34 SUBROUTINE i3pen2(X,IRECT,MSR,NSV,ILOC,IRTL,NSN,
35 1 CST,IRTLO,FRIC0,FRIC,GAP,IWPENE,
39 USE format_mod ,
ONLY : fmw_5i_f, fmw_5i
43#include "implicit_f.inc"
54 INTEGER IRECT(4,*), MSR(*), NSV(*), (*), IRTL(*), IRTLO(*), ITAB(*)
55 my_real x(3,*), cst(2,*), fric0(3,*)
57 CHARACTER(LEN=NCHARTITLE) :: TITR
61 INTEGER II, I, J, K, L, M, JJ
62 my_real N2, N3, YS, ZS, T2, T3, XL, PEN, SS, YM1, YM2, ZM1, ZM2
88 CALL ancmsg(msgid=80,msgtype=msgerror,anmode=aninfo,i1=id,c1=titr,i2=l,i3=itab(msr(irect(1,l))),i4=itab(msr(irect(2,l))))
94 pen=n2*(ys-ym1)+n3*(zs-zm1)-gap
98 ss=t2*(ys-ym1)+t3*(zs-zm1)
101 IF(ss> onep05)
GO TO 110
102 IF(ss<-onep05)
GO TO 110
105 CALL ancmsg(msgid=346,msgtype=msgwarning,anmode=aninfo_blind_2,i1=id,i2=itab(i),c1=titr,r1=pen)
108 WRITE(iout,fmt=fmw_5i_f)itab(i),itab(k),l,itab(msr(irect(1,l))),itab(msr(irect(2,l))),ss
110 IF(fric==0.0)
GO TO 150
116 WRITE(iout,fmt=fmw_5i)itab(i),itab(k),l,itab(msr(irect(1,l))),itab(msr(irect(2,l)))
subroutine i3pen2(x, irect, msr, nsv, iloc, irtl, nsn, cst, irtlo, fric0, fric, gap, iwpene, itab, 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)