mp_allgather_d2 Subroutine

private subroutine mp_allgather_d2(msgout, msgin, gid)

Gathers a datum from all processes and all processes receive the same data

Data size All processes send equal-sized data

MPI mapping mpi_allgather

Arguments

Type IntentOptional Attributes Name
real(kind=real_8), intent(in) :: msgout

Datum to send

real(kind=real_8), intent(out), CONTIGUOUS :: msgin(:,:)

Received data

type(mp_comm_type), intent(in) :: gid

Message passing environment identifier


Source Code

      SUBROUTINE mp_allgather_d2(msgout, msgin, gid)
      !! Gathers a datum from all processes and all processes receive the
      !! same data
      !!
      !! Data size
      !! All processes send equal-sized data
      !!
      !! MPI mapping
      !! mpi_allgather

         REAL(kind=real_8), INTENT(IN)                    :: msgout
         !! Datum to send
         REAL(kind=real_8), CONTIGUOUS, INTENT(OUT)       :: msgin(:, :)
         !! Received data
         TYPE(mp_comm_type), INTENT(IN)                      :: gid
         !! Message passing environment identifier

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

         INTEGER                                  :: handle, ierr
#if defined(__parallel)
         INTEGER                                  :: rcount, scount
#endif

         ierr = 0
         CALL timeset(routineN, handle)

#if defined(__parallel)
         scount = 1
         rcount = 1
         CALL MPI_ALLGATHER(msgout, scount, MPI_DOUBLE_PRECISION, &
                            msgin, rcount, MPI_DOUBLE_PRECISION, &
                            gid%handle, ierr)
         IF (ierr /= 0) CALL mp_stop(ierr, "mpi_allgather @ "//routineN)
#else
         MARK_USED(gid)
         msgin = msgout
#endif
         CALL timestop(handle)
      END SUBROUTINE mp_allgather_d2