summaryrefslogtreecommitdiffstats
path: root/fortran/test/tH5F.f90
diff options
context:
space:
mode:
Diffstat (limited to 'fortran/test/tH5F.f90')
-rw-r--r--fortran/test/tH5F.f9023
1 files changed, 16 insertions, 7 deletions
diff --git a/fortran/test/tH5F.f90 b/fortran/test/tH5F.f90
index 4b88cb3..d8f683c 100644
--- a/fortran/test/tH5F.f90
+++ b/fortran/test/tH5F.f90
@@ -1,3 +1,12 @@
+!****h* root/fortran/test/tH5F.f90
+!
+! NAME
+! tH5F.f90
+!
+! FUNCTION
+! Basic testing of Fortran H5F APIs.
+!
+! COPYRIGHT
! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
! Copyright by The HDF Group. *
! Copyright by the Board of Trustees of the University of Illinois. *
@@ -13,15 +22,15 @@
! access to either file, you may request a copy from help@hdfgroup.org. *
! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
!
+! CONTAINS SUBROUTINES
+! mountingtest, reopentest, plisttest, file_close, file_space
!
+!*****
!
-! Testing File Interface functionality.
-!
-! In the mountingtest subroutine we create one file with a group in it,
-! and another file with a dataset. Mounting is used to
-! access the dataset from the second file as a member of a group
-! in the first file.
-!
+! In the mountingtest subroutine we create one file with a group in it,
+! and another file with a dataset. Mounting is used to
+! access the dataset from the second file as a member of a group
+! in the first file.
SUBROUTINE mountingtest(cleanup, total_error)
USE HDF5 ! This module contains all necessary modules
IMPLICIT NONE