OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
thsol_count.F File Reference
#include "implicit_f.inc"
#include "vect01_c.inc"
#include "com01_c.inc"
#include "task_c.inc"
#include "param_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine thsol_count (nthgrp2, ithgrp, wa_size, index_wa_sol, iparg, ithbuf, sithbuf)

Function/Subroutine Documentation

◆ thsol_count()

subroutine thsol_count ( integer, intent(inout) nthgrp2,
integer, dimension(nithgr,*), intent(in) ithgrp,
integer, intent(inout) wa_size,
integer, dimension(2*nthgrp2+1), intent(inout) index_wa_sol,
integer, dimension(nparg,ngroup) iparg,
integer, dimension(*) ithbuf,
integer, intent(in) sithbuf )

Definition at line 28 of file thsol_count.F.

30C-----------------------------------------------
31C M o d u l e s
32C-----------------------------------------------
33C-----------------------------------------------
34C I m p l i c i t T y p e s
35C-----------------------------------------------
36#include "implicit_f.inc"
37C-----------------------------------------------
38C C o m m o n B l o c k s
39C-----------------------------------------------
40#include "vect01_c.inc"
41#include "com01_c.inc"
42#include "task_c.inc"
43#include "param_c.inc"
44C-----------------------------------------------
45C D u m m y A r g u m e n t s
46C-----------------------------------------------
47 INTEGER,INTENT(IN) :: SITHBUF
48 INTEGER IPARG(NPARG,NGROUP),ITHBUF(*)
49 INTEGER, INTENT(inout) :: WA_SIZE,NTHGRP2
50 INTEGER, DIMENSION(2*NTHGRP2+1), INTENT(inout) :: INDEX_WA_SOL
51 INTEGER, DIMENSION(NITHGR,*), INTENT(in) :: ITHGRP
52C-----------------------------------------------
53C L o c a l V a r i a b l e s
54C-----------------------------------------------
55 LOGICAL :: BOOL
56 INTEGER II,I,J,JJ,K,L,N, IH, NG, MTE,LWA,NEL,
57 . NUVAR, IP,IPT,ISOLNOD,ITENS,IPWWA,ISPAU,IUWWA,
58 . IT,IR,IS,J1,J2,J3,NPTG,NPTR,NPTT,NPTS,NLAY,NFAIL,NVARF,
59 . NC1,NC2,NC3,NC4,NC5,NC6,NC7,NC8,KHBE,KCVT,NUVARTH,
60 . CPT,PID,ISVIS,TSHELL,TSH_ORT,ICSIG,IVISC,NPTL,IL,KK(6)
61 INTEGER :: J_FIRST,NITER,IADB,NN,IADV,NVAR,ITYP,IJK
62 INTEGER, DIMENSION(NTHGRP2) :: INDEX_SOL
63
64C--------------------------------------------
65
66 ijk = 0
67 wa_size = 0
68 index_sol(1:nthgrp2) = 0
69 DO niter=1,nthgrp2
70 ityp=ithgrp(2,niter)
71 nn =ithgrp(4,niter)
72 iadb =ithgrp(5,niter)
73 nvar=ithgrp(6,niter)
74 iadv=ithgrp(7,niter)
75 ii=0
76 IF(ityp==1)THEN
77! -------------------------------
78 ih=iadb
79
80 DO WHILE((ithbuf(ih+nn) /= ispmd).AND.(ih < iadb+nn))
81 ih = ih + 1
82 ENDDO
83
84 IF (ih >= iadb+nn) GOTO 666
85
86 DO ng=1,ngroup
87 ity = iparg(5,ng)
88 isvis = iparg(60,ng)
89 ivisc = iparg(61,ng)
90 nft = iparg(3,ng)
91c
92 IF (ity == ityp) THEN
93 mte = iparg(1,ng)
94 nel = iparg(2,ng)
95 IF (mte /= 0 .AND. mte /= 13) THEN
96 DO i=1,nel
97 n =i+nft
98 k =ithbuf(ih)
99 ip=ithbuf(ih+nn)
100
101 IF (k == n)THEN
102 ih=ih+1
103 ii = ((ih-1) - iadb)*nvar
104 DO WHILE((ithbuf(ih+nn) /= ispmd).AND.(ih < iadb+nn))
105 ih = ih + 1
106 ENDDO
107 IF (ih > iadb+nn) GOTO 666
108 wa_size = wa_size + nvar + 1
109 ENDIF ! element = ITHBUF()
110 ENDDO ! NEL
111 ENDIF ! mte /= 13
112 ENDIF ! ITY
113 ENDDO ! groupe
114! -------------------------------
115 ENDIF
116 666 continue
117 index_sol(niter) = wa_size
118 ENDDO
119
120
121 j_first = 0
122 bool = .true.
123 DO i=1,nthgrp2
124 IF(bool.EQV..true.) THEN
125 IF( index_sol(i)/=0 ) THEN
126 bool = .false.
127 j_first = i
128 ENDIF
129 ENDIF
130 ENDDO
131
132 j = 0
133 IF(j_first>0) THEN
134 j=j+1
135 index_wa_sol(j) = index_sol(j_first)
136 j=j+1
137 index_wa_sol(j) = j_first
138 DO i=j_first+1,nthgrp2
139 IF( index_sol(i)-index_sol(i-1)>0 ) THEN
140 j=j+1
141 index_wa_sol(j) = index_sol(i)
142 j=j+1
143 index_wa_sol(j) = i
144 ENDIF
145 ENDDO
146 ENDIF
147 index_wa_sol(2*nthgrp2+1) = j ! number of non-zero index
148C-----------
149 RETURN
integer function nvar(text)
Definition nvar.F:32