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

Go to the source code of this file.

Functions/Subroutines

subroutine intal3 (ipari, x, v, a, vg, iskew, skew, icode, ixs, ixq, elbuf_tab, iparg, pm, nale, intbuf_tab)

Function/Subroutine Documentation

◆ intal3()

subroutine intal3 ( integer, dimension(npari,ninter) ipari,
x,
v,
a,
vg,
integer, dimension(*) iskew,
skew,
integer, dimension(*) icode,
integer, dimension(nixs,numels) ixs,
integer, dimension(nixq,numelq) ixq,
type(elbuf_struct_), dimension(ngroup) elbuf_tab,
integer, dimension(nparg,ngroup) iparg,
pm,
integer, dimension(*) nale,
type(intbuf_struct_), dimension(*) intbuf_tab )

Definition at line 35 of file intal3.F.

39C-----------------------------------------------
40C M o d u l e s
41C-----------------------------------------------
42 USE elbufdef_mod
43 USE intbufdef_mod
44C-----------------------------------------------
45C I m p l i c i t T y p e s
46C-----------------------------------------------
47#include "implicit_f.inc"
48C-----------------------------------------------
49C C o m m o n B l o c k s
50C-----------------------------------------------
51#include "com01_c.inc"
52#include "com04_c.inc"
53#include "param_c.inc"
54#include "task_c.inc"
55C-----------------------------------------------
56C D u m m y A r g u m e n t s
57C-----------------------------------------------
58 INTEGER IPARI(NPARI,NINTER), ICODE(*),IXS(NIXS,NUMELS),IXQ(NIXQ,NUMELQ), IPARG(NPARG,NGROUP),ISKEW(*), NALE(*)
59 my_real x(3,numnod), v(3,numnod), a(3,numnod), vg(*), skew(*), pm(npropm,nummat)
60 TYPE(ELBUF_STRUCT_), DIMENSION(NGROUP) :: ELBUF_TAB
61 TYPE(INTBUF_STRUCT_) INTBUF_TAB(*)
62C-----------------------------------------------
63C L o c a l V a r i a b l e s
64C-----------------------------------------------
65 INTEGER N, NTY, ITIED
66C-----------------------------------------------
67C S o u r c e L i n e s
68C-----------------------------------------------
69 DO n=1,ninter
70 nty = ipari(7,n)
71 IF(nty == 1)THEN
72 IF(ispmd == 0)THEN
73 CALL intal4(ipari(1,n),intbuf_tab(n),v ,vg)
74 END IF
75 ELSEIF(nty == 9) THEN
76 CALL i9wale(
77 1 ipari(1,n),intbuf_tab(n),x ,v ,
78 2 a ,vg ,icode ,iskew ,skew ,
79 3 ixs ,ixq ,elbuf_tab ,iparg ,
80 4 pm ,nale )
81 ELSEIF(nty == 12) THEN
82 IF(ispmd == 0)THEN
83 itied=nint(intbuf_tab(n)%VARIABLES(1))
84C Grid Velocities of secondary nodes are not interpolated
85C ONLY in case "TIED"
86 IF (itied == 1 .OR. itied == 2) CALL int12w(ipari(1,n),intbuf_tab(n),vg)
87 ENDIF
88 ENDIF
89 enddo!next N
90C
91 RETURN
92C
#define my_real
Definition cppsort.cpp:32
subroutine i9wale(ipari, intbuf_tab, x, v, a, vg, icode, iskew, skew, ixs, ixq, elbuf_tab, iparg, pm, nale)
Definition i9wale.F:38
subroutine int12w(ipari, intbuf_tab, vg)
Definition int12w.F:34
subroutine intal4(ipari, intbuf_tab, v, vg)
Definition intal4.F:33