Rocstar  1.0
Rocstar multiphysics simulation application
 All Classes Namespaces Files Functions Variables Typedefs Enumerations Enumerator Friends Macros Groups Pages
RADI_ExtinctionCoef.F90
Go to the documentation of this file.
1 ! *********************************************************************
2 ! * Rocstar Simulation Suite *
3 ! * Copyright@2015, Illinois Rocstar LLC. All rights reserved. *
4 ! * *
5 ! * Illinois Rocstar LLC *
6 ! * Champaign, IL *
7 ! * www.illinoisrocstar.com *
8 ! * sales@illinoisrocstar.com *
9 ! * *
10 ! * License: See LICENSE file in top level of distribution package or *
11 ! * http://opensource.org/licenses/NCSA *
12 ! *********************************************************************
13 ! *********************************************************************
14 ! * THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, *
15 ! * EXPRESS OR IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES *
16 ! * OF MERCHANTABILITY, FITNESS FOR A PARTICULAR PURPOSE AND *
17 ! * NONINFRINGEMENT. IN NO EVENT SHALL THE CONTRIBUTORS OR *
18 ! * COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER *
19 ! * LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, *
20 ! * Arising FROM, OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE *
21 ! * USE OR OTHER DEALINGS WITH THE SOFTWARE. *
22 ! *********************************************************************
23 !******************************************************************************
24 !
25 ! Purpose: compute diffusion approximation (Rosseland) radiative fluxes by
26 ! average of variables.
27 !
28 ! Description: none.
29 !
30 ! Input: region = data of current region.
31 !
32 ! Output: region%levels%mixt%rhs = radiative fluxes added to the residual.
33 !
34 ! Notes: grad(T) is averaged to cell center in wvInt for computation of
35 ! radiation intensity later.
36 !
37 !******************************************************************************
38 !
39 ! $Id: RADI_ExtinctionCoef.F90,v 1.3 2008/12/06 08:44:37 mtcampbe Exp $
40 !
41 ! Copyright: (c) 2001 by the University of Illinois
42 !
43 !******************************************************************************
44 
45 SUBROUTINE radi_extinctioncoef( region )
46 
47  USE moddatatypes
48  USE moddatastruct, ONLY : t_region
49  USE modglobal, ONLY : t_global
52  USE moderror
53  USE modparameters
55 #ifdef PLAG
57 #endif
58 #ifdef PEUL
60 #endif
61  IMPLICIT NONE
62 
63 #include "Indexing.h"
64 
65 ! ... parameters
66  TYPE(t_region) :: region
67 
68 ! ... loop variables
69  INTEGER :: i, j, k, n
70 
71 ! ... local variables
72  TYPE(t_global), POINTER :: global
73 
74  INTEGER :: ipcbeg, ipcend, jpcbeg, jpcend, kpcbeg, kpcend
75  INTEGER :: idcbeg, idcend, jdcbeg, jdcend, kdcbeg, kdcend
76  INTEGER :: ilev, icoff, ijcoff, ijkc0, ibc, iec
77  INTEGER :: n1, n2, n3, n4, n5, n6, naddgas, naddplag, naddpeul
78 
79  REAL(RFREAL) :: rati, maxvfrac, rtresh
80  REAL(RFREAL), POINTER :: coef(:,:), optc(:,:), cellvol(:), gofact(:)
81  REAL(RFREAL), POINTER :: vfrac(:,:), pdiam(:,:)
82  REAL(RFREAL), ALLOCATABLE :: volfrac(:), exteff(:), rdiam(:)
83 #ifdef PLAG
84  INTEGER :: ipcls, npcls, ncont, npclcel
85  REAL(RFREAL) :: diasumcel, volsumcel, volsumpcl
86  INTEGER, POINTER :: paiv(:,:), pdvplagvolu(:)
87  REAL(RFREAL), POINTER :: pdv(:,:)
88 #endif
89 #ifdef PEUL
90  INTEGER :: iptype
91  REAL(RFREAL) :: ptdiam, pteffdens, smokdens
92  REAL(RFREAL), POINTER :: peulcv(:,:)
93 #endif
94 
95 !******************************************************************************
96 
97  CALL registerfunction( region%global,'RADI_ExtinctionCoef',&
98  'RADI_ExtinctionCoef.F90' )
99 
100 ! get dimensions, pointers and constants --------------------------------------
101 
102  ilev = region%currLevel
103 
104  CALL rflo_getdimensphys( region,ilev,ipcbeg,ipcend, &
105  jpcbeg,jpcend,kpcbeg,kpcend )
106  CALL rflo_getdimensdummy( region,ilev,idcbeg,idcend, &
107  jdcbeg,jdcend,kdcbeg,kdcend )
108  CALL rflo_getcelloffset( region,ilev,icoff,ijcoff )
109  ibc = indijk(idcbeg,jdcbeg,kdcbeg,icoff,ijcoff)
110  iec = indijk(idcend,jdcend,kdcend,icoff,ijcoff)
111 
112  coef => region%levels(ilev)%radi%radCoef
113  gofact => region%levels(ilev)%radi%goFact
114  optc => region%radiInput%optConst
115 
116  rati = 1.5_rfreal
117 
118 ! check phase indexing
119 
120  IF ((radi_phase_dispart - radi_phase_gas /= 1 ) .OR. &
121  (radi_phase_conpart - radi_phase_dispart /= 1 )) THEN
122  CALL errorstop( global,err_radi_fixparam,__line__, &
123  'radiation phase indexing is not consistent' )
124  ENDIF
125 
126 ! clear up radiation coefficients before accumulating optical constants
127 
128  coef = 0._rfreal
129 
130 ! extinction coefficient from contribution of AlOxide smoke and Al-dropplets
131 
132  IF (region%radiInput%media == radi_media_artif) THEN
133 
134  ALLOCATE( volfrac(nphase), exteff(nphase), rdiam(nphase) )
135 
136  DO n = 1,nphase
137  volfrac(n) = optc(phase_prop_v,n)
138  exteff(n) = optc(phase_prop_q,n)
139  rdiam(n) = 1._rfreal/optc(phase_prop_d,n)
140  ENDDO
141 
142  DO k=kdcbeg,kdcend
143  DO j=jdcbeg,jdcend
144  DO i=idcbeg,idcend
145  ijkc0 = indijk(i ,j ,k ,icoff,ijcoff)
146 
147  DO n = 1,nphase
148  coef(ijkc0,radi_coeff_extinct)= coef(ijkc0,radi_coeff_extinct)+ &
149  volfrac(n)*exteff(n)*rdiam(n)
150  ENDDO
151 
152  coef(ijkc0,radi_coeff_extinct) = rati*coef(ijkc0,radi_coeff_extinct)
153  ENDDO ! i
154  ENDDO ! j
155  ENDDO ! k
156 
157  DEALLOCATE( volfrac, exteff, rdiam )
158 
159  ELSEIF (region%radiInput%media == radi_media_real) THEN
160 
161  cellvol => region%levels(ilev)%grid%vol
162  naddgas = 0
163  naddplag = 0
164  naddpeul = 0
165 
166 #ifdef PLAG
167  IF (global%plagUsed) THEN
168  naddplag = 0
169  ENDIF
170 #endif
171 #ifdef PEUL
172  IF (global%peulUsed) THEN
173  naddpeul = region%peulInput%nPtypes - 1
174  ENDIF
175 #endif
176 
177  n1 = radi_phase_gas
178  n2 = radi_phase_gas + naddgas
179  n3 = radi_phase_dispart + naddgas
180  n4 = radi_phase_dispart + naddgas + naddplag
181  n5 = radi_phase_conpart + naddgas + naddplag
182  n6 = radi_phase_conpart + naddgas + naddplag + naddpeul
183 
184  ALLOCATE( vfrac(n6,ibc:iec) )
185  ALLOCATE( pdiam(n6,ibc:iec) )
186 
187 ! - initialiaze volume fractions and particles diameters for safety
188  vfrac = 0._rfreal
189  pdiam = 1._rfreal
190  vfrac(n1:n2,:) = optc(phase_prop_v,radi_phase_gas)
191  pdiam(n1:n2,:) = optc(phase_prop_d,radi_phase_gas)
192 
193 ! - disPart volume fraction and diameter
194 #ifdef PLAG
195  IF (global%plagUsed) THEN
196 
197  paiv => region%levels(ilev)%plag%aiv
198  pdv => region%levels(ilev)%plag%dv
199  pdvplagvolu => region%levels(ilev)%plag%dvPlagVolu
200 
201  npcls = region%levels(ilev)%plag%nPcls
202  ncont = region%plagInput%nCont
203 
204 ! --- active for non-zero number of particles in region
205  IF ( npcls > 0 ) THEN
206 
207  DO k=kpcbeg,kpcend
208  DO j=jpcbeg,jpcend
209  DO i=ipcbeg,ipcend
210  ijkc0 = indijk(i ,j ,k ,icoff,ijcoff)
211 
212  diasumcel = 0._rfreal
213  volsumcel = 0._rfreal
214  npclcel = 0
215 
216  DO ipcls = 1, npcls
217 
218 ! ------------- only particles in ijkC0 cell
219  IF (paiv(aiv_plag_icells,ipcls) == ijkc0) THEN
220 
221 ! --------------- particle volume
222  volsumpcl = sum(pdv(pdvplagvolu(:),ipcls))
223 
224 ! --------------- volume of all pcls in this cell
225  volsumcel = volsumcel + volsumpcl
226 
227 ! --------------- sum all diameters and number of particles in this cell
228  diasumcel = diasumcel + pdv(dv_plag_diam,ipcls)
229  npclcel = npclcel + 1
230  ENDIF
231 
232  ENDDO ! iPcls
233 
234  vfrac(n3:n4,ijkc0) = volsumcel/cellvol(ijkc0)
235  pdiam(n3:n4,ijkc0) = diasumcel/REAL(npclcel,kind=rfreal)
236  ENDDO ! i
237  ENDDO ! j
238  ENDDO ! k
239 
240 ! ----- copy vFrac and pDiam to dummy cells
241  CALL copy2dumcells( n3,n4,vfrac )
242  CALL copy2dumcells( n3,n4,pdiam )
243 
244  ENDIF ! nPcls >0
245  ENDIF ! plagUsed
246 #endif
247 
248 ! - conPart volume fraction and diameter
249 #ifdef PEUL
250  IF (global%peulUsed) THEN
251 
252  peulcv => region%levels(ilev)%peul%cv
253 
254 ! --- there are nPtypes smoke particles, each treated as different phase
255  DO iptype = 1,region%peulInput%nPtypes
256 
257  ptdiam = region%peulInput%ptypes(iptype)%diam
258  pteffdens = region%peulInput%ptypes(iptype)%denseff
259 
260  DO k=kdcbeg,kdcend
261  DO j=jdcbeg,jdcend
262  DO i=idcbeg,idcend
263  ijkc0 = indijk(i ,j ,k ,icoff,ijcoff)
264 
265  smokdens = max( peulcv(cv_peul_dens+iptype-1,ijkc0), 0._rfreal )
266  vfrac(n5+iptype-1,ijkc0) = smokdens/pteffdens
267  pdiam(n5+iptype-1,ijkc0) = ptdiam
268 
269  ENDDO ! i
270  ENDDO ! j
271  ENDDO ! k
272  ENDDO ! iPtype
273  ENDIF ! peulUsed
274 #endif
275 
276  ALLOCATE( volfrac(n6) )
277  ALLOCATE( exteff(n6) )
278  volfrac = 0._rfreal
279  exteff = 0._rfreal
280 
281  exteff(n1:n2) = optc(phase_prop_q,radi_phase_gas)
282  exteff(n3:n4) = optc(phase_prop_q,radi_phase_dispart)
283  exteff(n5:n6) = optc(phase_prop_q,radi_phase_conpart)
284 
285  maxvfrac = 0._rfreal
286 
287  DO k=kdcbeg,kdcend
288  DO j=jdcbeg,jdcend
289  DO i=idcbeg,idcend
290  ijkc0 = indijk(i ,j ,k ,icoff,ijcoff)
291 
292  DO n = n1, n2
293  volfrac(n) = min( optc(phase_prop_v,radi_phase_gas), &
294  vfrac(n,ijkc0) )
295  ENDDO
296  DO n = n3, n4
297  volfrac(n) = min( optc(phase_prop_v,radi_phase_dispart), &
298  vfrac(n,ijkc0) )
299  ENDDO
300  DO n = n5, n6
301  volfrac(n) = min( optc(phase_prop_v,radi_phase_conpart), &
302  vfrac(n,ijkc0) )
303  ENDDO
304 
305  maxvfrac = max( maxvfrac, sum( volfrac(:) ) )
306 
307  DO n = n1,n6
308  coef(ijkc0,radi_coeff_extinct)= coef(ijkc0,radi_coeff_extinct)+ &
309  volfrac(n)*exteff(n)/pdiam(n,ijkc0)
310  ENDDO
311 
312  coef(ijkc0,radi_coeff_extinct) = rati*coef(ijkc0,radi_coeff_extinct)
313  ENDDO ! i
314  ENDDO ! j
315  ENDDO ! k
316 
317  DEALLOCATE( vfrac, pdiam, volfrac, exteff )
318  IF (maxvfrac > 1._rfreal) goto 10
319 
320  ENDIF ! media real
321 
322 ! compute go-ahead factor based on EC treshold to obey diffusion approximation
323 
324  rtresh = 1._rfreal/radi_real_ecmin
325 
326  DO k=kdcbeg,kdcend
327  DO j=jdcbeg,jdcend
328  DO i=idcbeg,idcend
329  ijkc0 = indijk(i ,j ,k ,icoff,ijcoff)
330  gofact(ijkc0) = aint( coef(ijkc0,radi_coeff_extinct)*rtresh )
331  gofact(ijkc0) = min( gofact(ijkc0), 1._rfreal )
332  ENDDO ! i
333  ENDDO ! j
334  ENDDO ! k
335 
336 ! finalize --------------------------------------------------------------------
337 
338  goto 999
339 
340 ! error handling
341 
342 10 CONTINUE
343  CALL errorstop( global,err_radi_mulphase,__line__, &
344  'total volume fractions of particles and smoke > 1.' )
345 
346 999 CONTINUE
347 
348  CALL deregisterfunction( region%global )
349 
350 ! =============================================================================
351 ! Copy given vector variables to dummy cells
352 ! =============================================================================
353 
354 CONTAINS
355 
356  SUBROUTINE copy2dumcells( m1,m2,var )
357 
358 ! ... parameters
359  INTEGER :: m1, m2, ibegc, iendc
360  REAL(RFREAL), POINTER :: var(:,:)
361 
362 ! ... local variables
363  INTEGER :: l, ijkc, ijkci
364 
365 ! - I direction
366 
367  DO k=kdcbeg,kdcend
368  DO j=jdcbeg,jdcend
369 
370  DO i=idcbeg,ipcbeg-1
371  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
372  ijkci = indijk(1 ,j ,k ,icoff,ijcoff)
373 
374  DO l = m1, m2
375  var(l,ijkc) = var(l,ijkci)
376  ENDDO
377  ENDDO
378  DO i=ipcend+1,idcend
379  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
380  ijkci = indijk(ipcend ,j ,k ,icoff,ijcoff)
381 
382  DO l = m1, m2
383  var(l,ijkc) = var(l,ijkci)
384  ENDDO
385  ENDDO ! i
386  ENDDO ! j
387  ENDDO ! k
388 
389 ! - J direction
390 
391  DO k=kdcbeg,kdcend
392  DO i=idcbeg,idcend
393 
394  DO j=jdcbeg,jpcbeg-1
395  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
396  ijkci = indijk(i ,1 ,k ,icoff,ijcoff)
397 
398  DO l = m1, m2
399  var(l,ijkc) = var(l,ijkci)
400  ENDDO
401  ENDDO
402 
403  DO j=jpcend+1,jdcend
404  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
405  ijkci = indijk(i ,jpcend ,k ,icoff,ijcoff)
406 
407  DO l = m1, m2
408  var(l,ijkc) = var(l,ijkci)
409  ENDDO
410  ENDDO ! j
411  ENDDO ! i
412  ENDDO ! k
413 
414 ! - K direction
415 
416  DO j=jdcbeg,jdcend
417  DO i=idcbeg,idcend
418 
419  DO k=kdcbeg,kpcbeg-1
420  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
421  ijkci = indijk(i ,j ,1 ,icoff,ijcoff)
422 
423  DO l = m1, m2
424  var(l,ijkc) = var(l,ijkci)
425  ENDDO
426  ENDDO
427 
428  DO k=kpcend+1,kdcend
429  ijkc = indijk(i ,j ,k ,icoff,ijcoff)
430  ijkci = indijk(i ,j ,kpcend ,icoff,ijcoff)
431 
432  DO l = m1, m2
433  var(l,ijkc) = var(l,ijkci)
434  ENDDO
435  ENDDO ! k
436  ENDDO ! i
437  ENDDO ! j
438 
439  END SUBROUTINE copy2dumcells
440 
441 END SUBROUTINE radi_extinctioncoef
442 
443 !******************************************************************************
444 !
445 ! RCS Revision history:
446 !
447 ! $Log: RADI_ExtinctionCoef.F90,v $
448 ! Revision 1.3 2008/12/06 08:44:37 mtcampbe
449 ! Updated license.
450 !
451 ! Revision 1.2 2008/11/19 22:17:49 mtcampbe
452 ! Added Illinois Open Source License/Copyright
453 !
454 ! Revision 1.1 2004/09/22 02:35:49 wasistho
455 ! changed file nomenclature from lower to upper case
456 !
457 ! Revision 1.3 2004/03/05 22:09:04 jferry
458 ! created global variables for peul, plag, and inrt use
459 !
460 ! Revision 1.2 2003/07/30 22:23:02 wasistho
461 ! enter part and smoke data into radiation
462 !
463 ! Revision 1.1 2003/07/17 01:16:59 wasistho
464 ! initial activation rocrad
465 !
466 !
467 !******************************************************************************
468 
469 
470 
471 
472 
473 
474 
Tfloat sum() const
Return the sum of all the pixel values in an image.
Definition: CImg.h:13022
**********************************************************************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 idcend
j indices k indices k
Definition: Indexing.h:6
**********************************************************************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
Vector_n max(const Array_n_const &v1, const Array_n_const &v2)
Definition: Vector_n.h:354
subroutine registerfunction(global, funName, fileName)
Definition: ModError.F90:449
**********************************************************************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
subroutine rflo_getdimensdummy(region, iLev, idcbeg, idcend, jdcbeg, jdcend, kdcbeg, kdcend)
**********************************************************************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 kdcbeg
**********************************************************************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
blockLoc i
Definition: read.cpp:79
subroutine rflo_getcelloffset(region, iLev, iCellOffset, ijCellOffset)
**********************************************************************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 idcbeg
const NT & n
**********************************************************************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 jdcend
Vector_n min(const Array_n_const &v1, const Array_n_const &v2)
Definition: Vector_n.h:346
subroutine radi_extinctioncoef(region)
j indices j
Definition: Indexing.h:6
**********************************************************************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
**********************************************************************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 jdcbeg
subroutine errorstop(global, errorCode, errorLine, addMessage)
Definition: ModError.F90:483
subroutine deregisterfunction(global)
Definition: ModError.F90:469
subroutine rflo_getdimensphys(region, iLev, ipcbeg, ipcend, jpcbeg, jpcend, kpcbeg, kpcend)
subroutine copy2dumcells(m1, m2, var)