mirror of https://gitlab.com/QEF/q-e.git
58 lines
1.3 KiB
Fortran
58 lines
1.3 KiB
Fortran
#if defined(__CUDA)
|
|
PROGRAM test_mp_bcast_rv_buffer_gpu
|
|
!
|
|
! Simple program to check the functionalities of test_mp_bcast_rv
|
|
! with buffer implementation.
|
|
!
|
|
|
|
USE parallel_include
|
|
USE cudafor
|
|
USE util_param, ONLY : DP
|
|
USE mp, ONLY : mp_bcast
|
|
USE mp_world, ONLY : mp_world_start, mp_world_end, mpime, &
|
|
root, nproc, world_comm
|
|
USE tester
|
|
IMPLICIT NONE
|
|
!
|
|
TYPE(tester_t) :: test
|
|
INTEGER :: world_group = 0
|
|
! test variable
|
|
REAL(DP), DEVICE :: rv_d(200001)
|
|
REAL(DP) :: rv_h(200001)
|
|
|
|
!
|
|
CALL test%init()
|
|
|
|
#if defined(__MPI)
|
|
world_group = MPI_COMM_WORLD
|
|
#endif
|
|
CALL mp_world_start(world_group)
|
|
|
|
rv_h(:) = mpime+0.5
|
|
!
|
|
rv_d = rv_h
|
|
CALL mp_bcast(rv_d, root, world_comm)
|
|
rv_h = rv_d
|
|
!
|
|
CALL test%assert_equal(ALL(rv_h .eq. 0.5) , .true. )
|
|
!
|
|
rv_h(:) = mpime+0.5
|
|
rv_d = rv_h
|
|
CALL mp_bcast(rv_d, nproc-1, world_comm)
|
|
rv_h = rv_d
|
|
!
|
|
CALL test%assert_equal(ALL(rv_h .eq. nproc-0.5) , .true. )
|
|
!
|
|
CALL collect_results(test)
|
|
!
|
|
CALL mp_world_end()
|
|
!
|
|
IF (mpime .eq. 0) CALL test%print()
|
|
!
|
|
END PROGRAM test_mp_bcast_rv_buffer_gpu
|
|
#else
|
|
PROGRAM test_mp_bcast_rv_buffer_gpu
|
|
CALL no_test()
|
|
END PROGRAM test_mp_bcast_rv_buffer_gpu
|
|
#endif
|