OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
xfecut.F File Reference
#include "implicit_f.inc"
#include "param_c.inc"
#include "com01_c.inc"
#include "com04_c.inc"
#include "com_xfem1.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine xfecut (iparg, ixc, ixtg, ilev, elcutc, iel_crk, iadc_crk, nodedge, crkedge, xedge4n, xedge3n)

Function/Subroutine Documentation

◆ xfecut()

subroutine xfecut ( integer, dimension(nparg,*) iparg,
integer, dimension(nixc,*) ixc,
integer, dimension(nixtg,*) ixtg,
integer ilev,
integer, dimension(2,*) elcutc,
integer, dimension(*) iel_crk,
integer, dimension(*) iadc_crk,
integer, dimension(2,*) nodedge,
type (xfem_edge_), dimension(*) crkedge,
integer, dimension(4,*) xedge4n,
integer, dimension(3,*) xedge3n )

Definition at line 33 of file xfecut.F.

36C-----------------------------------------------
38C-----------------------------------------------
39C I m p l i c i t T y p e s
40C-----------------------------------------------
41#include "implicit_f.inc"
42C-----------------------------------------------
43C C o m m o n B l o c k s
44C-----------------------------------------------
45#include "param_c.inc"
46#include "com01_c.inc"
47#include "com04_c.inc"
48#include "com_xfem1.inc"
49C-----------------------------------------------
50C D u m m y A r g u m e n t s
51C-----------------------------------------------
52 INTEGER ILEV,IPARG(NPARG,*),IXC(NIXC,*),ELCUTC(2,*),IEL_CRK(*),
53 . IADC_CRK(*),IXTG(NIXTG,*),NODEDGE(2,*),XEDGE4N(4,*),XEDGE3N(3,*)
54 TYPE (XFEM_EDGE_) , DIMENSION(*) :: CRKEDGE
55C-----------------------------------------------
56C L o c a l V a r i a b l e s
57C-----------------------------------------------
58 INTEGER NG,NEL,JFT,JLT,NFT,IXFEM,ITY,ITG1,ITG2,ACTIFXFEM
59C=======================================================================
60 IF (nlevset > 0) THEN
61C---
62 itg1 = 1+numelc
63 itg2 = 1+4*ecrkxfec
64C
65 DO ng=1,ngroup
66 nel = iparg(2,ng)
67 nft = iparg(3,ng)
68 ity = iparg(5,ng)
69 ixfem = iparg(54,ng)
70 actifxfem = iparg(70,ng)
71 IF (ity/=3 .and. ity/=7) cycle
72 IF (ixfem == 0) cycle
73 IF (actifxfem == 0) cycle
74 jft = 1
75 jlt = nel
76C
77 IF (ity == 3) THEN
78 CALL xfeconnec4n(
79 . jft ,jlt ,nft ,ixc ,elcutc ,
80 . iel_crk ,iadc_crk,ilev ,nodedge ,crkedge ,
81 . xedge4n )
82 ELSE IF (ity == 7) THEN
83 CALL xfeconnec3n(
84 . jft ,jlt ,nft ,ixtg ,elcutc(1,itg1),
85 . iel_crk(itg1),iadc_crk(itg2),ilev ,nodedge,crkedge,
86 . xedge3n )
87 END IF
88 ENDDO
89 ENDIF
90C-----------
91 RETURN
subroutine xfeconnec3n(jft, jlt, nft, ixtg, elcutc, iel_crktg, iad_crktg, ilev, nodedge, crkedge, xedge3n)
Definition xfeconnec3n.F:34
subroutine xfeconnec4n(jft, jlt, nft, ixc, elcutc, iel_crk, iadc_crk, ilev, nodedge, crkedge, xedge4n)
Definition xfeconnec4n.F:33