OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
cndleni.F
Go to the documentation of this file.
1Copyright> OpenRadioss
2Copyright> Copyright (C) 1986-2025 Altair Engineering Inc.
3Copyright>
4Copyright> This program is free software: you can redistribute it and/or modify
5Copyright> it under the terms of the GNU Affero General Public License as published by
6Copyright> the Free Software Foundation, either version 3 of the License, or
7Copyright> (at your option) any later version.
8Copyright>
9Copyright> This program is distributed in the hope that it will be useful,
10Copyright> but WITHOUT ANY WARRANTY; without even the implied warranty of
11Copyright> MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
12Copyright> GNU Affero General Public License for more details.
13Copyright>
14Copyright> You should have received a copy of the GNU Affero General Public License
15Copyright> along with this program. If not, see <https://www.gnu.org/licenses/>.
16Copyright>
17Copyright>
18Copyright> Commercial Alternative: Altair Radioss Software
19Copyright>
20Copyright> As an alternative to this open-source version, Altair also offers Altair Radioss
21Copyright> software under a commercial license. Contact Altair to discuss further if the
22Copyright> commercial version may interest you: https://www.altair.com/radioss/.
23!||====================================================================
24!|| cndleni ../starter/source/elements/shell/coqueba/cndleni.F
25!||--- called by ------------------------------------------------------
26!|| cbainit3 ../starter/source/elements/shell/coqueba/cbainit3.F
27!||--- uses -----------------------------------------------------
28!||====================================================================
29 SUBROUTINE cndleni(PM ,GEO ,STIFN ,STIFR ,IXC ,
30 . THK ,IHBE ,IGEO ,SH4TREE ,ALDT ,
31 . UPARAM ,IPM ,NLAY ,PM_STACK, ISUBSTACK,
32 . STRC ,AREA ,IMAT ,IPROP ,DTEL ,
33 . X2L ,X3L ,X4L ,Y2L ,Y3L ,Y4L ,
34 . IGEO_STACK ,GROUP_PARAM)
35C-----------------------------------------------
36C M o d u l e s
37C-----------------------------------------------
38 USE group_param_mod
39C-----------------------------------------------
40C I m p l i c i t T y p e s
41C-----------------------------------------------
42#include "implicit_f.inc"
43C-----------------------------------------------
44C G l o b a l P a r a m e t e r s
45C-----------------------------------------------
46#include "mvsiz_p.inc"
47C-----------------------------------------------
48C C o m m o n B l o c k s
49C-----------------------------------------------
50#include "param_c.inc"
51#include "remesh_c.inc"
52#include "vect01_c.inc"
53C-----------------------------------------------
54C D u m m y A r g u m e n t s
55C-----------------------------------------------
56 INTEGER IMAT, IPROP
57 INTEGER IXC(NIXC,*),IGEO(NPROPGI,*),IHBE, SH4TREE(KSH4TREE,*),
58 . IPM(NPROPMI,*),NLAY,ISUBSTACK,IGEO_STACK(4*NPT_STACK+2,*)
59C REAL
60 my_real
61 . pm(npropm,*), geo(npropg,*),stifn(*),stifr(*),thk(*),aldt(*),
62 . uparam(*),pm_stack(20,*),strc(*), dtel(mvsiz),
63 . x2l(mvsiz),x3l(mvsiz),x4l(mvsiz),y2l(mvsiz),y3l(mvsiz),y4l(mvsiz)
64 TYPE(group_param_) :: GROUP_PARAM
65C-----------------------------------------------
66C L o c a l V a r i a b l e s
67C-----------------------------------------------
68 INTEGER I,N, IMT, IPMAT, IGTYP,IADB,
69 . i1,i3,ipthk,ippos,i2,matly,ipgmat,igmat,ipos,nip,mlawly
70 my_real
71 . area(mvsiz),ssp(mvsiz), al1(mvsiz),
72 . al2(mvsiz),
73 . almin(mvsiz),lxyz0(2),corel(2,4)
74 my_real
75 . viscmx,a11,a11r,a12,b1,b2,vv,sti,stir,viscdef,rho,young,nu,
76 . x13,x24,y13,y24,l13,l24,c1,c2,thkly,posly,
77 . fac,visce,rx,ry,sx,sy,s1,fac1,fac2,faci,fac11,gmax,z0
78 my_real, DIMENSION(MVSIZ) :: zoffset
79C=======================================================================
80 fac = two
81C
82 igtyp = nint(geo(12,iprop))
83 igmat = igeo(98,iprop)
84 ipgmat = 700
85 ssp(lft:llt) = zero
86
87 z0 = geo(199,iprop)
88 zoffset(lft:llt) = zero
89 SELECT CASE(igtyp)
90 CASE (1,9,10,11,16)
91 DO i=lft,llt
92 zoffset(i) = z0
93 ENDDO
94 CASE (17,51,52)
95 ipos = igeo(99,iprop)
96 IF(ipos == 2) THEN
97 DO i=lft,llt
98 zoffset(i) = z0 - half*thk(i)
99 ENDDO
100 ELSEIF (ipos== 3 .OR. ipos == 4) THEN
101 DO i=lft,llt
102 z0= half*thk(i)
103 zoffset(i) = z0
104 ENDDO
105 ENDIF
106 CASE DEFAULT
107 zoffset(lft:llt) = zero
108 END SELECT
109c
110C
111 IF ((igtyp == 11 .AND. igmat < 0) .OR. igtyp == 16 ) THEN
112 ipmat = 100
113 nip = npt
114 IF (mtn<=28) THEN
115 DO i=lft,llt
116 DO n=1,nip
117 imt = igeo(ipmat+n,iprop)
118 ssp(i)=max(ssp(i),pm(27,imt))
119 ENDDO
120 ENDDO
121 ELSEIF (mtn == 42) THEN
122 DO i=lft,llt
123 DO n=1,nip
124 imt = igeo(ipmat+n,iprop)
125 rho = pm(1,imt)
126 nu = pm(21,imt)
127 gmax = pm(22,imt)
128 a11 = gmax*(one + nu)/(one - nu**2)
129 ssp(i)= max(ssp(i), sqrt(a11/rho))
130 ENDDO
131 ENDDO
132 ELSEIF (mtn == 69) THEN
133 DO i=lft,llt
134 DO n=1,nip
135 imt = igeo(ipmat+n,iprop)
136 iadb = ipm(7,imt)-1
137 nu = uparam(iadb+14)
138 gmax = uparam(iadb+1)*uparam(iadb+6)
139 . + uparam(iadb+2)*uparam(iadb+7)
140 . + uparam(iadb+3)*uparam(iadb+8)
141 . + uparam(iadb+4)*uparam(iadb+9)
142 . + uparam(iadb+5)*uparam(iadb+10)
143 rho = pm(1,imt)
144 a11 = gmax*(one + nu)/(one - nu**2)
145 ssp(i)=max(ssp(i), sqrt(a11/rho))
146 ENDDO
147 ENDDO
148 ELSEIF (mtn == 65) THEN
149 DO i=lft,llt
150 DO n=1,nip
151 imt =igeo(ipmat+n,iprop)
152 rho =pm(1,imt)
153 young=pm(20,imt)
154 ssp(i)=max(ssp(i), sqrt(young/rho))
155 ENDDO
156 ENDDO
157 ELSE
158 DO i=lft,llt
159 DO n=1,nip
160 imt =igeo(ipmat+n,iprop)
161 rho =pm(1,imt)
162 young=pm(20,imt)
163 nu =pm(21,imt)
164 ssp(i)=max(ssp(i), sqrt(young/(one-nu*nu)/rho))
165 ENDDO
166 ENDDO
167 ENDIF
168CCC
169 ELSEIF (igtyp == 17 .AND. igmat < 0) THEN
170 nip = npt
171 ipmat = 2 + nip
172 IF (mtn<=28) THEN
173 DO i=lft,llt
174 DO n=1,nip
175 imt = igeo_stack(ipmat + n,isubstack)
176 ssp(i)=max(ssp(i),pm(27,imt))
177 ENDDO
178 ENDDO
179 ELSEIF (mtn == 42) THEN
180 DO i=lft,llt
181 DO n=1,nip
182 imt = igeo_stack(ipmat + n,isubstack)
183 rho = pm(1,imt)
184 nu = pm(21,imt)
185 gmax = pm(22,imt)
186 a11 = gmax*(one + nu)/(one - nu**2)
187 ssp(i)= max(ssp(i), sqrt(a11/rho))
188 ENDDO
189 ENDDO
190 ELSEIF (mtn == 69) THEN
191 DO i=lft,llt
192 DO n=1,nip
193 imt = igeo_stack(ipmat + n,isubstack)
194 iadb = ipm(7,imt)-1
195 nu = uparam(iadb+14)
196 gmax = uparam(iadb+1)*uparam(iadb+6)
197 . + uparam(iadb+2)*uparam(iadb+7)
198 . + uparam(iadb+3)*uparam(iadb+8)
199 . + uparam(iadb+4)*uparam(iadb+9)
200 . + uparam(iadb+5)*uparam(iadb+10)
201 rho = pm(1,imt)
202 a11 = gmax*(one + nu)/(one - nu**2)
203 ssp(i)=max(ssp(i), sqrt(a11/rho))
204 ENDDO
205 ENDDO
206 ELSEIF (mtn == 65) THEN
207 DO i=lft,llt
208 DO n=1,nip
209 imt =igeo_stack(ipmat + n,isubstack)
210 rho =pm(1,imt)
211 young=pm(20,imt)
212 ssp(i)=max(ssp(i), sqrt(young/rho))
213 ENDDO
214 ENDDO
215 ELSE
216 DO i=lft,llt
217 DO n=1,nip
218 imt =igeo_stack(ipmat + n,isubstack)
219 rho =pm(1,imt)
220 young=pm(20,imt)
221 nu =pm(21,imt)
222 ssp(i)=max(ssp(i), sqrt(young/(one-nu*nu)/rho))
223 ENDDO
224 ENDDO
225 ENDIF
226 ELSEIF (igtyp == 51 .AND. igmat < 0) THEN
227 nip = nlay
228 ipmat = 2 + nlay
229 DO i=lft,llt
230 DO n=1,nip
231 imt = igeo_stack(ipmat + n,isubstack)
232 mlawly = nint(pm(19,imt))
233 IF (mlawly <= 28) THEN
234 ssp(i)=max(ssp(i),pm(27,imt))
235 ELSEIF (mlawly == 42) THEN
236 rho = pm(1,imt)
237 nu = pm(21,imt)
238 gmax = pm(22,imt)
239 a11 = gmax*(one + nu)/(one - nu**2)
240 ssp(i)= max(ssp(i), sqrt(a11/rho))
241 ELSEIF (mlawly == 69) THEN
242 iadb = ipm(7,imt)-1
243 nu = uparam(iadb+14)
244 gmax = uparam(iadb+1)*uparam(iadb+6)
245 . + uparam(iadb+2)*uparam(iadb+7)
246 . + uparam(iadb+3)*uparam(iadb+8)
247 . + uparam(iadb+4)*uparam(iadb+9)
248 . + uparam(iadb+5)*uparam(iadb+10)
249 rho = pm(1,imt)
250 a11 = gmax*(one + nu)/(one - nu**2)
251 ssp(i)=max(ssp(i), sqrt(a11/rho))
252 ELSEIF (mlawly == 65) THEN
253 rho =pm(1,imt)
254 young=pm(20,imt)
255 ssp(i)=max(ssp(i), sqrt(young/rho))
256 ELSE
257 rho =pm(1,imt)
258 young=pm(20,imt)
259 nu =pm(21,imt)
260 ssp(i)=max(ssp(i), sqrt(young/(one-nu*nu)/rho))
261 ENDIF
262 ENDDO
263 ENDDO
264 ELSEIF (igtyp == 11 .AND. igmat > 0) THEN
265 DO i=lft,llt
266 ssp(i) = geo(ipgmat +9 ,iprop)
267 ENDDO
268 ELSEIF (igtyp == 52 .OR.
269 . ((igtyp == 51 .OR. igtyp == 17 ).AND. igmat > 0)) THEN
270 DO i=lft,llt
271 ssp(i) = pm_stack(9 ,isubstack)
272 ENDDO
273 ELSEIF (mtn<=28)THEN
274 DO i=lft,llt
275 ssp(i)=pm(27,imat)
276 ENDDO
277 ELSEIF (mtn == 42) THEN
278 DO i=lft,llt
279 rho = pm(1 ,imat)
280 nu = pm(21,imat)
281 gmax = pm(22,imat)
282 a11 = gmax*(one + nu)/(one - nu**2)
283 ssp(i)= max(ssp(i), sqrt(a11/rho))
284 ENDDO
285 ELSEIF (mtn == 69) THEN
286 DO i=lft,llt
287 iadb = ipm(7,imat)-1
288 nu = uparam(iadb+14)
289 gmax = uparam(iadb+1)*uparam(iadb+6)
290 . + uparam(iadb+2)*uparam(iadb+7)
291 . + uparam(iadb+3)*uparam(iadb+8)
292 . + uparam(iadb+4)*uparam(iadb+9)
293 . + uparam(iadb+5)*uparam(iadb+10)
294 rho = pm(1,imat)
295 a11 = gmax*(one + nu)/(one - nu**2)
296 ssp(i)=max(ssp(i), sqrt(a11/rho))
297 ENDDO
298 ELSEIF (mtn == 65) THEN
299 DO i=lft,llt
300 rho =pm(1,imat)
301 young=pm(20,imat)
302 ssp(i)=sqrt(young/rho)
303 ENDDO
304 ELSE
305 DO i=lft,llt
306 rho =pm(1,imat)
307 young=pm(20,imat)
308 nu =pm(21,imat)
309 ssp(i)=sqrt(young/(one-nu*nu)/rho)
310 ENDDO
311 ENDIF
312C-------longueur caracteristique--------------
313 fac11=five_over_4
314 IF (ihbe == 11) fac11=four_over_3
315 DO i=lft,llt
316 lxyz0(1)=fourth*(x2l(i)+x3l(i)+x4l(i))
317 lxyz0(2)=fourth*(y2l(i)+y3l(i)+y4l(i))
318 corel(1,1)=-lxyz0(1)
319 corel(1,2)=x2l(i)-lxyz0(1)
320 corel(1,3)=x3l(i)-lxyz0(1)
321 corel(1,4)=x4l(i)-lxyz0(1)
322 corel(2,1)=-lxyz0(2)
323 corel(2,2)=y2l(i)-lxyz0(2)
324 corel(2,3)=y3l(i)-lxyz0(2)
325 corel(2,4)=y4l(i)-lxyz0(2)
326 x13=(corel(1,1)-corel(1,3))*half
327 x24=(corel(1,2)-corel(1,4))*half
328 y13=(corel(2,1)-corel(2,3))*half
329 y24=(corel(2,2)-corel(2,4))*half
330
331C
332 l13=x13*x13+y13*y13
333 l24=x24*x24+y24*y24
334 al1(i)=max(l13,l24)
335 c1 =corel(1,2)*corel(2,4)-corel(2,2)*corel(1,4)
336 c2 =corel(1,1)*corel(2,3)-corel(2,1)*corel(1,3)
337 al2(i) =max(abs(c1),abs(c2))/area(i)
338 rx=x24-x13
339 ry=y24-y13
340 sx=-x24-x13
341 sy=-y24-y13
342 c1=sqrt(rx*rx+ry*ry)
343 c2=sqrt(sx*sx+sy*sy)
344 s1=fourth*(max(c1,c2)/min(c1,c2)-one)
345 fac1=min(half,s1)+one
346 fac2=area(i)/(c1*c2)
347 fac2=3.413*max(zero,fac2-0.7071)
348 fac2=0.78+0.22*fac2*fac2*fac2
349 faci=two*fac1*fac2
350 s1 = sqrt(faci*(fac11+al2(i))*al1(i))
351 s1 = max(s1,em20)
352 al1(i)=s1
353 ENDDO
354c-------------------------------------------------------
355 IF (ihbe == 11) THEN
356 DO i=lft,llt
357 almin(i)= area(i)/al1(i)
358 ENDDO
359 visce=em3
360 ELSEIF (ihbe == 23) THEN
361 DO i=lft,llt
362 almin(i)= area(i)/al1(i)
363 ENDDO
364 visce=zep015
365 ELSE
366 DO i=lft,llt
367 almin(i)= area(i)/sqrt(fac*al1(i))
368 ENDDO
369 visce=zero
370 ENDIF
371C
372 IF(mtn == 19)THEN
373 viscdef=fourth
374 ELSEIF(mtn == 25.OR.mtn == 27)THEN
375 viscdef=fiveem2
376 ELSE
377 viscdef=zero
378 ENDIF
379c
380 viscmx = group_param%VISC_DM
381 visce = geo(13,iprop)
382 IF (viscmx == zero) viscmx = viscdef
383 IF (mtn == 1 .OR.mtn == 2 .OR. mtn == 3.OR.
384 . mtn == 22.OR.mtn == 23.OR.mtn == 91) viscmx = zero
385 viscmx = max(viscmx,visce)
386 viscmx = sqrt(one + viscmx*viscmx)-viscmx
387c
388 DO i=lft,llt
389 dtel(i)= almin(i)*viscmx/ssp(i)
390 aldt(i)= almin(i)
391 ENDDO
392C----------------------------------------------------------
393C DT NODAL
394C----------------------------------------------------------
395 ipgmat = 700
396 IF(nadmesh == 0)THEN
397 IF(igtyp == 11 .AND. igmat > 0)THEN
398 DO i=lft,llt
399 a11 =geo(ipgmat +5 ,iprop)
400 a11r =geo(ipgmat +7 ,iprop)
401 vv = viscmx * almin(i)
402 vv = vv*vv
403 fac = half*area(i)*thk(i) / vv
404 sti = fac * a11
405 stir = one_over_12*fac*a11r*thk(i)**2
406 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
407 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
408 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
409 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
410 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
411 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
412 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
413 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
414 strc(i) = stir
415 ENDDO
416 ELSEIF(igtyp == 52 .OR.
417 . ((igtyp == 17 .OR. igtyp == 51) .AND. igmat > 0)) THEN
418 DO i=lft,llt
419 a11 = pm_stack(5 ,isubstack)
420 a11r = pm_stack(7 ,isubstack)
421 vv = viscmx * almin(i)
422 vv = vv*vv
423 fac = half*area(i)*thk(i) / vv
424 sti = fac * a11
425 stir = fac*a11r*(one_over_12*thk(i)**2 + zoffset(i)*zoffset(i))
426 !! . + FAC *A11*AREA(I)*ONE_OVER_12
427 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
428 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
429 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
430 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
431 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
432 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
433 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
434 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
435 strc(i) = stir
436 ENDDO
437 ELSE
438 DO i=lft,llt
439 a11 =pm(24,imat)
440 vv = viscmx * almin(i)
441 vv = vv*vv
442 sti = half*thk(i) *area(i)* a11 / vv
443 stir = sti * thk(i)*thk(i) * one_over_12
444 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
445 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
446 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
447 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
448 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
449 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
450 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
451 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
452 strc(i) = stir
453 ENDDO
454 ENDIF
455 ELSE
456 IF(igtyp == 11 .AND. igmat > 0) THEN
457 DO i=lft,llt
458 n=nft+i
459 IF(sh4tree(3,n) >= 0)THEN
460 a11 = geo(ipgmat +5 ,iprop)
461 a11r = geo(ipgmat +7 ,iprop)
462 vv = viscmx * almin(i)
463 vv = vv*vv
464 fac = half*area(i)*thk(i) / vv
465 sti = fac * a11
466 stir = one_over_12*fac*a11r*thk(i)**2
467 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
468 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
469 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
470 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
471 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
472 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
473 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
474 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
475 strc(i) = stir
476 END IF
477 END DO
478 ELSEIF(igtyp == 52 .OR.
479 . ((igtyp == 17.OR. igtyp == 51) .AND. igmat > 0 )) THEN
480 DO i=lft,llt
481 n=nft+i
482 IF(sh4tree(3,n) >= 0)THEN
483 a11 = pm_stack(5 ,isubstack)
484 a11r = pm_stack(7 ,isubstack)
485 vv = viscmx * almin(i)
486 vv = vv*vv
487 fac = half*area(i)*thk(i) / vv
488 sti = fac * a11
489 stir = fac*a11r*(one_over_12*thk(i)**2 + zoffset(i)*zoffset(i))
490 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
491 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
492 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
493 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
494 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
495 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
496 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
497 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
498 strc(i) = stir
499 END IF
500 END DO
501 ELSE
502 DO i=lft,llt
503 n=nft+i
504 IF(sh4tree(3,n) >= 0)THEN
505 a11 =pm(24,imat)
506 vv = viscmx * almin(i)
507 vv = vv*vv
508 sti = half*thk(i) *area(i)* a11 / vv
509 stir = sti * thk(i)*thk(i) * one_over_12
510 stifn(ixc(2,i))=stifn(ixc(2,i))+sti
511 stifn(ixc(3,i))=stifn(ixc(3,i))+sti
512 stifn(ixc(4,i))=stifn(ixc(4,i))+sti
513 stifn(ixc(5,i))=stifn(ixc(5,i))+sti
514 stifr(ixc(2,i))=stifr(ixc(2,i))+stir
515 stifr(ixc(3,i))=stifr(ixc(3,i))+stir
516 stifr(ixc(4,i))=stifr(ixc(4,i))+stir
517 stifr(ixc(5,i))=stifr(ixc(5,i))+stir
518 strc(i) = stir
519 END IF
520 END DO
521 ENDIF
522 END IF
523C----------------------------------------------------------
524 IF (ismstr == 3) THEN
525 IF (geo(5,iprop) /=zero) geo(5,iprop)= min(geo(5,iprop),dtel(i))
526 ENDIF
527c-----------
528 RETURN
529 END
subroutine cndleni(pm, geo, stifn, stifr, ixc, thk, ihbe, igeo, sh4tree, aldt, uparam, ipm, nlay, pm_stack, isubstack, strc, area, imat, iprop, dtel, x2l, x3l, x4l, y2l, y3l, y4l, igeo_stack, group_param)
Definition cndleni.F:35
subroutine dtel(ssp, pm, geo, pid, mat, rho0, vis, deltax, aire, vol, dtx)
Definition dtel.F:46
subroutine area(d1, x, x2, y, y2, eint, stif0)
#define min(a, b)
Definition macros.h:20
#define max(a, b)
Definition macros.h:21