diff options
author | Scot Breitenfeld <brtnfld@hdfgroup.org> | 2008-05-21 19:55:50 (GMT) |
---|---|---|
committer | Scot Breitenfeld <brtnfld@hdfgroup.org> | 2008-05-21 19:55:50 (GMT) |
commit | 8332e5b7d393e72f343180632bd3c067f627aa38 (patch) | |
tree | 2175ee05100cd824670b480bd26f9fc7bc8e50c7 /fortran/testpar/hyper.f90 | |
parent | 8394d07bb1e614f9d376483f281ea74c6827ac6e (diff) | |
download | hdf5-8332e5b7d393e72f343180632bd3c067f627aa38.zip hdf5-8332e5b7d393e72f343180632bd3c067f627aa38.tar.gz hdf5-8332e5b7d393e72f343180632bd3c067f627aa38.tar.bz2 |
[svn-r15064] Description:
Removed extra MPI calls in subroutine by just passing
MPI variables into subroutines.
Added checks for MPI errors.
Cleaned-up formatting.
Diffstat (limited to 'fortran/testpar/hyper.f90')
-rw-r--r-- | fortran/testpar/hyper.f90 | 457 |
1 files changed, 227 insertions, 230 deletions
diff --git a/fortran/testpar/hyper.f90 b/fortran/testpar/hyper.f90 index fc0d1ff..a6d72dd 100644 --- a/fortran/testpar/hyper.f90 +++ b/fortran/testpar/hyper.f90 @@ -18,286 +18,283 @@ ! writes/reads dataset by hyperslabs !////////////////////////////////////////////////////////// -subroutine hyper(lenght,do_collective,do_chunk,nerrors) -use hdf5 -implicit none -include 'mpif.h' - -integer, intent(in) :: lenght ! array lenght -logical, intent(in) :: do_collective ! use collective I/O -logical, intent(in) :: do_chunk ! use chunking -integer, intent(inout) :: nerrors ! number of errors -integer :: mpierror ! MPI hdferror flag -integer :: hdferror ! HDF hdferror flag -integer :: mpi_size ! number of processes in the group of communicator -integer :: mpi_rank ! rank of the calling process in the communicator -integer(hsize_t), dimension(1) :: dims ! dataset dimensions -integer(hsize_t), dimension(1) :: cdims ! chunk dimensions -integer, allocatable :: wbuf(:) ! write buffer -integer, allocatable :: rbuf(:) ! read buffer -integer(hsize_t), dimension(1) :: counti ! hyperslab selection -integer(hsize_t), dimension(1) :: start ! hyperslab selection -integer(hid_t) :: fapl_id ! file access identifier -integer(hid_t) :: dxpl_id ! dataset transfer property list -integer(hid_t) :: dcpl_id ! dataset creation property list -integer(hid_t) :: file_id ! file identifier -integer(hid_t) :: dset_id ! dataset identifier -integer(hid_t) :: fspace_id ! file space identifier -integer(hid_t) :: mspace_id ! memory space identifier -integer(hid_t) :: driver_id ! low-level file driver identifier -integer :: istart ! start position in array -integer :: iend ! end position in array -integer :: icount ! number of elements in array -character(len=80) :: filename ! filename -integer :: i - -call mpi_comm_rank( MPI_COMM_WORLD, mpi_rank, mpierror ) -call mpi_comm_size( MPI_COMM_WORLD, mpi_size, mpierror ) +SUBROUTINE hyper(length,do_collective,do_chunk, mpi_size, mpi_rank, nerrors) + USE hdf5 + IMPLICIT NONE + INCLUDE 'mpif.h' + + INTEGER, INTENT(in) :: length ! array length + LOGICAL, INTENT(in) :: do_collective ! use collective I/O + LOGICAL, INTENT(in) :: do_chunk ! use chunking + INTEGER, INTENT(in) :: mpi_size ! number of processes in the group of communicator + INTEGER, INTENT(in) :: mpi_rank ! rank of the calling process in the communicator + INTEGER, INTENT(inout) :: nerrors ! number of errors + INTEGER :: mpierror ! MPI hdferror flag + INTEGER :: hdferror ! HDF hdferror flag + INTEGER(hsize_t), DIMENSION(1) :: dims ! dataset dimensions + INTEGER(hsize_t), DIMENSION(1) :: cdims ! chunk dimensions + INTEGER, ALLOCATABLE :: wbuf(:) ! write buffer + INTEGER, ALLOCATABLE :: rbuf(:) ! read buffer + INTEGER(hsize_t), DIMENSION(1) :: counti ! hyperslab selection + INTEGER(hsize_t), DIMENSION(1) :: start ! hyperslab selection + INTEGER(hid_t) :: fapl_id ! file access identifier + INTEGER(hid_t) :: dxpl_id ! dataset transfer property list + INTEGER(hid_t) :: dcpl_id ! dataset creation property list + INTEGER(hid_t) :: file_id ! file identifier + INTEGER(hid_t) :: dset_id ! dataset identifier + INTEGER(hid_t) :: fspace_id ! file space identifier + INTEGER(hid_t) :: mspace_id ! memory space identifier + INTEGER(hid_t) :: driver_id ! low-level file driver identifier + INTEGER :: istart ! start position in array + INTEGER :: iend ! end position in array + INTEGER :: icount ! number of elements in array + CHARACTER(len=80) :: filename ! filename + INTEGER :: i + + !////////////////////////////////////////////////////////// + ! initialize the array data between the processes (3) + ! for the 12 size array we get + ! p0 = 1,2,3,4 + ! p1 = 5,6,7,8 + ! p2 = 9,10,11,12 + !////////////////////////////////////////////////////////// + + ALLOCATE(wbuf(0:length-1),stat=hdferror) + IF (hdferror /= 0) THEN + WRITE(*,*) 'allocate error' + RETURN + ENDIF + + ALLOCATE(rbuf(0:length-1),stat=hdferror) + IF (hdferror /= 0) THEN + WRITE(*,*) 'allocate error' + RETURN + ENDIF + + icount = length/mpi_size ! divide the array by the number of processes + istart = mpi_rank*icount ! start position + iend = istart + icount ! end position + + DO i = istart, iend-1 + wbuf(i) = i + ENDDO + + !////////////////////////////////////////////////////////// + ! HDF5 I/O + !////////////////////////////////////////////////////////// + + dims(1) = length + cdims(1) = length/mpi_size ! define chunks as the number of processes + + !////////////////////////////////////////////////////////// + ! setup file access property list with parallel I/O access + !////////////////////////////////////////////////////////// + + CALL h5pcreate_f(H5P_FILE_ACCESS_F, fapl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) + + CALL h5pset_fapl_mpio_f(fapl_id, MPI_COMM_WORLD, MPI_INFO_NULL, hdferror) + CALL check("h5pset_fapl_mpio_f", hdferror, nerrors) + + CALL h5pget_driver_f(fapl_id, driver_id, hdferror) + CALL check("h5pget_driver_f", hdferror, nerrors) + + IF( driver_id /= H5FD_MPIO_F) THEN + WRITE(*,*) "Wrong driver information returned" + nerrors = nerrors + 1 + ENDIF + + !////////////////////////////////////////////////////////// + ! create the file collectively + !////////////////////////////////////////////////////////// + + CALL h5_fixname_f("parf1", filename, fapl_id, hdferror) + + CALL h5fcreate_f(filename, H5F_ACC_TRUNC_F, file_id, hdferror, access_prp = fapl_id) + CALL check("h5fcreate_f", hdferror, nerrors) + + CALL h5screate_simple_f(1, dims, fspace_id, hdferror) + CALL check("h5screate_simple_f", hdferror, nerrors) + + CALL h5screate_simple_f(1, dims, mspace_id, hdferror) + CALL check("h5screate_simple_f", hdferror, nerrors) + + !////////////////////////////////////////////////////////// + ! modify dataset creation properties to enable chunking + !////////////////////////////////////////////////////////// -!////////////////////////////////////////////////////////// -! initialize the array data between the processes (3) -! for the 12 size array we get -! p0 = 1,2,3,4 -! p1 = 5,6,7,8 -! p2 = 9,10,11,12 -!////////////////////////////////////////////////////////// + CALL h5pcreate_f(H5P_DATASET_CREATE_F, dcpl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -allocate(wbuf(0:lenght-1),stat=hdferror) -if (hdferror /= 0) then - write(*,*) 'allocate error' - return -endif + IF (do_chunk) THEN + CALL h5pset_chunk_f(dcpl_id, 1, cdims, hdferror) + CALL check("h5pset_chunk_f", hdferror, nerrors) + ENDIF -allocate(rbuf(0:lenght-1),stat=hdferror) -if (hdferror /= 0) then - write(*,*) 'allocate error' - return -endif + !////////////////////////////////////////////////////////// + ! create the dataset + !////////////////////////////////////////////////////////// -icount = lenght/mpi_size ! divide the array by the number of processes -istart = mpi_rank*icount ! start position -iend = istart + icount ! end position + CALL h5dcreate_f(file_id, "dset", H5T_NATIVE_INTEGER, fspace_id, dset_id, hdferror, dcpl_id) + CALL check("h5dcreate_f", hdferror, nerrors) -do i = istart, iend-1 - wbuf(i) = i -enddo + !////////////////////////////////////////////////////////// + ! define hyperslab + !////////////////////////////////////////////////////////// -!////////////////////////////////////////////////////////// -! HDF5 I/O -!////////////////////////////////////////////////////////// + counti(1) = icount + start(1) = istart -dims(1) = lenght -cdims(1) = lenght/mpi_size ! define chunks as the number of processes + !////////////////////////////////////////////////////////// + ! select hyperslab in memory + !////////////////////////////////////////////////////////// -!////////////////////////////////////////////////////////// -! setup file access property list with parallel I/O access -!////////////////////////////////////////////////////////// + CALL h5sselect_hyperslab_f(mspace_id, H5S_SELECT_SET_F, start, counti, hdferror) + CALL check("h5sselect_hyperslab_f", hdferror, nerrors) -call h5pcreate_f(H5P_FILE_ACCESS_F, fapl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! select hyperslab in the file + !////////////////////////////////////////////////////////// -call h5pset_fapl_mpio_f(fapl_id, MPI_COMM_WORLD, MPI_INFO_NULL, hdferror) -call check("h5pset_fapl_mpio_f", hdferror, nerrors) + CALL h5sselect_hyperslab_f(fspace_id, H5S_SELECT_SET_F, start, counti, hdferror) + CALL check("h5sselect_hyperslab_f", hdferror, nerrors) -call h5pget_driver_f(fapl_id, driver_id, hdferror) -call check("h5pget_driver_f", hdferror, nerrors) - -if( driver_id /= H5FD_MPIO_F) then - write(*,*) "Wrong driver information returned" - nerrors = nerrors + 1 -endif -!////////////////////////////////////////////////////////// -! create the file collectively -!////////////////////////////////////////////////////////// + !////////////////////////////////////////////////////////// + ! create a property list for collective dataset write + !////////////////////////////////////////////////////////// -call h5_fixname_f("parf1", filename, fapl_id, hdferror) + CALL h5pcreate_f(H5P_DATASET_XFER_F, dxpl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5fcreate_f(filename, H5F_ACC_TRUNC_F, file_id, hdferror, access_prp = fapl_id) -call check("h5fcreate_f", hdferror, nerrors) + IF (do_collective) THEN + CALL h5pset_dxpl_mpio_f(dxpl_id, H5FD_MPIO_COLLECTIVE_F, hdferror) + CALL check("h5pset_dxpl_mpio_f", hdferror, nerrors) + ENDIF -call h5screate_simple_f(1, dims, fspace_id, hdferror) -call check("h5screate_simple_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! write dataset + !////////////////////////////////////////////////////////// -call h5screate_simple_f(1, dims, mspace_id, hdferror) -call check("h5screate_simple_f", hdferror, nerrors) + CALL h5dwrite_f(dset_id,H5T_NATIVE_INTEGER,wbuf,dims,hdferror,file_space_id=fspace_id,mem_space_id=mspace_id,xfer_prp=dxpl_id) + CALL check("h5dwrite_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! modify dataset creation properties to enable chunking -!////////////////////////////////////////////////////////// -call h5pcreate_f(H5P_DATASET_CREATE_F, dcpl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! close HDF5 I/O + !////////////////////////////////////////////////////////// -if (do_chunk) then - call h5pset_chunk_f(dcpl_id, 1, cdims, hdferror) - call check("h5pset_chunk_f", hdferror, nerrors) -endif + CALL h5pclose_f(fapl_id, hdferror) + CALL check("h5pclose_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! create the dataset -!////////////////////////////////////////////////////////// + CALL h5pclose_f(dcpl_id, hdferror) + CALL check("h5pclose_f", hdferror, nerrors) -call h5dcreate_f(file_id, "dset", H5T_NATIVE_INTEGER, fspace_id, dset_id, hdferror, dcpl_id) -call check("h5dcreate_f", hdferror, nerrors) + CALL h5pclose_f(dxpl_id, hdferror) + CALL check("h5pclose_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! define hyperslab -!////////////////////////////////////////////////////////// + CALL h5sclose_f(mspace_id, hdferror) + CALL check("h5sclose_f", hdferror, nerrors) -counti(1) = icount -start(1) = istart + CALL h5sclose_f(fspace_id, hdferror) + CALL check("h5sclose_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! select hyperslab in memory -!////////////////////////////////////////////////////////// + CALL h5dclose_f(dset_id, hdferror) + CALL check("h5dclose_f", hdferror, nerrors) -call h5sselect_hyperslab_f(mspace_id, H5S_SELECT_SET_F, start, counti, hdferror) -call check("h5sselect_hyperslab_f", hdferror, nerrors) + CALL h5fclose_f(file_id, hdferror) + CALL check("h5fclose_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! select hyperslab in the file -!////////////////////////////////////////////////////////// + !////////////////////////////////////////////////////////// + ! reopen file with read access + !////////////////////////////////////////////////////////// -call h5sselect_hyperslab_f(fspace_id, H5S_SELECT_SET_F, start, counti, hdferror) -call check("h5sselect_hyperslab_f", hdferror, nerrors) + CALL h5pcreate_f(H5P_FILE_ACCESS_F, fapl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) + CALL h5pset_fapl_mpio_f(fapl_id, MPI_COMM_WORLD, MPI_INFO_NULL, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! create a property list for collective dataset write -!////////////////////////////////////////////////////////// + CALL h5fopen_f(filename, H5F_ACC_RDWR_F, file_id, hdferror, access_prp = fapl_id) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5pcreate_f(H5P_DATASET_XFER_F, dxpl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -if (do_collective) then - call h5pset_dxpl_mpio_f(dxpl_id, H5FD_MPIO_COLLECTIVE_F, hdferror) - call check("h5pset_dxpl_mpio_f", hdferror, nerrors) -endif + CALL h5screate_simple_f(1, dims, fspace_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! write dataset -!////////////////////////////////////////////////////////// + CALL h5screate_simple_f(1, dims, mspace_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5dwrite_f(dset_id,H5T_NATIVE_INTEGER,wbuf,dims,hdferror,file_space_id=fspace_id,mem_space_id=mspace_id,xfer_prp=dxpl_id) -call check("h5dwrite_f", hdferror, nerrors) + CALL h5dopen_f(file_id, "dset", dset_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! select hyperslab in memory + !////////////////////////////////////////////////////////// -!////////////////////////////////////////////////////////// -! close HDF5 I/O -!////////////////////////////////////////////////////////// + CALL h5sselect_hyperslab_f(mspace_id, H5S_SELECT_SET_F, start, counti, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5pclose_f(fapl_id, hdferror) -call check("h5pclose_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! select hyperslab in the file + !////////////////////////////////////////////////////////// -call h5pclose_f(dcpl_id, hdferror) -call check("h5pclose_f", hdferror, nerrors) + CALL h5sselect_hyperslab_f(fspace_id, H5S_SELECT_SET_F, start, counti, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5pclose_f(dxpl_id, hdferror) -call check("h5pclose_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! create a property list for collective dataset read + !////////////////////////////////////////////////////////// -call h5sclose_f(mspace_id, hdferror) -call check("h5sclose_f", hdferror, nerrors) + CALL h5pcreate_f(H5P_DATASET_XFER_F, dxpl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5sclose_f(fspace_id, hdferror) -call check("h5sclose_f", hdferror, nerrors) + IF (do_collective) THEN + CALL h5pset_dxpl_mpio_f(dxpl_id, H5FD_MPIO_COLLECTIVE_F, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) + ENDIF -call h5dclose_f(dset_id, hdferror) -call check("h5dclose_f", hdferror, nerrors) + !////////////////////////////////////////////////////////// + ! read dataset + !////////////////////////////////////////////////////////// -call h5fclose_f(file_id, hdferror) -call check("h5fclose_f", hdferror, nerrors) + CALL h5dread_f(dset_id,H5T_NATIVE_INTEGER,rbuf,dims,hdferror,file_space_id=fspace_id,mem_space_id=mspace_id,xfer_prp=dxpl_id) + CALL check("h5pcreate_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! reopen file with read access -!////////////////////////////////////////////////////////// + !////////////////////////////////////////////////////////// + ! close HDF5 I/O + !////////////////////////////////////////////////////////// -call h5pcreate_f(H5P_FILE_ACCESS_F, fapl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5pclose_f(fapl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5pset_fapl_mpio_f(fapl_id, MPI_COMM_WORLD, MPI_INFO_NULL, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5pclose_f(dxpl_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5fopen_f(filename, H5F_ACC_RDWR_F, file_id, hdferror, access_prp = fapl_id) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5sclose_f(fspace_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5screate_simple_f(1, dims, fspace_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5sclose_f(mspace_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5screate_simple_f(1, dims, mspace_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5dclose_f(dset_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -call h5dopen_f(file_id, "dset", dset_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) + CALL h5fclose_f(file_id, hdferror) + CALL check("h5pcreate_f", hdferror, nerrors) -!////////////////////////////////////////////////////////// -! select hyperslab in memory -!////////////////////////////////////////////////////////// - -call h5sselect_hyperslab_f(mspace_id, H5S_SELECT_SET_F, start, counti, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -!////////////////////////////////////////////////////////// -! select hyperslab in the file -!////////////////////////////////////////////////////////// - -call h5sselect_hyperslab_f(fspace_id, H5S_SELECT_SET_F, start, counti, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -!////////////////////////////////////////////////////////// -! create a property list for collective dataset read -!////////////////////////////////////////////////////////// - -call h5pcreate_f(H5P_DATASET_XFER_F, dxpl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -if (do_collective) then - call h5pset_dxpl_mpio_f(dxpl_id, H5FD_MPIO_COLLECTIVE_F, hdferror) - call check("h5pcreate_f", hdferror, nerrors) -endif - -!////////////////////////////////////////////////////////// -! read dataset -!////////////////////////////////////////////////////////// - -call h5dread_f(dset_id,H5T_NATIVE_INTEGER,rbuf,dims,hdferror,file_space_id=fspace_id,mem_space_id=mspace_id,xfer_prp=dxpl_id) -call check("h5pcreate_f", hdferror, nerrors) - -!////////////////////////////////////////////////////////// -! close HDF5 I/O -!////////////////////////////////////////////////////////// - -call h5pclose_f(fapl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -call h5pclose_f(dxpl_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -call h5sclose_f(fspace_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -call h5sclose_f(mspace_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -call h5dclose_f(dset_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -call h5fclose_f(file_id, hdferror) -call check("h5pcreate_f", hdferror, nerrors) - -!////////////////////////////////////////////////////////// -! compare read and write data. each process compares a subset of the array -!////////////////////////////////////////////////////////// + !////////////////////////////////////////////////////////// + ! compare read and write data. each process compares a subset of the array + !////////////////////////////////////////////////////////// -do i = istart, iend-1 - if( wbuf(i) /= rbuf(i)) then - write(*,*) 'buffers differs at ', i, rbuf(i), wbuf(i) - nerrors = nerrors + 1 - endif -enddo + DO i = istart, iend-1 + IF( wbuf(i) /= rbuf(i)) THEN + WRITE(*,*) 'buffers differs at ', i, rbuf(i), wbuf(i) + nerrors = nerrors + 1 + ENDIF + ENDDO -deallocate(wbuf) -deallocate(rbuf) + DEALLOCATE(wbuf) + DEALLOCATE(rbuf) -end subroutine hyper +END SUBROUTINE hyper |