34 . TSTOP,IWIOUT,MSTOP,ISMSCH,
35 . INT24USE,NBINTC,INTLIST,IPARI,INTBUF_TAB)
43 USE spmd_comm_world_mod,
ONLY : spmd_comm_world
44#include "implicit_f.inc"
57 INTEGER ITYPTS, NELTS, ICODT ,IMSCH, IWIOUT,MSTOP,
60 INTEGER INT24USE,,INTLIST(*),IPARI(NPARI,*)
63 TYPE(intbuf_struct_) (*)
68 INTEGER IERROR, LOC_PROC, MSTOP1, MSTOP2, LEN, myop,
69 . STATUS(MPI_STATUS_SIZE)
71 .
DIMENSION(:),
ALLOCATABLE :: rbuf, sbuf
111 IF(nty==24.OR.nty==25)
THEN
112 sbuf(10+ni) = intbuf_tab(nin)%VARIABLES(23)
125 & spmd_comm_world, ierror)
128 CALL mpi_allreduce(sbuf(11), rbuf(11), nbintc, real , mpi_max,
129 & spmd_comm_world, ierror)
137 itypts = nint(rbuf(2))
138 nelts = nint(rbuf(3))
139 iexicodt = nint(rbuf(4))
140 imsch = nint(rbuf(5))
142 iwiout = nint(rbuf(7))
143 mstop1 = nint(rbuf(8))
144 mstop2 = nint(rbuf(9))
153 IF(nty==24.OR.nty==25)
THEN
154 intbuf_tab(nin)%VARIABLES(23) = rbuf(10+ni)
subroutine mpi_allreduce(sendbuf, recvbuf, cnt, datatype, operation, comm, ierr)
subroutine spmd_glob_min5(dt2, itypts, nelts, icodt, imsch, tstop, iwiout, mstop, ismsch, int24use, nbintc, intlist, ipari, intbuf_tab)