OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
inifill.F File Reference
#include "implicit_f.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine inifill (numels, numeltg, numelq, numnod, npart, npropmi, nummat, n2d, ngroup, ixs, ipm, ipart_, iphase, sipart_, idp, kvol, bufmat, itagnsol, isolnod, nbip, ntrace, part_fill, nbsubmat, mlw, elbuf_tab, ng, multi_fvm, ixq, ixtg, ityp, imat, siphase, numel_tot, nel, nft, sbufmat)

Function/Subroutine Documentation

◆ inifill()

subroutine inifill ( integer, intent(in) numels,
integer, intent(in) numeltg,
integer, intent(in) numelq,
integer, intent(in) numnod,
integer, intent(in) npart,
integer, intent(in) npropmi,
integer, intent(in) nummat,
integer, intent(in) n2d,
integer, intent(in) ngroup,
integer, dimension(nixs,numels), target ixs,
integer, dimension(npropmi,nummat) ipm,
integer, dimension(sipart_) ipart_,
integer, dimension(nbsubmat+1,siphase/(nbsubmat+1)) iphase,
integer, intent(in) sipart_,
integer idp,
kvol,
bufmat,
integer, dimension(numnod) itagnsol,
integer isolnod,
integer, dimension(nbsubmat,numel_tot) nbip,
integer ntrace,
integer, dimension(npart) part_fill,
integer nbsubmat,
integer mlw,
type(elbuf_struct_), dimension(ngroup), intent(in), target elbuf_tab,
integer ng,
type (multi_fvm_struct), intent(in) multi_fvm,
integer, dimension(nixq,numelq), target ixq,
integer, dimension(nixtg, numeltg), target ixtg,
integer ityp,
integer imat,
integer siphase,
integer numel_tot,
integer nel,
integer nft,
integer, intent(in) sbufmat )

Definition at line 31 of file inifill.F.

39C-----------------------------------------------
40C M o d u l e s
41C-----------------------------------------------
42 USE elbufdef_mod , ONLY : elbuf_struct_
43 USE multi_fvm_mod , ONLY : multi_fvm_struct
44C-----------------------------------------------
45C I m p l i c i t T y p e s
46C-----------------------------------------------
47#include "implicit_f.inc"
48C-----------------------------------------------
49C D u m m y A r g u m e n t s
50C-----------------------------------------------
51 INTEGER,INTENT(IN) :: NUMELS,NUMELTG,NUMELQ,NUMNOD,NPART,NPROPMI,NUMMAT,N2D,NGROUP,SIPART_,SBUFMAT
52 INTEGER SIPHASE,IPM(NPROPMI,NUMMAT),IPHASE(NBSUBMAT+1,SIPHASE/(NBSUBMAT+1))
53 INTEGER IPART_(SIPART_),IDP,ITAGNSOL(NUMNOD),NUMEL_TOT,NBIP(NBSUBMAT,NUMEL_TOT)
54 INTEGER ISOLNOD,PART_FILL(NPART),NTRACE, ITYP, IMAT, NBSUBMAT, MLW, NG, NEL, NFT
55 INTEGER,TARGET :: IXS(NIXS,NUMELS),IXQ(NIXQ,NUMELQ), IXTG(NIXTG, NUMELTG)
56 INTEGER,POINTER :: pIXQ,pIXTG,pIXS
57 my_real kvol(nbsubmat,numel_tot),bufmat(sbufmat)
58 TYPE(ELBUF_STRUCT_), TARGET, DIMENSION(NGROUP), INTENT(IN) :: ELBUF_TAB
59 TYPE (MULTI_FVM_STRUCT), INTENT(IN) :: MULTI_FVM
60C-----------------------------------------------
61C L o c a l V a r i a b l e s
62C-----------------------------------------------
63 INTEGER NF1,IADBUF,NPAR
64C-----------------------------------------------
65C S o u r c e L i n e s
66C-----------------------------------------------
67
68 nf1 = nft+1
69 npar = ipm(9,imat)
70 iadbuf = max(1,ipm(7,imat))
71
72 NULLIFY(pixs)
73 NULLIFY(pixq)
74 NULLIFY(pixtg)
75 IF(numels>0) pixs => ixs(1,nf1)
76 IF(numelq>0) pixq => ixq(1,nf1)
77 IF(n2d>0 .AND. numeltg>0) pixtg => ixtg(1,nf1)
78
79C-----------
80 CALL iniphase(n2d ,numels ,numeltg ,numelq ,
81 . numnod ,ngroup ,
82 . pixs ,ipart_(nf1) ,iphase(1,nf1) ,idp ,
83 . kvol(1,nf1) ,npar ,bufmat(iadbuf) ,ntrace ,
84 . itagnsol ,isolnod ,part_fill ,nbip(1,nf1) ,
85 . nbsubmat ,mlw ,elbuf_tab ,ng ,
86 . multi_fvm ,pixq ,pixtg ,ityp ,
87 . nel )
88C-----------------------------------------------------------------
89 RETURN
#define my_real
Definition cppsort.cpp:32
subroutine iniphase(n2d, numels, numeltg, numelq, numnod, ngroup, ixs, ipart_, iphase, idp, kvol, nuparam, uparam, ntrace, itagnsol, isolnod, part_fill, nbip, nbsubmat, mlw, elbuf_tab, ng, multi_fvm, ixq, ixtg, ityp, nel)
Definition iniphase.F:36
#define max(a, b)
Definition macros.h:21