OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
set_elgroup_param.F File Reference
#include "implicit_f.inc"
#include "param_c.inc"
#include "com04_c.inc"
#include "tabsiz_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine set_elgroup_param (group_param_tab, iparg, ngroup, n2d, ipm, igeo, pm, geo, bufmat)

Function/Subroutine Documentation

◆ set_elgroup_param()

subroutine set_elgroup_param ( type(group_param_), dimension(ngroup) group_param_tab,
integer, dimension(nparg,ngroup) iparg,
integer ngroup,
integer n2d,
integer, dimension(npropmi,nummat) ipm,
integer, dimension(npropgi,numgeo) igeo,
dimension(npropm,nummat) pm,
dimension(npropg,numgeo) geo,
dimension(sbufmat) bufmat )

Definition at line 29 of file set_elgroup_param.F.

33C-----------------------------------------------
34C M o d u l e s
35C-----------------------------------------------
36 USE group_param_mod
37C-----------------------------------------------
38C I m p l i c i t T y p e s
39C-----------------------------------------------
40#include "implicit_f.inc"
41C-----------------------------------------------
42C C o m m o n B l o c k s
43C-----------------------------------------------
44#include "param_c.inc"
45#include "com04_c.inc"
46#include "tabsiz_c.inc"
47C-----------------------------------------------
48C D u m m y A r g u m e n t s
49C-----------------------------------------------
50 INTEGER NGROUP,N2D
51 INTEGER ,DIMENSION(NPARG,NGROUP) :: IPARG
52 INTEGER ,DIMENSION(NPROPMI,NUMMAT) :: IPM
53 INTEGER ,DIMENSION(NPROPGI,NUMGEO) :: IGEO
54 my_real ,DIMENSION(NPROPM,NUMMAT) :: pm
55 my_real ,DIMENSION(NPROPG,NUMGEO) :: geo
56 my_real ,DIMENSION(SBUFMAT) :: bufmat
57 TYPE(GROUP_PARAM_) ,DIMENSION(NGROUP) :: GROUP_PARAM_TAB
58C-----------------------------------------------
59C L o c a l V a r i a b l e s
60C-----------------------------------------------
61 INTEGER NG,ITY,IGTYP,IDEF,IGMAT,IHBE,ISH3N,IEL,PID,IMAT,ILAW,IADD,
62 . NIP,ISMSTR,ICOAT
63 my_real dm,tcoat
64C=======================================================================
65 DO ng=1,ngroup
66 ity = iparg(5,ng)
67 IF (n2d == 0 .and. (ity == 3 .or. ity == 7)) THEN
68 ilaw = iparg(1,ng)
69 imat = iparg(18,ng)
70 pid = iparg(62,ng)
71 iel = iparg(3,ng)+1
72 igtyp = iparg(38,ng)
73 dm = geo(16,pid)
74 idef = igeo(31,pid)
75 igmat = igeo(98,pid)
76c IHBE = IGEO(10,PID) ! should be the same, GEO(171) is obsolete, check !!!
77 ihbe = nint(geo(171,pid))
78 ish3n = igeo(18,pid)
79c
80c Set default membrane shell viscosity parameter (DM)
81c
82 IF (dm == zero) THEN
83 SELECT CASE (ilaw)
84 CASE (65)
85 dm = fiveem2
86 CASE (19, 119)
87 IF (ity == 3 .AND. ihbe == 23) THEN
88 dm = zep015
89 ELSE
90 dm = fourth
91 END IF
92 CASE (58, 158)
93 IF (ihbe == 11) THEN
94 dm = one_fifth
95 ELSE
96 dm = three_over_4 * em01
97 END IF
98 CASE (25, 125, 127)
99 IF (ihbe == 23) dm = em01
100 CASE DEFAULT
101 IF (ihbe == 23 .AND. (igtyp == 1 .or. igtyp == 9)) dm = zep015
102 END SELECT
103 END IF
104c------ specific composite IGMAT > 0
105 IF (igmat > 0) THEN ! .and. (ILAW /= 15 .AND. ILAW /= 27)) THEN
106 IF (dm == zero) dm = fiveem2
107 ELSEIF ( ilaw == 15 .or. ilaw == 27 .or. ilaw == 25 .or. ilaw==125
108 . .or. ilaw == 127) THEN
109 IF (dm == zero) dm = fiveem2
110 ENDIF !(IGMAT > 0
111c
112 group_param_tab(ng)%VISC_DM = dm
113c
114c------ special settings for law119
115c
116 IF (ilaw == 119) THEN
117 iadd = max(1,ipm(7,imat))-1
118 icoat = nint(bufmat(iadd+14))
119 tcoat = bufmat(iadd+16)
120 ismstr = 11 ! force small strain formulation for law 119 regardless of input
121 ihbe = 11 ! force full shell integration (Batoz) for law 119 regardless of input
122 IF (icoat > zero .AND. tcoat > zero) THEN
123 nip = 3
124 ! update shell thickness in the property to take coating into account
125 geo(1,pid) = geo(1,pid) + two*tcoat
126 ELSE
127 nip = 1
128 END IF
129 iparg(6,ng) = nip
130 iparg(9,ng) = ismstr
131 iparg(23,ng)= ihbe
132 END IF
133
134
135 ELSE
136c
137 group_param_tab(ng)%VISC_DM = zero
138c
139 ENDIF
140c
141 group_param_tab(ng)%VISC_DN = zero
142
143 ENDDO
144c-----------
145 RETURN
#define my_real
Definition cppsort.cpp:32
#define max(a, b)
Definition macros.h:21