36
37
38
39 USE intbufdef_mod
40
41
42
43 USE spmd_comm_world_mod, ONLY : spmd_comm_world
44#include "implicit_f.inc"
45
46
47
48#include "spmd.inc"
49
50
51
52#include "task_c.inc"
53#include "param_c.inc"
54
55
56
57 INTEGER ITYPTS, NELTS, ICODT ,IMSCH, IWIOUT,MSTOP,
58 . ISMSCH
59
60 INTEGER INT24USE,NBINTC,INTLIST(*),IPARI(NPARI,*)
62 . dt2, tstop
63 TYPE(INTBUF_STRUCT_) INTBUF_TAB(*)
64
65
66
67#ifdef MPI
68 INTEGER IERROR, LOC_PROC, MSTOP1, MSTOP2, LEN, myop,
69 . STATUS(MPI_STATUS_SIZE)
71 . DIMENSION(:),ALLOCATABLE :: rbuf, sbuf
72
73 INTEGER NIN,NI,NTY
74 INTEGER :: MY_TYPE
75 INTEGER GLOB_MIN
77
78
79
80 IF(int24use==1)THEN
81 len = 10 + nbintc
82 ELSE
83 len = 10
84 ENDIF
85 ALLOCATE(rbuf(len))
86 ALLOCATE(sbuf(len))
87 rbuf(1:len)=zero
88
89 mstop1=0
90 mstop2=0
91 IF(mstop==1)mstop1=1
92 IF(mstop==2)mstop2=1
93
94 loc_proc=ispmd+1
95
96 sbuf(1) = dt2
97 sbuf(2) = itypts
98 sbuf(3) = nelts
99 sbuf(4) = iexicodt
100 sbuf(5) = imsch
101 sbuf(6) = tstop
102 sbuf(7) = iwiout
103 sbuf(8) = mstop1
104 sbuf(9) = mstop2
105 sbuf(10)= ismsch
106
107 IF (int24use==1)THEN
108 DO ni=1,nbintc
109 nin = intlist(ni)
110 nty = ipari( 7,nin)
111 IF(nty==24.OR.nty==25) THEN
112 sbuf(10+ni) = intbuf_tab(nin)%VARIABLES(23)
113 ELSE
114 sbuf(10+ni) = zero
115 ENDIF
116 ENDDO
117 ENDIF
118
121
123
125 & spmd_comm_world, ierror)
126
127 IF (int24use==1)THEN
128 CALL mpi_allreduce(sbuf(11), rbuf(11), nbintc, real , mpi_max,
129 & spmd_comm_world, ierror)
130 ENDIF
131
134
135
136 dt2 = rbuf(1)
137 itypts = nint(rbuf(2))
138 nelts = nint(rbuf(3))
139 iexicodt = nint(rbuf(4))
140 imsch = nint(rbuf(5))
141 tstop = rbuf(6)
142 iwiout = nint(rbuf(7))
143 mstop1 = nint(rbuf(8))
144 mstop2 = nint(rbuf(9))
145 IF(mstop1/=0)mstop=1
146 IF(mstop2/=0)mstop=2
147 ismsch = rbuf(10)
148
149 IF (int24use==1)THEN
150 DO ni=1,nbintc
151 nin = intlist(ni)
152 nty = ipari( 7,nin)
153 IF(nty==24.OR.nty==25) THEN
154 intbuf_tab(nin)%VARIABLES(23) = rbuf(10+ni)
155 ENDIF
156 ENDDO
157 ENDIF
158
159 DEALLOCATE(rbuf)
160 DEALLOCATE(sbuf)
161
162#endif
163 RETURN
subroutine glob_min(rin, rinout, len, type)
subroutine mpi_type_free(newtyp, ierr_mpi)
subroutine mpi_type_contiguous(length, datatype, newtype, ierr_mpi)
subroutine mpi_allreduce(sendbuf, recvbuf, cnt, datatype, operation, comm, ierr)
subroutine mpi_type_commit(newtyp, ierr_mpi)
subroutine mpi_op_create(func, commute, op, ierr)
subroutine mpi_op_free(op, ierr)