New URL for NEMO forge!   http://forge.nemo-ocean.eu

Since March 2022 along with NEMO 4.2 release, the code development moved to a self-hosted GitLab.
This present forge is now archived and remained online for history.
trcdmp.F90 in trunk/NEMOGCM/NEMO/TOP_SRC/TRP – NEMO

source: trunk/NEMOGCM/NEMO/TOP_SRC/TRP/trcdmp.F90 @ 6701

Last change on this file since 6701 was 6701, checked in by lovato, 8 years ago

#1677 - trunk: Update code for passive tracers data input and restoring

  • Property svn:keywords set to Id
File size: 18.8 KB
Line 
1MODULE trcdmp
2   !!======================================================================
3   !!                       ***  MODULE  trcdmp  ***
4   !! Ocean physics: internal restoring trend on passive tracers
5   !!======================================================================
6   !! History :  OPA  !  1991-03  (O. Marti, G. Madec)  Original code
7   !!                 !  1996-01  (G. Madec) statement function for e3
8   !!                 !  1997-05  (H. Loukos)  adapted for passive tracers
9   !!    NEMO    9.0  !  2004-03  (C. Ethe)    free form + modules
10   !!            3.2  !  2007-02  (C. Deltel)  Diagnose ML trends for passive tracers
11   !!            3.3  !  2010-06  (C. Ethe, G. Madec) merge TRA-TRC
12   !!----------------------------------------------------------------------
13#if  defined key_top 
14   !!----------------------------------------------------------------------
15   !!   trc_dmp      : update the tracer trend with the internal damping
16   !!   trc_dmp_init : initialization, namlist read, parameters control
17   !!----------------------------------------------------------------------
18   USE oce_trc         ! ocean dynamics and tracers variables
19   USE trc             ! ocean passive tracers variables
20   USE trcdta
21   USE tradmp
22   USE prtctl_trc      ! Print control for debbuging
23   USE trdtra
24   USE trd_oce
25   USE iom
26
27   IMPLICIT NONE
28   PRIVATE
29
30   PUBLIC trc_dmp     
31   PUBLIC trc_dmp_clo   
32   PUBLIC trc_dmp_alloc 
33   PUBLIC trc_dmp_ini   
34
35   INTEGER , PUBLIC ::   nn_zdmp_tr    ! = 0/1/2 flag for damping in the mixed layer
36   CHARACTER(LEN=200) , PUBLIC :: cn_resto_tr    !File containing restoration coefficient
37
38   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   restotr   ! restoring coeff. on tracers (s-1)
39
40   INTEGER, PARAMETER           ::   npncts   = 8        ! number of closed sea
41   INTEGER, DIMENSION(npncts)   ::   nctsi1, nctsj1      ! south-west closed sea limits (i,j)
42   INTEGER, DIMENSION(npncts)   ::   nctsi2, nctsj2      ! north-east closed sea limits (i,j)
43
44   !! * Substitutions
45#  include "vectopt_loop_substitute.h90"
46   !!----------------------------------------------------------------------
47   !! NEMO/TOP 3.3 , NEMO Consortium (2010)
48   !! $Id$
49   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt)
50   !!----------------------------------------------------------------------
51CONTAINS
52
53   INTEGER FUNCTION trc_dmp_alloc()
54      !!----------------------------------------------------------------------
55      !!                   ***  ROUTINE trc_dmp_alloc  ***
56      !!----------------------------------------------------------------------
57      ALLOCATE( restotr(jpi,jpj,jpk) , STAT=trc_dmp_alloc )
58      !
59      IF( trc_dmp_alloc /= 0 )   CALL ctl_warn('trc_dmp_alloc: failed to allocate array')
60      !
61   END FUNCTION trc_dmp_alloc
62
63
64   SUBROUTINE trc_dmp( kt )
65      !!----------------------------------------------------------------------
66      !!                   ***  ROUTINE trc_dmp  ***
67      !!                 
68      !! ** Purpose :   Compute the passive tracer trend due to a newtonian damping
69      !!      of the tracer field towards given data field and add it to the
70      !!      general tracer trends.
71      !!
72      !! ** Method  :   Newtonian damping towards trdta computed
73      !!      and add to the general tracer trends:
74      !!                     trn = tra + restotr * (trdta - trb)
75      !!         The trend is computed either throughout the water column
76      !!      (nlmdmptr=0) or in area of weak vertical mixing (nlmdmptr=1) or
77      !!      below the well mixed layer (nlmdmptr=2)
78      !!
79      !! ** Action  : - update the tracer trends tra with the newtonian
80      !!                damping trends.
81      !!              - save the trends ('key_trdmxl_trc')
82      !!----------------------------------------------------------------------
83      INTEGER, INTENT(in) ::   kt   ! ocean time-step index
84      !
85      INTEGER ::   ji, jj, jk, jn, jl   ! dummy loop indices
86      CHARACTER (len=22) ::   charout
87      REAL(wp), POINTER, DIMENSION(:,:,:) ::   ztrtrd
88      REAL(wp), POINTER, DIMENSION(:,:,:) ::   ztrcdta   ! 3D  workspace
89      !!----------------------------------------------------------------------
90      !
91      IF( nn_timing == 1 )  CALL timing_start('trc_dmp')
92      !
93      IF( l_trdtrc )   CALL wrk_alloc( jpi, jpj, jpk, ztrtrd )   ! temporary save of trends
94      !
95      IF( nb_trcdta > 0 ) THEN  ! Initialisation of tracer from a file that may also be used for damping
96         !
97         CALL wrk_alloc( jpi, jpj, jpk, ztrcdta )    ! Memory allocation
98         !                                                          ! ===========
99         DO jn = 1, jptra                                           ! tracer loop
100            !                                                       ! ===========
101            IF( l_trdtrc ) ztrtrd(:,:,:) = tra(:,:,:,jn)    ! save trends
102            !
103            IF( ln_trc_ini(jn) ) THEN      ! update passive tracers arrays with input data read from file
104               !
105               jl = n_trc_index(jn) 
106               CALL trc_dta( kt, sf_trcdta(jl), rf_trfac(jl), ztrcdta )   ! read tracer data at nit000
107               !
108               SELECT CASE ( nn_zdmp_tr )
109               !
110               CASE( 0 )                !==  newtonian damping throughout the water column  ==!
111                  DO jk = 1, jpkm1
112                     DO jj = 2, jpjm1
113                        DO ji = fs_2, fs_jpim1   ! vector opt.
114                           tra(ji,jj,jk,jn) = tra(ji,jj,jk,jn) + restotr(ji,jj,jk) * ( ztrcdta(ji,jj,jk) - trb(ji,jj,jk,jn) )
115                        END DO
116                     END DO
117                  END DO
118                  !
119               CASE ( 1 )                !==  no damping in the turbocline (avt > 5 cm2/s)  ==!
120                  DO jk = 1, jpkm1
121                     DO jj = 2, jpjm1
122                        DO ji = fs_2, fs_jpim1   ! vector opt.
123                           IF( avt(ji,jj,jk) <= 5.e-4_wp )  THEN
124                              tra(ji,jj,jk,jn) = tra(ji,jj,jk,jn) + restotr(ji,jj,jk) * ( ztrcdta(ji,jj,jk) - trb(ji,jj,jk,jn) )
125                           ENDIF
126                        END DO
127                     END DO
128                  END DO
129                  !
130               CASE ( 2 )               !==  no damping in the mixed layer   ==!
131                  DO jk = 1, jpkm1
132                     DO jj = 2, jpjm1
133                        DO ji = fs_2, fs_jpim1   ! vector opt.
134                           IF( gdept_n(ji,jj,jk) >= hmlp (ji,jj) ) THEN
135                              tra(ji,jj,jk,jn) = tra(ji,jj,jk,jn) + restotr(ji,jj,jk) * ( ztrcdta(ji,jj,jk) - trb(ji,jj,jk,jn) )
136                           END IF
137                        END DO
138                     END DO
139                  END DO
140                 
141               END SELECT
142               !
143            ENDIF
144            !
145            IF( l_trdtrc ) THEN
146               ztrtrd(:,:,:) = tra(:,:,:,jn) -  ztrtrd(:,:,:)
147               CALL trd_tra( kt, 'TRC', jn, jptra_dmp, ztrtrd )
148            END IF
149            !                                                       ! ===========
150         END DO                                                     ! tracer loop
151         !                                                          ! ===========
152         CALL wrk_dealloc( jpi, jpj, jpk, ztrcdta )
153      ENDIF
154      !
155      IF( l_trdtrc )  CALL wrk_dealloc( jpi, jpj, jpk, ztrtrd )
156      !                                          ! print mean trends (used for debugging)
157      IF( ln_ctl ) THEN
158         WRITE(charout, FMT="('dmp ')")
159         CALL prt_ctl_trc_info(charout)
160         CALL prt_ctl_trc( tab4d=tra, mask=tmask, clinfo=ctrcnm, clinfo2='trd' )
161      ENDIF
162      !
163      IF( nn_timing == 1 )  CALL timing_stop('trc_dmp')
164      !
165   END SUBROUTINE trc_dmp
166
167
168   SUBROUTINE trc_dmp_ini
169      !!----------------------------------------------------------------------
170      !!                  ***  ROUTINE trc_dmp_ini  ***
171      !!
172      !! ** Purpose :   Initialization for the newtonian damping
173      !!
174      !! ** Method  :   read the nammbf namelist and check the parameters
175      !!              called by trc_dmp at the first timestep (nittrc000)
176      !!----------------------------------------------------------------------
177      INTEGER ::   ios, imask  ! local integers
178      !!
179      NAMELIST/namtrc_dmp/ nn_zdmp_tr , cn_resto_tr
180      !!----------------------------------------------------------------------
181      !
182      IF( nn_timing == 1 )  CALL timing_start('trc_dmp_ini')
183      !
184      REWIND( numnat_ref )              ! Namelist namtrc_dmp in reference namelist : Passive tracers newtonian damping
185      READ  ( numnat_ref, namtrc_dmp, IOSTAT = ios, ERR = 909)
186909   IF( ios /= 0 ) CALL ctl_nam ( ios , 'namtrc_dmp in reference namelist', lwp )
187
188      REWIND( numnat_cfg )              ! Namelist namtrc_dmp in configuration namelist : Passive tracers newtonian damping
189      READ  ( numnat_cfg, namtrc_dmp, IOSTAT = ios, ERR = 910)
190910   IF( ios /= 0 ) CALL ctl_nam ( ios , 'namtrc_dmp in configuration namelist', lwp )
191      IF(lwm) WRITE ( numont, namtrc_dmp )
192
193      IF(lwp) THEN                       ! Namelist print
194         WRITE(numout,*)
195         WRITE(numout,*) 'trc_dmp : Passive tracers newtonian damping'
196         WRITE(numout,*) '~~~~~~~'
197         WRITE(numout,*) '   Namelist namtrc_dmp : set damping parameter'
198         WRITE(numout,*) '      mixed layer damping option     nn_zdmp_tr = ', nn_zdmp_tr, '(zoom: forced to 0)'
199         WRITE(numout,*) '      Restoration coeff file    cn_resto_tr = ', cn_resto_tr
200      ENDIF
201      !                          ! Allocate arrays
202      IF( trc_dmp_alloc() /= 0 )   CALL ctl_stop( 'STOP', 'trc_dmp_ini: unable to allocate arrays' )
203      !
204      IF( lzoom .AND. .NOT.lk_c1d )   nn_zdmp_tr = 0           ! restoring to climatology at closed north or south boundaries
205      SELECT CASE ( nn_zdmp_tr )
206      CASE ( 0 )   ;   IF(lwp) WRITE(numout,*) '   tracer damping throughout the water column'
207      CASE ( 1 )   ;   IF(lwp) WRITE(numout,*) '   no tracer damping in the turbocline (avt > 5 cm2/s)'
208      CASE ( 2 )   ;   IF(lwp) WRITE(numout,*) '   no tracer damping in the mixed layer'
209      CASE DEFAULT
210         WRITE(ctmp1,*) 'bad flag value for nn_zdmp_tr = ', nn_zdmp_tr
211         CALL ctl_stop(ctmp1)
212      END SELECT
213
214      IF( .NOT.lk_c1d ) THEN
215         IF( .NOT. ln_tradmp )   &
216            &   CALL ctl_stop( 'passive trace damping need ln_tradmp to compute damping coef.' )
217         !
218         !                          ! Read damping coefficients from file
219         !Read in mask from file
220         CALL iom_open ( cn_resto_tr, imask)
221         CALL iom_get  ( imask, jpdom_autoglo, 'resto', restotr)
222         CALL iom_close( imask )
223         !
224      ENDIF
225      IF( nn_timing == 1 )  CALL timing_stop('trc_dmp_init')
226      !
227   END SUBROUTINE trc_dmp_ini
228
229
230   SUBROUTINE trc_dmp_clo( kt )
231      !!---------------------------------------------------------------------
232      !!                  ***  ROUTINE trc_dmp_clo  ***
233      !!
234      !! ** Purpose :   Closed sea domain initialization
235      !!
236      !! ** Method  :   if a closed sea is located only in a model grid point
237      !!                we restore to initial data
238      !!
239      !! ** Action  :   nctsi1(), nctsj1() : south-west closed sea limits (i,j)
240      !!                nctsi2(), nctsj2() : north-east Closed sea limits (i,j)
241      !!----------------------------------------------------------------------
242      INTEGER, INTENT( in ) ::   kt      ! ocean time-step index
243      !
244      INTEGER :: ji , jj, jk, jn, jl, jc                    ! dummy loop indicesa
245      INTEGER :: isrow                                      ! local index
246      REAL(wp), POINTER, DIMENSION(:,:,:) ::  ztrcdta       ! 3D  workspace
247
248      !!----------------------------------------------------------------------
249
250      IF( kt == nit000 ) THEN
251         ! initial values
252         nctsi1(:) = 1  ;  nctsi2(:) = 1
253         nctsj1(:) = 1  ;  nctsj2(:) = 1
254
255         ! set the closed seas (in data domain indices)
256         ! -------------------
257
258         IF( cp_cfg == "orca" ) THEN
259            !
260            SELECT CASE ( jp_cfg )
261            !                                           ! =======================
262            CASE ( 1 )                                  ! eORCA_R1 configuration
263            !                                           ! =======================
264            isrow = 332 - jpjglo
265            !
266                                                        ! Caspian Sea
267            nctsi1(1)   = 333  ; nctsj1(1)   = 243 - isrow
268            nctsi2(1)   = 342  ; nctsj2(1)   = 274 - isrow
269            !                                           ! Lake Superior
270            nctsi1(2)   = 198  ; nctsj1(2)   = 258 - isrow
271            nctsi2(2)   = 204  ; nctsj2(2)   = 262 - isrow
272            !                                           ! Lake Michigan
273            nctsi1(3)   = 201  ; nctsj1(3)   = 250 - isrow
274            nctsi2(3)   = 203  ; nctsj2(3)   = 256 - isrow
275            !                                           ! Lake Huron
276            nctsi1(4)   = 204  ; nctsj1(4)   = 252 - isrow
277            nctsi2(4)   = 209  ; nctsj2(4)   = 256 - isrow
278            !                                           ! Lake Erie
279            nctsi1(5)   = 206  ; nctsj1(5)   = 249 - isrow
280            nctsi2(5)   = 209  ; nctsj2(5)   = 251 - isrow
281            !                                           ! Lake Ontario
282            nctsi1(6)   = 210  ; nctsj1(6)   = 252 - isrow
283            nctsi2(6)   = 212  ; nctsj2(6)   = 252 - isrow
284            !                                           ! Victoria Lake
285            nctsi1(7)   = 321  ; nctsj1(7)   = 180 - isrow
286            nctsi2(7)   = 322  ; nctsj2(7)   = 189 - isrow
287            !                                           ! Baltic Sea
288            nctsi1(8)   = 297  ; nctsj1(8)   = 270 - isrow
289            nctsi2(8)   = 308  ; nctsj2(8)   = 293 - isrow
290            !                                       
291            !                                           ! =======================
292            CASE ( 2 )                                  !  ORCA_R2 configuration
293               !                                        ! =======================
294               !                                            ! Caspian Sea
295               nctsi1(1)   =  11  ;  nctsj1(1)   = 103
296               nctsi2(1)   =  17  ;  nctsj2(1)   = 112
297               !                                            ! Great North American Lakes
298               nctsi1(2)   =  97  ;  nctsj1(2)   = 107
299               nctsi2(2)   = 103  ;  nctsj2(2)   = 111
300               !                                            ! Black Sea 1 : west part of the Black Sea
301               nctsi1(3)   = 174  ;  nctsj1(3)   = 107
302               nctsi2(3)   = 181  ;  nctsj2(3)   = 112
303              !                                            ! Black Sea 2 : est part of the Black Sea
304               nctsi1(4)   =   2  ;  nctsj1(4)   = 107
305               nctsi2(4)   =   6  ;  nctsj2(4)   = 112
306               !                                            ! Baltic Sea
307               nctsi1(5)   =  145 ;  nctsj1(5)   = 116
308               nctsi2(5)   =  150 ;  nctsj2(5)   = 126
309               !                                        ! =======================
310            CASE ( 4 )                                  !  ORCA_R4 configuration
311               !                                        ! =======================
312               !                                            ! Caspian Sea
313               nctsi1(1)   =  4  ;  nctsj1(1)   = 53
314               nctsi2(1)   =  4  ;  nctsj2(1)   = 56
315               !                                            ! Great North American Lakes
316               nctsi1(2)   = 49  ;  nctsj1(2)   = 55
317               nctsi2(2)   = 51  ;  nctsj2(2)   = 56
318               !                                            ! Black Sea
319               nctsi1(3)   = 88  ;  nctsj1(3)   = 55
320               nctsi2(3)   = 91  ;  nctsj2(3)   = 56
321               !                                            ! Baltic Sea
322               nctsi1(4)   = 75  ;  nctsj1(4)   = 59
323               nctsi2(4)   = 76  ;  nctsj2(4)   = 61
324               !                                        ! =======================
325            CASE ( 025 )                                ! ORCA_R025 configuration
326               !                                        ! =======================
327                                                     ! Caspian + Aral sea
328               nctsi1(1)   = 1330 ; nctsj1(1)   = 645
329               nctsi2(1)   = 1400 ; nctsj2(1)   = 795
330               !                                        ! Azov Sea
331               nctsi1(2)   = 1284 ; nctsj1(2)   = 722
332               nctsi2(2)   = 1304 ; nctsj2(2)   = 747
333               !
334            END SELECT
335            !
336         ENDIF
337         !
338
339         ! convert the position in local domain indices
340         ! --------------------------------------------
341         DO jc = 1, npncts
342            nctsi1(jc)   = mi0( nctsi1(jc) )
343            nctsj1(jc)   = mj0( nctsj1(jc) )
344
345            nctsi2(jc)   = mi1( nctsi2(jc) )
346            nctsj2(jc)   = mj1( nctsj2(jc) )
347         END DO
348         !
349      ENDIF
350
351      ! Restore close seas values to initial data
352      IF( ln_trcdta .AND. nb_trcdta > 0 )  THEN   ! Initialisation of tracer from a file that may also be used for damping
353         !
354         IF(lwp)  WRITE(numout,*)
355         IF(lwp)  WRITE(numout,*) ' trc_dmp_clo : Restoring of nutrients on close seas at time-step kt = ', kt
356         IF(lwp)  WRITE(numout,*)
357         !
358         CALL wrk_alloc( jpi, jpj, jpk, ztrcdta )   ! Memory allocation
359         !
360         DO jn = 1, jptra
361            IF( ln_trc_ini(jn) ) THEN      ! update passive tracers arrays with input data read from file
362                jl = n_trc_index(jn)
363                CALL trc_dta( kt, sf_trcdta(jl), rf_trfac(jl), ztrcdta )   ! read tracer data at nit000
364                DO jc = 1, npncts
365                   DO jk = 1, jpkm1
366                      DO jj = nctsj1(jc), nctsj2(jc)
367                         DO ji = nctsi1(jc), nctsi2(jc)
368                            trn(ji,jj,jk,jn) = ztrcdta(ji,jj,jk)
369                            trb(ji,jj,jk,jn) = trn(ji,jj,jk,jn)
370                         ENDDO
371                      ENDDO
372                   ENDDO
373                ENDDO
374             ENDIF
375          ENDDO
376          CALL wrk_dealloc( jpi, jpj, jpk, ztrcdta )
377      ENDIF
378      !
379   END SUBROUTINE trc_dmp_clo
380
381 
382#else
383   !!----------------------------------------------------------------------
384   !!  Dummy module :                                     No passive tracer
385   !!----------------------------------------------------------------------
386CONTAINS
387   SUBROUTINE trc_dmp( kt )        ! Empty routine
388      INTEGER, INTENT(in) :: kt
389      WRITE(*,*) 'trc_dmp: You should not have seen this print! error?', kt
390   END SUBROUTINE trc_dmp
391#endif
392
393   !!======================================================================
394END MODULE trcdmp
Note: See TracBrowser for help on using the repository browser.