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.f905
1 files changed, 2 insertions, 3 deletions
diff --git a/fortran/test/tH5F.f90 b/fortran/test/tH5F.f90
index e39d0ee..af2d7d6 100644
--- a/fortran/test/tH5F.f90
+++ b/fortran/test/tH5F.f90
@@ -691,15 +691,14 @@
! The following subroutine tests h5fget_freespace_f
!
- SUBROUTINE file_space(cleanup, total_error)
+ SUBROUTINE file_space(filename, cleanup, total_error)
USE HDF5 ! This module contains all necessary modules
IMPLICIT NONE
+ CHARACTER(*), INTENT(IN) :: filename
LOGICAL, INTENT(IN) :: cleanup
INTEGER, INTENT(OUT) :: total_error
INTEGER :: error
-
!
- CHARACTER(LEN=10), PARAMETER :: filename = "file_space"
CHARACTER(LEN=3), PARAMETER :: grpname = "grp"
CHARACTER(LEN=80) :: fix_filename