67 INTEGER :: k,i,j,i1,i2,i3,ii,NCNT,itemp,IERR
68 INTEGER,
ALLOCATABLE :: temp1(:),temp2(:)
69 REAL(SP),
ALLOCATABLE :: RTEMP1(:,:),RTEMP2(:,:)
87 READ(
inmf,*) j,(rtemp1(i,k),k = 1,kbm1)
93 mf_tm%LABEL =
"open boundary mean flow flux" 94 ALLOCATE(
mf_tm%TIMES(itemp))
98 mf_tm%TIMES(i) = ttemp
101 IF(msr)
WRITE(ipt,*)maxval(rtemp2(1:
nmfcell_gl,i))&
125 DEALLOCATE(rtemp1,rtemp2)
152 REAL(DP) DX12,DY12,ATMP1,HTMP
153 INTEGER I,J,I1,I2,J1,J2,II,ITMP,JTMP
164 print*,
'NO.',i,
'MEAN FLOW CELL' 165 print*,
'IS NOT A OPEN BOUNDARY ONE' 170 IF(
nbe(ii,j) == 0 .and.
isonb(
nv(ii,j)) /= 2)
THEN 176 print*,
'NO OPEN BOUNDARY OR MORE THAN ONE OPEN BOUNDARY' 177 print*,
'IN NO.',i,
'MEAN FLOW CELL' 180 j1=jtmp+1-int((jtmp+1)/4)*3
181 j2=jtmp+2-int((jtmp+2)/4)*3
188 htmp=0.5_sp*(
h(i1)+
h(i2))
191 atmp1=atan2(dy12,dx12)
192 mfarea(i)=sqrt(dx12**2+dy12**2)*htmp
214 INTEGER L1,L2,IERR,II
215 REAL(SP) :: FACT,UFACT
218 thour = dti*float(iint)/3600.0
228 SUBROUTINE bracket(TMAP,STIME,L1,L2,FACT,BACT,IERR)
249 TYPE(
bc),
INTENT(IN) :: TMAP
250 REAL(SP),
INTENT(IN) :: STIME
251 INTEGER,
INTENT(OUT) :: L1,L2
252 REAL(SP),
INTENT(OUT) :: FACT,BACT
253 INTEGER,
INTENT(OUT) :: IERR
260 IF(stime < tmap%TIMES(1))
THEN 269 IF(stime > tmap%TIMES(ntmax))
THEN 291 IF(stime >= t1 .AND. stime <= t2)
THEN 295 fact = (stime-t1)/(t2-t1)
real(sp), dimension(:), allocatable vlctymf
real(sp), dimension(:), allocatable, target h
integer, dimension(:,:), allocatable node_mfcell
integer, dimension(:), allocatable i_mfcell_n
real(sp), dimension(:), allocatable, target art1
real(sp), dimension(:,:), allocatable dmfqdis
real(sp), dimension(:), allocatable, target vx
real(sp), dimension(:), allocatable anglemf
real(sp), dimension(:), allocatable, target vy
integer, dimension(:,:), allocatable, target nbe
integer, dimension(:,:), allocatable, target nv
integer, dimension(:), allocatable mf_gl2loc
real(sp), dimension(:,:), allocatable mfdist
real(sp), dimension(:), allocatable mfqdis
integer, dimension(:), allocatable, target isbce
real(sp), dimension(:), allocatable mfarea
subroutine bcond_meanflow
real(sp), dimension(:,:), allocatable rdismf
subroutine bracket(TMAP, STIME, L1, L2, FACT, BACT, IERR)
subroutine set_bndry_meanflow
integer, dimension(:), allocatable, target isonb
integer, dimension(:), allocatable i_mfcell_gl