summaryrefslogtreecommitdiffstats
path: root/fortran/test/fortranlib_test.f90
diff options
context:
space:
mode:
authorQuincey Koziol <koziol@hdfgroup.org>2010-01-30 04:29:13 (GMT)
committerQuincey Koziol <koziol@hdfgroup.org>2010-01-30 04:29:13 (GMT)
commitfd70b2afa883f94718ffb7f4f33d104d76e3fe0a (patch)
treec1add8db2a4848202d86a9b274bfaf8c7b80e961 /fortran/test/fortranlib_test.f90
parent35b0159a0a5f1f4b80e305204ea51a742b052403 (diff)
downloadhdf5-fd70b2afa883f94718ffb7f4f33d104d76e3fe0a.zip
hdf5-fd70b2afa883f94718ffb7f4f33d104d76e3fe0a.tar.gz
hdf5-fd70b2afa883f94718ffb7f4f33d104d76e3fe0a.tar.bz2
[svn-r18197] Description:
Trim trailing whitespace from source code files with this command: find . \( -name "*.[ch]" -or -name "*.cpp" -or -name "*.f90" \) -print |xargs -n 1 sed -i "" 's/[[:blank:]]*$//' Tested on: None - eyeballed only
Diffstat (limited to 'fortran/test/fortranlib_test.f90')
-rw-r--r--fortran/test/fortranlib_test.f9030
1 files changed, 15 insertions, 15 deletions
diff --git a/fortran/test/fortranlib_test.f90 b/fortran/test/fortranlib_test.f90
index f44e373..d8acc29 100644
--- a/fortran/test/fortranlib_test.f90
+++ b/fortran/test/fortranlib_test.f90
@@ -1,4 +1,4 @@
-! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
+! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
! Copyright by The HDF Group. *
! Copyright by the Board of Trustees of the University of Illinois. *
! All rights reserved. *
@@ -11,16 +11,16 @@
! is linked from the top-level documents page. It can also be found at *
! http://hdfgroup.org/HDF5/doc/Copyright.html. If you do not have *
! access to either file, you may request a copy from help@hdfgroup.org. *
-! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
+! * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * * *
+!
!
!
-!
! Testing Fortran functionality.
!
PROGRAM fortranlibtest
-
+
USE HDF5
-
+
IMPLICIT NONE
INTEGER :: total_error = 0
INTEGER :: error
@@ -43,7 +43,7 @@ PROGRAM fortranlibtest
WRITE(*, '(" FORTRANLIB_TEST is linked with HDF5 Library version ")', advance="NO")
WRITE(*, '(I1)', advance="NO") majnum
- WRITE(*, '(".")', advance="NO")
+ WRITE(*, '(".")', advance="NO")
WRITE(*, '(I1)', advance="NO") minnum
WRITE(*, '(" release ")', advance="NO")
WRITE(*, '(I3)') relnum
@@ -60,7 +60,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL mountingtest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Mounting test', total_error)
-
+
ret_total_error = 0
CALL reopentest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Reopen test', total_error)
@@ -86,7 +86,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL datasettest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Dataset test', total_error)
-
+
ret_total_error = 0
CALL extenddsettest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Extendible dataset test', total_error)
@@ -108,7 +108,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL refobjtest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Reference to object test', total_error)
-
+
ret_total_error = 0
CALL refregtest(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Reference to dataset region test', total_error)
@@ -126,7 +126,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL test_select_hyperslab( cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Hyperslab selection test', total_error)
-
+
ret_total_error = 0
CALL test_select_element(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Element selection test', total_error)
@@ -142,7 +142,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL test_select_bounds(cleanup, ret_total_error)
CALL write_test_status(ret_total_error, ' Selection bounds test ', total_error)
-
+
! write(*,*)
! write(*,*) '========================================='
! write(*,*) 'Testing DATATYPE interface '
@@ -165,7 +165,7 @@ PROGRAM fortranlibtest
! write(*,*)
! write(*,*) '========================================='
-! write(*,*) 'Testing PROPERTY interface '
+! write(*,*) 'Testing PROPERTY interface '
! write(*,*) '========================================='
ret_total_error = 0
@@ -181,7 +181,7 @@ PROGRAM fortranlibtest
! write(*,*)
! write(*,*) '========================================='
-! write(*,*) 'Testing ATTRIBUTE interface '
+! write(*,*) 'Testing ATTRIBUTE interface '
! write(*,*) '========================================='
ret_total_error = 0
@@ -203,7 +203,7 @@ PROGRAM fortranlibtest
ret_total_error = 0
CALL szip_test(szip_flag, cleanup, ret_total_error)
-
+
IF (.NOT. szip_flag) THEN ! test not available
CALL write_test_status(-1, ' SZIP filter test', total_error)
ELSE
@@ -236,7 +236,7 @@ PROGRAM fortranlibtest
WRITE(*, fmt = '(i4)', advance='NO') total_error
WRITE(*, fmt = '(12a)' ) ' error(s) ! '
WRITE(*,*) ' ============================================ '
-
+
CALL h5close_f(error)
! if errors detected, exit with non-zero code.