summaryrefslogtreecommitdiffstats
path: root/fortran/src/H5f90miscf.f90
diff options
context:
space:
mode:
Diffstat (limited to 'fortran/src/H5f90miscf.f90')
-rw-r--r--fortran/src/H5f90miscf.f9022
1 files changed, 22 insertions, 0 deletions
diff --git a/fortran/src/H5f90miscf.f90 b/fortran/src/H5f90miscf.f90
new file mode 100644
index 0000000..a345019
--- /dev/null
+++ b/fortran/src/H5f90miscf.f90
@@ -0,0 +1,22 @@
+ SUBROUTINE h5init_types_f(error)
+ USE H5GLOBAL
+
+ IMPLICIT NONE
+ INTEGER, INTENT(OUT) :: error
+ INTEGER, EXTERNAL :: h5init_types_c
+ error = h5init_types_c(predef_types, floating_types, integer_types)
+
+ END SUBROUTINE h5init_types_f
+
+ SUBROUTINE h5close_types_f(error)
+ USE H5GLOBAL
+
+ IMPLICIT NONE
+ INTEGER, INTENT(OUT) :: error
+ INTEGER, EXTERNAL :: h5close_types_c
+ error = h5close_types_c(predef_types, PREDEF_TYPES_LEN, &
+ floating_types, FLOATING_TYPES_LEN, &
+ integer_types, INTEGER_TYPES_LEN )
+
+ END SUBROUTINE h5close_types_f
+