summaryrefslogtreecommitdiffstats
path: root/fortran/src/H5Off.f90
diff options
context:
space:
mode:
Diffstat (limited to 'fortran/src/H5Off.f90')
-rw-r--r--fortran/src/H5Off.f906
1 files changed, 0 insertions, 6 deletions
diff --git a/fortran/src/H5Off.f90 b/fortran/src/H5Off.f90
index c64b82d..4e7a3be 100644
--- a/fortran/src/H5Off.f90
+++ b/fortran/src/H5Off.f90
@@ -48,9 +48,6 @@ CONTAINS
SUBROUTINE h5olink_f(object_id, new_loc_id, new_link_name, hdferr, lcpl_id, lapl_id)
!This definition is needed for Windows DLLs
-!DEC$if defined(BUILD_HDF5_DLL)
-!DEC$attributes dllexport :: h5olink_f
-!DEC$endif
IMPLICIT NONE
INTEGER(HID_T), INTENT(IN) :: object_id ! Object to be linked
INTEGER(HID_T), INTENT(IN) :: new_loc_id ! File or group identifier specifying
@@ -119,9 +116,6 @@ CONTAINS
SUBROUTINE h5oopen_f(loc_id, name, obj_id, hdferr, lapl_id)
!This definition is needed for Windows DLLs
-!DEC$if defined(BUILD_HDF5_DLL)
-!DEC$attributes dllexport :: h5oopen_f
-!DEC$endif
IMPLICIT NONE
INTEGER(HID_T), INTENT(IN) :: loc_id ! File or group identifier
CHARACTER(LEN=*), INTENT(IN) :: name ! Path to the object, relative to loc_id