OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
crk_tagxp4.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!|| crk_tagxp4 ../engine/source/elements/xfem/crk_tagxp4.F
26!||--- called by ------------------------------------------------------
27!|| upxfem_tagxp ../engine/source/elements/xfem/upxfem_tagxp.F
28!||--- uses -----------------------------------------------------
29!|| crackxfem_mod ../engine/share/modules/crackxfem_mod.F
30!||====================================================================
31 SUBROUTINE crk_tagxp4(IPARG ,IXC ,NFT ,JFT ,JLT ,
32 . ELCUTC ,IADC_CRK,IEL_CRK,INOD_CRK,ENRTAG,
33 . NXLAY ,CRKEDGE ,XEDGE4N,ITAB )
34C-----------------------------------------------
36C-----------------------------------------------
37C I m p l i c i t T y p e s
38C-----------------------------------------------
39#include "implicit_f.inc"
40C-----------------------------------------------
41C G l o b a l P a r a m e t e r s
42C-----------------------------------------------
43#include "mvsiz_p.inc"
44#include "param_c.inc"
45C-----------------------------------------------
46C C o m m o n B l o c k s
47C-----------------------------------------------
48#include "com04_c.inc"
49#include "com_xfem1.inc"
50C-----------------------------------------------
51C D u m m y A r g u m e n t s
52C-----------------------------------------------
53 INTEGER NFT,JFT,JLT,NXLAY
54 INTEGER IPARG(NPARG,*),IXC(NIXC,*),ELCUTC(2,*),INOD_CRK(*),
55 . iadc_crk(4,*),iel_crk(*),enrtag(numnod,*),xedge4n(4,*),itab(*)
56 TYPE (XFEM_EDGE_) , DIMENSION(*) :: CRKEDGE
57C-----------------------------------------------
58C L o c a l V a r i a b l e s
59C-----------------------------------------------
60 INTEGER I,K,IR,IAD,NELCRK,ELCRK,ILEV,ILAY,IXEL,ELCUT,LAYCUT,
61 . IECUT,ENR0,ENR,IBOUNDEDGE,IED,EDGE,COUNT,ITIP,ITRI,NUMXEL,NSX,
62 . isend_nsx,isend_iad
63 INTEGER JCT(MVSIZ),NS(4),IADC(4)
64C=======================================================================
65 nelcrk = 0
66 DO i=jft,jlt
67 jct(i) = 0
68 IF (elcutc(1,i+nft) /= 0) THEN
69 nelcrk = nelcrk + 1
70 jct(nelcrk) = i
71 ENDIF
72 ENDDO
73 IF (nelcrk == 0) RETURN
74c--------------------
75 DO ilay=1,nxlay
76 DO ir=1,nelcrk
77 i = jct(ir)
78 elcrk = iel_crk(i+nft)
79 elcut = xfem_phantom(ilay)%ELCUT(elcrk)
80 laycut = abs(crkedge(ilay)%LAYCUT(elcrk))
81 IF (elcut /= 0 .and. laycut == 1) THEN ! new advancing crack
82 itri = xfem_phantom(ilay)%ITRI(1,elcrk)
83 ns(1) = ixc(2,i+nft)
84 ns(2) = ixc(3,i+nft)
85 ns(3) = ixc(4,i+nft)
86 ns(4) = ixc(5,i+nft)
87 iadc(1) = iadc_crk(1,elcrk)
88 iadc(2) = iadc_crk(2,elcrk)
89 iadc(3) = iadc_crk(3,elcrk)
90 iadc(4) = iadc_crk(4,elcrk)
91 isend_nsx = 0
92 isend_iad = 0
93c Tag phantom nodes with new positive enrichment to copy the velocities
94 IF (itri /= 0) THEN
95 ixel = 3
96 ilev = nxel*(ilay-1) + ixel
97 ! sender = third phantom
98 DO k=1,4
99 iad = iadc(k)
100 enr0 = crklvset(ilev)%ENR0(2,iad)
101 enr = crklvset(ilev)%ENR0(1,iad)
102 edge = xedge4n(k,elcrk) ! global egdge N
103 iboundedge = crkedge(ilay)%IBORDEDGE(edge)
104 nsx = inod_crk(ns(k))
105 IF (enr > 0 .and. iboundedge /= 2) THEN
106 xfem_phantom(ilay)%TAGXP(1,nsx,enr) = iad
107 xfem_phantom(ilay)%TAGXP(2,nsx,enr) = ilev
108 xfem_phantom(ilay)%TAGXP(3,nsx,enr) = 2 ! counter
109 isend_nsx = nsx
110 isend_iad = iad
111 ENDIF
112 ENDDO
113 ENDIF
114c
115 numxel = 2 ! receiver : first or second phantom
116 DO ixel=1,numxel
117 ilev = nxel*(ilay-1) + ixel
118 DO k=1,4
119 iad = iadc(k)
120 enr0 = crklvset(ilev)%ENR0(2,iad)
121 enr = abs(crklvset(ilev)%ENR0(1,iad))
122 edge = xedge4n(k,elcrk) ! global egdge N
123 iboundedge = crkedge(ilay)%IBORDEDGE(edge)
124 nsx = inod_crk(ns(k))
125 IF (isend_nsx /= nsx .and. isend_iad /= iad) THEN
126 IF (enr > 0 .and. iboundedge /= 2) THEN
127 xfem_phantom(ilay)%TAGXP(4,nsx,enr) = iad
128 xfem_phantom(ilay)%TAGXP(5,nsx,enr) = ilev
129 xfem_phantom(ilay)%TAGXP(3,nsx,enr) = 2 ! counter
130 ENDIF
131 ENDIF
132 ENDDO
133 ENDDO ! DO IXEL=1,NUMXEL
134C--------------------------------------------------------------------------
135 ENDIF ! IF (ELCUT /= 0 .and. LAYCUT == 1)
136 ENDDO ! DO IR=1,NELCRK
137 ENDDO ! DO ILAY=1,NXLAY
138c-----------------------------------------------
139 RETURN
140 END
subroutine crk_tagxp4(iparg, ixc, nft, jft, jlt, elcutc, iadc_crk, iel_crk, inod_crk, enrtag, nxlay, crkedge, xedge4n, itab)
Definition crk_tagxp4.F:34
type(xfem_phantom_), dimension(:), allocatable xfem_phantom
type(xfem_lvset_), dimension(:), allocatable crklvset