Skip to content

Commit

Permalink
Update fortran test file
Browse files Browse the repository at this point in the history
  • Loading branch information
byrnHDF committed Nov 15, 2023
1 parent 52aa450 commit e54d12b
Showing 1 changed file with 7 additions and 7 deletions.
14 changes: 7 additions & 7 deletions fortran/test/tH5T_F03.F90
Original file line number Diff line number Diff line change
Expand Up @@ -984,7 +984,7 @@ SUBROUTINE test_h5kind_to_type(total_error)
INTEGER, PARAMETER :: real_kind_15 = C_DOUBLE !should map to REAL*8 on most modern processors

! Check if C has quad precision extension
#if H5_HAVE_FLOAT128!=0
#ifdef H5_HAVE_FLOAT128
! Check if Fortran supports quad precision
# if H5_PAC_FC_MAX_REAL_PRECISION > 26
INTEGER, PARAMETER :: real_kind_31 = SELECTED_REAL_KIND(31)
Expand Down Expand Up @@ -3400,18 +3400,18 @@ SUBROUTINE multiple_dset_rw(total_error)
!-------------------------------------------------------------------------
! Subroutine: multiple_dset_rw
!
! Purpose: Tests the reading and writing of multiple datasets
! Purpose: Tests the reading and writing of multiple datasets
! using H5Dread_multi and H5Dwrite_multi
!
! Return: Success: 0
! Failure: number of errors
!-------------------------------------------------------------------------
!
IMPLICIT NONE

INTEGER, INTENT(INOUT) :: total_error ! number of errors
INTEGER :: error ! HDF hdferror flag

INTEGER(SIZE_T), PARAMETER :: ndset = 5 ! Number of data sets
INTEGER(HID_T), DIMENSION(:), ALLOCATABLE :: dset_id
INTEGER(HID_T), DIMENSION(:), ALLOCATABLE :: mem_type_id
Expand All @@ -3424,9 +3424,9 @@ SUBROUTINE multiple_dset_rw(total_error)
INTEGER, PARAMETER :: sdim=2 ! length of character string
INTEGER, PARAMETER :: ddim=2 ! size of derived type array
INTEGER :: i,j,k

TYPE(C_PTR), ALLOCATABLE, DIMENSION(:) :: buf_md ! array to hold the multi-datasets

INTEGER, DIMENSION(1:idim), TARGET :: wbuf_int ! integer write buffer
INTEGER, DIMENSION(1:idim,idim2,idim3), TARGET :: wbuf_intmd
REAL, DIMENSION(1:rdim), TARGET :: wbuf_real ! real write buffer
Expand Down Expand Up @@ -3535,7 +3535,7 @@ SUBROUTINE multiple_dset_rw(total_error)
CALL check("h5tinsert_f", error, total_error)
CALL h5tcopy_f(H5T_NATIVE_CHARACTER, strtype, error)
CALL check("h5tcopy_f", error, total_error)
CALL h5tset_size_f(strtype, INT(sdim,size_t), error)
CALL h5tset_size_f(strtype, INT(sdim,size_t), error)
CALL check("h5tset_size_f", error, total_error)
CALL h5tinsert_f(mem_type_id(4), "chr", &
H5OFFSETOF(C_LOC(wbuf_derived(1)),C_LOC(wbuf_derived(1)%c(1:1))), strtype, error)
Expand Down

0 comments on commit e54d12b

Please sign in to comment.