10 private :: nodalstress_inv3, nodalstress_inv2, inverse_func
18 type(hecmwst_local_mesh) :: hecMESH
20 real(kind=kreal),
pointer :: tnstrain(:), testrain(:), yield_ratio(:)
21 integer(kind=kint),
pointer :: is_rot(:)
23 integer(kind=kint) :: itype, icel, ic, is, iE, jS, i, j, k, m, ic_type, nn, ni, ID_area
24 integer(kind=kint) :: nodlocal(20), ntemp
25 integer(kind=kint),
allocatable :: nnumber(:)
26 real(kind=kreal) :: estrain(6), estress(6), naturalcoord(3)
27 real(kind=kreal) :: enqm(12)
28 real(kind=kreal) :: ndstrain(20,6), ndstress(20,6), tdstrain(20,6)
29 real(kind=kreal) :: ecoord(3, 20), edisp(60), tt(20), t0(20)
30 real(kind=kreal),
allocatable :: func(:,:), inv_func(:,:)
33 integer(kind=kint) :: isect, ihead, ntot_lyr, nlyr, flag33, cid, truss
34 real(kind=kreal) :: thick, thick_lyr, dtot_lyr
37 allocate( nnumber(hecmesh%n_node) )
38 if( .not.
associated(fstrsolid%is_rot) )
allocate( fstrsolid%is_rot(hecmesh%n_node) )
44 tnstrain => fstrsolid%tnstrain
45 testrain => fstrsolid%testrain
46 is_rot => fstrsolid%is_rot
47 yield_ratio => fstrsolid%yield_ratio
49 if(
associated(tnstrain) ) tnstrain = 0.0d0
52 ntot_lyr = fstrsolid%max_lyr
53 flag33 = fstrsolid%is_33shell
54 truss = fstrsolid%is_33beam
59 do itype = 1, hecmesh%n_elem_type
60 is = hecmesh%elem_type_index(itype-1) + 1
61 ie = hecmesh%elem_type_index(itype )
62 ic_type = hecmesh%elem_type_item(itype)
63 if( ic_type == fe_tet10nc ) ic_type = fe_tet10n
64 if( .not. (hecmw_is_etype_solid(ic_type) .or. ic_type == 781 &
65 & .or. ic_type == 761 .or. ic_type == fe_beam341 ) ) cycle
67 nn = hecmw_get_max_node( ic_type )
68 ni = numofquadpoints( ic_type )
69 allocate( func(ni,nn), inv_func(nn,ni) )
70 if( ic_type == fe_tet10n )
then
71 ic = hecmw_get_max_node( fe_tet4n )
73 call getquadpoint( ic_type, i, naturalcoord )
74 call getshapefunc( fe_tet4n, naturalcoord, func(i,1:ic) )
76 call inverse_func( ic, func, inv_func )
77 else if( ic_type == fe_hex8n )
then
79 call getquadpoint( ic_type, i, naturalcoord )
80 call getshapefunc( ic_type, naturalcoord, func(i,1:nn) )
82 call inverse_func( ni, func, inv_func )
83 else if( ic_type == fe_prism15n )
then
86 if( i==1 .or. i==2 .or. i==3 .or. i==7 .or. i==8 .or. i==9 )
then
88 call getquadpoint( ic_type, i, naturalcoord )
89 call getshapefunc( fe_prism6n, naturalcoord, func(ic,1:6) )
92 call inverse_func( ic, func, inv_func )
94 else if( ic_type == fe_hex20n )
then
97 if( i==1 .or. i==3 .or. i==7 .or. i==9 .or. &
98 i==19 .or. i==21 .or. i==25 .or. i==27 )
then
100 call getquadpoint( ic_type, i, naturalcoord )
101 call getshapefunc( fe_hex8n, naturalcoord, func(ic,1:8) )
104 call inverse_func( ic, func, inv_func )
109 js = hecmesh%elem_node_index(icel-1)
110 id_area = hecmesh%elem_ID(icel*2)
111 isect= hecmesh%section_ID(icel)
112 ihead = hecmesh%section%sect_R_index(isect-1)
113 thick = hecmesh%section%sect_R_item(ihead+1)
123 if( ic_type == 641 )
then
125 nodlocal(j) = hecmesh%elem_node_item(js+j)
126 ecoord(1:3,j) = hecmesh%node(3*nodlocal(j)-2:3*nodlocal(j))
127 edisp(3*j-2:3*j) = fstrsolid%unode(3*nodlocal(j)-2:3*nodlocal(j))
130 if(
associated( fstrsolid%temperature ) )
then
133 nodlocal(j) = hecmesh%elem_node_item(js+j)
134 t0(j) = fstrsolid%last_temp( nodlocal(j) )
135 tt(j) = fstrsolid%temperature( nodlocal(j) )
138 call nodalstress_beam_641( ic_type, nn, ecoord, fstrsolid%elements(icel)%gausses, &
139 & hecmesh%section%sect_R_item(ihead+1:), edisp, &
140 & ndstrain(1:nn,1:6), ndstress(1:nn,1:6), tt(1:nn), t0(1:nn), ntemp )
141 call elementalstress_beam_641( fstrsolid%elements(icel)%gausses, estrain, estress, enqm )
142 fstrsolid%ENQM(icel*12-11:icel*12) = enqm(1:12)
145 elseif( ic_type == 781)
then
147 nodlocal(j ) = hecmesh%elem_node_item(js+j )
148 nodlocal(j+4) = hecmesh%elem_node_item(js+j+4)
149 is_rot(nodlocal(j+4)) = 1
150 ecoord(1:3,j ) = hecmesh%node(3*nodlocal(j )-2:3*nodlocal(j ))
151 ecoord(1:3,j+4) = hecmesh%node(3*nodlocal(j+4)-2:3*nodlocal(j+4))
152 edisp(6*j-5:6*j-3) = fstrsolid%unode(3*nodlocal(j )-2:3*nodlocal(j ))
153 edisp(6*j-2:6*j ) = fstrsolid%unode(3*nodlocal(j+4)-2:3*nodlocal(j+4))
155 ntot_lyr = fstrsolid%elements(icel)%gausses(1)%pMaterial%totallyr
157 call elementstress_shell_mitc( 741, 4, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
158 & ndstrain(1:4,1:6), ndstress(1:4,1:6), thick, 1.0d0, nlyr, ntot_lyr)
161 call elementstress_shell_mitc( 741, 4, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
162 & ndstrain(1:4,1:6), ndstress(1:4,1:6), thick,-1.0d0, nlyr, ntot_lyr)
165 call fstr_getavg_shell(4,fstrsolid,icel,nodlocal,ndstrain(1:4,1:6),ndstress(1:4,1:6),estrain,estress)
167 elseif( ic_type == 761)
then
169 nodlocal(j ) = hecmesh%elem_node_item(js+j )
170 nodlocal(j+3) = hecmesh%elem_node_item(js+j+3)
171 is_rot(nodlocal(j+3)) = 1
172 ecoord(1:3,j ) = hecmesh%node(3*nodlocal(j )-2:3*nodlocal(j ))
173 ecoord(1:3,j+3) = hecmesh%node(3*nodlocal(j+3)-2:3*nodlocal(j+3))
174 edisp(6*j-5:6*j-3) = fstrsolid%unode(3*nodlocal(j )-2:3*nodlocal(j ))
175 edisp(6*j-2:6*j ) = fstrsolid%unode(3*nodlocal(j+3)-2:3*nodlocal(j+3))
177 ntot_lyr = fstrsolid%elements(icel)%gausses(1)%pMaterial%totallyr
179 call elementstress_shell_mitc( 731, 3, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
180 & ndstrain(1:3,1:6), ndstress(1:3,1:6), thick, 1.0d0, nlyr, ntot_lyr)
183 call elementstress_shell_mitc( 731, 3, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
184 & ndstrain(1:3,1:6), ndstress(1:3,1:6), thick,-1.0d0, nlyr, ntot_lyr)
187 call fstr_getavg_shell(3,fstrsolid,icel,nodlocal,ndstrain(1:3,1:6),ndstress(1:3,1:6),estrain,estress)
189 else if( ic_type == 301 )
then
190 call nodalstress_c1( ic_type, nn, fstrsolid%elements(icel)%gausses, &
191 ndstrain(1:nn,1:6), ndstress(1:nn,1:6) )
192 call elementstress_c1( ic_type, fstrsolid%elements(icel)%gausses, estrain, estress )
194 else if( ic_type == fe_tet10n .or. ic_type == fe_hex8n .or. &
195 ic_type == fe_prism15n .or. ic_type == fe_hex20n )
then
196 call nodalstress_inv3( ic_type, ni, fstrsolid%elements(icel)%gausses, &
197 inv_func, ndstrain(1:nn,1:6), ndstress(1:nn,1:6), &
199 call elementstress_c3( ic_type, fstrsolid%elements(icel)%gausses, estrain, estress )
201 else if ( ic_type == 881 .or. ic_type == 891 )
then
204 if( ic_type == 341 .and. fstrsolid%sections(isect)%elemopt341 ==
kel341sesns ) cycle
206 call nodalstress_c3( ic_type, nn, fstrsolid%elements(icel)%gausses, &
207 ndstrain(1:nn,1:6), ndstress(1:nn,1:6) )
210 call elementstress_c3( ic_type, fstrsolid%elements(icel)%gausses, estrain, estress )
216 ic = hecmesh%elem_node_item(js+j)
217 fstrsolid%STRAIN(6*(ic-1)+1:6*(ic-1)+6) = fstrsolid%STRAIN(6*(ic-1)+1:6*(ic-1)+6) + ndstrain(j,1:6)
218 fstrsolid%STRESS(6*(ic-1)+1:6*(ic-1)+6) = fstrsolid%STRESS(6*(ic-1)+1:6*(ic-1)+6) + ndstress(j,1:6)
219 if(
associated(tnstrain) )
then
220 tnstrain(6*(ic-1)+1:6*(ic-1)+6) = tnstrain(6*(ic-1)+1:6*(ic-1)+6) + tdstrain(j,1:6)
222 nnumber(ic) = nnumber(ic) + 1
225 fstrsolid%ESTRAIN(6*(icel-1)+1:6*(icel-1)+6) = fstrsolid%ESTRAIN(6*(icel-1)+1:6*(icel-1)+6) + estrain(1:6)
226 fstrsolid%ESTRESS(6*(icel-1)+1:6*(icel-1)+6) = fstrsolid%ESTRESS(6*(icel-1)+1:6*(icel-1)+6) + estress(1:6)
230 deallocate( func, inv_func )
234 do i = 1, hecmesh%n_node
235 if( nnumber(i) == 0 ) cycle
236 fstrsolid%STRAIN(6*(i-1)+1:6*(i-1)+6) = fstrsolid%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
237 fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6) = fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
238 if(
associated(tnstrain) )
then
239 tnstrain(6*(i-1)+1:6*(i-1)+6) = tnstrain(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
244 & hecmesh, fstrsolid, nnumber, fstrsolid%STRAIN, fstrsolid%STRESS, fstrsolid%ESTRAIN, fstrsolid%ESTRESS )
246 if( flag33 == 1 )
then
247 do nlyr = 1, ntot_lyr
248 do i = 1, hecmesh%n_node
249 if( nnumber(i) == 0 ) cycle
250 fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRAIN(6*(i-1)+1:6*(i-1)+6) = &
251 & fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
252 fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRESS(6*(i-1)+1:6*(i-1)+6) = &
253 & fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
254 fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRAIN(6*(i-1)+1:6*(i-1)+6) = &
255 & fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
256 fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRESS(6*(i-1)+1:6*(i-1)+6) = &
257 & fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
263 do i = 1, hecmesh%n_node
264 fstrsolid%MISES(i) =
get_mises(fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6))
266 do i = 1, hecmesh%n_elem
267 fstrsolid%EMISES(i) =
get_mises(fstrsolid%ESTRESS(6*(i-1)+1:6*(i-1)+6))
271 do i = 1, hecmesh%n_elem
272 if (.not.
associated(fstrsolid%elements(i)%gausses)) cycle
273 fstrsolid%EPLSTRAIN(i) =
get_pl_estrain(fstrsolid%elements(i)%gausses)
276 if( flag33 == 1 )
then
277 if( fstrsolid%output_ctrl(3)%outinfo%on(27) .or. fstrsolid%output_ctrl(4)%outinfo%on(27) )
then
278 do nlyr = 1, ntot_lyr
279 call make_principal(fstrsolid, hecmesh, fstrsolid%SHELL%LAYER(nlyr)%PLUS)
280 call make_principal(fstrsolid, hecmesh, fstrsolid%SHELL%LAYER(nlyr)%MINUS)
288 deallocate( nnumber )
293 integer(kind=kint),
allocatable,
intent(in) :: irow(:)
294 integer(kind=kint),
allocatable,
intent(in) :: asect(:)
295 integer(kind=kint),
intent(in) :: nid
296 integer(kind=kint),
intent(in) :: sid
298 integer(kind=kint) :: i
301 do i=irow(nid-1)+1,irow(nid)
302 if( asect(i) == sid )
then
311 Nodal_STRAIN, Nodal_STRESS, Elemental_STRAIN, Elemental_STRESS )
312 type(hecmwst_local_mesh),
intent(in) :: hecMESH
314 integer(kind=kint),
allocatable,
intent(inout) :: nnumber(:)
315 real(kind=kreal),
pointer,
intent(inout) :: nodal_strain(:)
316 real(kind=kreal),
pointer,
intent(inout) :: nodal_stress(:)
317 real(kind=kreal),
pointer,
intent(inout) :: elemental_strain(:)
318 real(kind=kreal),
pointer,
intent(inout) :: elemental_stress(:)
320 integer(kind=kint) :: itype, iS, iE, jS, ic_type, icel, i, j, isect
321 integer(kind=kint) :: nsize, nid(2), idx(2), nd
322 integer(kind=kint) :: nnode, nlen
323 type(hecmwst_varray_int),
allocatable :: nodal_sections(:)
324 real(kind=kreal) :: tmpval(6), hydval, nsecdup
325 integer(kind=kint),
allocatable :: irow(:), jcol(:), asect(:)
326 real(kind=kreal),
allocatable :: stress_hyd(:), strain_hyd(:)
327 real(kind=kreal),
allocatable :: stress_dev(:)
328 real(kind=kreal) :: stress_hyd_ndave(6), strain_hyd_ndave(6)
329 real(kind=kreal) :: stress_dev_ndave(6), strain_dev_ndave(6)
330 real(kind=kreal),
allocatable :: n_dup_dev(:), n_dup_hyd(:)
331 real(kind=kreal) :: edstrain(6), edstress(6)
333 nnode = hecmesh%n_node
334 nsize =
size(nodal_strain)
337 call hecmw_varray_int_initialize_all( nodal_sections, nnode, 2 )
338 do itype = 1, hecmesh%n_elem_type
339 ic_type = hecmesh%elem_type_item(itype)
340 if( ic_type /= 341 ) cycle
342 is = hecmesh%elem_type_index(itype-1) + 1
343 ie = hecmesh%elem_type_index(itype )
346 isect= hecmesh%section_ID(icel)
347 if( fstrsolid%sections(isect)%elemopt341 /=
kel341sesns ) cycle
348 js = hecmesh%elem_node_index(icel-1)
350 nd = hecmesh%elem_node_item(js+i)
351 call hecmw_varray_int_add_if_not_exits( nodal_sections(nd), isect )
357 allocate(irow(0:nnode))
360 irow(i) = irow(i-1)+hecmw_varray_int_get_nitem(nodal_sections(i))
364 allocate(asect(nlen))
366 if( irow(i-1) == irow(i) ) cycle
367 call hecmw_varray_int_get_item_all( nodal_sections(i), asect(irow(i-1)+1:irow(i)) )
371 allocate(stress_hyd(6*nlen), strain_hyd(6*nlen))
372 allocate(stress_dev(6*nlen))
373 allocate(n_dup_dev(nlen),n_dup_hyd(nlen))
380 do itype = 1, hecmesh%n_elem_type
381 ic_type = hecmesh%elem_type_item(itype)
382 if( ic_type /= 881 .and. ic_type /= 891 ) cycle
384 is = hecmesh%elem_type_index(itype-1) + 1
385 ie = hecmesh%elem_type_index(itype )
388 js = hecmesh%elem_node_index(icel-1)
389 isect= hecmesh%section_ID(icel)
390 if( ic_type == 881 )
then
391 nid(1) = hecmesh%elem_node_item(js+1)
395 strain_hyd(6*idx(1)-5:6*idx(1)) = fstrsolid%elements(icel)%gausses(1)%strain_out(1:6)
397 stress_hyd(6*idx(1)-5:6*idx(1)) = fstrsolid%elements(icel)%gausses(1)%stress_out(1:6)
399 n_dup_hyd(idx(1)) = n_dup_hyd(idx(1)) + 1.d0
400 else if( ic_type == 891 )
then
401 nid(1:2) = hecmesh%elem_node_item(js+1:js+2)
406 tmpval(1:6) = fstrsolid%elements(icel)%gausses(1)%stress_out(1:6)
407 stress_dev(6*idx(1)-5:6*idx(1)) = stress_dev(6*idx(1)-5:6*idx(1)) + tmpval(1:6)
408 stress_dev(6*idx(2)-5:6*idx(2)) = stress_dev(6*idx(2)-5:6*idx(2)) + tmpval(1:6)
410 n_dup_dev(idx(1)) = n_dup_dev(idx(1)) + 1.d0
411 n_dup_dev(idx(2)) = n_dup_dev(idx(2)) + 1.d0
417 if( irow(i-1) == irow(i) ) cycle
418 do j=irow(i-1)+1,irow(i)
419 if( n_dup_dev(j) < 1.0d-8 ) cycle
420 stress_dev(6*j-5:6*j) = stress_dev(6*j-5:6*j)/n_dup_dev(j)
426 if( irow(i-1) == irow(i) ) cycle
427 strain_hyd_ndave(:) = 0.d0
428 stress_hyd_ndave(:) = 0.d0
429 stress_dev_ndave(:) = 0.d0
430 do j=irow(i-1)+1,irow(i)
431 strain_hyd_ndave(1:6) = strain_hyd_ndave(1:6) + strain_hyd(6*j-5:6*j)
432 stress_hyd_ndave(1:6) = stress_hyd_ndave(1:6) + stress_hyd(6*j-5:6*j)
433 stress_dev_ndave(1:6) = stress_dev_ndave(1:6) + stress_dev(6*j-5:6*j)
435 nsecdup = dble(irow(i)-irow(i-1))
436 strain_hyd_ndave(1:6) = strain_hyd_ndave(1:6)/nsecdup
437 stress_hyd_ndave(1:6) = stress_hyd_ndave(1:6)/nsecdup
438 stress_dev_ndave(1:6) = stress_dev_ndave(1:6)/nsecdup
440 if( nnumber(i) == 0 )
then
441 nodal_strain(6*i-5:6*i) = strain_hyd_ndave(1:6)
442 nodal_stress(6*i-5:6*i) = stress_hyd_ndave(1:6)+stress_dev_ndave(1:6)
444 nodal_strain(6*i-5:6*i) = 0.5d0*(nodal_strain(6*i-5:6*i)+strain_hyd_ndave(1:6))
445 nodal_stress(6*i-5:6*i) = 0.5d0*(nodal_stress(6*i-5:6*i)+stress_hyd_ndave(1:6)+stress_dev_ndave(1:6))
450 do itype = 1, hecmesh%n_elem_type
451 ic_type = hecmesh%elem_type_item(itype)
452 if( ic_type /= 341 ) cycle
454 is = hecmesh%elem_type_index(itype-1) + 1
455 ie = hecmesh%elem_type_index(itype )
458 isect= hecmesh%section_ID(icel)
459 if( fstrsolid%sections(isect)%elemopt341 /=
kel341sesns ) cycle
460 js = hecmesh%elem_node_index(icel-1)
464 nd = hecmesh%elem_node_item(js+i)
465 idx(1) =
search_idx_senes( irow, asect, hecmesh%elem_node_item(js+i), isect )
466 edstrain(1:6) = edstrain(1:6) + strain_hyd(6*idx(1)-5:6*idx(1))
467 edstress(1:6) = edstress(1:6) + stress_hyd(6*idx(1)-5:6*idx(1)) + stress_dev(6*idx(1)-5:6*idx(1))
469 edstrain(1:6) = 0.25d0*edstrain(1:6)
470 edstress(1:6) = 0.25d0*edstress(1:6)
472 elemental_strain(6*(icel-1)+1:6*(icel-1)+6) = elemental_strain(6*(icel-1)+1:6*(icel-1)+6) + edstrain(1:6)
473 elemental_stress(6*(icel-1)+1:6*(icel-1)+6) = elemental_stress(6*(icel-1)+1:6*(icel-1)+6) + edstress(1:6)
475 fstrsolid%elements(icel)%gausses(1)%strain_out(1:6) = elemental_strain(6*(icel-1)+1:6*(icel-1)+6)
476 fstrsolid%elements(icel)%gausses(1)%stress_out(1:6) = elemental_stress(6*(icel-1)+1:6*(icel-1)+6)
480 deallocate(stress_hyd, strain_hyd)
481 deallocate(stress_dev)
482 deallocate(n_dup_dev, n_dup_hyd)
489 integer(kind=kint) :: nodlocal(20)
490 integer(kind=kint) :: nn, i, j, k, m, nlyr, weight, icel, flag
491 real(kind=kreal) :: strain(nn, 6), stress(nn, 6)
498 layer => fstrsolid%SHELL%LAYER(nlyr)%PLUS
499 elseif(flag == -1)
then
500 layer => fstrsolid%SHELL%LAYER(nlyr)%MINUS
503 layer%STRAIN(6*(i-1)+k) = layer%STRAIN(6*(i-1)+k) + strain(j,k)
504 layer%STRAIN(6*(m-1)+k) = layer%STRAIN(6*(m-1)+k) + strain(j,k)
505 layer%STRESS(6*(i-1)+k) = layer%STRESS(6*(i-1)+k) + stress(j,k)
506 layer%STRESS(6*(m-1)+k) = layer%STRESS(6*(m-1)+k) + stress(j,k)
507 layer%ESTRAIN(6*(icel-1)+k) = layer%ESTRAIN(6*(icel-1)+k) + strain(j,k)/nn
508 layer%ESTRESS(6*(icel-1)+k) = layer%ESTRESS(6*(icel-1)+k) + stress(j,k)/nn
516 integer(kind=kint) :: nodlocal(20)
517 integer(kind=kint) :: nn, i, j, k, m, nlyr, icel, flag, ntot_lyr
518 real(kind=kreal) :: strain(nn,6), stress(nn,6), estrain(6), estress(6), weight
521 ntot_lyr = fstrsolid%elements(icel)%gausses(1)%pMaterial%totallyr
527 do nlyr = 1, ntot_lyr
528 layer => fstrsolid%SHELL%LAYER(nlyr)
529 weight = fstrsolid%elements(icel)%gausses(1)%pMaterial%shell_var(nlyr)%weight
533 strain(j,k) = strain(j,k) &
534 & + weight*(0.5d0*layer%PLUS%STRAIN(6*(i-1)+k) + 0.5d0*layer%MINUS%STRAIN(6*(i-1)+k))
535 stress(j,k) = stress(j,k) &
536 & + weight*(0.5d0*layer%PLUS%STRESS(6*(i-1)+k) + 0.5d0*layer%MINUS%STRESS(6*(i-1)+k))
538 estrain(j) = estrain(j) &
539 & + weight*(0.5d0*layer%PLUS%ESTRAIN(6*(icel-1)+j) + 0.5d0*layer%MINUS%ESTRAIN(6*(icel-1)+j))
540 estress(j) = estress(j) &
541 & + weight*(0.5d0*layer%PLUS%ESTRESS(6*(icel-1)+j) + 0.5d0*layer%MINUS%ESTRESS(6*(icel-1)+j))
547 subroutine nodalstress_inv3( etype, ni, gausses, func, edstrain, edstress, tdstrain )
550 integer(kind=kint) :: etype, ni
552 real(kind=kreal) :: func(:, :), edstrain(:, :), edstress(:, :), tdstrain(:, :)
553 integer :: i, j, k, ic
559 if( etype == fe_hex8n )
then
563 edstrain(i,k) = edstrain(i,k) + func(i,j) * gausses(j)%strain_out(k)
564 edstress(i,k) = edstress(i,k) + func(i,j) * gausses(j)%stress_out(k)
569 else if( etype == fe_tet10n )
then
573 edstrain(i,k) = edstrain(i,k) + func(i,j) * gausses(j)%strain_out(k)
574 edstress(i,k) = edstress(i,k) + func(i,j) * gausses(j)%stress_out(k)
579 edstrain(5,1:6) = ( edstrain(1,1:6) + edstrain(2,1:6) ) / 2.0
580 edstress(5,1:6) = ( edstress(1,1:6) + edstress(2,1:6) ) / 2.0
581 tdstrain(5,1:6) = ( tdstrain(1,1:6) + tdstrain(2,1:6) ) / 2.0
582 edstrain(6,1:6) = ( edstrain(2,1:6) + edstrain(3,1:6) ) / 2.0
583 edstress(6,1:6) = ( edstress(2,1:6) + edstress(3,1:6) ) / 2.0
584 tdstrain(6,1:6) = ( tdstrain(2,1:6) + tdstrain(3,1:6) ) / 2.0
585 edstrain(7,1:6) = ( edstrain(3,1:6) + edstrain(1,1:6) ) / 2.0
586 edstress(7,1:6) = ( edstress(3,1:6) + edstress(1,1:6) ) / 2.0
587 tdstrain(7,1:6) = ( tdstrain(3,1:6) + tdstrain(1,1:6) ) / 2.0
588 edstrain(8,1:6) = ( edstrain(1,1:6) + edstrain(4,1:6) ) / 2.0
589 edstress(8,1:6) = ( edstress(1,1:6) + edstress(4,1:6) ) / 2.0
590 tdstrain(8,1:6) = ( tdstrain(1,1:6) + tdstrain(4,1:6) ) / 2.0
591 edstrain(9,1:6) = ( edstrain(2,1:6) + edstrain(4,1:6) ) / 2.0
592 edstress(9,1:6) = ( edstress(2,1:6) + edstress(4,1:6) ) / 2.0
593 tdstrain(9,1:6) = ( tdstrain(2,1:6) + tdstrain(4,1:6) ) / 2.0
594 edstrain(10,1:6) = ( edstrain(3,1:6) + edstrain(4,1:6) ) / 2.0
595 edstress(10,1:6) = ( edstress(3,1:6) + edstress(4,1:6) ) / 2.0
596 tdstrain(10,1:6) = ( tdstrain(3,1:6) + tdstrain(4,1:6) ) / 2.0
597 else if( etype == fe_prism15n )
then
600 do j = 1, numofquadpoints(etype)
601 if( j==1 .or. j==2 .or. j==3 .or. j==7 .or. j==8 .or. j==9 )
then
604 edstrain(i,k) = edstrain(i,k) + func(i,ic) * gausses(j)%strain_out(k)
605 edstress(i,k) = edstress(i,k) + func(i,ic) * gausses(j)%stress_out(k)
611 edstrain(7,1:6) = ( edstrain(1,1:6) + edstrain(2,1:6) ) / 2.0
612 edstress(7,1:6) = ( edstress(1,1:6) + edstress(2,1:6) ) / 2.0
613 tdstrain(7,1:6) = ( tdstrain(1,1:6) + tdstrain(2,1:6) ) / 2.0
614 edstrain(8,1:6) = ( edstrain(2,1:6) + edstrain(3,1:6) ) / 2.0
615 edstress(8,1:6) = ( edstress(2,1:6) + edstress(3,1:6) ) / 2.0
616 tdstrain(8,1:6) = ( tdstrain(2,1:6) + tdstrain(3,1:6) ) / 2.0
617 edstrain(9,1:6) = ( edstrain(3,1:6) + edstrain(1,1:6) ) / 2.0
618 edstress(9,1:6) = ( edstress(3,1:6) + edstress(1,1:6) ) / 2.0
619 tdstrain(9,1:6) = ( tdstrain(3,1:6) + tdstrain(1,1:6) ) / 2.0
620 edstrain(10,1:6) = ( edstrain(4,1:6) + edstrain(5,1:6) ) / 2.0
621 edstress(10,1:6) = ( edstress(4,1:6) + edstress(5,1:6) ) / 2.0
622 tdstrain(10,1:6) = ( tdstrain(4,1:6) + tdstrain(5,1:6) ) / 2.0
623 edstrain(11,1:6) = ( edstrain(5,1:6) + edstrain(6,1:6) ) / 2.0
624 edstress(11,1:6) = ( edstress(5,1:6) + edstress(6,1:6) ) / 2.0
625 tdstrain(11,1:6) = ( tdstrain(5,1:6) + tdstrain(6,1:6) ) / 2.0
626 edstrain(12,1:6) = ( edstrain(6,1:6) + edstrain(4,1:6) ) / 2.0
627 edstress(12,1:6) = ( edstress(6,1:6) + edstress(4,1:6) ) / 2.0
628 tdstrain(12,1:6) = ( tdstrain(6,1:6) + tdstrain(4,1:6) ) / 2.0
629 edstrain(13,1:6) = ( edstrain(1,1:6) + edstrain(4,1:6) ) / 2.0
630 edstress(13,1:6) = ( edstress(1,1:6) + edstress(4,1:6) ) / 2.0
631 tdstrain(13,1:6) = ( tdstrain(1,1:6) + tdstrain(4,1:6) ) / 2.0
632 edstrain(14,1:6) = ( edstrain(2,1:6) + edstrain(5,1:6) ) / 2.0
633 edstress(14,1:6) = ( edstress(2,1:6) + edstress(5,1:6) ) / 2.0
634 tdstrain(14,1:6) = ( tdstrain(2,1:6) + tdstrain(5,1:6) ) / 2.0
635 edstrain(15,1:6) = ( edstrain(3,1:6) + edstrain(6,1:6) ) / 2.0
636 edstress(15,1:6) = ( edstress(3,1:6) + edstress(6,1:6) ) / 2.0
637 tdstrain(15,1:6) = ( tdstrain(3,1:6) + tdstrain(6,1:6) ) / 2.0
638 else if( etype == fe_hex20n )
then
641 do j = 1, numofquadpoints(etype)
642 if( j==1 .or. j==3 .or. j==7 .or. j==9 .or. &
643 j==19 .or. j==21 .or. j==25 .or. j==27 )
then
646 edstrain(i,k) = edstrain(i,k) + func(i,ic) * gausses(j)%strain_out(k)
647 edstress(i,k) = edstress(i,k) + func(i,ic) * gausses(j)%stress_out(k)
653 edstrain(9,1:6) = ( edstrain(1,1:6) + edstrain(2,1:6) ) / 2.0
654 edstress(9,1:6) = ( edstress(1,1:6) + edstress(2,1:6) ) / 2.0
655 tdstrain(9,1:6) = ( tdstrain(1,1:6) + tdstrain(2,1:6) ) / 2.0
656 edstrain(10,1:6) = ( edstrain(2,1:6) + edstrain(3,1:6) ) / 2.0
657 edstress(10,1:6) = ( edstress(2,1:6) + edstress(3,1:6) ) / 2.0
658 tdstrain(10,1:6) = ( tdstrain(2,1:6) + tdstrain(3,1:6) ) / 2.0
659 edstrain(11,1:6) = ( edstrain(3,1:6) + edstrain(4,1:6) ) / 2.0
660 edstress(11,1:6) = ( edstress(3,1:6) + edstress(4,1:6) ) / 2.0
661 tdstrain(11,1:6) = ( tdstrain(3,1:6) + tdstrain(4,1:6) ) / 2.0
662 edstrain(12,1:6) = ( edstrain(4,1:6) + edstrain(1,1:6) ) / 2.0
663 edstress(12,1:6) = ( edstress(4,1:6) + edstress(1,1:6) ) / 2.0
664 tdstrain(12,1:6) = ( tdstrain(4,1:6) + tdstrain(1,1:6) ) / 2.0
665 edstrain(13,1:6) = ( edstrain(5,1:6) + edstrain(6,1:6) ) / 2.0
666 edstress(13,1:6) = ( edstress(5,1:6) + edstress(6,1:6) ) / 2.0
667 tdstrain(13,1:6) = ( tdstrain(5,1:6) + tdstrain(6,1:6) ) / 2.0
668 edstrain(14,1:6) = ( edstrain(6,1:6) + edstrain(7,1:6) ) / 2.0
669 edstress(14,1:6) = ( edstress(6,1:6) + edstress(7,1:6) ) / 2.0
670 tdstrain(14,1:6) = ( tdstrain(6,1:6) + tdstrain(7,1:6) ) / 2.0
671 edstrain(15,1:6) = ( edstrain(7,1:6) + edstrain(8,1:6) ) / 2.0
672 edstress(15,1:6) = ( edstress(7,1:6) + edstress(8,1:6) ) / 2.0
673 tdstrain(15,1:6) = ( tdstrain(7,1:6) + tdstrain(8,1:6) ) / 2.0
674 edstrain(16,1:6) = ( edstrain(8,1:6) + edstrain(5,1:6) ) / 2.0
675 edstress(16,1:6) = ( edstress(8,1:6) + edstress(5,1:6) ) / 2.0
676 tdstrain(16,1:6) = ( tdstrain(8,1:6) + tdstrain(5,1:6) ) / 2.0
677 edstrain(17,1:6) = ( edstrain(1,1:6) + edstrain(5,1:6) ) / 2.0
678 edstress(17,1:6) = ( edstress(1,1:6) + edstress(5,1:6) ) / 2.0
679 tdstrain(17,1:6) = ( tdstrain(1,1:6) + tdstrain(5,1:6) ) / 2.0
680 edstrain(18,1:6) = ( edstrain(2,1:6) + edstrain(6,1:6) ) / 2.0
681 edstress(18,1:6) = ( edstress(2,1:6) + edstress(6,1:6) ) / 2.0
682 tdstrain(18,1:6) = ( tdstrain(2,1:6) + tdstrain(6,1:6) ) / 2.0
683 edstrain(19,1:6) = ( edstrain(3,1:6) + edstrain(7,1:6) ) / 2.0
684 edstress(19,1:6) = ( edstress(3,1:6) + edstress(7,1:6) ) / 2.0
685 tdstrain(19,1:6) = ( tdstrain(3,1:6) + tdstrain(7,1:6) ) / 2.0
686 edstrain(20,1:6) = ( edstrain(4,1:6) + edstrain(8,1:6) ) / 2.0
687 edstress(20,1:6) = ( edstress(4,1:6) + edstress(8,1:6) ) / 2.0
688 tdstrain(20,1:6) = ( tdstrain(4,1:6) + tdstrain(8,1:6) ) / 2.0
690 end subroutine nodalstress_inv3
695 real(kind=kreal) :: s11, s22, s33, s12, s23, s13, ps, smises
703 ps = ( s11 + s22 + s33 ) / 3.0d0
704 smises = 0.5d0 * ( (s11-ps)**2 + (s22-ps)**2 + (s33-ps)**2 ) + s12**2 + s23**2 + s13**2
712 type(tgaussstatus) :: gausses(:)
713 integer(kind=kint) :: i
716 do i = 1,
size(gausses)
728 type (hecmwst_local_mesh) :: hecMESH
729 type (fstr_solid) :: fstrSOLID
730 real(kind=kreal),
pointer :: tnstrain(:), testrain(:)
732 integer(kind=kint) :: itype, icel, ic, is, iE, jS, i, j, ic_type, nn, ni, ID_area
733 real(kind=kreal) :: estrain(4), estress(4), tstrain(4), naturalcoord(4)
734 real(kind=kreal) :: edstrain(8,4), edstress(8,4), tdstrain(8,4)
735 real(kind=kreal) :: s11, s22, s33, s12, s23, s13, ps, smises
736 real(kind=kreal),
allocatable :: func(:,:), inv_func(:,:)
737 integer(kind=kint),
allocatable :: nnumber(:)
739 tnstrain => fstrsolid%tnstrain
740 testrain => fstrsolid%testrain
743 allocate( nnumber(hecmesh%n_node) )
744 if( .not.
associated(fstrsolid%is_rot) )
allocate( fstrsolid%is_rot(hecmesh%n_node) )
751 do itype = 1, hecmesh%n_elem_type
752 is = hecmesh%elem_type_index(itype-1) + 1
753 ie = hecmesh%elem_type_index(itype )
754 ic_type = hecmesh%elem_type_item(itype)
755 if( .not. hecmw_is_etype_surface(ic_type) ) cycle
757 nn = hecmw_get_max_node( ic_type )
758 ni = numofquadpoints( ic_type )
759 allocate( func(ni,nn), inv_func(nn,ni) )
760 if( ic_type == fe_tri6n )
then
761 ic = hecmw_get_max_node( fe_tri3n )
763 call getquadpoint( ic_type, i, naturalcoord )
764 call getshapefunc( fe_tri3n, naturalcoord, func(i,1:ic) )
766 call inverse_func( ic, func, inv_func )
767 else if( ic_type == fe_quad4n )
then
769 call getquadpoint( ic_type, i, naturalcoord )
770 call getshapefunc( ic_type, naturalcoord, func(i,1:nn) )
772 call inverse_func( ni, func, inv_func )
773 else if( ic_type == fe_quad8n )
then
776 if( i==1 .or. i==3 .or. i==7 .or. i==9 )
then
778 call getquadpoint( ic_type, i, naturalcoord )
779 call getshapefunc( fe_quad4n, naturalcoord, func(ic,1:4) )
782 call inverse_func( ic, func, inv_func )
787 js = hecmesh%elem_node_index(icel-1)
788 id_area = hecmesh%elem_ID(icel*2)
790 if( ic_type == fe_tri6n .or. ic_type == fe_quad4n .or. ic_type == fe_quad8n )
then
791 call nodalstress_inv2( ic_type, ni, fstrsolid%elements(icel)%gausses, &
792 inv_func, edstrain(1:nn,1:4), edstress(1:nn,1:4), &
795 call nodalstress_c2( ic_type, nn, fstrsolid%elements(icel)%gausses, &
796 edstrain(1:nn,1:4), edstress(1:nn,1:4) )
801 ic = hecmesh%elem_node_item(js+j)
802 fstrsolid%STRAIN(3*ic-2) = fstrsolid%STRAIN(3*ic-2) + edstrain(j,1)
803 fstrsolid%STRAIN(3*ic-1) = fstrsolid%STRAIN(3*ic-1) + edstrain(j,2)
804 fstrsolid%STRAIN(3*ic-0) = fstrsolid%STRAIN(3*ic-0) + edstrain(j,3)
805 fstrsolid%STRESS(3*ic-2) = fstrsolid%STRESS(3*ic-2) + edstress(j,1)
806 fstrsolid%STRESS(3*ic-1) = fstrsolid%STRESS(3*ic-1) + edstress(j,2)
807 fstrsolid%STRESS(3*ic-0) = fstrsolid%STRESS(3*ic-0) + edstress(j,3)
809 if(
associated(tnstrain) )
then
810 tnstrain(3*ic-2) = tnstrain(3*ic-2) + tdstrain(j,1)
811 tnstrain(3*ic-1) = tnstrain(3*ic-1) + tdstrain(j,2)
812 tnstrain(3*ic ) = tnstrain(3*ic ) + tdstrain(j,3)
814 nnumber(ic) = nnumber(ic) + 1
818 call elementstress_c2( ic_type, fstrsolid%elements(icel)%gausses, estrain, estress )
821 fstrsolid%ESTRAIN(3*icel-2) = estrain(1)
822 fstrsolid%ESTRAIN(3*icel-1) = estrain(2)
823 fstrsolid%ESTRAIN(3*icel-0) = estrain(3)
824 fstrsolid%ESTRESS(3*icel-2) = estress(1)
825 fstrsolid%ESTRESS(3*icel-1) = estress(2)
826 fstrsolid%ESTRESS(3*icel-0) = estress(3)
836 smises = 0.5d0 * ((s11-s22)**2+(s11)**2+(s22)**2) + 3*s12**2
837 fstrsolid%EMISES(icel) = sqrt( smises )
840 deallocate( func, inv_func )
844 do i = 1, hecmesh%n_node
845 if( nnumber(i) == 0 ) cycle
846 fstrsolid%STRAIN(3*i-2:3*i-0) = fstrsolid%STRAIN(3*i-2:3*i-0) / nnumber(i)
847 fstrsolid%STRESS(3*i-2:3*i-0) = fstrsolid%STRESS(3*i-2:3*i-0) / nnumber(i)
848 if(
associated(tnstrain) ) tnstrain(3*i-2:3*i) = tnstrain(3*i-2:3*i) / nnumber(i)
851 do i = 1, hecmesh%n_node
852 s11 = fstrsolid%STRESS(3*i-2)
853 s22 = fstrsolid%STRESS(3*i-1)
854 s12 = fstrsolid%STRESS(3*i-0)
855 smises = 0.5d0 * ((s11-s22)**2+(s11)**2+(s22)**2) + 3*s12**2
856 fstrsolid%MISES(i) = sqrt( smises )
859 deallocate( nnumber )
863 subroutine nodalstress_inv2( etype, ni, gausses, func, edstrain, edstress, tdstrain )
866 integer(kind=kint) :: etype, ni
868 real(kind=kreal) :: func(:,:), edstrain(:,:), edstress(:,:), tdstrain(:,:)
869 integer :: i, j, k, ic
875 if( etype == fe_quad4n )
then
879 edstrain(i,k) = edstrain(i,k) + func(i,j) * gausses(j)%strain_out(k)
880 edstress(i,k) = edstress(i,k) + func(i,j) * gausses(j)%stress_out(k)
885 else if( etype == fe_tri6n )
then
889 edstrain(i,k) = edstrain(i,k) + func(i,j) * gausses(j)%strain_out(k)
890 edstress(i,k) = edstress(i,k) + func(i,j) * gausses(j)%stress_out(k)
895 edstrain(4,1:4) = ( edstrain(1,1:4) + edstrain(2,1:4) ) / 2.0
896 edstress(4,1:4) = ( edstress(1,1:4) + edstress(2,1:4) ) / 2.0
897 tdstrain(4,1:4) = ( tdstrain(1,1:4) + tdstrain(2,1:4) ) / 2.0
898 edstrain(5,1:4) = ( edstrain(2,1:4) + edstrain(3,1:4) ) / 2.0
899 edstress(5,1:4) = ( edstress(2,1:4) + edstress(3,1:4) ) / 2.0
900 tdstrain(5,1:4) = ( tdstrain(2,1:4) + tdstrain(3,1:4) ) / 2.0
901 edstrain(6,1:4) = ( edstrain(3,1:4) + edstrain(1,1:4) ) / 2.0
902 edstress(6,1:4) = ( edstress(3,1:4) + edstress(1,1:4) ) / 2.0
903 tdstrain(6,1:4) = ( tdstrain(3,1:4) + tdstrain(1,1:4) ) / 2.0
904 else if( etype == fe_quad8n )
then
907 do j = 1, numofquadpoints(etype)
908 if( j==1 .or. j==3 .or. j==7 .or. j==9 )
then
911 edstrain(i,k) = edstrain(i,k) + func(i,ic) * gausses(j)%strain_out(k)
912 edstress(i,k) = edstress(i,k) + func(i,ic) * gausses(j)%stress_out(k)
918 edstrain(5,1:4) = ( edstrain(1,1:4) + edstrain(2,1:4) ) / 2.0
919 edstress(5,1:4) = ( edstress(1,1:4) + edstress(2,1:4) ) / 2.0
920 tdstrain(5,1:4) = ( tdstrain(1,1:4) + tdstrain(2,1:4) ) / 2.0
921 edstrain(6,1:4) = ( edstrain(2,1:4) + edstrain(3,1:4) ) / 2.0
922 edstress(6,1:4) = ( edstress(2,1:4) + edstress(3,1:4) ) / 2.0
923 tdstrain(6,1:4) = ( tdstrain(2,1:4) + tdstrain(3,1:4) ) / 2.0
924 edstrain(7,1:4) = ( edstrain(3,1:4) + edstrain(4,1:4) ) / 2.0
925 edstress(7,1:4) = ( edstress(3,1:4) + edstress(4,1:4) ) / 2.0
926 tdstrain(7,1:4) = ( tdstrain(3,1:4) + tdstrain(4,1:4) ) / 2.0
927 edstrain(8,1:4) = ( edstrain(4,1:4) + edstrain(1,1:4) ) / 2.0
928 edstress(8,1:4) = ( edstress(4,1:4) + edstress(1,1:4) ) / 2.0
929 tdstrain(8,1:4) = ( tdstrain(4,1:4) + tdstrain(1,1:4) ) / 2.0
931 end subroutine nodalstress_inv2
934 subroutine inverse_func( n, a, inv_a )
936 integer(kind=kint) :: n
937 real(kind=kreal) :: a(:,:), inv_a(:,:)
938 integer(kind=kint) :: i, j, k
939 real(kind=kreal) :: buf
954 a(i,j) = a(i,j) * buf
955 inv_a(i,j) = inv_a(i,j) *buf
961 a(j,k) = a(j,k) - a(i,k) * buf
962 inv_a(j,k) = inv_a(j,k) - inv_a(i,k) * buf
967 end subroutine inverse_func
974 type (hecmwST_local_mesh) :: hecMESH
975 type (fstr_solid) :: fstrSOLID
977 integer(kind=kint) :: itype, icel, is, iE, jS, i, j, k, it, ic, ic_type, nn, isect, ihead, ID_area
978 integer(kind=kint) :: nodLOCAL(20), n_layer, ntot_lyr, nlyr, n_totlyr, com_total_layer, shellmatl
979 real(kind=kreal) :: ecoord(3,9), edisp(6,9), estrain(6), estress(6), ndstrain(9,6), ndstress(9,6)
980 real(kind=kreal) :: thick, thick_layer
981 real(kind=kreal) :: s11, s22, s33, s12, s23, s13, t11, t22, t33, t12, t23, t13, ps, smises, tmises
982 integer(kind=kint),
allocatable :: nnumber(:)
987 n_totlyr = fstrsolid%max_lyr
989 allocate( nnumber(hecmesh%n_node) )
990 if( .not.
associated(fstrsolid%is_rot) )
allocate( fstrsolid%is_rot(hecmesh%n_node) )
997 do itype = 1, hecmesh%n_elem_type
998 is = hecmesh%elem_type_index(itype-1) + 1
999 ie = hecmesh%elem_type_index(itype )
1000 ic_type = hecmesh%elem_type_item(itype)
1001 if( .not. hecmw_is_etype_shell(ic_type) )
then
1005 nn = hecmw_get_max_node( ic_type )
1008 js = hecmesh%elem_node_index(icel-1)
1009 id_area = hecmesh%elem_ID(icel*2)
1011 nodlocal(j) = hecmesh%elem_node_item(js+j)
1012 ecoord(1,j) = hecmesh%node(3*nodlocal(j)-2)
1013 ecoord(2,j) = hecmesh%node(3*nodlocal(j)-1)
1014 ecoord(3,j) = hecmesh%node(3*nodlocal(j) )
1015 edisp(1,j) = fstrsolid%unode(6*nodlocal(j)-5)
1016 edisp(2,j) = fstrsolid%unode(6*nodlocal(j)-4)
1017 edisp(3,j) = fstrsolid%unode(6*nodlocal(j)-3)
1018 edisp(4,j) = fstrsolid%unode(6*nodlocal(j)-2)
1019 edisp(5,j) = fstrsolid%unode(6*nodlocal(j)-1)
1020 edisp(6,j) = fstrsolid%unode(6*nodlocal(j) )
1022 isect = hecmesh%section_ID(icel)
1023 ihead = hecmesh%section%sect_R_index(isect-1)
1024 thick = hecmesh%section%sect_R_item(ihead+1)
1026 if( ic_type == 731 .or. ic_type == 741 .or. ic_type == 743 )
then
1027 ntot_lyr = fstrsolid%elements(icel)%gausses(1)%pMaterial%totallyr
1029 call elementstress_shell_mitc( ic_type, nn, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
1030 & ndstrain(1:nn,1:6), ndstress(1:nn,1:6), thick, 1.0d0, nlyr, ntot_lyr)
1033 layer => fstrsolid%SHELL%LAYER(nlyr)%PLUS
1035 layer%STRAIN(6*(i-1)+k) = layer%STRAIN(6*(i-1)+k) + ndstrain(j,k)
1036 layer%STRESS(6*(i-1)+k) = layer%STRESS(6*(i-1)+k) + ndstress(j,k)
1037 layer%ESTRAIN(6*(icel-1)+k) = layer%ESTRAIN(6*(icel-1)+k) + ndstrain(j,k)/nn
1038 layer%ESTRESS(6*(icel-1)+k) = layer%ESTRESS(6*(icel-1)+k) + ndstress(j,k)/nn
1042 call elementstress_shell_mitc( ic_type, nn, 6, ecoord, fstrsolid%elements(icel)%gausses, edisp, &
1043 & ndstrain(1:nn,1:6), ndstress(1:nn,1:6), thick,-1.0d0, nlyr, ntot_lyr)
1046 layer => fstrsolid%SHELL%LAYER(nlyr)%MINUS
1048 layer%STRAIN(6*(i-1)+k) = layer%STRAIN(6*(i-1)+k) + ndstrain(j,k)
1049 layer%STRESS(6*(i-1)+k) = layer%STRESS(6*(i-1)+k) + ndstress(j,k)
1050 layer%ESTRAIN(6*(icel-1)+k) = layer%ESTRAIN(6*(icel-1)+k) + ndstrain(j,k)/nn
1051 layer%ESTRESS(6*(icel-1)+k) = layer%ESTRESS(6*(icel-1)+k) + ndstress(j,k)/nn
1055 call fstr_getavg_shell(nn,fstrsolid,icel,nodlocal,ndstrain(1:nn,1:6),ndstress(1:nn,1:6),estrain,estress)
1061 ic = hecmesh%elem_node_item(js+j)
1062 fstrsolid%STRAIN(6*(ic-1)+1:6*(ic-1)+6) = fstrsolid%STRAIN(6*(ic-1)+1:6*(ic-1)+6) + ndstrain(j,1:6)
1063 fstrsolid%STRESS(6*(ic-1)+1:6*(ic-1)+6) = fstrsolid%STRESS(6*(ic-1)+1:6*(ic-1)+6) + ndstress(j,1:6)
1067 nnumber(ic) = nnumber(ic) + 1
1070 fstrsolid%ESTRAIN(6*(icel-1)+1:6*(icel-1)+6) = fstrsolid%ESTRAIN(6*(icel-1)+1:6*(icel-1)+6) + estrain(1:6)
1071 fstrsolid%ESTRESS(6*(icel-1)+1:6*(icel-1)+6) = fstrsolid%ESTRESS(6*(icel-1)+1:6*(icel-1)+6) + estress(1:6)
1077 do i = 1, hecmesh%n_node
1078 if( nnumber(i) == 0 ) cycle
1079 fstrsolid%STRAIN(6*(i-1)+1:6*(i-1)+6) = fstrsolid%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1080 fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6) = fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1086 do nlyr = 1, ntot_lyr
1087 do i = 1, hecmesh%n_node
1088 fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRAIN(6*(i-1)+1:6*(i-1)+6) = &
1089 & fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1090 fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRESS(6*(i-1)+1:6*(i-1)+6) = &
1091 & fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1092 fstrsolid%SHELL%LAYER(nlyr)%PLUS%MISES(i) = &
1093 &
get_mises(fstrsolid%SHELL%LAYER(nlyr)%PLUS%STRESS(6*(i-1)+1:6*(i-1)+6))
1095 fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRAIN(6*(i-1)+1:6*(i-1)+6) = &
1096 & fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRAIN(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1097 fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRESS(6*(i-1)+1:6*(i-1)+6) = &
1098 & fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRESS(6*(i-1)+1:6*(i-1)+6) / nnumber(i)
1099 fstrsolid%SHELL%LAYER(nlyr)%MINUS%MISES(i) = &
1100 &
get_mises(fstrsolid%SHELL%LAYER(nlyr)%MINUS%STRESS(6*(i-1)+1:6*(i-1)+6))
1105 do i = 1, hecmesh%n_node
1106 fstrsolid%MISES(i) =
get_mises(fstrsolid%STRESS(6*(i-1)+1:6*(i-1)+6))
1108 do i = 1, hecmesh%n_elem
1109 fstrsolid%EMISES(i) =
get_mises(fstrsolid%ESTRESS(6*(i-1)+1:6*(i-1)+6))
1113 do i = 1, hecmesh%n_elem
1114 if (.not.
associated(fstrsolid%elements(i)%gausses)) cycle
1115 fstrsolid%EPLSTRAIN(i) =
get_pl_estrain(fstrsolid%elements(i)%gausses)
1118 deallocate( nnumber )
1130 integer(kind=kint) :: i, flag
1131 real(kind=
kreal) :: tmat(3, 3), tvec(3), strain(6)
1133 flag=ieor(flag,flag)
1134 if( fstrsolid%output_ctrl(3)%outinfo%on(19) .or. fstrsolid%output_ctrl(4)%outinfo%on(19) )
then
1135 if ( .not.
associated(res%PSTRESS) )
then
1136 allocate(res%PSTRESS( 3*hecmesh%n_node ))
1138 flag=ior(flag,b
'00000001')
1140 if( fstrsolid%output_ctrl(3)%outinfo%on(23) .or. fstrsolid%output_ctrl(4)%outinfo%on(23) )
then
1141 if ( .not.
associated(res%PSTRESS_VECT) )
then
1142 allocate(res%PSTRESS_VECT( 3*hecmesh%n_node ,3))
1144 flag=ior(flag,b
'00000010')
1146 if( fstrsolid%output_ctrl(3)%outinfo%on(21) .or. fstrsolid%output_ctrl(4)%outinfo%on(21) )
then
1147 if ( .not.
associated(res%PSTRAIN) )
then
1148 allocate(res%PSTRAIN( 3*hecmesh%n_node ))
1150 flag=ior(flag,b
'00000100')
1152 if( fstrsolid%output_ctrl(3)%outinfo%on(25) .or. fstrsolid%output_ctrl(4)%outinfo%on(25) )
then
1153 if ( .not.
associated(res%PSTRAIN_VECT) )
then
1154 allocate(res%PSTRAIN_VECT( 3*hecmesh%n_node ,3))
1156 flag=ior(flag,b
'00001000')
1158 if( fstrsolid%output_ctrl(3)%outinfo%on(20) .or. fstrsolid%output_ctrl(4)%outinfo%on(20) )
then
1159 if ( .not.
associated(res%EPSTRESS) )
then
1160 allocate(res%EPSTRESS( 3*hecmesh%n_elem ))
1162 flag=ior(flag,b
'00010000')
1164 if( fstrsolid%output_ctrl(3)%outinfo%on(24) .or. fstrsolid%output_ctrl(4)%outinfo%on(24) )
then
1165 if ( .not.
associated(res%EPSTRESS_VECT) )
then
1166 allocate(res%EPSTRESS_VECT( 3*hecmesh%n_elem ,3))
1168 flag=ior(flag,b
'00100000')
1170 if( fstrsolid%output_ctrl(3)%outinfo%on(22) .or. fstrsolid%output_ctrl(4)%outinfo%on(22) )
then
1171 if ( .not.
associated(res%EPSTRAIN) )
then
1172 allocate(res%EPSTRAIN( 3*hecmesh%n_elem ))
1174 flag=ior(flag,b
'01000000')
1176 if( fstrsolid%output_ctrl(3)%outinfo%on(26) .or. fstrsolid%output_ctrl(4)%outinfo%on(26) )
then
1177 if ( .not.
associated(res%EPSTRAIN_VECT) )
then
1178 allocate(res%EPSTRAIN_VECT( 3*hecmesh%n_elem ,3))
1180 flag=ior(flag,b
'10000000')
1183 if (iand(flag,b
'00000011') /= 0)
then
1184 do i = 1, hecmesh%n_node
1185 call get_principal(res%STRESS(6*i-5:6*i), tvec, tmat)
1186 if (iand(flag,b
'00000001') /= 0) res%PSTRESS(3*(i-1)+1:3*(i-1)+3)=tvec
1187 if (iand(flag,b
'00000010') /= 0) res%PSTRESS_VECT(3*(i-1)+1:3*(i-1)+3,1:3)=tmat
1190 if (iand(flag,b
'00001100') /= 0)
then
1191 do i = 1, hecmesh%n_node
1192 strain(1:6) = res%STRAIN(6*i-5:6*i)
1193 strain(4:6) = 0.5d0*strain(4:6)
1194 call get_principal(strain, tvec, tmat)
1195 if (iand(flag,b
'00000100') /= 0) res%PSTRAIN(3*(i-1)+1:3*(i-1)+3)=tvec
1196 if (iand(flag,b
'00001000') /= 0) res%PSTRAIN_VECT(3*(i-1)+1:3*(i-1)+3,1:3)=tmat
1200 if (iand(flag,b
'00110000') /= 0)
then
1201 do i = 1, hecmesh%n_elem
1202 call get_principal( res%ESTRESS(6*i-5:6*i), tvec, tmat)
1203 if (iand(flag,b
'00010000') /= 0) res%EPSTRESS(3*(i-1)+1:3*(i-1)+3)=tvec
1204 if (iand(flag,b
'00100000') /= 0) res%EPSTRESS_VECT(3*(i-1)+1:3*(i-1)+3,1:3)=tmat
1207 if (iand(flag,b
'11000000') /= 0)
then
1208 do i = 1, hecmesh%n_elem
1209 strain(1:6) = res%ESTRAIN(6*i-5:6*i)
1210 strain(4:6) = 0.5d0*strain(4:6)
1211 call get_principal(strain, tvec, tmat)
1212 if (iand(flag,b
'01000000') /= 0) res%EPSTRAIN(3*(i-1)+1:3*(i-1)+3)=tvec
1213 if (iand(flag,b
'10000000') /= 0) res%EPSTRAIN_VECT(3*(i-1)+1:3*(i-1)+3,1:3)=tmat
integer(kind=4), parameter kreal
This module provides functions to calculation nodal stress.
subroutine fstr_stress_add_shelllyr(nn, fstrSOLID, icel, nodLOCAL, nlyr, strain, stress, flag)
real(kind=kreal) function get_pl_estrain(gausses)
subroutine fstr_nodalstress3d(hecMESH, fstrSOLID)
Calculate NODAL STRESS of solid elements.
subroutine fstr_nodalstress6d(hecMESH, fstrSOLID)
Calculate NODAL STRESS of shell elements.
real(kind=kreal) function get_mises(s)
subroutine fstr_nodalstress3d_c3d4_sesns(hecMESH, fstrSOLID, nnumber, Nodal_STRAIN, Nodal_STRESS, Elemental_STRAIN, Elemental_STRESS)
subroutine fstr_nodalstress2d(hecMESH, fstrSOLID)
Calculate NODAL STRESS of plane elements.
subroutine make_principal(fstrSOLID, hecMESH, RES)
integer(kind=kint) function search_idx_senes(irow, asect, nid, sid)
subroutine fstr_getavg_shell(nn, fstrSOLID, icel, nodLOCAL, strain, stress, estrain, estress)
This module defines common data and basic structures for analysis.
integer(kind=kint), parameter kel341sesns
subroutine fstr_solid_phys_clear(fstrSOLID)
This module manages step information.
This modules just summarizes all modules used in static analysis.
This modules defines a structure to record history dependent parameter in static analysis.
Data for STATIC ANSLYSIS (fstrSOLID)
All data should be recorded in every quadrature points.