FrontISTR  5.8.0
Large-scale structural analysis program with finit element method
heat_mat_ass_conductivity.f90
Go to the documentation of this file.
1 !-------------------------------------------------------------------------------
2 ! Copyright (c) 2019 FrontISTR Commons
3 ! This software is released under the MIT License, see LICENSE.txt
4 !-------------------------------------------------------------------------------
6 contains
7 
8  subroutine heat_mat_ass_conductivity( hecMESH,hecMAT,fstrSOLID,fstrHEAT,beta )
9  use hecmw
10  use m_fstr
11  use m_heat_lib
12  use m_static_lib
13  implicit none
14  type(fstr_heat) :: fstrHEAT
15  type(hecmwst_matrix) :: hecMAT
16  type(fstr_solid) :: fstrSOLID
17  type(hecmwst_local_mesh) :: hecMESH
18  integer(kind=kint) :: itype, is, iE, ic_type, icel, isect, IMAT, ntab, itab, NDOF
19  integer(kind=kint) :: in0, nn, i, in, j, nodLOCAL(20), jsect, ic, ip, inod, jp, jnod, isU, ieU, ik, isL, ieL
20  real(kind=kreal) :: beta, tzero, alfa, temp(1000), funca(1000), funcb(1000), tt(20), t0(20), ss(400)
21  real(kind=kreal) :: asect, thick, gth, ghh, gr1, gr2
22  real(kind=kreal) :: lumped(20), stiff(20, 20), ecoord(3,20)
23  real(kind=kreal), allocatable :: s(:)
24 
25  ndof = hecmesh%n_dof
26  tzero = hecmesh%zero_temp
27  alfa = 1.0 - beta
28 
29  call hecmw_mat_clear(hecmat)
30  call hecmw_mat_clear_b(hecmat)
31 
32  do itype = 1, hecmesh%n_elem_type
33  is = hecmesh%elem_type_index(itype-1) + 1
34  ie = hecmesh%elem_type_index(itype )
35  ic_type= hecmesh%elem_type_item(itype)
36  if (hecmw_is_etype_link(ic_type)) cycle
37  if (hecmw_is_etype_patch(ic_type)) cycle
38 
39  !$omp parallel default(none), &
40  !$omp& private(icel,isect,IMAT,ntab,itab,temp,funcA,funcB,in0,nn,i,j,nodLOCAL,SS,TT,GTH,GHH,GR1,GR2,ecoord,&
41  !$omp& stiff,in,ASECT,thick,jsect), &
42  !$omp& shared(iS,iE,hecMESH,fstrSOLID,ic_type,hecMAT,fstrHEAT,TZERO)
43  !$omp do
44  do icel = is, ie
45  if( fstrsolid%elements(icel)%elemact_flag == kelact_inactive ) cycle
46  isect = hecmesh%section_ID(icel)
47  imat = hecmesh%section%sect_mat_ID_item(isect)
48 
49  if( hecmesh%section%sect_type(isect) .ne. 4 ) then
50  ntab = fstrheat%CONDtab(imat)
51  do itab = 1, ntab
52  temp(itab) = fstrheat%CONDtemp (imat,itab)
53  funca(itab) = fstrheat%CONDfuncA(imat,itab)
54  funcb(itab) = fstrheat%CONDfuncB(imat,itab)
55  enddo
56  funca(ntab+1) = fstrheat%CONDfuncA(imat,ntab+1)
57  funcb(ntab+1) = fstrheat%CONDfuncB(imat,ntab+1)
58  endif
59 
60  in0 = hecmesh%elem_node_index(icel-1)
61  nn = hecmw_get_max_node(ic_type)
62  do i = 1, nn
63  nodlocal(i) = hecmesh%elem_node_item(in0+i)
64  tt(i) = fstrheat%TEMP ( nodlocal(i) )
65  !T0(i) = fstrHEAT%TEMP0( nodLOCAL(i) )
66  do j = 1, 3
67  ecoord(j,i) = hecmesh%node(3*(nodlocal(i)-1)+j)
68  enddo
69  enddo
70  do i = 1, nn*nn
71  ss(i) = 0.0
72  enddo
73 
74  if(ic_type == 111) then
75  in = hecmesh%section%sect_R_index(isect)
76  asect = hecmesh%section%sect_R_item(in)
77  call heat_conductivity_c1(ic_type, nn, ecoord(1:2,1:nn), tt, imat, asect, stiff, &
78  fstrheat%CONDtab(imat), fstrheat%CONDtemp(imat,:), fstrheat%CONDfuncA(imat,:) ,fstrheat%CONDfuncB(imat,:))
79 
80  elseif(ic_type == 231 .or. ic_type == 232 .or. ic_type == 241 .or. ic_type == 242)then
81  in = hecmesh%section%sect_R_index(isect)
82  thick = hecmesh%section%sect_R_item(in)
83  call heat_conductivity_c2(ic_type, nn, ecoord(1:2,1:nn), tt, imat, thick, stiff, &
84  fstrheat%CONDtab(imat), fstrheat%CONDtemp(imat,:), fstrheat%CONDfuncA(imat,:) ,fstrheat%CONDfuncB(imat,:))
85 
86  elseif(ic_type == 341 .or. ic_type == 342 .or. ic_type == 351 .or. ic_type == 352 .or. &
87  & ic_type == 361 .or. ic_type == 362)then
88  call heat_conductivity_c3(ic_type, nn, ecoord(1:3,1:nn), tt, imat, stiff, &
89  fstrheat%CONDtab(imat), fstrheat%CONDtemp(imat,:), fstrheat%CONDfuncA(imat,:) ,fstrheat%CONDfuncB(imat,:))
90 
91  elseif (ic_type == 541) then
92  jsect = hecmesh%section%sect_R_index(isect-1)+1
93  gth = hecmesh%section%sect_R_item(jsect)
94  ghh = hecmesh%section%sect_R_item(jsect+1)
95  gr1 = hecmesh%section%sect_R_item(jsect+2)
96  gr2 = hecmesh%section%sect_R_item(jsect+3)
97  call heat_conductivity_541(nn, ecoord, tt, tzero, gth, ghh, gr1, gr2, ss, stiff)
98 
99  elseif(ic_type == 731)then
100  nn = 4
101  nodlocal(nn) = hecmesh%elem_node_item(in0+nn-1)
102  in = hecmesh%section%sect_R_index(isect)
103  thick = hecmesh%section%sect_R_item(in)
104  ss = 0.0d0
105  call heat_conductivity_shell_731(ic_type, nn, ecoord(1:3,1:nn), tt, imat, thick, ss, stiff, &
106  fstrheat%CONDtab(imat), fstrheat%CONDtemp(imat,:), fstrheat%CONDfuncA(imat,:) ,fstrheat%CONDfuncB(imat,:))
107 
108  elseif(ic_type == 741)then
109  in = hecmesh%section%sect_R_index(isect)
110  thick = hecmesh%section%sect_R_item(in)
111  call heat_conductivity_shell_741(ic_type, nn, ecoord(1:3,1:nn), tt, imat, thick, ss, stiff, &
112  fstrheat%CONDtab(imat), fstrheat%CONDtemp(imat,:), fstrheat%CONDfuncA(imat,:) ,fstrheat%CONDfuncB(imat,:))
113 
114  else
115  write(*,*)"** error setMASS"
116  endif
117 
118  if(ic_type == 541 .or. ic_type == 731 .or. ic_type == 741)then
119  stiff = 0.0d0
120  in = 1
121  do i = 1, nn
122  do j = 1, nn
123  stiff(j,i) = ss(in)
124  in = in + 1
125  enddo
126  enddo
127  endif
128 
129  call hecmw_mat_ass_elem(hecmat, nn, nodlocal, stiff)
130 
131  enddo
132  !$omp end do
133  !$omp end parallel
134  enddo
135 
136  allocate(s(hecmat%NP))
137  s = 0.0d0
138 
139  call hecmw_matvec(hecmesh, hecmat, fstrheat%TEMP0, s)
140 
141  hecmat%D = beta*hecmat%D
142  hecmat%AU = beta*hecmat%AU
143  hecmat%AL = beta*hecmat%AL
144  hecmat%B = hecmat%B - alfa*s
145 
146  deallocate(s)
147 
148  end subroutine heat_mat_ass_conductivity
Definition: hecmw.f90:6
This module defines common data and basic structures for analysis.
Definition: m_fstr.f90:15
This modules just summarizes all modules used in heat analysis.
Definition: heat_LIB.f90:6
subroutine heat_mat_ass_conductivity(hecMESH, hecMAT, fstrSOLID, fstrHEAT, beta)
This modules just summarizes all modules used in static analysis.
Definition: static_LIB.f90:6
Data for HEAT ANSLYSIS (fstrHEAT)
Definition: m_fstr.f90:431