OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
c_ncrkxfem.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/.
23!||====================================================================
24!|| c_ncrkxfem ../starter/source/restart/ddsplit/c_ncrkxfem.F
25!||--- called by ------------------------------------------------------
26!|| ddsplit ../starter/source/restart/ddsplit/ddsplit.F
27!||--- uses -----------------------------------------------------
28!||====================================================================
29 SUBROUTINE c_ncrkxfem(NODGLOB,INOD_CRKXFEM,INOD_L,
30 . NUMNOD_L,NUMNODCRKXFE_L,INDEX,PROC,
31 . IXC,IXTG,CEP_XFE,NODLOCAL,NODLEVXF_L,
32 . NODLEVXF,NODGLOBXFE,NOD_XFE_L,CRKSHELL)
33C-----------------------------------------------
34 USE xfem2def_mod
35C-----------------------------------------------
36C I m p l i c i t T y p e s
37C-----------------------------------------------
38#include "implicit_f.inc"
39C-----------------------------------------------
40C C o m m o n B l o c k s
41C-----------------------------------------------
42#include "com_xfem1.inc"
43#include "com04_c.inc"
44C-----------------------------------------------
45C D u m m y A r g u m e n t s
46C-----------------------------------------------
47 INTEGER NODGLOB(*),INOD_CRKXFEM(*),INOD_L(*),
48 . NUMNOD_L,NUMNODCRKXFE_L,INDEX(*),PROC,
49 . IXC(NIXC,*),IXTG(NIXTG,*),CEP_XFE(*),
50 . nodlocal(*),nodlevxf_l(*),nodlevxf(*),
51 . nodglobxfe(*),nod_xfe_l
52 TYPE (XFEM_SHELL_) , DIMENSION(NLEVMAX) :: CRKSHELL
53C-----------------------------------------------
54C L o c a l V a r i a b l e s
55C-----------------------------------------------
56 INTEGER I,NL_L,II,JJ,J,K,NOD,ELTYP,ELEM,
57 . INOD_CRK,NOD_XFE_G,NELCRK
58 INTEGER, DIMENSION(:), ALLOCATABLE :: NODTAG
59C=======================================================================
60! 1d array
61 ALLOCATE( nodtag(0:numnod_l+1) )
62! ----------------------------------
63c Tableaux noeuds phantomes chaque ply
64C-----------------------------------------------
65 nelcrk = 0
66 DO k=1,nlevmax
67 DO i=1,crkshell(k)%CRKNUMSHELL
68 elem = crkshell(k)%PHANTOML(i)
69 eltyp = crkshell(k)%ELTYPE(i)
70 IF (cep_xfe(i) == proc) THEN
71 IF(eltyp == 4) THEN
72 DO j=1,eltyp
73 nod = ixc(j+1,elem)
74 IF (nod > 0) THEN
75 IF (inod_crkxfem(nod) > 0) THEN ! N noeud local xfem
76 nod_xfe_g = crkshell(k)%XNODEG(j,i) ! ID glob node phantome sur ply
77 nod_xfe_l = nod_xfe_l + 1 ! ID local node phantome sur ply
78 nodglobxfe(nod_xfe_l) = nod_xfe_g ! Id local -> Id global (phant)
79 ENDIF
80 ENDIF
81 ENDDO
82 ELSEIF (eltyp == 3) THEN
83 DO j=1,eltyp
84 nod = ixtg(j+1,elem)
85 IF (nod > 0) THEN
86 IF(inod_crkxfem(nod) > 0)THEN
87 nod_xfe_g = crkshell(k)%XNODEG(j,i)
88 nod_xfe_l = nod_xfe_l + 1
89 nodglobxfe(nod_xfe_l) = nod_xfe_g
90 ENDIF
91 ENDIF
92 ENDDO
93C
94c add one more node (as sh4) for animation files (3N -> 4N)
95C
96 nod_xfe_g = crkshell(k)%XNODEG(4,i)
97 nod_xfe_l = nod_xfe_l + 1
98 nodglobxfe(nod_xfe_l) = nod_xfe_g
99 END IF
100 ENDIF
101 ENDDO
102 nelcrk = nelcrk + crkshell(k)%CRKNUMSHELL ! Nb elements total sur nlevmax
103 ENDDO
104 numnodxfe = nod_xfe_l ! Nb noeuds total sur nlevmax
105C
106 nodtag(1:numnod_l) = 0
107 k = 1 ! the same as K=1,NLEVMAX
108 DO i=1,crkshell(k)%CRKNUMSHELL
109 eltyp = crkshell(k)%ELTYPE(i)
110 elem = crkshell(k)%PHANTOML(i)
111 IF (cep_xfe(i) == proc) THEN
112 IF (eltyp == 4) THEN
113 DO j=1,eltyp
114 nod = ixc(j+1,elem)
115 nodtag(nodlocal(nod))=nod
116 ENDDO
117 ELSEIF (eltyp == 3) THEN
118 DO j=1,eltyp
119 nod = ixtg(j+1,elem)
120 nodtag(nodlocal(nod))=nod
121 ENDDO
122 END IF
123 END IF
124 END DO
125C---
126 nl_l = 0
127 DO i=1,numnod_l
128 nod = nodtag(i)
129 IF (nod > 0) THEN
130 IF (inod_crkxfem(nod) > 0) THEN
131 nl_l = nl_l + 1
132 inod_l(i) = nl_l
133 index(nl_l) = inod_crkxfem(nod)
134 inod_crk = inod_crkxfem(nod)
135 nodlevxf_l(nl_l) = nodlevxf(inod_crk) ! nb des copies d'un nooeuds std xfem
136 ENDIF
137 ENDIF
138 ENDDO
139C---
140 numnodcrkxfe_l = nl_l
141C---
142! ----------------------------------
143! 1d array
144 DEALLOCATE( nodtag )
145! ----------------------------------
146 RETURN
147 END
subroutine c_ncrkxfem(nodglob, inod_crkxfem, inod_l, numnod_l, numnodcrkxfe_l, index, proc, ixc, ixtg, cep_xfe, nodlocal, nodlevxf_l, nodlevxf, nodglobxfe, nod_xfe_l, crkshell)
Definition c_ncrkxfem.F:33