mp_ibcast_rv Subroutine

private subroutine mp_ibcast_rv(msg, source, gid, request)

Broadcasts rank-1 data to all processes

Note

see mp_bcast_r1

Arguments

Type IntentOptional Attributes Name
real(kind=real_4), CONTIGUOUS :: msg(:)

Data to broadcast

integer :: source
type(mp_comm_type), intent(in) :: gid
type(mp_request_type), intent(inout) :: request

Source Code

      SUBROUTINE mp_ibcast_rv(msg, source, gid, request)
      !! Broadcasts rank-1 data to all processes
      !! @note see mp_bcast_r1

         REAL(kind=real_4), CONTIGUOUS                    :: msg(:)
         !! Data to broadcast
         INTEGER                                  :: source
         TYPE(mp_comm_type), INTENT(IN)           :: gid
         TYPE(mp_request_type), INTENT(INOUT)     :: request

         CHARACTER(LEN=*), PARAMETER :: routineN = 'mp_ibcast_rv'

         INTEGER                                  :: handle, ierr, msglen

         ierr = 0
         CALL timeset(routineN, handle)

         msglen = SIZE(msg)
#if defined(__parallel)
         CALL mpi_ibcast(msg, msglen, MPI_REAL, source, gid%handle, request%handle, ierr)
         IF (ierr /= 0) CALL mp_stop(ierr, "mpi_ibcast @ "//routineN)
         CALL add_perf(perf_id=22, msg_size=msglen*real_4_size)
#else
         MARK_USED(source)
         MARK_USED(gid)
         request = mp_request_null
#endif
         CALL timestop(handle)
      END SUBROUTINE mp_ibcast_rv