46 SUBROUTINE rflupick(caseString,stampString,verbLevel)
102 CHARACTER(*) :: casestring,stampstring
103 INTEGER,
INTENT(IN) :: verblevel
109 LOGICAL :: fileexists
110 CHARACTER(CHRLEN) :: casename,choice,nregions,rcsidentstring,stamp
111 INTEGER :: errorflag,ipatch,ireg
114 TYPE(t_level
),
DIMENSION(:),
POINTER :: levels
115 TYPE(t_patch),
POINTER :: ppatch
116 TYPE(t_region
),
POINTER :: pregion
122 rcsidentstring =
'$RCSfile: rflupick.F90,v $ $Revision: 1.14 $'
128 ALLOCATE(global,stat=errorflag)
129 IF ( errorflag /= err_none )
THEN
130 WRITE(stderr,
'(A,1X,A)') solver_name,
'ERROR - Pointer allocation failed.'
134 casename = casestring(1:len(casestring))
135 stamp = stampstring(1:len(stampstring))
146 IF ( global%myProcid == masterproc )
THEN
148 IF ( global%verbLevel /= verbose_none )
THEN
176 IF ( global%flowType == flow_steady )
THEN
177 READ(stamp,*) global%currentIter
179 READ(stamp,*) global%currentTime
186 WRITE(stdout,
'(A,1X,A)') solver_name,
'Picking regions based on bounding box?'
187 WRITE(stdout,
'(A,3X,A)') solver_name,
'n - No'
188 WRITE(stdout,
'(A,3X,A)') solver_name,
'y - Yes'
189 WRITE(stdout,
'(A,3X,A)') solver_name,
'Enter choice:'
190 READ(stdin,
'(A)') choice
192 SELECT CASE ( trim(choice) )
194 global%pickCoordFlag = .true.
196 WRITE(stdout,
'(A,3X,A)') solver_name,
'Enter coordinates of bounding box:'
197 WRITE(stdout,
'(A,5X,A)') solver_name,
'Enter x-coordinate range (low,high):'
198 READ(stdin,*) global%pickXCoordLow,global%pickXCoordUpp
199 WRITE(stdout,
'(A,5X,A)') solver_name,
'Enter y-coordinate range (low,high):'
200 READ(stdin,*) global%pickYCoordLow,global%pickYCoordUpp
201 WRITE(stdout,
'(A,5X,A)') solver_name,
'Enter z-coordinate range (low,high):'
202 READ(stdin,*) global%pickZCoordLow,global%pickZCoordUpp
204 global%pickCoordFlag = .false.
206 global%warnCounter = global%warnCounter + 1
208 WRITE(stdout,
'(A,3X,A)') solver_name,
'*** WARNING *** Invalid input.'
209 WRITE(stdout,
'(A,17X,A)') solver_name,
'Continuing assuming choice of no.'
211 global%pickCoordFlag = .false.
218 IF ( global%nRegionsLocal > 1 )
THEN
219 IF ( global%pickCoordFlag .EQV. .true. )
THEN
220 DO ireg = 1,global%nRegionsLocal
221 pregion => levels(1)%regions(ireg)
226 IF ( pregion%grid%nPatches > 0 )
THEN
232 IF ( global%verbLevel > verbose_none )
THEN
247 IF ( global%nRegionsLocal > 1 )
THEN
261 IF ( global%postSpecFlag .EQV. .true. )
THEN
262 DO ireg = 1,global%nRegionsLocal
263 IF ( global%nRegionsLocal /= 1 )
THEN
264 pregion => levels(1)%regions(ireg)
266 pregion => levels(1)%regions(0)
269 pmixtinput => pregion%mixtInput
275 IF ( pregion%postActiveFlag .EQV. .true. )
THEN
279 IF ( pregion%grid%nPatches > 0 )
THEN
285 IF ( global%verbLevel > verbose_none )
THEN
317 IF ( pmixtinput%spaceOrder > 1 )
THEN
323 IF ( pmixtinput%flowModel == flow_navst )
THEN
329 DO ipatch = 1,pregion%grid%nPatches
330 ppatch => pregion%patches(ipatch)
363 IF ( pmixtinput%flowModel == flow_navst )
THEN
367 DO ipatch = 1,pregion%grid%nPatches
368 ppatch => pregion%patches(ipatch)
375 IF ( pmixtinput%spaceOrder > 1 )
THEN
387 DO ireg = 1,global%nRegionsLocal
388 IF ( global%nRegionsLocal /= 1 )
THEN
389 pregion => levels(1)%regions(ireg)
391 pregion => levels(1)%regions(0)
subroutine, public rflu_buildcell2facelist(pRegion)
subroutine, public rflu_destroycell2facelist(pRegion)
subroutine rflu_creategrid(pRegion)
subroutine, public rflu_buildbf2cstencilwrapper(pRegion, pPatch, constrInput)
subroutine, public rflu_buildbvertexlists(pRegion)
subroutine, public rflu_createc2cstencilwrapper(pRegion)
subroutine rflu_pickspecialfaces(pRegion)
subroutine rflu_destroygrid(pRegion)
subroutine rflu_printwarninfo(global)
subroutine, public rflu_destroyregionmapping(global, mapType)
subroutine, public rflu_destroyfacelist(pRegion)
subroutine, public rflu_buildf2cstencilwrapper(pRegion, constrInput)
subroutine, public rflu_createbf2cstencilwrapper(pRegion, pPatch)
subroutine, public rflu_setinfof2cstencilwrapper(pRegion, orderNominal)
subroutine, public rflu_createcell2facelist(pRegion)
LOGICAL function rflu_decideneedbgradface(pRegion, pPatch)
subroutine, public rflu_destroygeometry(pRegion)
subroutine, public rflu_setinfostencilvert2cell(pRegion, orderNominal)
subroutine registerfunction(global, funName, fileName)
subroutine rflu_pickregionscoord(pRegion)
subroutine, public rflu_readgridwrapper(pRegion)
subroutine, public rflu_createvert2celllist(pRegion)
subroutine, public rflu_buildgeometry(pRegion, sypeFaceFlag)
subroutine, public rflu_setregionmappingserial(global)
subroutine, public rflu_createstencilvert2cell(pRegion)
subroutine, public rflu_readloc2globcellmapping(pRegion)
subroutine rflupick(caseString, stampString, verbLevel)
subroutine, public rflu_buildstencilvert2cell(pRegion)
subroutine, public rflu_destroybf2cstencilwrapper(pRegion, pPatch)
subroutine, public rflu_destroyf2cstencilwrapper(pRegion)
subroutine, public rflu_createfacelist(pRegion)
subroutine, public rflu_buildglob2loccellmapping(pRegion)
subroutine, public rflu_destroyc2cstencilwrapper(pRegion)
subroutine, public rflu_buildfacelist(pRegion)
subroutine, public rflu_renumberbfacelists(pRegion)
subroutine, public rflu_destroystencilvert2cell(pRegion)
subroutine rflu_openpostinfo(global, fileStatus, fileExists)
subroutine rflu_closepostinfo(global)
subroutine, public rflu_readregionmappingfile(global, readMode, myProcId)
subroutine, public rflu_destroycellmapping(pRegion)
subroutine rflu_builddatastruct(global, levels)
subroutine, public rflu_destroyvert2celllist(pRegion)
subroutine, public rflu_destroybvertexlists(pRegion)
subroutine, public rflu_createbvertexlists(pRegion)
subroutine, public rflu_setinfoc2cstencilwrapper(pRegion, orderNominal)
subroutine, public rflu_buildc2cstencilwrapper(pRegion, icgInput, constrInput)
subroutine rflu_printgridinfo(pRegion)
subroutine, public rflu_readdimensions(pRegion)
subroutine rflu_pickspecialcells(pRegion)
subroutine rflu_writepostinfo(pRegion)
subroutine, public rflu_createcellmapping(pRegion)
subroutine deregisterfunction(global)
subroutine, public rflu_creategeometry(pRegion)
subroutine rflu_writeversionstring(global)
subroutine, public rflu_applyregionmapping(global, levels)
subroutine rflu_initglobal(casename, verbLevel, communicator, global)
subroutine, public rflu_createf2cstencilwrapper(pRegion)
subroutine, public rflu_setinfobf2cstencilwrapper(pRegion, pPatch, orderNominal)
subroutine, public rflu_imposeregionmappingserial(global)
subroutine rflu_pickregionsmanual(regions)
subroutine, public rflu_buildvert2celllist(pRegion)
subroutine, public rflu_createregionmapping(global, mapType)