/[MITgcm]/MITgcm/pkg/generic_advdiff/gad_os7mp_adv_x.F
ViewVC logotype

Annotation of /MITgcm/pkg/generic_advdiff/gad_os7mp_adv_x.F

Parent Directory Parent Directory | Revision Log Revision Log | View Revision Graph Revision Graph


Revision 1.5 - (hide annotations) (download)
Fri May 11 18:24:31 2007 UTC (17 years ago) by adcroft
Branch: MAIN
CVS Tags: checkpoint59c, checkpoint59b
Changes since 1.4: +43 -27 lines
Updated masking (discretization near boundaries) to retain slightly
higher accuracy near topography.
 - Improves advact_xz solution by 5%.

1 adcroft 1.5 C $Header: /u/gcmpack/MITgcm/pkg/generic_advdiff/gad_os7mp_adv_x.F,v 1.4 2007/05/11 17:30:06 adcroft Exp $
2 mlosch 1.2 C $Name: $
3 adcroft 1.1
4     #include "GAD_OPTIONS.h"
5    
6     SUBROUTINE GAD_OS7MP_ADV_X(
7 jmc 1.3 I bi,bj,k, calcCFL, deltaTloc,
8 adcroft 1.1 I uTrans, uFld,
9     I maskLocW, Q,
10     O uT,
11     I myThid )
12     C /==========================================================\
13     C | SUBROUTINE GAD_OS7MP_ADV_X |
14     C | o Compute Zonal advective Flux of tracer Q using |
15     C | 7th Order DST Sceheme with monotone preserving limiter |
16     C |==========================================================|
17     IMPLICIT NONE
18    
19     C == GLobal variables ==
20     #include "SIZE.h"
21     #include "GRID.h"
22     #include "GAD.h"
23    
24     C == Routine arguments ==
25     INTEGER bi,bj,k
26 jmc 1.3 LOGICAL calcCFL
27 adcroft 1.1 _RL deltaTloc
28     _RL uTrans(1-OLx:sNx+OLx,1-OLy:sNy+OLy)
29     _RL uFld (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
30     _RS maskLocW(1-OLx:sNx+OLx,1-OLy:sNy+OLy)
31     _RL Q (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
32     _RL uT (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
33     INTEGER myThid
34    
35     C == Local variables ==
36     INTEGER i,j
37     _RL cfl,Psi
38 adcroft 1.5 _RL uLoc,Fac,DelIp,DelI,Phi,Eps,rp1h,rp1h_cfl
39 adcroft 1.1 _RL Qippp,Qipp,Qip,Qi,Qim,Qimm,Qimmm
40     _RL MskIpp,MskIp,MskI,MskIm,MskImm,MskImmm
41     _RL d2,d2p1,d2m1,A,B,C,D
42     _RL dp1h,dm1h,qMD,qUL,qLC,PhiMD,PhiLC,PhiMin,PhiMax
43 adcroft 1.5 _RL DelM,DelP,DelMM,DelPP,DelMMM,DelPPP
44     _RL Del2MM,Del2M,Del2,Del2P,Del2PP
45     _RL Del3MM,Del3M,Del3P,Del3PP
46     _RL Del4M,Del4,Del4P
47     _RL Del5M,Del5P
48     _RL Del6
49 adcroft 1.1
50     Eps = 1. _d -20
51    
52     DO j=1-Oly,sNy+Oly
53     uT(1-Olx,j)=0. _d 0
54     uT(2-Olx,j)=0. _d 0
55     uT(3-Olx,j)=0. _d 0
56     uT(4-Olx,j)=0. _d 0
57     uT(sNx+Olx-2,j)=0. _d 0
58     uT(sNx+Olx-1,j)=0. _d 0
59     uT(sNx+Olx,j)=0. _d 0
60     DO i=1-Olx+4,sNx+Olx-3
61    
62     uLoc = uFld(i,j)
63 jmc 1.3 cfl = uLoc
64     IF ( calcCFL ) cfl = abs(uLoc*deltaTloc*recip_dxC(i,j,bi,bj))
65 adcroft 1.1
66 adcroft 1.4 IF (uTrans(i,j).gt.0.) THEN
67 adcroft 1.1 Qippp = Q(i+2,j)
68     Qipp = Q(i+1,j)
69     Qip = Q(i,j)
70     Qi = Q(i-1,j)
71     Qim = Q(i-2,j)
72     Qimm = Q(i-3,j)
73     Qimmm = Q(i-4,j)
74    
75     MskIpp = maskLocW(i+2,j)
76     MskIp = maskLocW(i+1,j)
77     MskI = maskLocW(i,j)
78     MskIm = maskLocW(i-1,j)
79     MskImm = maskLocW(i-2,j)
80     MskImmm = maskLocW(i-3,j)
81 adcroft 1.4 ELSEIF (uTrans(i,j).lt.0.) THEN
82 adcroft 1.1 Qippp = Q(i-3,j)
83     Qipp = Q(i-2,j)
84     Qip = Q(i-1,j)
85     Qi = Q(i,j)
86     Qim = Q(i+1,j)
87     Qimm = Q(i+2,j)
88     Qimmm = Q(i+3,j)
89    
90     MskIpp = maskLocW(i-2,j)
91     MskIp = maskLocW(i-1,j)
92     MskI = maskLocW(i,j)
93     MskIm = maskLocW(i+1,j)
94     MskImm = maskLocW(i+2,j)
95     MskImmm = maskLocW(i+3,j)
96     ENDIF
97    
98 adcroft 1.4 IF (uTrans(i,j).ne.0.) THEN
99 adcroft 1.1 C 2nd order correction [i i-1]
100     Fac = 1.
101 adcroft 1.5 DelP = (Qip-Qi)*MskI
102     Phi = Fac * DelP
103 adcroft 1.1 C 3rd order correction [i i-1 i-2]
104     Fac = Fac * ( cfl + 1. )/3.
105 adcroft 1.5 DelM = (Qi-Qim)*MskIm
106     Del2 = DelP - DelM
107     Phi = Phi - Fac * Del2
108 adcroft 1.1 C 4th order correction [i+1 i i-1 i-2]
109     Fac = Fac * ( cfl - 2. )/4.
110 adcroft 1.5 DelPP = (Qipp-Qip)*MskIp*MskI
111     Del2P = DelPP - DelP
112     Del3P = Del2P - Del2
113     Phi = Phi + Fac * Del3p
114 adcroft 1.1 C 5th order correction [i+1 i i-1 i-2 i-3]
115     Fac = Fac * ( cfl - 3. )/5.
116 adcroft 1.5 DelMM = (Qim-Qimm)*MskImm*MskIm
117     Del2M = DelM - DelMM
118     Del3M = Del2 - Del2M
119     Del4 = Del3P - Del3M
120     Phi = Phi + Fac * Del4
121 adcroft 1.1 C 6th order correction [i+2 i+1 i i-1 i-2 i-3]
122     Fac = Fac * ( cfl + 2. )/6.
123 adcroft 1.5 DelPPP = (Qippp-Qipp)*MskIpp*MskIp*MskI
124     Del2PP = DelPP - DelP
125     Del3PP = Del2PP - Del2P
126     Del4P = Del3PP - Del3P
127     Del5P = Del4P - Del4
128     Phi = Phi + Fac * Del5P
129 adcroft 1.1 C 7th order correction [i+2 i+1 i i-1 i-2 i-3 i-4]
130     Fac = Fac * ( cfl + 2. )/7.
131 adcroft 1.5 DelMMM = (Qimm-Qimmm)*MskImmm*MskImm*MskIm
132     Del2MM = DelMM - DelMMM
133     Del3MM = Del2M - Del2MM
134     Del4M = Del3M - Del3MM
135     Del5M = Del4 - Del4M
136     Del6 = Del5P - Del5M
137     Phi = Phi - Fac * Del6
138 adcroft 1.1
139     DelIp = ( Qip - Qi ) * MskI
140 mlosch 1.2 Phi = sign(1. _d 0,Phi)*sign(1. _d 0,DelIp)
141     & *abs(Phi+Eps)/abs(DelIp+Eps)
142 adcroft 1.1
143     DelI = ( Qi - Qim ) * MskIm
144 mlosch 1.2 rp1h =sign(1. _d 0,DelI)*sign(1. _d 0,DelIp)
145     & *abs(DelI+Eps)/abs(DelIp+Eps)
146 adcroft 1.4 rp1h_cfl = rp1h/(cfl+Eps)
147 adcroft 1.1
148     C TVD limiter
149 adcroft 1.4 ! Phi = max(0. _d 0, min( 2./(1-cfl), Phi, 2.*rp1h_cfl ) )
150 adcroft 1.1
151     C MP limiter
152 adcroft 1.5 d2 = Del2 !( ( Qip + Qim ) - 2.*Qi ) * MskI * MskIm
153     d2p1 = Del2P !( ( Qipp + Qi ) - 2.*Qip ) * MskIp * MskI
154     d2m1 = Del2M !( ( Qi + Qimm ) - 2.*Qim ) * MskIm * MskImm
155 adcroft 1.1 A = 4.*d2 - d2p1
156     B = 4.*d2p1 - d2
157     C = d2
158     D = d2p1;
159 mlosch 1.2 dp1h = max(min(A,B,C,D),0. _d 0)+min(max(A,B,C,D),0. _d 0)
160 adcroft 1.1 A = 4.*d2m1 - d2
161     B = 4.*d2 - d2m1
162     C = d2m1
163     D = d2;
164 mlosch 1.2 dm1h = max(min(A,B,C,D),0. _d 0)+min(max(A,B,C,D),0. _d 0)
165 adcroft 1.5 !qMD = 0.5*( ( Qi + Qip ) - dp1h )
166     qMD = 0.5*( ( 2.*Qi + DelIp ) - dp1h )
167     qUL = Qi + (1.-cfl)/(cfl+Eps)*DelI
168     qLC = Qi + 0.5*( 1.+dm1h/(DelI+Eps) )*(qUL-Qi)
169     PhiMD = 2./(1.-cfl)*(qMD-Qi+Eps)/(DelIp+Eps)
170 adcroft 1.4 PhiLC = 2.*rp1h_cfl*(qLC-Qi+Eps)/(qUL-Qi+Eps)
171 mlosch 1.2 PhiMin = max(min(0. _d 0,PhiMD),
172 adcroft 1.4 & min(0. _d 0,2.*rp1h_cfl,PhiLC))
173 mlosch 1.2 PhiMax = min(max(2. _d 0/(1.-cfl),PhiMD),
174 adcroft 1.4 & max(0. _d 0,2.*rp1h_cfl,PhiLC))
175 adcroft 1.1 Phi = max(PhiMin,min(Phi,PhiMax))
176    
177     Psi = Phi * 0.5 * (1. - cfl)
178     uT(i,j) = uTrans(i,j)*( Qi + Psi*DelIp )
179     ELSE
180     uT(i,j) = 0.
181     ENDIF
182    
183     ENDDO
184     ENDDO
185    
186     RETURN
187     END

  ViewVC Help
Powered by ViewVC 1.1.22