35 SUBROUTINE i1tid3(X ,IRECT,CRST ,MSR ,NSV,
36 1 ILOC ,IRTL ,NSN ,ITAB ,IKINE,
37 2 IKINE1,ID ,TITR ,ILEV ,NTY, CSTS_BIS)
46 USE format_mod ,
ONLY : fmw_7i_2f
51#include "implicit_f.inc"
61 INTEGER IRECT(4,*), MSR(*), NSV(*), ILOC(*), IRTL(*), ITAB(*),IKINE(*),IKINE1(*),ILEV,NTY
62 my_real x(3,*), crst(2,*), csts_bis(2,*)
64 CHARACTER(LEN=NCHARTITLE) :: TITR
68 INTEGER II, I, J, K, L, JJ, NN, IER
70 . n1, n2, n3, ss, tt, alp
71 my_real :: xx1(4),xx2(4),xx3(4),xs1,ys1,zs1,xc,yc,zc
78 IF ((nty==1).OR.((nty==2).AND.(ilev /= 25 .and. ilev /= 2
THEN
79 CALL kinset(2,itab(i),ikine(i),1,0,ikine1(i))
80 CALL kinset(2,itab(i),ikine(i),2,0,ikine1(i))
81 CALL kinset(2,itab(i),ikine(i),3,0,ikine1(i))
82 CALL kinset(2,itab(i),ikine(i),4,0,ikine1(i))
83 CALL kinset(2,itab(i),ikine(i),5,0,ikine1(i))
84 CALL kinset(2,itab(i),ikine(i),6,0,ikine1(i))
98 CALL inist3(n1,n2,n3,ss,tt,ier,alp,xx1,xx2,xx3,xs1,ys1,zs1,xc,yc,zc)
99 IF(ipri>=1)
WRITE(iout,fmt=fmw_7i_2f)
101 . l,(itab(msr(irect(jj,l))),jj=1,4),ss,tt
111 . i5=itab(nsv(irect(1,l))),
112 . i6=itab(nsv(irect(2,l))),
113 . i7=itab(nsv(irect(3,l))),
114 . i8=itab(nsv(irect(4,l))))
117 . msgtype=msgwarning,
118 . anmode=aninfo_blind_2,
124 . i5=itab(msr(irect(1,l))),
125 . i6=itab(msr(irect(2,l))),
126 . i7=itab(msr(irect(3,l))),
127 . i8=itab(msr(irect(4,l))),
subroutine i1tid3(x, irect, crst, msr, nsv, iloc, irtl, nsn, itab, ikine, ikine1, id, titr, ilev, nty, csts_bis)
subroutine inist3(n1, n2, n3, ssc, ttc, ier, alp, xx1, xx2, xx3, xs1, ys1, zs1, xc, yc, zc)
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)