64 TYPE(t_region
),
DIMENSION(:) :: regions
70 CHARACTER(CHRLEN) :: rcsidentstring
71 INTEGER :: cntrglob,cntrloc,errorflag,ipatch,ireg
72 TYPE(t_patch),
POINTER :: ppatch
79 rcsidentstring =
'$RCSfile: RFLU_CheckCouplingInput.F90,v $ $Revision: 1.4 $'
81 global => regions(1)%global
84 'RFLU_CheckCouplingInput.F90')
86 IF ( global%myProcid == masterproc .AND. &
87 global%verbLevel > verbose_none )
THEN
88 WRITE(stdout,
'(A,1X,A)') solver_name,
'Checking coupling input...'
98 DO ireg = lbound(regions,1),ubound(regions,1)
99 DO ipatch = 1,regions(ireg)%grid%nPatches
100 ppatch => regions(ireg)%patches(ipatch)
102 IF ( ppatch%bcCoupled /= bc_not_coupled )
THEN
103 cntrloc = cntrloc + 1
112 CALL mpi_reduce(cntrloc,cntrglob,1,mpi_integer,mpi_sum,masterproc, &
113 global%mpiComm,errorflag)
114 global%error = errorflag
115 IF ( global%error /= err_none )
THEN
116 CALL
errorstop(global,err_mpi_trouble,__line__)
119 IF ( global%myProcid == masterproc .AND. cntrglob == 0 )
THEN
120 CALL
errorstop(global,err_bccoupled_none,__line__)
127 IF ( global%myProcid == masterproc .AND. &
128 global%verbLevel > verbose_none )
THEN
129 WRITE(stdout,
'(A,1X,A)') solver_name,
'Checking coupling input done.'
subroutine registerfunction(global, funName, fileName)
subroutine errorstop(global, errorCode, errorLine, addMessage)
subroutine deregisterfunction(global)