OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
dmasani0.F File Reference
#include "implicit_f.inc"
#include "vect01_c.inc"
#include "com01_c.inc"
#include "sphcom.inc"
#include "scr17_c.inc"
#include "param_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine dmasani0 (x, d, elbuf_tab, geo, iparg, mas, pm, el2fa, ipart, ipartsp)

Function/Subroutine Documentation

◆ dmasani0()

subroutine dmasani0 ( x,
d,
type (elbuf_struct_), dimension(ngroup), target elbuf_tab,
geo,
integer, dimension(nparg,*) iparg,
mas,
pm,
integer, dimension(*) el2fa,
integer, dimension(lipart1,*) ipart,
integer, dimension(*) ipartsp )

Definition at line 33 of file dmasani0.F.

35C-----------------------------------------------
36C M o d u l e s
37C-----------------------------------------------
38 USE initbuf_mod
39 USE elbufdef_mod
40C-----------------------------------------------
41C I m p l i c i t T y p e s
42C-----------------------------------------------
43#include "implicit_f.inc"
44C-----------------------------------------------
45C C o m m o n B l o c k s
46C-----------------------------------------------
47#include "vect01_c.inc"
48#include "com01_c.inc"
49#include "sphcom.inc"
50#include "scr17_c.inc"
51#include "param_c.inc"
52C-----------------------------------------------
53C D u m m y A r g u m e n t s
54C-----------------------------------------------
55C REAL
57 . mas(*) ,pm(npropm,*),geo(npropg,*),x(3,*),d(3,*)
58 INTEGER IPARG(NPARG,*),EL2FA(*),IPART(LIPART1,*),
59 . IPARTSP(*)
60 TYPE (ELBUF_STRUCT_), DIMENSION(NGROUP), TARGET :: ELBUF_TAB
61C-----------------------------------------------
62C L o c a l V a r i a b l e s
63C-----------------------------------------------
64C REAL
66 . off, VALUE
67 INTEGER I, NG, NEL, N, MT,IALEL,NN1,NN2,IPRT
68 REAL R4
69 TYPE(G_BUFEL_) ,POINTER :: GBUF
70C=======================================================================
71 nn1 = 1
72 nn2 = nn1 + (numsph+maxpjet)
73C-----------------------------------------------
74C face ext
75C-----------------------------------------------
76 DO 490 ng=1,ngroup
77 CALL initbuf(iparg ,ng ,
78 2 mtn ,nel ,nft ,iad ,ity ,
79 3 npt ,jale ,ismstr ,jeul ,jtur ,
80 4 jthe ,jlag ,jmult ,jhbe ,jivf ,
81 5 nvaux ,jpor ,jcvt ,jclose ,jplasol ,
82 6 irep ,iint ,igtyp ,israt ,isrot ,
83 7 icsen ,isorth ,isorthg ,ifailure,jsms )
84 IF (ity == 51) THEN
85C-----------------------------------------------
86C PARTICULES SPH.
87C-----------------------------------------------
88 lft=1
89 llt=nel
90 gbuf => elbuf_tab(ng)%GBUF
91 ialel=iparg(7,ng)+iparg(11,ng)
92 DO i=lft,llt
93 n = i + nft
94 IF(el2fa(nn1+n)/=0)THEN
95 IF(ialel==0)THEN
96 iprt=ipartsp(n)
97 mt =ipart(1,iprt)
98 VALUE=pm(89,mt)*gbuf%VOL(i)
99 ELSE
100 off = min(gbuf%OFF(i),one)
101 VALUE=gbuf%RHO(i)*gbuf%VOL(i)*off
102 ENDIF
103 mas(el2fa(nn1+n)) = VALUE
104 ENDIF
105 ENDDO
106 ENDIF
107C-----------------------------------------------
108C FIN DE BOUCLE SUR LES GROUPES
109C-----------------------------------------------
110 490 CONTINUE
111C-----------------------------------------------
112 RETURN
#define my_real
Definition cppsort.cpp:32
#define min(a, b)
Definition macros.h:20
subroutine initbuf(iparg, ng, mtn, llt, nft, iad, ity, npt, jale, ismstr, jeul, jtur, jthe, jlag, jmult, jhbe, jivf, mid, jpor, jcvt, jclose, jpla, irep, iint, igtyp, israt, isrot, icsen, isorth, isorthg, ifailure, jsms)
Definition initbuf.F:261