OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
m2lawt.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!|| m2lawt ../engine/source/materials/mat/mat002/m2lawt.F
25!||--- called by ------------------------------------------------------
26!|| tforc3 ../engine/source/elements/truss/tforc3.F
27!||====================================================================
28 SUBROUTINE m2lawt(
29 1 PM, GEO, OFF, FOR,
30 2 EINT, AREA, AL0, PLA,
31 3 STI, MAT, MGM, NGL,
32 4 EPS, AL, NEL)
33C-----------------------------------------------
34C I m p l i c i t T y p e s
35C-----------------------------------------------
36#include "implicit_f.inc"
37#include "comlock.inc"
38C-----------------------------------------------
39C G l o b a l P a r a m e t e r s
40C-----------------------------------------------
41#include "mvsiz_p.inc"
42C-----------------------------------------------
43C C o m m o n B l o c k s
44C-----------------------------------------------
45#include "param_c.inc"
46#include "com08_c.inc"
47#include "units_c.inc"
48#include "scr17_c.inc"
49C-----------------------------------------------
50C D u m m y A r g u m e n t s
51C-----------------------------------------------
52 INTEGER, INTENT(IN) :: NEL
53 INTEGER MAT(MVSIZ),MGM(MVSIZ),NGL(MVSIZ)
54 my_real
55 . PM(NPROPM,*),GEO(NPROPG,*),OFF(*),FOR(*),EINT(*),
56 . area(*),al0(*),pla(*),sti(*),eps(mvsiz),al(mvsiz)
57C-----------------------------------------------
58C L o c a l V a r i a b l e s
59C-----------------------------------------------
60 INTEGER ICC(MVSIZ)
61 INTEGER I,J
62 my_real
63 . YM(MVSIZ),GAP(MVSIZ),
64 . ca(mvsiz),cb(mvsiz),cn(mvsiz),ymax(mvsiz),
65 . epmx(mvsiz),yld(mvsiz),ff(mvsiz),hh(mvsiz),
66 . aa(mvsiz),pr(mvsiz),yma
67C-----------------------------------------------
68C E x t e r n a l F u n c t i o n s
69C-----------------------------------------------
70 my_real
71 . cvmgt
72C-----------------------------------------------
73 DO i=1,nel
74 ym(i) =pm(20,mat(i))
75 pr(i) =pm(21,mat(i))
76 ca(i) =pm(38,mat(i))
77 cb(i) =pm(39,mat(i))
78 cn(i) =pm(40,mat(i))
79 epmx(i)=pm(41,mat(i))
80 ymax(i)=pm(42,mat(i))
81 icc(i) =nint(pm(49,mat(i)))
82 gap(i) =geo(2,mgm(i))
83 ENDDO
84c
85 DO i=1,nel
86 IF (gap(i) > zero .AND. al(i) <= (al0(i)-gap(i))) off(i)=one
87 ENDDO
88c
89 DO i=1,nel
90 eint(i)=eint(i)+for(i)*eps(i)*al(i)*dt1*half
91 ENDDO
92c
93 DO i=1,nel
94 area(i)=area(i)*(one - two*pr(i)*eps(i)*dt1*off(i))
95 ENDDO
96c
97 DO i=1,nel
98 yma = ym(i)*area(i)
99 for(i)=for(i)+yma*eps(i)*dt1
100 sti(i)=yma / al(i)
101 ENDDO
102c
103 DO i=1,nel
104 yld(i)=ca(i)+cb(i)*pla(i)**cn(i)
105 ENDDO
106C-----------------------
107C MODULE ECROUISSAGE
108C-----------------------
109 DO i=1,nel
110 IF (cn(i) == one) THEN
111 hh(i)= cb(i)
112 ELSE
113 IF (pla(i) /= zero) THEN
114 hh(i)= cb(i)*cn(i)/pla(i)**(one -cn(i))
115 ELSE
116 hh(i)=zero
117 ENDIF
118 ENDIF
119 ENDDO
120c
121 DO i=1,nel
122 aa(i) = (ym(i)+hh(i))*area(i)
123 yld(i) = min(yld(i),ymax(i))
124 ff(i) = abs(for(i))-yld(i)*area(i)
125 ff(i) = max(zero,ff(i))
126 ENDDO
127c
128 DO i=1,nel
129 pla(i)=pla(i)+ff(i)/aa(i)
130 ENDDO
131c
132 DO i=1,nel
133 for(i)=cvmgt(sign(yld(i)*area(i),for(i)),for(i),ff(i) > zero)
134 ENDDO
135C--------------------------------
136C TEST DE RUPTURE DUCTILE
137C-------------------------------
138 DO i=1,nel
139 IF (off(i) < em01) off(i)=zero
140 IF (off(i) < one) off(i)=off(i)*four_over_5
141 ENDDO
142c
143 DO i=1,nel
144 IF (off(i) < one) cycle
145 IF (pla(i) < epmx(i)) cycle
146 off(i)=off(i)*four_over_5
147 idel7nok = 1
148 ENDDO
149c
150 DO i=1,nel
151 IF (off(i) /= four_over_5) cycle
152#include "lockon.inc"
153 WRITE(iout,1000) ngl(i)
154 WRITE(istdo,1100) ngl(i),tt
155#include "lockoff.inc"
156 ENDDO
157c
158 DO i=1,nel
159 sti(i)=sti(i)*off(i)
160 for(i)= for(i)*off(i)
161 ENDDO
162c
163 DO i=1,nel
164 eint(i)=eint(i)+for(i)*eps(i)*al(i)*dt1*half
165 ENDDO
166C
167 1000 FORMAT(1x,'-- RUPTURE OF TRUSS ELEMENT NUMBER ',i10)
168 1100 FORMAT(1x,'-- RUPTURE OF TRUSS ELEMENT :',i10,' AT TIME :',g11.4)
169C-----------------------------------------------
170 RETURN
171 END
subroutine area(d1, x, x2, y, y2, eint, stif0)
subroutine ymax(idn, fac, npc, pld, stiffmin, stiffmax, stiffini, stiffavg)
Definition law100_upd.F:272
subroutine m2lawt(pm, geo, off, for, eint, area, al0, pla, sti, mat, mgm, ngl, eps, al, nel)
Definition m2lawt.F:33
#define min(a, b)
Definition macros.h:20
#define max(a, b)
Definition macros.h:21