OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
aturi3.F
Go to the documentation of this file.
1Copyright> OpenRadioss
2Copyright> Copyright (C) 1986-2025 Altair Engineering Inc.
3Copyright>
4Copyright> This program is free software: you can redistribute it and/or modify
5Copyright> it under the terms of the GNU Affero General Public License as published by
6Copyright> the Free Software Foundation, either version 3 of the License, or
7Copyright> (at your option) any later version.
8Copyright>
9Copyright> This program is distributed in the hope that it will be useful,
10Copyright> but WITHOUT ANY WARRANTY; without even the implied warranty of
11Copyright> MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
12Copyright> GNU Affero General Public License for more details.
13Copyright>
14Copyright> You should have received a copy of the GNU Affero General Public License
15Copyright> along with this program. If not, see <https://www.gnu.org/licenses/>.
16Copyright>
17Copyright>
18Copyright> Commercial Alternative: Altair Radioss Software
19Copyright>
20Copyright> As an alternative to this open-source version, Altair also offers Altair Radioss
21Copyright> software under a commercial license. Contact Altair to discuss further if the
22Copyright> commercial version may interest you: https://www.altair.com/radioss/.
23C
24!||====================================================================
25!|| aturi3 ../starter/source/ale/ale3d/aturi3.F
26!||--- called by ------------------------------------------------------
27!|| multifluid_init3 ../starter/source/multifluid/multifluid_init3.F
28!|| s4init3 ../starter/source/elements/solid/solide4/s4init3.F
29!|| sinit3 ../starter/source/elements/solid/solide/sinit3.F
30!||====================================================================
31 SUBROUTINE aturi3(IPARG,RHO,PM,IX,X,RK,RE,VOLU)
32C-----------------------------------------------
33C D e s c r i p t i o n
34C-----------------------------------------------
35C This subroutine is initializing state for
36C turbulency model K-EPS in ALE (3D)
37C-----------------------------------------------
38C I m p l i c i t T y p e s
39C-----------------------------------------------
40#include "implicit_f.inc"
41C-----------------------------------------------
42C G l o b a l P a r a m e t e r s
43C-----------------------------------------------
44#include "mvsiz_p.inc"
45C-----------------------------------------------
46C C o m m o n B l o c k s
47C-----------------------------------------------
48#include "com01_c.inc"
49#include "vect01_c.inc"
50#include "param_c.inc"
51#include "com04_c.inc"
52C-----------------------------------------------
53C D u m m y A r g u m e n t s
54C-----------------------------------------------
55 INTEGER,INTENT(IN) :: IX(NIXS,*), IPARG(NPARG,NGROUP)
56 my_real,INTENT(IN) :: rho(mvsiz), volu(mvsiz),pm(npropm,nummat), x(3,numnod)
57 my_real,INTENT(INOUT) :: rk(mvsiz), re(mvsiz)
58C-----------------------------------------------
59C L o c a l V a r i a b l e s
60C-----------------------------------------------
61 INTEGER I, II, MAT, NG, MTN2, LLT2, NFT2, LFT2, JJ, J
62 my_real xl, xk, c1, xe, d2, x0, y0, z0, x1, y1, z1
63C-----------------------------------------------
64C S o u r c e L i n e s
65C-----------------------------------------------
66 IF(mtn == 17)THEN
67 DO i=lft,llt
68 ii=i+nft
69 mat=iabs(ix(1,ii))
70 rk(i)=rho(i)*pm(87,mat)
71 xl=volu(i)**zep333
72 xk= max(rk(i),em15)/rho(i)
73 c1=pm(81,mat)
74 xe=sqrt(xk*sqrt(c1))**3/(zep4187*xl)
75 re(i)=rho(i)*xe
76 END DO
77 ELSE
78 DO i=lft,llt
79 ii=i+nft
80 mat=iabs(ix(1,ii))
81 rk(i)=rho(i)*pm(87,mat)
82 xl=volu(i)**zep333
83 xk= max(rk(i),em15)/rho(i)
84 d2=ep30
85 x0=x(1,ix(2,ii))+x(1,ix(3,ii))+x(1,ix(4,ii))+x(1,ix(5,ii))+x(1,ix(6,ii))+x(1,ix(7,ii))+x(1,ix(8,ii))+x(1,ix(9,ii))
86 y0=x(2,ix(2,ii))+x(2,ix(3,ii))+x(2,ix(4,ii))+x(2,ix(5,ii))+x(2,ix(6,ii))+x(2,ix(7,ii))+x(2,ix(8,ii))+x(2,ix(9,ii))
87 z0=x(3,ix(2,ii))+x(3,ix(3,ii))+x(3,ix(4,ii))+x(3,ix(5,ii))+x(3,ix(6,ii))+x(3,ix(7,ii))+x(3,ix(8,ii))+x(3,ix(9,ii))
88 DO ng=1,ngroup
89 mtn2=iparg(1,ng)
90 IF(mtn2 == 17)THEN
91 llt2=iparg(2,ng)
92 nft2=iparg(3,ng)
93 lft2=1
94 DO jj=lft2,llt2
95 j=jj+nft2
96 x1=x(1,ix(2,j))+x(1,ix(3,j))+x(1,ix(4,j))+x(1,ix(5,j))+x(1,ix(6,j))+x(1,ix(7,j))+x(1,ix(8,j))+x(1,ix(9,j))
97 y1=x(2,ix(2,j))+x(2,ix(3,j))+x(2,ix(4,j))+x(2,ix(5,j))+x(2,ix(6,j))+x(2,ix(7,j))+x(2,ix(8,j))+x(2,ix(9,j))
98 z1=x(3,ix(2,j))+x(3,ix(3,j))+x(3,ix(4,j))+x(3,ix(5,j))+x(3,ix(6,j))+x(3,ix(7,j))+x(3,ix(8,j))+x(3,ix(9,j))
99 d2= min(d2,(x1-x0)**2+(y1-y0)**2+(z1-z0)**2)
100 END DO !JJ=LFT2,LLT2
101 ENDIF
102 END DO !NG=1,NGROUP
103 xl=xl+one_over_8*sqrt(d2)
104 xe=zep33*sqrt(xk)**3/xl
105 re(i)=rho(i)*xe
106 END DO !I=LFT,LLT
107 ENDIF
108C-----------------------------------------------
109 RETURN
110 END
subroutine aturi3(iparg, rho, pm, ix, x, rk, re, volu)
Definition aturi3.F:32
#define my_real
Definition cppsort.cpp:32
#define min(a, b)
Definition macros.h:20
#define max(a, b)
Definition macros.h:21