/[MITgcm]/MITgcm/pkg/seaice/seaice_calc_strainrates.F
ViewVC logotype

Annotation of /MITgcm/pkg/seaice/seaice_calc_strainrates.F

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


Revision 1.20 - (hide annotations) (download)
Thu Feb 28 17:25:41 2013 UTC (12 years, 4 months ago) by mlosch
Branch: MAIN
CVS Tags: checkpoint64y, checkpoint64x, checkpoint64z, checkpoint64q, checkpoint64p, checkpoint64s, checkpoint64r, checkpoint64u, checkpoint64t, checkpoint64w, checkpoint64v, checkpoint64i, checkpoint64h, checkpoint64k, checkpoint64j, checkpoint64m, checkpoint64l, checkpoint64o, checkpoint64n, checkpoint64e, checkpoint64g, checkpoint64f, checkpoint65, checkpoint65b, checkpoint65c, checkpoint65a, checkpoint65f, checkpoint65d, checkpoint65e
Changes since 1.19: +5 -2 lines
- fix bug in the no-slip implementation in, this bug changes two
  verification experiments, recover old (wrong) results by setting
  noSlipFac = 2. in seaice_calc_strainrates.F;

1 mlosch 1.20 C $Header: /u/gcmpack/MITgcm/pkg/seaice/seaice_calc_strainrates.F,v 1.19 2012/03/06 16:45:20 jmc Exp $
2 mlosch 1.1 C $Name: $
3    
4     #include "SEAICE_OPTIONS.h"
5 jmc 1.18 #ifdef ALLOW_OBCS
6     # include "OBCS_OPTIONS.h"
7     #else
8     # define OBCS_UVICE_OLD
9     #endif
10 mlosch 1.1
11 jmc 1.18 CBOP
12     C !ROUTINE: SEAICE_CALC_STRAINRATES
13     C !INTERFACE:
14 jmc 1.8 SUBROUTINE SEAICE_CALC_STRAINRATES(
15 mlosch 1.1 I uFld, vFld,
16 mlosch 1.12 O e11Loc, e22Loc, e12Loc,
17 mlosch 1.14 I iStep, myTime, myIter, myThid )
18 jmc 1.18
19     C !DESCRIPTION: \bv
20     C *==========================================================*
21     C | SUBROUTINE SEAICE_CALC_STRAINRATES
22     C | o compute strain rates from ice velocities
23     C *==========================================================*
24     C | written by Martin Losch, Apr 2007
25     C *==========================================================*
26     C \ev
27    
28     C !USES:
29 mlosch 1.1 IMPLICIT NONE
30    
31     C === Global variables ===
32     #include "SIZE.h"
33     #include "EEPARAMS.h"
34     #include "PARAMS.h"
35     #include "GRID.h"
36 jmc 1.19 #include "SEAICE_SIZE.h"
37 mlosch 1.1 #include "SEAICE_PARAMS.h"
38 mlosch 1.11 #include "SEAICE.h"
39 mlosch 1.1
40     #ifdef ALLOW_AUTODIFF_TAMC
41     # include "tamc.h"
42     #endif
43    
44 jmc 1.18 C !INPUT/OUTPUT PARAMETERS:
45 mlosch 1.1 C === Routine arguments ===
46 jmc 1.18 C uFld :: ice velocity, u-component
47     C vFld :: ice velocity, v-component
48     C e11Loc :: strain rate tensor, component 1,1
49     C e22Loc :: strain rate tensor, component 2,2
50     C e12Loc :: strain rate tensor, component 1,2
51 jmc 1.8 C iStep :: Sub-time-step number
52     C myTime :: Simulation time
53     C myIter :: Simulation timestep number
54     C myThid :: My Thread Id. number
55 jmc 1.19 _RL uFld (1-OLx:sNx+OLx,1-OLy:sNy+OLy,nSx,nSy)
56     _RL vFld (1-OLx:sNx+OLx,1-OLy:sNy+OLy,nSx,nSy)
57 mlosch 1.12 _RL e11Loc (1-OLx:sNx+OLx,1-OLy:sNy+OLy,nSx,nSy)
58     _RL e22Loc (1-OLx:sNx+OLx,1-OLy:sNy+OLy,nSx,nSy)
59     _RL e12Loc (1-OLx:sNx+OLx,1-OLy:sNy+OLy,nSx,nSy)
60 jmc 1.18 INTEGER iStep
61     _RL myTime
62     INTEGER myIter
63     INTEGER myThid
64     CEOP
65 mlosch 1.1
66     #ifdef SEAICE_CGRID
67     #ifdef SEAICE_ALLOW_DYNAMICS
68 jmc 1.18 C !LOCAL VARIABLES:
69 mlosch 1.1 C === Local variables ===
70 jmc 1.18 C i,j,bi,bj :: Loop counters
71 mlosch 1.1 INTEGER i, j, bi, bj
72 jmc 1.18 C hFacU, hFacV :: determine the no-slip boundary condition
73 mlosch 1.2 INTEGER k
74 mlosch 1.11 _RS hFacU, hFacV, noSlipFac
75 mlosch 1.15 C auxillary variables that help writing code that
76     C vectorizes even after TAFization
77     _RL dudx (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
78     _RL dvdy (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
79     _RL dudy (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
80     _RL dvdx (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
81     _RL uave (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
82     _RL vave (1-OLx:sNx+OLx,1-OLy:sNy+OLy)
83 mlosch 1.2
84 mlosch 1.4 k = 1
85 mlosch 1.11 noSlipFac = 0. _d 0
86     IF ( SEAICE_no_slip ) noSlipFac = 1. _d 0
87 mlosch 1.20 C in order repoduce results before fixing a bug in r1.20 comment out
88     C the following line
89     CML IF ( SEAICE_no_slip ) noSlipFac = 2. _d 0
90 mlosch 1.1 C
91 mlosch 1.11 DO bj=myByLo(myThid),myByHi(myThid)
92     DO bi=myBxLo(myThid),myBxHi(myThid)
93 mlosch 1.15 C abbreviations on C-points, need to do them in separate loops
94     C for vectorization
95 jmc 1.19 DO j=1-OLy,sNy+OLy-1
96     DO i=1-OLx,sNx+OLx-1
97 jmc 1.18 dudx(i,j) = _recip_dxF(i,j,bi,bj) *
98     & (uFld(i+1,j,bi,bj)-uFld(i,j,bi,bj))
99     uave(i,j) = 0.5 _d 0 * (uFld(i,j,bi,bj)+uFld(i+1,j,bi,bj))
100 mlosch 1.15 ENDDO
101     ENDDO
102 jmc 1.19 DO j=1-OLy,sNy+OLy-1
103     DO i=1-OLx,sNx+OLx-1
104 jmc 1.18 dvdy(i,j) = _recip_dyF(i,j,bi,bj) *
105     & (vFld(i,j+1,bi,bj)-vFld(i,j,bi,bj))
106     vave(i,j) = 0.5 _d 0 * (vFld(i,j,bi,bj)+vFld(i,j+1,bi,bj))
107 mlosch 1.15 ENDDO
108     ENDDO
109     C evaluate strain rates at C-points
110 jmc 1.19 DO j=1-OLy,sNy+OLy-1
111     DO i=1-OLx,sNx+OLx-1
112 jmc 1.18 e11Loc(i,j,bi,bj) = dudx(i,j) + vave(i,j) * k2AtC(i,j,bi,bj)
113     e22Loc(i,j,bi,bj) = dvdy(i,j) + uave(i,j) * k1AtC(i,j,bi,bj)
114     ENDDO
115     ENDDO
116     #ifndef OBCS_UVICE_OLD
117     C-- for OBCS: assume no gradient beyong OB
118 jmc 1.19 DO j=1-OLy,sNy+OLy-1
119     DO i=1-OLx,sNx+OLx-1
120 jmc 1.18 e11Loc(i,j,bi,bj) = e11Loc(i,j,bi,bj)*maskInC(i,j,bi,bj)
121     e22Loc(i,j,bi,bj) = e22Loc(i,j,bi,bj)*maskInC(i,j,bi,bj)
122 mlosch 1.11 ENDDO
123     ENDDO
124 jmc 1.18 #endif /* OBCS_UVICE_OLD */
125    
126 mlosch 1.15 C abbreviations at Z-points, need to do them in separate loops
127     C for vectorization
128 jmc 1.19 DO j=1-OLy+1,sNy+OLy
129     DO i=1-OLx+1,sNx+OLx
130 jmc 1.18 dudy(i,j) = ( uFld(i,j,bi,bj) - uFld(i ,j-1,bi,bj) )
131     & * _recip_dyU(i,j,bi,bj)
132     uave(i,j) = 0.5 _d 0 * (uFld(i,j,bi,bj)+uFld(i ,j-1,bi,bj))
133 mlosch 1.15 ENDDO
134     ENDDO
135 jmc 1.19 DO j=1-OLy+1,sNy+OLy
136     DO i=1-OLx+1,sNx+OLx
137 jmc 1.18 dvdx(i,j) = ( vFld(i,j,bi,bj) - vFld(i-1,j ,bi,bj) )
138     & * _recip_dxV(i,j,bi,bj)
139     vave(i,j) = 0.5 _d 0 * (vFld(i,j,bi,bj)+vFld(i-1,j ,bi,bj))
140 mlosch 1.15 ENDDO
141     ENDDO
142     C evaluate strain rates at Z-points
143 jmc 1.19 DO j=1-OLy+1,sNy+OLy
144     DO i=1-OLx+1,sNx+OLx
145 mlosch 1.11 hFacU = _maskW(i,j,k,bi,bj) - _maskW(i,j-1,k,bi,bj)
146     hFacV = _maskS(i,j,k,bi,bj) - _maskS(i-1,j,k,bi,bj)
147 jmc 1.18 e12Loc(i,j,bi,bj) = 0.5 _d 0 * (
148     & dudy(i,j) + dvdx(i,j)
149     & - k1AtZ(i,j,bi,bj) * vave(i,j)
150     & - k2AtZ(i,j,bi,bj) * uave(i,j)
151 mlosch 1.11 & )
152 jmc 1.18 & *maskC(i ,j ,k,bi,bj)*maskC(i-1,j ,k,bi,bj)
153     & *maskC(i ,j-1,k,bi,bj)*maskC(i-1,j-1,k,bi,bj)
154 mlosch 1.20 & + noSlipFac * (
155 jmc 1.18 & 2.0 _d 0 * uave(i,j) * _recip_dyU(i,j,bi,bj) * hFacU
156     & + 2.0 _d 0 * vave(i,j) * _recip_dxV(i,j,bi,bj) * hFacV
157 mlosch 1.11 & )
158     C no slip at the boundary implies u(j)+u(j-1)=0 and v(i)+v(i-1)=0
159     C accross the boundary; this is already accomplished by masking so
160     C that the following lines are not necessary
161 jmc 1.18 c$$$ & - hFacV * k1AtZ(i,j,bi,bj) * vave(i,j)
162     c$$$ & - hFacU * k2AtZ(i,j,bi,bj) * uave(i,j)
163 mlosch 1.11 ENDDO
164     ENDDO
165    
166     ENDDO
167     ENDDO
168 gforget 1.16
169     #ifdef ALLOW_AUTODIFF_TAMC
170     #ifdef SEAICE_DYN_STABLE_ADJOINT
171     cgf zero out adjoint fields to stabilize pkg/seaice dyna. adjoint
172     CALL ZERO_ADJ( 1, e11Loc, myThid)
173     CALL ZERO_ADJ( 1, e12Loc, myThid)
174     CALL ZERO_ADJ( 1, e22Loc, myThid)
175     #endif
176     #endif /* ALLOW_AUTODIFF_TAMC */
177    
178 mlosch 1.1 #endif /* SEAICE_ALLOW_DYNAMICS */
179     #endif /* SEAICE_CGRID */
180     RETURN
181     END

  ViewVC Help
Powered by ViewVC 1.1.22