33 SUBROUTINE admlcnt(NIX ,IX ,NUMEL ,IPARTEL ,IPART ,
34 . KELTREE ,ELTREE ,KSONTREE ,NSONTREE,KLEVTREE,
35 . NLIST ,MESS ,IX1 ,IX2 ,INDEX ,
36 . KK ,NEL ,TYPE ,ID ,TITR)
41 USE format_mod ,
ONLY : fmt_10i
43 USE reader_old_mod ,
ONLY : line, irec
47#include "implicit_f.inc"
56 INTEGER NIX, IX(NIX,*), NUMEL, IPARTEL(*), IPART(LIPART1,*),
57 . KELTREE, ELTREE(KELTREE,*), KSONTREE, NSONTREE, KLEVTREE,
58 . NLIST,IX1(*), IX2(*), INDEX(*), KK, NEL, LEVEL
61 CHARACTER(LEN=NCHARTITLE) :: TITR,TYPE
65 INTEGER (NLIST), IL, JREC, J10(10)
66 INTEGER I, J, NOLD, K, IWORK(70000)
67 INTEGER , NE, IP, NLEV
75 READ(iin,rec=jrec,err=999,fmt=
'(A)')line
76 DO WHILE(line(1:1)/=
'/')
77 READ(line,err=999,fmt=fmt_10i) j10
85 READ(iin,rec=jrec,err=999,fmt=
'(A)')line
91 CALL my_orders(0,iwork,list,index,nlist,1)
93 index(nlist+i) = list(index(i))
98 IF(nold/=index(nlist+i))k=k+1
99 list(k) = index(nlist+i)
100 nold = index(nlist+i)
110 CALL my_orders(0,iwork,ix2,index,numel,1)
112 ix1(i) = ix2(index(i))
125 DO WHILE(list(i)>ix1(j).AND.j<numel)
128 IF(list(i)==ix1(j))
THEN
153 level =eltree(klevtree,ne)
154 IF(level < 0) level=-(level+1)
156 lelt=lelt+nsontree**(nlev-level)
179 SUBROUTINE admlist(NIX ,IX ,NUMEL ,IPARTEL ,IPART ,
180 . KELTREE ,ELTREE ,KSONTREE,NSONTREE ,KLEVTREE,
181 . NLIST ,MESS ,IX1 ,IX2 ,INDEX ,
182 . KK ,NEL ,NELT ,TYPE ,ID ,
189 USE format_mod ,
ONLY : fmt_10i
190 USE reader_old_mod ,
ONLY : line, irec
194#include "implicit_f.inc"
198#include "remesh_c.inc"
199#include "scr17_c.inc"
200#include "units_c.inc"
204 INTEGER nix, ix(nix,*), , IPARTEL(*), IPART(LIPART1,*),
205 . KELTREE, (KELTREE,*), KSONTREE, NSONTREE, KLEVTREE,
206 . NLIST, IX1(*), IX2(*), INDEX(*), KK, NEL, NELT(*)
209 CHARACTER(LEN=NCHARTITLE) :: TITR,TYPE
213 INTEGER LIST(NLIST), IL, JREC, J10(10)
214 INTEGER I, J, NOLD, K, IWORK(70000)
215 INTEGER LELT, LELT1, LELT2, NE, KE, IP, LEVEL, NLEV,
216 . leltmp, neltmp(nsontree**(levelmax+1))
224 READ(iin,rec=jrec,err=999,fmt=
'(A)')line
225 DO WHILE(line(1:1)/=
'/')
226 READ(line,err=999,fmt=fmt_10i) j10
234 READ(iin,rec=jrec,err=999,fmt=
'(A)')line
240 CALL my_orders(0,iwork,list,index,nlist,1)
242 index(nlist+i) = list(index(i))
245 nold = index(nlist+1)
247 IF(nold/=index(nlist+i))k=k+1
248 list(k) = index(nlist+i)
249 nold = index(nlist+i)
259 CALL my_orders(0,iwork,ix2,index,numel,1)
261 ix1(i) = ix2(index(i))
274 DO WHILE(list(i)>ix1(j).AND.j<numel)
277 IF(list(i)==ix1(j))
THEN
280 CALL ancmsg(msgid=70, msgtype=msgerror, anmode=aninfo, c1=
TYPE, i1=id, c2=titr, i2=list(i))
303 level =eltree(klevtree,ne)
304 IF(level < 0) level=-(level+1)
309 DO WHILE(level < nlev)
313 neltmp(leltmp)=eltree(ksontree,neltmp(ke))+k
325 nelt(lelt)=neltmp(ke)
subroutine admlcnt(nix, ix, numel, ipartel, ipart, keltree, eltree, ksontree, nsontree, klevtree, nlist, mess, ix1, ix2, index, kk, nel, type, id, titr)
subroutine admlist(nix, ix, numel, ipartel, ipart, keltree, eltree, ksontree, nsontree, klevtree, nlist, mess, ix1, ix2, index, kk, nel, nelt, type, id, titr)
subroutine ancmsg(msgid, msgtype, anmode, i1, i2, i3, i4, i5, i6, i7, i8, i9, i10, i11, i12, i13, i14, i15, i16, i17, i18, i19, i20, r1, r2, r3, r4, r5, r6, r7, r8, r9, c1, c2, c3, c4, c5, c6, c7, c8, c9, prmode)