45 SUBROUTINE rflu_flowsolver(globalGenx,timeSystem,dTimeSystem,genxHandleBc, &
82 INTEGER :: ditersystem
83 INTEGER,
INTENT(IN) :: genxhandlebc,genxhandlegm
84 DOUBLE PRECISION,
INTENT(IN) :: dtimesystem,timesystem
87 INTEGER,
INTENT(IN) :: ditersystem
88 REAL(RFREAL),
INTENT(IN) :: dtimesystem
89 TYPE(t_level
),
POINTER :: levels(:)
96 CHARACTER(CHRLEN) :: rcsidentstring
101 TYPE(t_region
),
POINTER :: pregion,regions(:)
108 rcsidentstring =
'$RCSfile: RFLU_FlowSolver.F90,v $ $Revision: 1.24 $'
111 global => globalgenx%global
112 regions => globalgenx%levels(1)%regions
114 IF ( (global%currentTime-timesystem) > 1.0e-10_rfreal )
THEN
120 global%currentTime = timesystem
121 global%timeStamp = timesystem
123 global%genxHandleBc = genxhandlebc
124 global%genxHandleGm = genxhandlegm
127 global => levels(1)%regions(1)%global
128 regions => levels(1)%regions
131 global%dTimeSystem = dtimesystem
134 'RFLU_FlowSolver.F90')
137 CALL fprofiler_begins(
"RFLU::FlowSolver")
148 IF ( global%myProcid==masterproc .AND. global%verbLevel/=verbose_none )
THEN
149 WRITE(stdout,
'(A)') solver_name
150 IF ( global%flowType == flow_steady )
THEN
151 WRITE(stdout,1000) solver_name,solver_name
152 ELSE IF ( global%flowType == flow_unsteady )
THEN
153 WRITE(stdout,1010) solver_name,solver_name
162 DO ireg = 1,global%nRegionsLocal
163 pregion => regions(ireg)
164 CALL com_call_function(global%genxHandleBc,2,0.0_rfreal,1)
166 CALL com_call_function(global%genxHandleBc,2,0.0_rfreal,2)
175 IF ( corrflag .EQV. .true. )
THEN
176 IF ( global%myProcid == masterproc .AND. &
177 global%verbLevel > verbose_none )
THEN
178 WRITE(stdout,
'(A,1X,A)') solver_name,
'Starting corrector step.'
181 DO ireg = 1,global%nRegionsLocal
182 pregion => regions(ireg)
192 IF (global%solverType == solv_explicit)
THEN
193 IF (global%cycleType == mgcycle_no)
THEN
196 CALL
errorstop(global,err_reached_default,__line__)
209 CALL fprofiler_ends(
"RFLU::FlowSolver")
214 1000
FORMAT(
a,2
x,
' iter',4
x,
'res-norm',5
x,
'force-x',6
x,
'force-y',6
x,
'force-z', &
215 6
x,
'mass-in',6
x,
'mass-out',/,
a,1
x,84(
'-'))
216 1010
FORMAT(
a,2
x,
' time',10
x,
'delta-t',6
x,
'force-x',6
x,
'force-y',6
x,
'force-z', &
217 6
x,
'mass-in',6
x,
'mass-out'/,
a,1
x,90(
'-'))
subroutine rflu_flowsolver(dTimeSystem, dIterSystem, levels)
subroutine registerfunction(global, funName, fileName)
subroutine, public rflu_buildgeometry(pRegion, sypeFaceFlag)
subroutine, public rflu_nk_timestepping(dTimeSystem, dIterSystem, regions)
subroutine rflu_putboundaryvaluesalpha(region)
subroutine rflu_timestepping(dTimeSystem, dIterSystem, regions)
subroutine rflu_getboundaryvalues(region)
subroutine errorstop(global, errorCode, errorLine, addMessage)
subroutine deregisterfunction(global)