37 SUBROUTINE init_th0( IPARG,ELBUF_TAB,IGEO,IXR,TH,
51#include "implicit_f.inc"
59#include "tabsiz_c.inc"
63 INTEGER MBUFFER, NPARTL
64 INTEGER IPARG(NPARG,*),IGEO(NPROPGI,*),IXR(NIXR,*)
65 INTEGER,
DIMENSION(NUMNOD),
INTENT(in)
67 TYPE (ELBUF_STRUCT_),
DIMENSION(NGROUP) :: ELBUF_TAB
68 TYPE (TH_),
INTENT(IN),
TARGET ::
73 INTEGER :: ID,LOCAL_ID
74 INTEGER,
POINTER :: ITHGR
75INTEGER,
DIMENSION(10) :: ALREADY_DONE
76 INTEGER :: SITHBUF,SITHGRP
83 already_done(1:10) = 0
86 IF(nthgrp01(id)/=0)
THEN
88 ithgr => th%ITHGRPA(1)
93 ithgr => th%ITHGRPB(1)
98 ithgr => th%ITHGRPC(1)
100 sithbuf = th%SITHBUFC
103 ithgr => th%ITHGRPD(1)
104 ithb => th%ITHBUFD(1)
105 sithbuf = th%SITHBUFD
108 ithgr => th%ITHGRPE(1)
109 ithb => th%ITHBUFE(1)
110 sithbuf = th%SITHBUFE
113 ithgr => th%ITHGRPF(1)
114 ithb => th%ITHBUFF(1)
115 sithbuf = th%SITHBUFF
118 ithgr => th%ITHGRPG(1)
119 ithb => th%ITHBUFG(1)
120 sithbuf = th%SITHBUFG
123 ithgr => th%ITHGRPH(1)
124 ithb => th%ITHBUFH(1)
125 sithbuf = th%SITHBUFH
128 ithgr => th%ITHGRPI(1)
129 ithb => th%ITHBUFI(1)
130 sithbuf = th%SITHBUFI
133 CALL init_th(iparg,ithb,elbuf_tab,igeo,ixr,
134 . ithgr,nthgrp1(id),id,weight,sithbuf)
140 CALL init_th(iparg,th%ITHBUF,elbuf_tab,igeo,ixr,
141 . th%ITHGRP,nthgrp,id,weight,th%SITHBUF)
145 IF(abfile(id)/=0)
THEN
146 IF(id==2.OR.id==4.OR.id==5.OR.id==6.OR.id
THEN
148 IF(already_done(local_id)==0)
THEN
149 ithgr => th%ITHGRPA(1)
156 IF(already_done(local_id)==0)
THEN
157 ithgr => th%ITHGRPB(1)
163 IF(bool.EQV..true.)
THEN
164 already_done(local_id)=1
165 CALL init_th(iparg,ithb,elbuf_tab,igeo,ixr,
166 . ithgr,nthgrp1(id),id,weight,th%SITHBUF)
subroutine init_th(iparg, ithbuf, elbuf_tab, igeo, ixr, ithgrp, nthgrp2, id, weight, sithbuf)