31 1 NGL, OFFG, VOLG, DELTAX,
35 5 NEL, NPT, ISMSTR, ISROT,DT )
43#include "implicit_f.inc"
52 INTEGER,
INTENT(IN) :: NEL
53 INTEGER,
INTENT(IN) :: NPT
54 INTEGER,
INTENT(IN) :: ISMSTR
55 INTEGER,
INTENT(IN) :: ISROT
58 my_real,
DIMENSION(NPROPG) ,
INTENT(IN) :: geo
59 my_real,
DIMENSION(MVSIZ) ,
INTENT(OUT) :: lc
61 . offg(*),volg(*),deltax(*), volg0(*),
62 . rx(*), ry(*), rz(*), sx(*), sy(*), sz(*),tx(*), ty(*), tz(*)
63 TYPE(
dt_),
INTENT(INOUT) :: DT
67 INTEGER I,ITET,IDELM,ICST
70 . a1x,a2x,a3x,a4x,a1y,a2y,a3y,a4y,a1z,a2z,a3z,a4z,
71 . vdefmin,vdefmax,aspmin,asptet,min_aspect,min_defv,delm
73 min_aspect = dt%BRICK_CST_COL_MIN
74 min_defv = dt%BRICK_CST_DEFV_MIN
79 delm = vdefmin +vdefmax+aspmin+asptet
81 IF((min_aspect+min_defv)==zero.AND.
82 . (ismstr==1.OR.ismstr==3.OR.ismstr==11)) icst=0
85 IF(idelm ==0.AND.delm==zero) idelm = 0
86 IF((idelm+icst) >0)
THEN
89 a1x = ry(i)*sz(i)-rz(i)*sy(i)
90 a1y = rz(i)*sx(i)-rx(i)*sz(i)
91 a1z = rx(i)*sy(i)-ry(i)*sx(i)
92 a1 = a1x*a1x+a1y*a1y+a1z*a1z
94 a2x = sy(i)*tz(i)-sz(i)*ty(i)
95 a2y = sz(i)*tx(i)-sx(i)*tz(i)
96 a2z = sx(i)*ty(i)-sy(i)*tx(i)
97 a2 = a2x*a2x+a2y*a2y+a2z*a2z
99 a3x = ty(i)*rz(i)-tz(i)*ry(i)
100 a3y = tz(i)*rx(i)-tx(i)*rz(i)
101 a3z = tx(i)*ry(i)-ty(i)*rx(i)
102 a3 = a3x*a3x+a3y*a3y+a3z*a3z
107 a4 = a4x*a4x+a4y*a4y+a4z*a4z
109 lc(i) = six*volg(i)/sqrt(
max(a1,a2,a3,a4))
subroutine s10forc3(timers, output, elbuf_tab, ng, pm, geo, ixs, x, a, v, ms, w, flux, flu1, veul, fv, ale_connect, iparg, tf, npf, bufmat, partsav, nloc_dmg, dt2t, neltst, ityptst, stifn, fsky, iads, offset, eani, iparts, ixs10, iads10, nel, fx, fy, fz, ar, vr, dr, ipm, istrain, isolnod, itask, temp, fthe, fthesky, iexpan, stifr, d, gresav, grth, igrth, table, mssa, dmels, igeo, xdp, voln, condn, condnsky, sfem_nodvar, itagdn, sensors, ioutprt, mat_elem, h3d_strain, dt, idel7nok, snpc, stf, sbufmat, svis, nsvois, idtmins, idel7ng, maxfunc, userl_avail, glob_therm, impl_s, idyna, s_sfem_nodvar)
subroutine s10mallgeo3(ngl, offg, volg, deltax, volg0, rx, ry, rz, sx, sy, sz, tx, ty, tz, lc, geo, nel, npt, ismstr, isrot, dt)