30 1 NEDGE ,LEDGE ,STFE ,STFM ,IGAP ,
31 2 GAPE ,GAP_E_L ,GAP_M ,GAP_M_L ,GAP_S_L ,
32 3 BGAPEMX ,INTFRIC ,IPARTFRIC_E,IPARTFRICM,IPARTSM ,
33 4 BGAPEMX_L,NSN ,NSV )
39#include "implicit_f.inc"
48 INTEGER NEDGE,IGAP,INTFRIC,
49 . LEDGE(,*),IPARTFRIC_E(*) ,IPARTFRICM(*), IPARTSM(*)
50 INTEGER ,
INTENT(IN) :: NSN
51 INTEGER ,
INTENT(IN) :: NSV(NSN)
53 . stfe(*), gape(*), gap_e_l(*), stfm
58 INTEGER I, A, B, N1, N2, IPRTA, IPRTB
61INTEGER,
DIMENSION(:),
ALLOCATABLE :: TAGSLAV
72 IF(stfa/=zero.AND.stfb/=zero)
THEN
73 stfe(i)=two*stfa*stfb/
max(zero,stfa+stfb)
75 stfe(i)=
max(stfa,stfb)
86 IF(a/=0) gapa=gap_m(a)
88 IF(b/=0) gapb=gap_m(b)
89 gape(i)=
max(gapa,gapb)
91 bgapemx =
max(bgapemx,gape(i))
97 ALLOCATE(tagslav(numnod))
105 gap_e_l(i)=
min(gap_s_l(tagslav(n1)),gap_s_l(tagslav(n2)))
108 bgapemx_l =
max(bgapemx_l,gap_e_l(i))
122 IF(a/=0) iprtga=ipartsm(a)
123 IF(a/=0) iprta=ipartfricm(a)
126 IF(b/=0) iprtgb=ipartsm(b)
127 IF(b/=0) iprtb=ipartfricm(b)
129 IF(iprta == iprtb)
THEN
130 ipartfric_e(i) = iprta
132 IF(iprtga > iprtgb )
THEN
133 ipartfric_e(i) = iprta
135 ipartfric_e(i) = iprtb
subroutine i25sti_edg(nedge, ledge, stfe, stfm, igap, gape, gap_e_l, gap_m, gap_m_l, gap_s_l, bgapemx, intfric, ipartfric_e, ipartfricm, ipartsm, bgapemx_l, nsn, nsv)