61 TYPE(t_region
),
TARGET :: region
64 INTEGER ::
i,
j,
k, ipatch
68 TYPE(t_patch),
POINTER :: patches(:)
70 INTEGER,
PARAMETER :: max_invalid_locs = 10
72 INTEGER :: ilev, icoff, ijcoff, ijkc
73 INTEGER :: indcp,indmol,nlocs
77 REAL(RFREAL) :: eo,gamma,p,rgas,rho,rrho,t,u,
v,vm2,w,rmin,pmin
78 REAL(RFREAL),
DIMENSION(:,:),
POINTER :: cv,gv
83 global => region%global
86 'RFLO_CheckValidity.F90')
92 ilev = region%currLevel
98 cv => region%levels(ilev)%mixt%cv
99 gv => region%levels(ilev)%mixt%gv
100 patches => region%levels(ilev)%patches
102 indcp = region%levels(ilev)%mixt%indCp
103 indmol = region%levels(ilev)%mixt%indMol
114 ijkc = indijk(
i,
j,
k,icoff,ijcoff)
116 rho = cv(cv_mixt_dens,ijkc)
117 rrho = 1.0_rfreal/rho
118 u = rrho*cv(cv_mixt_xmom,ijkc)
119 v = rrho*cv(cv_mixt_ymom,ijkc)
120 w = rrho*cv(cv_mixt_zmom,ijkc)
121 eo = rrho*cv(cv_mixt_ener,ijkc)
125 vm2 = u*u +
v*
v + w*w
129 rmin =
min( rmin,rho )
132 foundnan =
isnan(rho)
133 IF (foundnan) goto 888
141 IF (foundnan .OR. rmin < 0._rfreal .OR. pmin < 0._rfreal)
THEN
146 ijkc = indijk(
i,
j,
k,icoff,ijcoff)
148 rho = cv(cv_mixt_dens,ijkc)
149 rrho = 1.0_rfreal/rho
150 u = rrho*cv(cv_mixt_xmom,ijkc)
151 v = rrho*cv(cv_mixt_ymom,ijkc)
152 w = rrho*cv(cv_mixt_zmom,ijkc)
153 eo = rrho*cv(cv_mixt_ener,ijkc)
157 vm2 = u*u +
v*
v + w*w
162 IF ( (
isnan(rho) .EQV. .true.) .OR. &
163 (
isnan(u) .EQV. .true.) .OR. &
164 (
isnan(
v) .EQV. .true.) .OR. &
165 (
isnan(w) .EQV. .true.) .OR. &
166 (
isnan(p) .EQV. .true.) .OR. &
167 (
isnan(t) .EQV. .true.) .OR. &
168 ( rho < 0._rfreal) .OR. &
169 ( p < 0._rfreal) )
THEN
172 IF ( nlocs == 1 )
THEN
173 WRITE(stdout,
'(A,1X,A,1X,I9)') solver_name, &
174 'Invalid variables detected!'
176 IF ( global%flowType == flow_unsteady )
THEN
177 WRITE(stdout,
'(A,3X,A,1X,1PE12.5)') solver_name, &
181 WRITE(stdout,
'(A,3X,A,1X,I6)') solver_name, &
182 'Current iteration number:', &
186 WRITE(stdout,1000) solver_name,
'Region:',region%iRegionGlobal, &
187 ', bc-types:', (patches(ipatch)%bcType, &
188 ipatch = 1,region%nPatches)
190 WRITE(stdout,
'(A,6X,A,7(1X,A))') solver_name,
'#', &
200 IF ( nlocs <= max_invalid_locs )
THEN
201 WRITE(stdout,
'(A,4X,I3,6(1X,E13.6),2X,3I7)') solver_name,nlocs, &
210 CALL mpi_abort( global%mpiComm,mpierrcode,global%mpierr )
217 1000
FORMAT(
a,3
x,
a,i5,
a,60i5 )
real(rfreal) function mixtperf_p_deogvm2(D, Eo, G, Vm2)
real(rfreal) function mixtperf_r_m(M)
**********************************************************************Rocstar Simulation Suite Illinois Rocstar LLC All rights reserved ****Illinois Rocstar LLC IL **www illinoisrocstar com **sales illinoisrocstar com WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **Arising OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE **********************************************************************INTERFACE SUBROUTINE kpcbeg
subroutine registerfunction(global, funName, fileName)
**********************************************************************Rocstar Simulation Suite Illinois Rocstar LLC All rights reserved ****Illinois Rocstar LLC IL **www illinoisrocstar com **sales illinoisrocstar com WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **Arising OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE **********************************************************************INTERFACE SUBROUTINE jpcbeg
**********************************************************************Rocstar Simulation Suite Illinois Rocstar LLC All rights reserved ****Illinois Rocstar LLC IL **www illinoisrocstar com **sales illinoisrocstar com WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **Arising OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE **********************************************************************INTERFACE SUBROUTINE ipcend
*********************************************************************Illinois Open Source License ****University of Illinois NCSA **Open Source License University of Illinois All rights reserved ****Developed free of to any person **obtaining a copy of this software and associated documentation to deal with the Software without including without limitation the rights to and or **sell copies of the and to permit persons to whom the **Software is furnished to do subject to the following this list of conditions and the following disclaimers ****Redistributions in binary form must reproduce the above **copyright this list of conditions and the following **disclaimers in the documentation and or other materials **provided with the distribution ****Neither the names of the Center for Simulation of Advanced the University of nor the names of its **contributors may be used to endorse or promote products derived **from this Software without specific prior written permission ****THE SOFTWARE IS PROVIDED AS WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **ARISING OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE v
**********************************************************************Rocstar Simulation Suite Illinois Rocstar LLC All rights reserved ****Illinois Rocstar LLC IL **www illinoisrocstar com **sales illinoisrocstar com WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **Arising OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE **********************************************************************INTERFACE SUBROUTINE ipcbeg
subroutine rflo_getcelloffset(region, iLev, iCellOffset, ijCellOffset)
real(rfreal) function mixtperf_t_dpr(D, P, R)
subroutine rflo_checkvalidity(region)
Vector_n min(const Array_n_const &v1, const Array_n_const &v2)
**********************************************************************Rocstar Simulation Suite Illinois Rocstar LLC All rights reserved ****Illinois Rocstar LLC IL **www illinoisrocstar com **sales illinoisrocstar com WITHOUT WARRANTY OF ANY **EXPRESS OR INCLUDING BUT NOT LIMITED TO THE WARRANTIES **OF FITNESS FOR A PARTICULAR PURPOSE AND **NONINFRINGEMENT IN NO EVENT SHALL THE CONTRIBUTORS OR **COPYRIGHT HOLDERS BE LIABLE FOR ANY DAMAGES OR OTHER WHETHER IN AN ACTION OF TORT OR **Arising OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE **USE OR OTHER DEALINGS WITH THE SOFTWARE **********************************************************************INTERFACE SUBROUTINE jpcend
subroutine deregisterfunction(global)
real(rfreal) function mixtperf_g_cpr(Cp, R)
subroutine rflo_getdimensphys(region, iLev, ipcbeg, ipcend, jpcbeg, jpcend, kpcbeg, kpcend)