37 . IOK_PART,IS_WRITTEN_NODE,NODAL_VECTOR)
59#include "implicit_f.inc"
69 INTEGER,
INTENT(IN) :: IPARG(NPARG,*), IFLG,IXS(NIXS,NUMELS),IXQ(NIXQ
70INTEGER,
INTENT(IN) :: IOK_PART(*)
71 INTEGER,
INTENT(INOUT) :: IS_WRITTEN_NODE(*)
74 TYPE (ELBUF_STRUCT_),
DIMENSION(NGROUP),
TARGET :: ELBUF_TAB
75 TYPE(buf_mat_),
POINTER :: MBUF
76 TYPE(g_bufel_),
POINTER :: GBUF
80 INTEGER :: NGM, IDLOCM, IBM,ICELLM,MLW,NCELL,NELm,NBF,NBL,ICELL,NIN,NODE_ID,IB,NG,I
81 my_real :: rho_cell, rho(4), vfrac(4)
82 REAL,
DIMENSION(:,:),
ALLOCATABLE :: BUFFER
91 ALLOCATE(buffer(3,numnod))
97 DO WHILE (icell<=ncell)
99 IF (icell>ncell .AND. ncell/=0)icell=9
100 ibm =
brick_list(nin,ib)%POLY(icell)%WhereIsMain(4)
109 mbuf =>elbuf_tab(ngm)%BUFLY(1)%MAT(1,1,1)
115 !uvar(i,3) : density of liquid
118 rho(1) = mbuf%VAR((3-1)*nelm+idlocm)
119 rho(2) = mbuf%VAR((2-1)*nelm+idlocm)
120 vfrac(1) = mbuf%VAR((4-1)*nelm+idlocm)
121 vfrac(2) = mbuf%VAR((5-1)*nelm+idlocm)
122 rho_cell = rho(1)*vfrac(1) + rho(2)*vfrac(2)
128 rho_cell = gbuf%RHO(idlocm)
134 buffer(1,node_id) = gbuf%MOM(nelm*(1-1) + idlocm) / rho_cell
135 buffer(2,node_id) = gbuf%MOM(nelm*(2-1) + idlocm) / rho_cell
136 buffer(3,node_id) = gbuf%MOM(nelm*(3-1) + idlocm) / rho_cell
139 buffer(1,node_id) = gbuf%MOM(nelm*(1-1) + idlocm)
140 buffer(2,node_id) = gbuf%MOM(nelm*(2-1) + idlocm)
141 buffer(3,node_id) = gbuf%MOM(nelm*(3-1) + idlocm)
144 buffer(1,node_id) =
brick_list(nin,ibm)%FCELL(1)
145 buffer(2,node_id) =
brick_list(nin,ibm)%FCELL(2)
146 buffer(3,node_id) =
brick_list(nin,ibm)%FCELL(3)
148 buffer(1,node_id) = zero
149 buffer(2,node_id) = zero
150 buffer(3,node_id) = zero
subroutine h3d_nodal_vector(elbuf_tab, nodal_vector, ifunc, iparg, geo, mass, pm, anin, itab, node_id, info1, info2, is_written_node, h3d_part, ipartc, iparttg, ixc, ixtg, temp, iflow, rflow, ixs, ixq, nv46, monvol, diag_sms, ms, pdama2, x, volmon, stifr, stifn, a, d, v, cont, fcontg, fint, fext, keyword, fncont, fncontg, ftcont, ftcontg, fncont2, dr, dxancg, fanreac, fcluster, mcluster, vr, fopt, npby, vgaz, ipari, igrnod, weight, nodglob, fcont_max, fncontp2, ftcontp2, ar, ipartsp, ipartr, ipartp, ipartt, iparts, ipartq, kxsp, ixr, ixp, ixt, n_h3d_part_list, nodal_vector_fvm, is_written_node_fvm, airbags_total_fvm_in_h3d, smonvol, svolmon, ispmd, fvdata_p, airbags_node_id_shift, w, sw, x_c)