OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
c_crkadd.F
Go to the documentation of this file.
1Copyright> OpenRadioss
2Copyright> Copyright (C) 1986-2025 Altair Engineering Inc.
3Copyright>
4Copyright> This program is free software: you can redistribute it and/or modify
5Copyright> it under the terms of the GNU Affero General Public License as published by
6Copyright> the Free Software Foundation, either version 3 of the License, or
7Copyright> (at your option) any later version.
8Copyright>
9Copyright> This program is distributed in the hope that it will be useful,
10Copyright> but WITHOUT ANY WARRANTY; without even the implied warranty of
11Copyright> MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
12Copyright> GNU Affero General Public License for more details.
13Copyright>
14Copyright> You should have received a copy of the GNU Affero General Public License
15Copyright> along with this program. If not, see <https://www.gnu.org/licenses/>.
16Copyright>
17Copyright>
18Copyright> Commercial Alternative: Altair Radioss Software
19Copyright>
20Copyright> As an alternative to this open-source version, Altair also offers Altair Radioss
21Copyright> software under a commercial license. Contact Altair to discuss further if the
22Copyright> commercial version may interest you: https://www.altair.com/radioss/.
23C
24!||====================================================================
25!|| c_crkadd ../starter/source/restart/ddsplit/c_crkadd.F
26!||--- called by ------------------------------------------------------
27!|| ddsplit ../starter/source/restart/ddsplit/ddsplit.F
28!||====================================================================
29 SUBROUTINE c_crkadd(
30 . ELCUTC ,NODENR ,KXFENOD2ELC ,ENRTAG ,
31 . ELCUTC_L ,NODENR_L ,KXFENOD2ELC_L,ENRTAG_L,
32 . NUMELC_L ,NUMELTG_L ,NUMNOD_L ,NODGLOB ,INOD_CRKXFEM ,
33 . P ,CEP ,ELCUTTG_L ,INCRKXFEM_L,INDEX_CRKXFEM)
34C-----------------------------------------------
35C M o d u l e s
36C-----------------------------------------------
37C-----------------------------------------------
38C I m p l i c i t T y p e s
39C-----------------------------------------------
40#include "implicit_f.inc"
41C-----------------------------------------------
42C C o m m o n B l o c k s
43C-----------------------------------------------
44#include "com04_c.inc"
45#include "com_xfem1.inc"
46C-----------------------------------------------
47C D u m m y A r g u m e n t s
48C-----------------------------------------------
49 INTEGER ELCUTC(2,*),NODENR(*),KXFENOD2ELC(*),ENRTAG(NUMNOD,*),
50 . ELCUTC_L(2,*),NODENR_L(*),
51 . KXFENOD2ELC_L(*),ENRTAG_L(NUMNOD_L,*),
52 . NUMELC_L,NUMELTG_L,NCRKXFE_L,NUMNOD_L,NODGLOB(*),
53 . inod_crkxfem(*),p,cep(*),elcuttg_l(2,*),incrkxfem_l(*),
54 . index_crkxfem(*)
55C-----------------------------------------------
56C L o c a l V a r i a b l e s
57C-----------------------------------------------
58 INTEGER I,J,PROC,OFFC,OFFTG,NOD,NOD_CRK,IEL_L,NL_L
59C-----------------------------------------------
60 OFFC = numels + numelq
61 offtg = offc + numelc + numelt + numelp + numelr
62C
63 iel_l = 0
64 DO i=1,numelc
65 IF (cep(i+offc) == p) THEN
66 iel_l = iel_l + 1
67 DO j=1,2
68 elcutc_l(j,iel_l) = elcutc(j,i)
69 ENDDO
70 ENDIF
71 ENDDO
72C
73 iel_l = 0
74 DO i=1,numeltg
75 IF (cep(i+offtg) == p) THEN
76 iel_l = iel_l + 1
77 DO j=1,2
78 elcuttg_l(j,iel_l) = elcutc(j,i+numelc)
79 ENDDO
80 ENDIF
81 ENDDO
82C---
83 nl_l = 0
84 DO i=1,numnod_l
85 nod = nodglob(i)
86cc IF (NOD > 0 .and. INOD_CRKXFEM(NOD) > 0) THEN
87 IF (incrkxfem_l(i) > 0) THEN
88 nl_l = nl_l + 1
89 nod_crk = inod_crkxfem(nod)
90 nodenr_l(nl_l) = nodenr(nod_crk)
91 kxfenod2elc(nl_l) = kxfenod2elc(nod_crk)
92 ENDIF
93c
94c or even:
95c
96c NL_L = INCRKXFEM_L(I)
97c IF(NL_L > 0)THEN
98c NOD_CRK = INDEX_CRKXFEM(NL_L)
99c NODENR_L(NL_L) = NODENR(NOD_CRK)
100c KXFENOD2ELC(NL_L) = KXFENOD2ELC(NOD_CRK)
101c ENDIF
102 DO j=1,ienrnod
103 enrtag_l(i,j) = enrtag(nod,j)
104 ENDDO
105 ENDDO
106C-----------
107 RETURN
108 END
subroutine c_crkadd(elcutc, nodenr, kxfenod2elc, enrtag, elcutc_l, nodenr_l, kxfenod2elc_l, enrtag_l, numelc_l, numeltg_l, numnod_l, nodglob, inod_crkxfem, p, cep, elcuttg_l, incrkxfem_l, index_crkxfem)
Definition c_crkadd.F:34