hdf5/fortran/testpar/tcheck.f90
Elena Pourmal 76807a6985 [svn-r2753]
Purpose:
    Adding F90 || tests.
Description:
    I created testpar directory with the following files
      ptesthdf5_fortran.f90 - F90 test driver program
      tcheck.f90 thdf5.f90  - handy subroutines to use with the tests
      thyperslab_wr.f90     - F90 test:
                              collectively writes and reads hyperslabs to/from the dataset
Solution:
Platforms tested:
     Partially tested on modi4 (O2K)
2000-10-30 16:03:18 -05:00

17 lines
429 B
Fortran

!
!
! This module contains check subroutine which is used in
! all the fortran h5 test files
!
SUBROUTINE check(string,error,total_error)
CHARACTER(LEN=*) :: string
INTEGER :: error, total_error
if (error .lt. 0) then
total_error=total_error+1
write(*,*) string, " failed"
endif
RETURN
END SUBROUTINE check