36 1 IB ,IXS ,IXQ ,IXC ,IXT ,IXP ,
37 2 IXR ,IXTG ,ITAG ,ITASK ,ITAGL ,ITAB ,
38 3 NODES ,ADDCNEL ,CNEL ,TAGEL ,IPARG ,GEO ,
39 4 IBUFS ,NINDEX ,NINDG ,NPRESLOAD,LOADP_TAGDEL ,
40 5 ILOADP ,LLOADP ,IAD_ELEM)
46#include "implicit_f.inc"
55#include "tabsiz_c.inc"
60 INTEGER,
INTENT(IN) :: NPRESLOAD
61 INTEGER IB(NIBCLD,*), ITAG(*),
62 . IXS(NIXS,*),IXQ(NIXQ,*),IXC(NIXC,*), IXT(NIXT,*), IXP(NIXP,*),
63 . IXR(NIXR,*), IXTG(NIXTG,*),IPARG(NPARG,*), ITAGL(*), ITAB(*),
64 . cnel(0:*), addcnel(0:*), tagel(*), ibufs(*) , nindex(*)
65 INTEGER,
INTENT(INOUT) :: LOADP_TAGDEL(NPRESLOAD)
66 INTEGER,
INTENT(IN) :: LLOADP(SLLOADP), ILOADP(SIZLOADP,NLOADP)
67 INTEGER,
DIMENSION(2,NSPMD+1),
INTENT(in) :: IAD_ELEM
70 TYPE(nodal_arrays_),
intent(in) :: NODES
74 INTEGER I, J, NMNF, NMNL, NRTF, NRTL, N1, N2, N3, N4,
75 . nn, ii, ix, k, nind, n, irsize, irecv(nspmd),
76 . ofc, ofq, oft, ofp ,ofr ,oftg, ofur,nconldf ,
77 . nconldl,
nl ,icomp ,idbs ,idb , ierr, nind2 ,
78 . nindpload ,numpresload, jj, iad, npres, np
80 INTEGER,
DIMENSION(:,:),
ALLOCATABLE :: NINDL
90 ALLOCATE(nindl(2,nconld+npresload))
94 nconldf = 1 + itask*nconld / nthread
95 nconldl = (itask+1)*nconld / nthread
102 DO nl=nconldf,nconldl
103 IF( ib(7,
nl) == 1 )
THEN
110 IF(itag(n1) == 0.OR.itag(n2) == 0.OR.
111 + itag(n3) == 0.OR.itag(n4) == 0)
THEN
113 ELSEIF(itag(numnod+n1)>=1.AND.itag(numnod+n2)>=1.AND.
114 + itag(numnod+n3)>=1.AND.itag(numnod+n4)>=1)
THEN
132 n1 = lloadp(iad+4*(n-1))
133 n2 = lloadp(iad+4*(n-1)+1)
134 n3 = lloadp(iad+4*(n-1)+2)
135 n4 = lloadp(iad+4*(n-1)+3)
136 numpresload = numpresload + 1
140 IF(itag(n1) == 0.OR.itag(n2) == 0.OR.
141 + itag(n3) == 0.OR.itag(n4) == 0)
THEN
142 loadp_tagdel(numpresload) = 1
143 ELSEIF(itag(numnod+n1)>=1.AND.itag(numnod+n2)>=1.AND.
144 + itag(numnod+n3)>=1.AND.itag(numnod+n4)>=1)
THEN
146 nindl(1,nind) = iad+4*(n-1)
147 nindl(2,nind) = numpresload
157 IF(n <= nindpload)
THEN
171 DO j = addcnel(n1),addcnel(n1+1)-1
173 IF(tagel(ii) > 0)
THEN
183 ELSEIF(ii > ofq.AND.ii<=ofc)
THEN
189 ELSEIF(ii > ofc.AND.ii<=oft)
THEN
195 ELSEIF(ii > oftg.AND.ii<=ofur)
THEN
201 ELSEIF(ii > oft.AND.ii<=ofp)
THEN
207 ELSEIF(ii > ofp.AND.ii<=ofr)
THEN
213 ELSEIF(ii > ofr.AND.ii<=oftg)
THEN
219 IF(nint(geo(12,ixr(1,ii))) == 12)
THEN
225 IF(itagl(n1)+itagl(n2)+itagl(n3)+itagl(n4) == 4)
THEN
232 IF(n <= nindpload)
THEN
245 IF(n <= nindpload)
THEN
251 ibufs(4*(nind2-1)+1 ) = itab(n1)
252 ibufs(4*(nind2-1)+2 ) = itab(n2)
253 ibufs(4*(nind2-1)+3 ) = itab(n3)
254 ibufs(4*(nind2-1)+4 ) = itab(n4)
256#include "lockoff.inc"
280 1 ibufs ,4*nindg ,ixs ,ixc ,ixtg ,
281 2 ixq ,iparg ,itagl ,nodes,tagel ,
282 3 irsize ,irecv ,cnel ,addcnel,ofc ,
283 4 oft ,oftg ,ofur ,ofr ,ofp ,
284 5 ofq ,nindg ,ixp ,ixr ,ixt ,
subroutine chkload(ib, ixs, ixq, ixc, ixt, ixp, ixr, ixtg, itag, itask, itagl, itab, nodes, addcnel, cnel, tagel, iparg, geo, ibufs, nindex, nindg, npresload, loadp_tagdel, iloadp, lloadp, iad_elem)
subroutine spmd_exchseg_idel(bufs, lbufs, ixs, ixc, ixtg, ixq, iparg, itagl, nodes, tagel, irsize, irecv, cnel, addcnel, ofc, oft, oftg, ofur, ofr, ofp, ofq, lindex, ixp, ixr, ixt, geo, iad_elem)