summaryrefslogtreecommitdiffstats
path: root/fortran/test/tH5P_F03.f90
diff options
context:
space:
mode:
authorScot Breitenfeld <brtnfld@hdfgroup.org>2014-04-03 15:18:42 (GMT)
committerScot Breitenfeld <brtnfld@hdfgroup.org>2014-04-03 15:18:42 (GMT)
commite26b78a04b855a1c5c60dbe161ac1fd4c2123405 (patch)
tree6d9d8a82a582552c41b89e9ae7646cc43f1ef7c9 /fortran/test/tH5P_F03.f90
parentb0bdd254177e5464a74fdd9256e3b63cc132571a (diff)
downloadhdf5-e26b78a04b855a1c5c60dbe161ac1fd4c2123405.zip
hdf5-e26b78a04b855a1c5c60dbe161ac1fd4c2123405.tar.gz
hdf5-e26b78a04b855a1c5c60dbe161ac1fd4c2123405.tar.bz2
[svn-r24953] Fixed --enable-production compilation error using Sun compilers.
Tested (emu)
Diffstat (limited to 'fortran/test/tH5P_F03.f90')
-rw-r--r--fortran/test/tH5P_F03.f904
1 files changed, 2 insertions, 2 deletions
diff --git a/fortran/test/tH5P_F03.f90 b/fortran/test/tH5P_F03.f90
index 5d6b1b9..398fb87 100644
--- a/fortran/test/tH5P_F03.f90
+++ b/fortran/test/tH5P_F03.f90
@@ -379,7 +379,7 @@ END SUBROUTINE test_genprop_class_callback
SUBROUTINE test_h5p_file_image(total_error)
USE HDF5
- USE ISO_C_BINDING
+ USE, INTRINSIC :: iso_c_binding
IMPLICIT NONE
INTEGER, INTENT(INOUT) :: total_error
INTEGER(hid_t) :: fapl_1 = -1
@@ -404,7 +404,7 @@ SUBROUTINE test_h5p_file_image(total_error)
CALL check("h5pcreate_f", error, total_error)
! Test with NULL ptr
- f_ptr2 = C_NULL_PTR
+ f_ptr2(1) = C_NULL_PTR
temp_size = 1
CALL h5pget_file_image_f(fapl_1, f_ptr2, temp_size, error)
CALL check("h5pget_file_image_f", error, total_error)