40
41
42
47 USE defaults_mod
48
49
50
51#include "implicit_f.inc"
52
53
54
55#include "param_c.inc"
56#include "tablen_c.inc"
57
58
59
60
61
62
63
64
65
66
67
68
69
70 TYPE (UNIT_TYPE_),INTENT(IN) ::UNITAB
71 INTEGER IGEO(NPROPGI)
72 INTEGER IG,IGTYP
74
75 TYPE(PROP_TAG_) , DIMENSION(0:MAXPROP) :: PROP_TAG
76 TYPE(SUBMODEL_DATA),INTENT(IN)::LSUBMODEL(*)
78 . pargeo(*)
79 TYPE(SOLID_DEFAULTS_), INTENT(IN) :: DEFAULTS_SOLID
80
81
82
83 INTEGER IOUT,IERROR,NUVAR,NPG,JCVT,ISMSTR
84 INTEGER IHBE_DS,ISST_DS,IPLA_DS,IFRAME_DS
86 . tthick
87 LOGICAL IS_AVAILABLE, IS_ENCRYPTED
88
89 is_encrypted = .false.
90 is_available = .false.
91
92 nuvar = 0
93 npg = 4
94 jcvt = 1
95 ismstr = 0
96
97 ihbe_ds= defaults_solid%ISOLID
98 isst_ds= defaults_solid%ISMSTR
99 iframe_ds= defaults_solid%IFRAME
100
101
102
103
105
106
107
108 CALL hm_get_intv(
'Ismstr',ismstr,is_available,lsubmodel)
109
110
111
112 CALL hm_get_floatv(
'THICK',tthick,is_available,lsubmodel,unitab)
113
114 geo(41) = tthick
115
116 pargeo(1) = 0
117 pargeo(2) = 0
118 pargeo(3) = 0
119 pargeo(4) = npg
120 pargeo(5) = jcvt
121 IF (ismstr == 0) ismstr = isst_ds
122 IF (ismstr < 0 .OR. isst_ds==-2) ismstr = 1
123 IF (ismstr == 0 .OR. ismstr == 2 .OR. ismstr == 3) ismstr = 1
124 IF (ismstr == 10) ismstr = 4
125
126 igeo(5) = ismstr
127
128
129
130 IF(.NOT. is_encrypted)THEN
131 IF(tthick > 0) THEN
132 WRITE(iout,1100) ig,ismstr,tthick
133 ELSE
134 WRITE(iout,1000) ig,ismstr
135 ENDIF
136 ELSE
137 WRITE(iout,'(5X,A,//)')'CONFIDENTIAL DATA'
138 ENDIF
139
140 prop_tag(igtyp)%G_SIG = 6
141 prop_tag(igtyp)%L_SIG = 6
142 prop_tag(igtyp)%G_VOL = 1
143 prop_tag(igtyp)%L_VOL = 1
144 prop_tag(igtyp)%G_EINT = 1
145 prop_tag(igtyp)%L_EINT = 1
146 prop_tag(igtyp)%G_GAMA = 9
147 prop_tag(igtyp)%G_FILL = 1
148
149
150 RETURN
151
152 1000 FORMAT(
153 & 5x,'SOLID SPOTWELD PROPERTY SET'/,
154 & 5x,'PROPERTY SET ID . . . . . . . . . . . .=',i10/,
155 & 5x,'SMALL STRAIN FLAG . . . . . . . . . . .=',i10/)
156 1100 FORMAT(
157 & 5x,'SOLID SPOTWELD PROPERTY SET'/,
158 & 5x,'PROPERTY SET ID . . . . . . . . . . . .=',i10/,
159 & 5x,'SMALL STRAIN FLAG . . . . . . . . . . .=',i10/,
160 & 5x,'TRUE THICKNESS . . . . . . . . . . . .=',1pg20.13/)
161
162 RETURN
subroutine hm_get_floatv(name, rval, is_available, lsubmodel, unitab)
subroutine hm_get_intv(name, ival, is_available, lsubmodel)
subroutine hm_option_is_encrypted(is_encrypted)