Pressure Treatment
In the SUBROUTINE CMPDPM,
DELDPM=(DPMEAN-DPMEAO)/LENGTH
IF(IPERIO.EQ.1) THENP(I,J,K)=P(I,J,K)+DELDPM*(XC(I)-X(1))
ELSE
P(I,J,K)=P(I,J,K)+DELDPM*(XC(I)-XC(1))
END IF
Please let me know if we are using IPERIO=1 or 0.
In the new program, we should use the expression for IPERIO.EQ.1.
Another point is in the SUBROUTINE GETBKP,
C Periodic B.C.
IF(ICONBC.EQ.3) THEN
J=1
PMEAN=0.0E0
DO 120 K=1,NZ
DO 120 I=1,NX
PMEAN=PMEAN+P(I,J,K)
120 CONTINUE
PMEAN=PMEAN/NX/NZ
IF(IPERIO.EQ.1) THEN
PMEAN0=DPMEAN*0.5E0
ELSE
IF(DPMEAN.NE.0.0E0) THEN
PMEAN0=DPMEAN*(0.5E0*NXT-1.0E0)/NXELSE IF(ABS(DPMEAZ).GE.1.0E-8) THEN
PMEAN0=DPMEAZ*(0.5E0*NZT-1.0E0)/NZEND IF
END IF
DELDPM=PMEAN0-PMEAN
WRITE(21,*)'PMEAN=',PMEAN,' PMEAN0=',PMEAN0,' DELDPM=',DELDPM
IF(ABS(DELDPM).GT.1.0E-8) THEN
DO 122 K=0,NZT
DO 122 J=1,NY
DO 122 I=0,NXT P(I,J,K)=P(I,J,K)+DELDPM122 CONTINUE
END IF
END IF
RETURN
END
Please let me know where the last END IF command has the matching IF command.
In the new program, the above section of te program (from IF(ICONBC.EQ.3) THEN to the matching END IF) should be discarded.