FrontISTR  5.7.1
Large-scale structural analysis program with finit element method
fstr_ctrl_common.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 
8  use m_fstr
9  use hecmw
10  use mcontact
11  use m_timepoint
13 
14  implicit none
15 
16  private :: pc_strupr
17 
18 contains
19 
20  subroutine pc_strupr( s )
21  implicit none
22  character(*) :: s
23  integer :: i, n, a, da
24 
25  n = len_trim(s)
26  da = iachar('a') - iachar('A')
27  do i = 1, n
28  a = iachar(s(i:i))
29  if( a > iachar('Z')) then
30  a = a - da
31  s(i:i) = achar(a)
32  end if
33  end do
34  end subroutine pc_strupr
35 
36 
38  function fstr_ctrl_get_solution( ctrl, type, nlgeom )
39  integer(kind=kint) :: ctrl
40  integer(kind=kint) :: type
41  logical :: nlgeom
42  integer(kind=kint) :: fstr_ctrl_get_solution
43 
44  integer(kind=kint) :: ipt
45  character(len=80) :: s
46 
48 
49  s = 'ELEMCHECK,STATIC,EIGEN,HEAT,DYNAMIC,NLSTATIC,STATICEIGEN,NZPROF '
50  if( fstr_ctrl_get_param_ex( ctrl, 'TYPE ', s, 1, 'P', type )/= 0) return
51  type = type -1
52 
53  ipt=0
54  if( fstr_ctrl_get_param_ex( ctrl, 'NONLINEAR ', '# ', 0, 'E', ipt )/= 0) return
55  if( ipt/=0 .and. ( type == kststatic .or. type == kstdynamic )) nlgeom = .true.
56 
57  if( type == 5 ) then !if type == NLSTATIC
58  type = kststatic
59  nlgeom = .true.
60  end if
61  if( type == kststaticeigen ) nlgeom = .true.
62 
64  end function fstr_ctrl_get_solution
65 
67  function fstr_ctrl_get_nonlinear_solver( ctrl, method )
68  integer(kind=kint) :: ctrl
69  integer(kind=kint) :: method
70  integer(kind=kint) :: fstr_ctrl_get_nonlinear_solver
71 
72  integer(kind=kint) :: ipt
73  character(len=80) :: s
74 
76 
77  s = 'NEWTON,QUASINEWTON '
78  if( fstr_ctrl_get_param_ex( ctrl, 'METHOD ', s, 1, 'P', method )/= 0) return
81 
83  function fstr_ctrl_get_solver( ctrl, method, precond, nset, iterlog, timelog, steplog, nier, &
84  iterpremax, nrest, nBFGS, scaling, &
85  dumptype, dumpexit, usejad, ncolor_in, mpc_method, estcond, method2, recyclepre, &
86  solver_opt, contact_elim, &
87  resid, singma_diag, sigma, thresh, filter )
88  integer(kind=kint) :: ctrl
89  integer(kind=kint) :: method
90  integer(kind=kint) :: precond
91  integer(kind=kint) :: nset
92  integer(kind=kint) :: iterlog
93  integer(kind=kint) :: timelog
94  integer(kind=kint) :: steplog
95  integer(kind=kint) :: nier
96  integer(kind=kint) :: iterpremax
97  integer(kind=kint) :: nrest
98  integer(kind=kint) :: nbfgs
99  integer(kind=kint) :: scaling
100  integer(kind=kint) :: dumptype
101  integer(kind=kint) :: dumpexit
102  integer(kind=kint) :: usejad
103  integer(kind=kint) :: ncolor_in
104  integer(kind=kint) :: mpc_method
105  integer(kind=kint) :: estcond
106  integer(kind=kint) :: method2
107  integer(kind=kint) :: recyclepre
108  integer(kind=kint) :: solver_opt(10)
109  integer(kind=kint) :: contact_elim
110  real(kind=kreal) :: resid
111  real(kind=kreal) :: singma_diag
112  real(kind=kreal) :: sigma
113  real(kind=kreal) :: thresh
114  real(kind=kreal) :: filter
115  integer(kind=kint) :: fstr_ctrl_get_solver
116 
117  character(92) :: mlist = '1,2,3,4,101,CG,BiCGSTAB,GMRES,GPBiCG,GMRESR,GMRESREN,DIRECT,DIRECTmkl,DIRECTlag,MUMPS,MKL '
118  !character(92) :: mlist = '1,2,3,4,5,101,CG,BiCGSTAB,GMRES,GPBiCG,DIRECT,DIRECTmkl,DIRECTlag,MUMPS,MKL '
119  character(24) :: dlist = '0,1,2,3,NONE,MM,CSR,BSR '
120 
121  integer(kind=kint) :: number_number = 5
122  integer(kind=kint) :: indirect_number = 6 ! GMRESR and GMRESREN need to be added
123  integer(kind=kint) :: iter, time, sclg, dmpt, dmpx, usjd, step
124 
126 
127  iter = iterlog+1
128  time = timelog+1
129  step = steplog+1
130  sclg = scaling+1
131  dmpt = dumptype+1
132  dmpx = dumpexit+1
133  usjd = usejad+1
134  !* parameter in header line -----------------------------------------------------------------*!
135 
136  ! JP-0
137  if( fstr_ctrl_get_param_ex( ctrl, 'METHOD ', mlist, 1, 'P', method ) /= 0) return
138  if( fstr_ctrl_get_param_ex( ctrl, 'PRECOND ', '1,2,3,4,5,6,7,8,9,10,11,12,20,21,30,31,32 ' ,0, 'I', precond ) /= 0) return
139  if( fstr_ctrl_get_param_ex( ctrl, 'NSET ', '0,-1,+1 ', 0, 'I', nset ) /= 0) return
140  if( fstr_ctrl_get_param_ex( ctrl, 'ITERLOG ', 'NO,YES ', 0, 'P', iter ) /= 0) return
141  if( fstr_ctrl_get_param_ex( ctrl, 'TIMELOG ', 'NO,YES,VERBOSE ', 0, 'P', time ) /= 0) return
142  if( fstr_ctrl_get_param_ex( ctrl, 'STEPLOG ', 'NO,YES ', 0, 'P', step ) /= 0) return
143  if( fstr_ctrl_get_param_ex( ctrl, 'SCALING ', 'NO,YES ', 0, 'P', sclg ) /= 0) return
144  if( fstr_ctrl_get_param_ex( ctrl, 'DUMPTYPE ', dlist, 0, 'P', dmpt ) /= 0) return
145  if( fstr_ctrl_get_param_ex( ctrl, 'DUMPEXIT ','NO,YES ', 0, 'P', dmpx ) /= 0) return
146  if( fstr_ctrl_get_param_ex( ctrl, 'USEJAD ' ,'NO,YES ', 0, 'P', usjd ) /= 0) return
147  if( fstr_ctrl_get_param_ex( ctrl, 'MPCMETHOD ','# ', 0, 'I',mpc_method) /= 0) return
148  if( fstr_ctrl_get_param_ex( ctrl, 'ESTCOND ' ,'# ', 0, 'I',estcond ) /= 0) return
149  if( fstr_ctrl_get_param_ex( ctrl, 'METHOD2 ', mlist, 0, 'P', method2 ) /= 0) return
150  if( fstr_ctrl_get_param_ex( ctrl, 'CONTACT_ELIM ','# ', 0, 'I',contact_elim ) /= 0) return
151  ! JP-1
152  if( method > number_number ) then ! JP-2
153  method = method - number_number
154  if( method > indirect_number ) then
155  ! JP-3
156  method = method - indirect_number + 100
157  if( method == 103 ) method = 101 ! DIRECTlag => DIRECT
158  if( method == 105 ) method = 102 ! MKL => DIRECTmkl
159  end if
160  end if
161  if( method2 > number_number ) then ! JP-2
162  method2 = method2 - number_number
163  if( method2 > indirect_number ) then
164  ! JP-3
165  method2 = method2 - indirect_number + 100
166  end if
167  end if
168 
169  dumptype = dmpt - 1
170  if( dumptype >= 4 ) then
171  dumptype = dumptype - 4
172  end if
173 
174  !* data --------------------------------------------------------------------------------------- *!
175  ! JP-4
176  if( fstr_ctrl_get_data_ex( ctrl, 1, 'iiiiii ', nier, iterpremax, nrest, ncolor_in, recyclepre, nbfgs )/= 0) return
177  if( fstr_ctrl_get_data_ex( ctrl, 2, 'rrr ', resid, singma_diag, sigma )/= 0) return
178 
179  if( precond == 20 .or. precond == 21) then
180  if( fstr_ctrl_get_data_ex( ctrl, 3, 'rr ', thresh, filter)/= 0) return
181  else if( precond == 5 ) then
182  if( fstr_ctrl_get_data_ex( ctrl, 3, 'iiiiiiiiii ', &
183  solver_opt(1), solver_opt(2), solver_opt(3), solver_opt(4), solver_opt(5), &
184  solver_opt(6), solver_opt(7), solver_opt(8), solver_opt(9), solver_opt(10) )/= 0) return
185  else if( method == 101 ) then
186  if( fstr_ctrl_get_data_ex( ctrl, 3, 'i ', solver_opt(1) )/= 0) return
187  end if
188 
189  iterlog = iter -1
190  timelog = time -1
191  steplog = step -1
192  scaling = sclg -1
193  dumpexit = dmpx -1
194  usejad = usjd -1
195 
197 
198  end function fstr_ctrl_get_solver
199 
200 
202  function fstr_ctrl_get_step( ctrl, amp, iproc )
203  integer(kind=kint) :: ctrl
204  character(len=HECMW_NAME_LEN) :: amp
205  integer(kind=kint) :: iproc
206  integer(kind=kint) :: fstr_ctrl_get_step
207 
208  integer(kind=kint) :: ipt = 0
209  integer(kind=kint) :: ip = 0
210 
211  fstr_ctrl_get_step = -1
212 
213  if( fstr_ctrl_get_param_ex( ctrl, 'AMP ', '# ', 0, 'S', amp )/= 0) return
214  if( fstr_ctrl_get_param_ex( ctrl, 'TYPE ', 'STANDARD,NLGEOM ', 0, 'P', ipt )/= 0) return
215  if( fstr_ctrl_get_param_ex( ctrl, 'NLGEOM ', '# ', 0, 'E', ip )/= 0) return
216 
217  if( ipt == 2 .or. ip == 1 ) iproc = 1
218 
220 
221  end function fstr_ctrl_get_step
222 
224  logical function fstr_ctrl_get_istep( ctrl, hecMESH, steps, tpname, apname )
225  use fstr_setup_util
226  use m_step
227  integer(kind=kint), intent(in) :: ctrl
228  type (hecmwst_local_mesh), intent(in) :: hecmesh
229  type(step_info), intent(out) :: steps
230  character(len=*), intent(out) :: tpname
231  character(len=*), intent(out) :: apname
232 
233  character(len=HECMW_NAME_LEN) :: data_fmt,ss, data_fmt1
234  character(len=HECMW_NAME_LEN) :: amp
235  character(len=HECMW_NAME_LEN) :: header_name
236  integer(kind=kint) :: bcid
237  integer(kind=kint) :: i, n, sn, ierr
238  integer(kind=kint) :: bc_n, load_n, contact_n
239  real(kind=kreal) :: fn, f1, f2, f3
240 
241  fstr_ctrl_get_istep = .false.
242 
243  write(ss,*) hecmw_name_len
244  write( data_fmt, '(a,a,a)') 'S', trim(adjustl(ss)), 'I '
245  write( data_fmt1, '(a,a,a)') 'S', trim(adjustl(ss)),'rrr '
246 
247  call init_stepinfo(steps)
248  steps%solution = stepstatic
249  if( fstr_ctrl_get_param_ex( ctrl, 'TYPE ', 'STATIC,VISCO ', 0, 'P', steps%solution )/= 0) return
250  steps%inc_type = stepfixedinc
251  if( fstr_ctrl_get_param_ex( ctrl, 'INC_TYPE ', 'FIXED,AUTO ', 0, 'P', steps%inc_type )/= 0) return
252  if( fstr_ctrl_get_param_ex( ctrl, 'SUBSTEPS ', '# ', 0, 'I', steps%num_substep )/= 0) return
253  steps%initdt = 1.d0/steps%num_substep
254  if( fstr_ctrl_get_param_ex( ctrl, 'ITMAX ', '# ', 0, 'I', steps%max_iter )/= 0) return
255  if( fstr_ctrl_get_param_ex( ctrl, 'MAXITER ', '# ', 0, 'I', steps%max_iter )/= 0) return
256  if( fstr_ctrl_get_param_ex( ctrl, 'MAXCONTITER ', '# ', 0, 'I', steps%max_contiter )/= 0) return
257  if( fstr_ctrl_get_param_ex( ctrl, 'CONVERG ', '# ', 0, 'R', steps%converg )/= 0) return
258  if( fstr_ctrl_get_param_ex( ctrl, 'CONVERG_LAG ', '# ', 0, 'R', steps%converg_lag )/= 0) return
259  if( fstr_ctrl_get_param_ex( ctrl, 'CONVERG_DDISP ', '# ', 0, 'R', steps%converg_ddisp )/= 0) return
260  if( fstr_ctrl_get_param_ex( ctrl, 'MAXRES ', '# ', 0, 'R', steps%maxres )/= 0) return
261  amp = ""
262  if( fstr_ctrl_get_param_ex( ctrl, 'AMP ', '# ', 0, 'S', amp )/= 0) return
263  if( len( trim(amp) )>0 ) then
264  call amp_name_to_id( hecmesh, '!STEP', amp, steps%amp_id )
265  endif
266  tpname=""
267  if( fstr_ctrl_get_param_ex( ctrl, 'TIMEPOINTS ', '# ', 0, 'S', tpname )/= 0) return
268  apname=""
269  if( fstr_ctrl_get_param_ex( ctrl, 'AUTOINCPARAM ', '# ', 0, 'S', apname )/= 0) return
270 
271  n = fstr_ctrl_get_data_line_n( ctrl )
272  if( n == 0 ) then
273  fstr_ctrl_get_istep = .true.; return
274  endif
275 
276  f2 = steps%mindt
277  f3 = steps%maxdt
278  if( fstr_ctrl_get_data_ex( ctrl, 1, data_fmt1, ss, f1, f2, f3 )/= 0) return
279  read( ss, * , iostat=ierr ) fn
280  sn=1
281  if( ierr==0 ) then
282  steps%initdt = fn
283  steps%elapsetime = f1
284  if( steps%inc_type == stepautoinc ) then
285  steps%mindt = min(f2,steps%initdt)
286  steps%maxdt = f3
287  endif
288  steps%num_substep = max(int((f1+0.999999999d0*fn)/fn),steps%num_substep)
289  !if( mod(f1,fn)/=0 ) steps%num_substep =steps%num_substep+1
290  sn = 2
291  endif
292 
293  bc_n = 0
294  load_n = 0
295  contact_n = 0
296  do i=sn,n
297  if( fstr_ctrl_get_data_ex( ctrl, i, data_fmt, header_name, bcid )/= 0) return
298  if( trim(header_name) == 'BOUNDARY' ) then
299  bc_n = bc_n + 1
300  else if( trim(header_name) == 'LOAD' ) then
301  load_n = load_n +1
302  else if( trim(header_name) == 'CONTACT' ) then
303  contact_n = contact_n+1
304  else if( trim(header_name) == 'TEMPERATURE' ) then
305  ! steps%Temperature = .true.
306  endif
307  end do
308 
309  if( bc_n>0 ) allocate( steps%Boundary(bc_n) )
310  if( load_n>0 ) allocate( steps%Load(load_n) )
311  if( contact_n>0 ) allocate( steps%Contact(contact_n) )
312 
313  bc_n = 0
314  load_n = 0
315  contact_n = 0
316  do i=sn,n
317  if( fstr_ctrl_get_data_ex( ctrl, i, data_fmt, header_name, bcid )/= 0) return
318  if( trim(header_name) == 'BOUNDARY' ) then
319  bc_n = bc_n + 1
320  steps%Boundary(bc_n) = bcid
321  else if( trim(header_name) == 'LOAD' ) then
322  load_n = load_n +1
323  steps%Load(load_n) = bcid
324  else if( trim(header_name) == 'CONTACT' ) then
325  contact_n = contact_n+1
326  steps%Contact(contact_n) = bcid
327  endif
328  end do
329 
330  fstr_ctrl_get_istep = .true.
331  end function fstr_ctrl_get_istep
332 
334  integer function fstr_ctrl_get_section( ctrl, hecMESH, sections )
335  use fstr_setup_util
336  integer(kind=kint), intent(in) :: ctrl
337  type (hecmwst_local_mesh), intent(inout) :: hecmesh
338  type (tsection), pointer, intent(inout) :: sections(:)
339 
340  integer(kind=kint) :: j, k, sect_id, ori_id, elemopt
341  integer(kind=kint),save :: cache = 1
342  character(len=HECMW_NAME_LEN) :: sect_orien
343  character(19) :: form341list = 'FI,SELECTIVE_ESNS '
344  character(16) :: form361list = 'FI,BBAR,IC,FBAR '
345 
347 
348  if( fstr_ctrl_get_param_ex( ctrl, 'SECNUM ', '# ', 1, 'I', sect_id )/= 0) return
349  if( sect_id > hecmesh%section%n_sect ) return
350 
351  elemopt = 0
352  if( fstr_ctrl_get_param_ex( ctrl, 'FORM341 ', form341list, 0, 'P', elemopt )/= 0) return
353  if( elemopt > 0 ) sections(sect_id)%elemopt341 = elemopt
354 
355  elemopt = 0
356  if( fstr_ctrl_get_param_ex( ctrl, 'FORM361 ', form361list, 0, 'P', elemopt )/= 0) return
357  if( elemopt > 0 ) sections(sect_id)%elemopt361 = elemopt
358 
359  ! sectional orientation ID
360  hecmesh%section%sect_orien_ID(sect_id) = -1
361  if( fstr_ctrl_get_param_ex( ctrl, 'ORIENTATION ', '# ', 0, 'S', sect_orien )/= 0) return
362 
363  if( associated(g_localcoordsys) ) then
364  call fstr_strupr(sect_orien)
365  k = size(g_localcoordsys)
366 
367  if(cache < k)then
368  if( sect_orien == g_localcoordsys(cache)%sys_name ) then
369  hecmesh%section%sect_orien_ID(sect_id) = cache
370  cache = cache + 1
372  return
373  endif
374  endif
375 
376  do j=1, k
377  if( sect_orien == g_localcoordsys(j)%sys_name ) then
378  hecmesh%section%sect_orien_ID(sect_id) = j
379  cache = j + 1
380  exit
381  endif
382  enddo
383  endif
384 
386 
387  end function fstr_ctrl_get_section
388 
389 
391  function fstr_ctrl_get_write( ctrl, res, visual, femap )
392  integer(kind=kint) :: ctrl
393  integer(kind=kint) :: res
394  integer(kind=kint) :: visual
395  integer(kind=kint) :: femap
396  integer(kind=kint) :: fstr_ctrl_get_write
397 
399 
400  ! JP-6
401  if( fstr_ctrl_get_param_ex( ctrl, 'RESULT ', '# ', 0, 'E', res )/= 0) return
402  if( fstr_ctrl_get_param_ex( ctrl, 'VISUAL ', '# ', 0, 'E', visual )/= 0) return
403  if( fstr_ctrl_get_param_ex( ctrl, 'FEMAP ', '# ', 0, 'E', femap )/= 0) return
404 
406 
407  end function fstr_ctrl_get_write
408 
410  function fstr_ctrl_get_echo( ctrl, echo )
411  integer(kind=kint) :: ctrl
412  integer(kind=kint) :: echo
413  integer(kind=kint) :: fstr_ctrl_get_echo
414 
415  echo = kon;
416 
418 
419  end function fstr_ctrl_get_echo
420 
422  function fstr_ctrl_get_couple( ctrl, fg_type, fg_first, fg_window, surf_id, surf_id_len )
423  integer(kind=kint) :: ctrl
424  integer(kind=kint) :: fg_type
425  integer(kind=kint) :: fg_first
426  integer(kind=kint) :: fg_window
427  character(len=HECMW_NAME_LEN) :: surf_id(:)
428  integer(kind=kint) :: surf_id_len
429  integer(kind=kint) :: fstr_ctrl_get_couple
430 
431  character(len=HECMW_NAME_LEN) :: data_fmt,ss
432  write(ss,*) surf_id_len
433  write(data_fmt,'(a,a,a)') 'S',trim(adjustl(ss)),' '
434 
436  if( fstr_ctrl_get_param_ex( ctrl, 'TYPE ', '1,2,3,4,5,6 ', 0, 'I', fg_type )/= 0) return
437  if( fstr_ctrl_get_param_ex( ctrl, 'ISTEP ', '# ', 0, 'I', fg_first )/= 0) return
438  if( fstr_ctrl_get_param_ex( ctrl, 'WINDOW ', '# ', 0, 'I', fg_window )/= 0) return
439 
441  fstr_ctrl_get_data_array_ex( ctrl, data_fmt, surf_id )
442 
443  end function fstr_ctrl_get_couple
444 
446  function fstr_ctrl_get_mpc( ctrl, penalty )
447  integer(kind=kint), intent(in) :: ctrl
448  real(kind=kreal), intent(out) :: penalty
449  integer(kind=kint) :: fstr_ctrl_get_mpc
450 
451  fstr_ctrl_get_mpc = fstr_ctrl_get_data_ex( ctrl, 1, 'r ', penalty )
452  if( penalty <= 1.0 ) then
453  if (myrank == 0) then
454  write(imsg,*) "Warging : !MPC : too small penalty: ", penalty
455  write(*,*) "Warging : !MPC : too small penalty: ", penalty
456  endif
457  endif
458 
459  end function fstr_ctrl_get_mpc
460 
462  logical function fstr_ctrl_get_outitem( ctrl, hecMESH, outinfo )
463  use fstr_setup_util
464  use m_out
465  integer(kind=kint), intent(in) :: ctrl
466  type (hecmwst_local_mesh), intent(in) :: hecmesh
467  type( output_info ), intent(out) :: outinfo
468 
469  integer(kind=kint) :: rcode, ipos
470  integer(kind=kint) :: n, i, j
471  character(len=HECMW_NAME_LEN) :: data_fmt, ss
472  character(len=HECMW_NAME_LEN), allocatable :: header_name(:), onoff(:), vtype(:)
473 
474  write( ss, * ) hecmw_name_len
475  write( data_fmt, '(a,a,a,a,a)') 'S', trim(adjustl(ss)), 'S', trim(adjustl(ss)), ' '
476  ! write( data_fmt, '(a,a,a,a,a,a,a)') 'S', trim(adjustl(ss)), 'S', trim(adjustl(ss)), 'S', trim(adjustl(ss)), ' '
477 
478  fstr_ctrl_get_outitem = .false.
479 
480  outinfo%grp_id_name = "ALL"
481  rcode = fstr_ctrl_get_param_ex( ctrl, 'GROUP ', '# ', 0, 'S', outinfo%grp_id_name )
482  ipos = 0
483  rcode = fstr_ctrl_get_param_ex( ctrl, 'ACTION ', 'SUM ', 0, 'P', ipos )
484  outinfo%actn = ipos
485 
486  n = fstr_ctrl_get_data_line_n( ctrl )
487  if( n == 0 ) return
488  allocate( header_name(n), onoff(n), vtype(n) )
489  header_name(:) = ""; vtype(:) = ""; onoff(:) = ""
490  rcode = fstr_ctrl_get_data_array_ex( ctrl, data_fmt, header_name, onoff )
491  ! rcode = fstr_ctrl_get_data_array_ex( ctrl, data_fmt, header_name, onoff, vtype )
492 
493  do i = 1, n
494  do j = 1, outinfo%num_items
495  if( trim(header_name(i)) == outinfo%keyWord(j) ) then
496  outinfo%on(j) = .true.
497  if( trim(onoff(i)) == 'OFF' ) outinfo%on(j) = .false.
498  if( len( trim(vtype(i)) )>0 ) then
499  if( fstr_str2index( vtype(i), ipos ) ) then
500  outinfo%vtype(j) = ipos
501  else if( trim(vtype(i)) == "SCALER" ) then
502  outinfo%vtype(j) = -1
503  else if( trim(vtype(i)) == "VECTOR" ) then
504  outinfo%vtype(j) = -2
505  else if( trim(vtype(i)) == "SYMTENSOR" ) then
506  outinfo%vtype(j) = -3
507  else if( trim(vtype(i)) == "TENSOR" ) then
508  outinfo%vtype(j) = -4
509  endif
510  endif
511  endif
512  enddo
513  enddo
514 
515  deallocate( header_name, onoff, vtype )
516  fstr_ctrl_get_outitem = .true.
517 
518  end function fstr_ctrl_get_outitem
519 
521  function fstr_ctrl_get_contactalgo( ctrl, algo )
522  integer(kind=kint) :: ctrl
523  integer(kind=kint) :: algo
524  integer(kind=kint) :: fstr_ctrl_get_contactalgo
525 
526  integer(kind=kint) :: rcode
527  character(len=80) :: s
528  algo = kcaslagrange
529  s = 'SLAGRANGE,ALAGRANGE '
530  rcode = fstr_ctrl_get_param_ex( ctrl, 'TYPE ', s, 0, 'P', algo )
532  end function fstr_ctrl_get_contactalgo
533 
535  logical function fstr_ctrl_get_contact( ctrl, n, contact, np, tp, ntol, ttol, ctAlgo, cpname )
536  use fstr_setup_util
537  integer(kind=kint), intent(in) :: ctrl
538  integer(kind=kint), intent(in) :: n
539  integer(kind=kint), intent(in) :: ctalgo
540  type(tcontact), intent(out) :: contact(n)
541  real(kind=kreal), intent(out) :: np
542  real(kind=kreal), intent(out) :: tp
543  real(kind=kreal), intent(out) :: ntol
544  real(kind=kreal), intent(out) :: ttol
545  character(len=*), intent(out) :: cpname
546 
547  integer :: rcode, ipt
548  character(len=30) :: s1 = 'TIED,GLUED,SSLID,FSLID '
549  character(len=HECMW_NAME_LEN) :: data_fmt,ss
550  character(len=HECMW_NAME_LEN) :: cp_name(n)
551  real(kind=kreal) :: fcoeff(n),tpenalty(n)
552 
553  tpenalty = 1.0d6
554 
555  write(ss,*) hecmw_name_len
556 
557  fstr_ctrl_get_contact = .false.
558  contact(1)%ctype = 1 ! pure slave-master contact; default value
559  contact(1)%algtype = contactsslid ! small sliding contact; default value
560  rcode = fstr_ctrl_get_param_ex( ctrl, 'INTERACTION ', s1, 0, 'P', contact(1)%algtype )
561  if( contact(1)%algtype==contactglued ) contact(1)%algtype=contactfslid ! not complemented yet
562  if( fstr_ctrl_get_param_ex( ctrl, 'GRPID ', '# ', 1, 'I', contact(1)%group )/=0) return
563  do rcode=2,n
564  contact(rcode)%ctype = contact(1)%ctype
565  contact(rcode)%group = contact(1)%group
566  contact(rcode)%algtype = contact(1)%algtype
567  end do
568 
569  if( contact(1)%algtype==contactsslid .or. contact(1)%algtype==contactfslid ) then
570  write( data_fmt, '(a,a,a)') 'S', trim(adjustl(ss)),'Rr '
571  if( fstr_ctrl_get_data_array_ex( ctrl, data_fmt, cp_name, fcoeff, tpenalty ) /= 0 ) return
572  do rcode=1,n
573  call fstr_strupr(cp_name(rcode))
574  contact(rcode)%pair_name = cp_name(rcode)
575  contact(rcode)%fcoeff = fcoeff(rcode)
576  contact(rcode)%tPenalty = tpenalty(rcode)
577  enddo
578  else if( contact(1)%algtype==contacttied ) then
579  write( data_fmt, '(a,a)') 'S', trim(adjustl(ss))
580  if( fstr_ctrl_get_data_array_ex( ctrl, data_fmt, cp_name ) /= 0 ) return
581  do rcode=1,n
582  call fstr_strupr(cp_name(rcode))
583  contact(rcode)%pair_name = cp_name(rcode)
584  contact(rcode)%fcoeff = 0.d0
585  contact(rcode)%tPenalty = 1.d+4
586  enddo
587  endif
588 
589  np = 0.d0; tp=0.d0
590  ntol = 0.d0; ttol=0.d0
591  if( fstr_ctrl_get_param_ex( ctrl, 'NPENALTY ', '# ', 0, 'R', np ) /= 0 ) return
592  if( fstr_ctrl_get_param_ex( ctrl, 'TPENALTY ', '# ', 0, 'R', tp ) /= 0 ) return
593  if( fstr_ctrl_get_param_ex( ctrl, 'NTOL ', '# ', 0, 'R', ntol ) /= 0 ) return
594  if( fstr_ctrl_get_param_ex( ctrl, 'TTOL ', '# ', 0, 'R', ttol ) /= 0 ) return
595  cpname=""
596  if( fstr_ctrl_get_param_ex( ctrl, 'CONTACTPARAM ', '# ', 0, 'S', cpname )/= 0) return
597  fstr_ctrl_get_contact = .true.
598  end function fstr_ctrl_get_contact
599 
601  logical function fstr_ctrl_get_embed( ctrl, n, embed, cpname )
602  use fstr_setup_util
603  integer(kind=kint), intent(in) :: ctrl
604  integer(kind=kint), intent(in) :: n
605  type(tcontact), intent(out) :: embed(n)
606  character(len=*), intent(out) :: cpname
607 
608  integer :: rcode, ipt
609  character(len=30) :: s1 = 'TIED,GLUED,SSLID,FSLID '
610  character(len=HECMW_NAME_LEN) :: data_fmt,ss
611  character(len=HECMW_NAME_LEN) :: cp_name(n)
612  real(kind=kreal) :: fcoeff(n),tpenalty(n)
613 
614  tpenalty = 1.0d6
615 
616  write(ss,*) hecmw_name_len
617 
618  fstr_ctrl_get_embed = .false.
619  embed(1)%ctype = 1 ! pure slave-master contact; default value
620  embed(1)%algtype = contacttied ! small sliding contact; default value
621  if( fstr_ctrl_get_param_ex( ctrl, 'GRPID ', '# ', 1, 'I', embed(1)%group )/=0) return
622  do rcode=2,n
623  embed(rcode)%ctype = embed(1)%ctype
624  embed(rcode)%group = embed(1)%group
625  embed(rcode)%algtype = embed(1)%algtype
626  end do
627 
628  write( data_fmt, '(a,a)') 'S', trim(adjustl(ss))
629  if( fstr_ctrl_get_data_array_ex( ctrl, data_fmt, cp_name ) /= 0 ) return
630  do rcode=1,n
631  call fstr_strupr(cp_name(rcode))
632  embed(rcode)%pair_name = cp_name(rcode)
633  enddo
634 
635  cpname=""
636  if( fstr_ctrl_get_param_ex( ctrl, 'CONTACTPARAM ', '# ', 0, 'S', cpname )/= 0) return
637  fstr_ctrl_get_embed = .true.
638  end function
639 
641  function fstr_ctrl_get_contactparam( ctrl, contactparam )
642  implicit none
643  integer(kind=kint) :: ctrl
644  type( tcontactparam ) :: contactparam
645  integer(kind=kint) :: fstr_ctrl_get_contactparam
646 
647  integer(kind=kint) :: rcode
648  character(len=HECMW_NAME_LEN) :: data_fmt
649  character(len=128) :: msg
650  real(kind=kreal) :: clearance, clr_same_elem, clr_difflpos, clr_cal_norm
651  real(kind=kreal) :: distclr_init, distclr_free, distclr_nocheck, tensile_force
652  real(kind=kreal) :: box_exp_rate
653 
655 
656  !parameters
657  contactparam%name = ''
658  if( fstr_ctrl_get_param_ex( ctrl, 'NAME ', '# ', 1, 'S', contactparam%name ) /=0 ) return
659 
660  !read first line
661  data_fmt = 'rrrr '
662  rcode = fstr_ctrl_get_data_ex( ctrl, 1, data_fmt, &
663  & clearance, clr_same_elem, clr_difflpos, clr_cal_norm )
664  if( rcode /= 0 ) return
665  contactparam%CLEARANCE = clearance
666  contactparam%CLR_SAME_ELEM = clr_same_elem
667  contactparam%CLR_DIFFLPOS = clr_difflpos
668  contactparam%CLR_CAL_NORM = clr_cal_norm
669 
670  !read second line
671  data_fmt = 'rrrrr '
672  rcode = fstr_ctrl_get_data_ex( ctrl, 2, data_fmt, &
673  & distclr_init, distclr_free, distclr_nocheck, tensile_force, box_exp_rate )
674  if( rcode /= 0 ) return
675  contactparam%DISTCLR_INIT = distclr_init
676  contactparam%DISTCLR_FREE = distclr_free
677  contactparam%DISTCLR_NOCHECK = distclr_nocheck
678  contactparam%TENSILE_FORCE = tensile_force
679  contactparam%BOX_EXP_RATE = box_exp_rate
680 
681  !input check
682  rcode = 1
683  if( clearance<0.d0 .OR. 1.d0<clearance ) THEN
684  write(msg,*) 'fstr control file error : !CONTACT_PARAM : CLEARANCE must be 0 < CLEARANCE < 1.'
685  else if( clr_same_elem<0.d0 .or. 1.d0<clr_same_elem ) then
686  write(msg,*) 'fstr control file error : !CONTACT_PARAM : CLR_SAME_ELEM must be 0 < CLR_SAME_ELEM < 1.'
687  else if( clr_difflpos<0.d0 .or. 1.d0<clr_difflpos ) then
688  write(msg,*) 'fstr control file error : !CONTACT_PARAM : CLR_DIFFLPOS must be 0 < CLR_DIFFLPOS < 1.'
689  else if( clr_cal_norm<0.d0 .or. 1.d0<clr_cal_norm ) then
690  write(msg,*) 'fstr control file error : !CONTACT_PARAM : CLR_CAL_NORM must be 0 < CLR_CAL_NORM < 1.'
691  else if( distclr_init<0.d0 .or. 1.d0<distclr_init ) then
692  write(msg,*) 'fstr control file error : !CONTACT_PARAM : DISTCLR_INIT must be 0 < DISTCLR_INIT < 1.'
693  else if( distclr_free<-1.d0 .or. 1.d0<distclr_free ) then
694  write(msg,*) 'fstr control file error : !CONTACT_PARAM : DISTCLR_FREE must be -1 < DISTCLR_FREE < 1.'
695  else if( distclr_nocheck<0.5d0 ) then
696  write(msg,*) 'fstr control file error : !CONTACT_PARAM : DISTCLR_NOCHECK must be >= 0.5.'
697  else if( tensile_force>=0.d0 ) then
698  write(msg,*) 'fstr control file error : !CONTACT_PARAM : TENSILE_FORCE must be < 0.'
699  else if( box_exp_rate<=1.d0 .or. 2.0<box_exp_rate ) then
700  write(msg,*) 'fstr control file error : !CONTACT_PARAM : BOX_EXP_RATE must be 1 < BOX_EXP_RATE <= 2.'
701  else
702  rcode =0
703  end if
704  if( rcode /= 0 ) then
705  write(*,*) trim(msg)
706  write(ilog,*) trim(msg)
707  return
708  endif
709 
711  end function fstr_ctrl_get_contactparam
712 
714  function fstr_ctrl_get_contact_if( ctrl, n, contact_if )
715  use fstr_setup_util
716  integer(kind=kint), intent(in) :: ctrl
717  integer(kind=kint), intent(in) :: n
718  !
719  type(tcontactinterference), intent(out) :: contact_if(n)
720 
721  integer :: rcode, i
722  character(len=30) :: s1 = 'SLAVE,MASTER '
723  character(len=HECMW_NAME_LEN) :: data_fmt,ss
724  character(len=HECMW_NAME_LEN) :: cp_name(n)
725  real(kind=kreal) :: init_pos(n), end_pos(n)
726  integer(kind=kint) :: fstr_ctrl_get_contact_if
727 
729  write(ss,*) hecmw_name_len
730  if( fstr_ctrl_get_param_ex( ctrl, 'TYPE ', s1, 0, 'P', contact_if(1)%if_type ) /= 0 ) return
731  if( fstr_ctrl_get_param_ex( ctrl, 'END ', '# ', 0, 'R', contact_if(1)%etime ) /= 0 ) return
732  write( data_fmt, '(a,a,a)') 'S', trim(adjustl(ss)),'rr '
733  init_pos = 0.d0; end_pos = 0.d0
734  if( fstr_ctrl_get_data_array_ex( ctrl, data_fmt, cp_name, init_pos, end_pos ) /= 0 ) return
735  do i = 1, n
736  contact_if(i)%if_type = contact_if(1)%if_type
737  contact_if(i)%etime = contact_if(1)%etime
738 
739  contact_if(i)%cp_name = cp_name(i)
740  contact_if(i)%initial_pos = - init_pos(i)
741  contact_if(i)%end_pos = - end_pos(i)
742  if(contact_if(i)%if_type == c_if_slave .and. init_pos(i) /= 0.d0) contact_if(i)%initial_pos = 0.d0
743  end do
745 
746  end function fstr_ctrl_get_contact_if
747 
749  function fstr_ctrl_get_elemopt( ctrl, elemopt361 )
750  integer(kind=kint) :: ctrl
751  integer(kind=kint) :: elemopt361
752  integer(kind=kint) :: fstr_ctrl_get_elemopt
753 
754  character(72) :: o361list = 'IC,Bbar '
755 
756  integer(kind=kint) :: o361
757 
759 
760  o361 = elemopt361 + 1
761 
762  !* parameter in header line -----------------------------------------------------------------*!
763  if( fstr_ctrl_get_param_ex( ctrl, '361 ', o361list, 0, 'P', o361 ) /= 0) return
764 
765  elemopt361 = o361 - 1
766 
768 
769  end function fstr_ctrl_get_elemopt
770 
771 
773  function fstr_get_autoinc( ctrl, aincparam )
774  implicit none
775  integer(kind=kint) :: ctrl
776  type( tparamautoinc ) :: aincparam
777  integer(kind=kint) :: fstr_get_autoinc
778 
779  integer(kind=kint) :: rcode
780  character(len=HECMW_NAME_LEN) :: data_fmt
781  character(len=128) :: msg
782  integer(kind=kint) :: bound_s(10), bound_l(10)
783  real(kind=kreal) :: rs, rl
784 
785  fstr_get_autoinc = -1
786 
787  bound_s(:) = 0
788  bound_l(:) = 0
789 
790  !parameters
791  aincparam%name = ''
792  if( fstr_ctrl_get_param_ex( ctrl, 'NAME ', '# ', 1, 'S', aincparam%name ) /=0 ) return
793 
794  !read first line ( decrease criteria )
795  data_fmt = 'riiii '
796  rcode = fstr_ctrl_get_data_ex( ctrl, 1, data_fmt, rs, &
797  & bound_s(1), bound_s(2), bound_s(3), aincparam%NRtimes_s )
798  if( rcode /= 0 ) return
799  aincparam%ainc_Rs = rs
800  aincparam%NRbound_s(knstmaxit) = bound_s(1)
801  aincparam%NRbound_s(knstsumit) = bound_s(2)
802  aincparam%NRbound_s(knstciter) = bound_s(3)
803 
804  !read second line ( increase criteria )
805  data_fmt = 'riiii '
806  rcode = fstr_ctrl_get_data_ex( ctrl, 2, data_fmt, rl, &
807  & bound_l(1), bound_l(2), bound_l(3), aincparam%NRtimes_l )
808  if( rcode /= 0 ) return
809  aincparam%ainc_Rl = rl
810  aincparam%NRbound_l(knstmaxit) = bound_l(1)
811  aincparam%NRbound_l(knstsumit) = bound_l(2)
812  aincparam%NRbound_l(knstciter) = bound_l(3)
813 
814  !read third line ( cutback criteria )
815  data_fmt = 'ri '
816  rcode = fstr_ctrl_get_data_ex( ctrl, 3, data_fmt, &
817  & aincparam%ainc_Rc, aincparam%CBbound )
818  if( rcode /= 0 ) return
819 
820  !input check
821  rcode = 1
822  if( rs<0.d0 .or. rs>1.d0 ) then
823  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : decrease ratio Rs must 0 < Rs < 1.'
824  else if( any(bound_s<0) ) then
825  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : decrease NR bound must >= 0.'
826  else if( aincparam%NRtimes_s < 1 ) then
827  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : # of times to decrease must > 0.'
828  else if( rl<1.d0 ) then
829  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : increase ratio Rl must > 1.'
830  else if( any(bound_l<0) ) then
831  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : increase NR bound must >= 0.'
832  else if( aincparam%NRtimes_l < 1 ) then
833  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : # of times to increase must > 0.'
834  elseif( aincparam%ainc_Rc<0.d0 .or. aincparam%ainc_Rc>1.d0 ) then
835  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : cutback decrease ratio Rc must 0 < Rc < 1.'
836  else if( aincparam%CBbound < 1 ) then
837  write(msg,*) 'fstr control file error : !AUTOINC_PARAM : maximum # of cutback times must > 0.'
838  else
839  rcode =0
840  end if
841  if( rcode /= 0 ) then
842  write(*,*) trim(msg)
843  write(ilog,*) trim(msg)
844  return
845  endif
846 
847  fstr_get_autoinc = 0
848  end function fstr_get_autoinc
849 
851  function fstr_ctrl_get_timepoints( ctrl, tp )
852  integer(kind=kint) :: ctrl
853  type(time_points) :: tp
854  integer(kind=kint) :: fstr_ctrl_get_timepoints
855 
856  integer(kind=kint) :: i, n, rcode
857  logical :: generate
858  real(kind=kreal) :: stime, etime, interval
859 
861 
862  tp%name = ''
863  if( fstr_ctrl_get_param_ex( ctrl, 'NAME ', '# ', 1, 'S', tp%name ) /=0 ) return
864  tp%range_type = 1
865  if( fstr_ctrl_get_param_ex( ctrl, 'TIME ', 'STEP,TOTAL ', 0, 'P', tp%range_type ) /= 0 ) return
866  generate = .false.
867  if( fstr_ctrl_get_param_ex( ctrl, 'GENERATE ', '# ', 0, 'E', generate ) /= 0) return
868 
869  if( generate ) then
870  stime = 0.d0; etime = 0.d0; interval = 1.d0
871  if( fstr_ctrl_get_data_ex( ctrl, 1, 'rrr ', stime, etime, interval ) /= 0) return
872  tp%n_points = int((etime-stime)/interval)+1
873  allocate(tp%points(tp%n_points))
874  do i=1,tp%n_points
875  tp%points(i) = stime + dble(i-1)*interval
876  end do
877  else
878  n = fstr_ctrl_get_data_line_n( ctrl )
879  if( n == 0 ) return
880  tp%n_points = n
881  allocate(tp%points(tp%n_points))
882  if( fstr_ctrl_get_data_array_ex( ctrl, 'r ', tp%points ) /= 0 ) return
883  do i=1,tp%n_points-1
884  if( tp%points(i) < tp%points(i+1) ) cycle
885  write(*,*) 'Error in reading !TIME_POINT: time points must be given in ascending order.'
886  return
887  end do
888  end if
889 
891  end function fstr_ctrl_get_timepoints
892 
894  function fstr_ctrl_get_amplitude( ctrl, nline, name, type_def, type_time, type_val, n, val, table )
895  implicit none
896  integer(kind=kint), intent(in) :: ctrl
897  integer(kind=kint), intent(in) :: nline
898  character(len=HECMW_NAME_LEN), intent(out) :: name
899  integer(kind=kint), intent(out) :: type_def
900  integer(kind=kint), intent(out) :: type_time
901  integer(kind=kint), intent(out) :: type_val
902  integer(kind=kint), intent(out) :: n
903  real(kind=kreal), pointer :: val(:)
904  real(kind=kreal), pointer :: table(:)
905  integer(kind=kint) :: fstr_ctrl_get_amplitude
906 
907  integer(kind=kint) :: t_def, t_time, t_val
908  integer(kind=kint) :: i, j
909  real(kind=kreal) :: r(4), t(4)
910 
912 
913  name = ''
914  t_def = 1
915  t_time = 1
916  t_val = 1
917 
918  if( fstr_ctrl_get_param_ex( ctrl, 'NAME ', '# ', 1, 'S', name )/=0 ) return
919  if( fstr_ctrl_get_param_ex( ctrl, 'DEFINITION ', 'TABULAR ', 0, 'P', t_def )/=0 ) return
920  if( fstr_ctrl_get_param_ex( ctrl, 'TIME ', 'STEP ', 0, 'P', t_time )/=0 ) return
921  if( fstr_ctrl_get_param_ex( ctrl, 'VALUE ', 'RELATIVE,ABSOLUTE ', 0, 'P', t_val )/=0 ) return
922 
923  if( t_def==1 ) then
924  type_def = hecmw_amp_typedef_tabular
925  else
926  write(*,*) 'Error in reading !AMPLITUDE: invalid value for parameter DEFINITION.'
927  endif
928  if( t_time==1 ) then
929  type_time = hecmw_amp_typetime_step
930  else
931  write(*,*) 'Error in reading !AMPLITUDE: invalid value for parameter TIME.'
932  endif
933  if( t_val==1 ) then
934  type_val = hecmw_amp_typeval_relative
935  elseif( t_val==2 ) then
936  type_val = hecmw_amp_typeval_absolute
937  else
938  write(*,*) 'Error in reading !AMPLITUDE: invalid value for parameter VALUE.'
939  endif
940 
941  n = 0
942  do i = 1, nline
943  r(:)=huge(0.0d0); t(:)=huge(0.0d0)
944  if( fstr_ctrl_get_data_ex( ctrl, 1, 'RRrrrrrr ', r(1), t(1), r(2), t(2), r(3), t(3), r(4), t(4) ) /= 0) return
945  n = n+1
946  val(n) = r(1)
947  table(n) = t(1)
948  do j = 2, 4
949  if (r(j) < huge(0.0d0) .and. t(j) < huge(0.0d0)) then
950  n = n+1
951  val(n) = r(j)
952  table(n) = t(j)
953  else
954  exit
955  endif
956  enddo
957  enddo
959 
960  end function fstr_ctrl_get_amplitude
961 
962 end module fstr_ctrl_common
int fstr_ctrl_get_param_ex(int *ctrl, const char *param_name, const char *value_list, int *necessity, char *type, void *val)
int fstr_ctrl_get_data_array_ex(int *ctrl, const char *format,...)
int fstr_ctrl_get_data_ex(int *ctrl, int *line_no, const char *format,...)
This module contains fstr control file data obtaining functions.
integer(kind=kint) function fstr_ctrl_get_contactalgo(ctrl, algo)
Read in !CONTACT.
integer(kind=kint) function fstr_ctrl_get_contactparam(ctrl, contactparam)
Read in !CONTACT_PARAM !
integer(kind=kint) function fstr_ctrl_get_solution(ctrl, type, nlgeom)
Read in !SOLUTION.
integer(kind=kint) function fstr_ctrl_get_contact_if(ctrl, n, contact_if)
Read in contact interference.
integer(kind=kint) function fstr_ctrl_get_couple(ctrl, fg_type, fg_first, fg_window, surf_id, surf_id_len)
Read in !COUPLE.
integer(kind=kint) function fstr_get_autoinc(ctrl, aincparam)
Read in !AUTOINC_PARAM !
integer(kind=kint) function fstr_ctrl_get_amplitude(ctrl, nline, name, type_def, type_time, type_val, n, val, table)
Read in !AMPLITUDE.
logical function fstr_ctrl_get_outitem(ctrl, hecMESH, outinfo)
Read in !OUTPUT_RES & !OUTPUT_VIS.
integer(kind=kint) function fstr_ctrl_get_elemopt(ctrl, elemopt361)
Read in !ELEMOPT.
integer(kind=kint) function fstr_ctrl_get_timepoints(ctrl, tp)
Read in !TIME_POINTS.
integer(kind=kint) function fstr_ctrl_get_solver(ctrl, method, precond, nset, iterlog, timelog, steplog, nier, iterpremax, nrest, nBFGS, scaling, dumptype, dumpexit, usejad, ncolor_in, mpc_method, estcond, method2, recyclepre, solver_opt, contact_elim, resid, singma_diag, sigma, thresh, filter)
Read in !SOLVER.
integer(kind=kint) function fstr_ctrl_get_echo(ctrl, echo)
Read in !ECHO.
integer(kind=kint) function fstr_ctrl_get_nonlinear_solver(ctrl, method)
Read in !NONLINEAR_SOLVER.
integer(kind=kint) function fstr_ctrl_get_mpc(ctrl, penalty)
Read in !MPC.
integer function fstr_ctrl_get_section(ctrl, hecMESH, sections)
Read in !SECTION.
logical function fstr_ctrl_get_contact(ctrl, n, contact, np, tp, ntol, ttol, ctAlgo, cpname)
Read in contact definition.
logical function fstr_ctrl_get_istep(ctrl, hecMESH, steps, tpname, apname)
Read in !STEP and !ISTEP.
integer(kind=kint) function fstr_ctrl_get_write(ctrl, res, visual, femap)
Read in !WRITE.
integer(kind=kint) function fstr_ctrl_get_step(ctrl, amp, iproc)
Read in !STEP.
logical function fstr_ctrl_get_embed(ctrl, n, embed, cpname)
Read in contact definition.
This module contains auxiliary functions in calculation setup.
logical function fstr_str2index(s, x)
subroutine amp_name_to_id(hecMESH, header_name, aname, id)
subroutine fstr_strupr(s)
Definition: hecmw.f90:6
This module defines common data and basic structures for analysis.
Definition: m_fstr.f90:15
integer(kind=kint) myrank
PARALLEL EXECUTION.
Definition: m_fstr.f90:96
integer(kind=kint), parameter imsg
Definition: m_fstr.f90:110
integer(kind=kint), parameter kstdynamic
Definition: m_fstr.f90:40
real(kind=kreal) etime
Definition: m_fstr.f90:140
integer(kind=kint), parameter kon
Definition: m_fstr.f90:32
integer(kind=kint), parameter kcaslagrange
contact analysis algorithm
Definition: m_fstr.f90:59
integer(kind=kint), parameter ilog
FILE HANDLER.
Definition: m_fstr.f90:107
integer(kind=kint), parameter kststatic
Definition: m_fstr.f90:37
integer(kind=kint), parameter kststaticeigen
Definition: m_fstr.f90:42
This module manages step information.
Definition: m_out.f90:6
This module manages step information.
Definition: m_step.f90:6
subroutine init_stepinfo(stepinfo)
Initializer.
Definition: m_step.f90:67
integer, parameter stepfixedinc
Definition: m_step.f90:14
integer, parameter stepautoinc
Definition: m_step.f90:15
integer, parameter stepstatic
Definition: m_step.f90:12
This module manages timepoint information.
Definition: m_timepoint.f90:6
This module provides functions to calculate contact stiff matrix.
Definition: fstr_contact.f90:6
Data for section control.
Definition: m_fstr.f90:642
output information
Definition: m_out.f90:17
Step control such as active boundary condition, convergent condition etc.
Definition: m_step.f90:24
Time points storage for output etc.
Definition: m_timepoint.f90:14