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.
Changeset 11098 – NEMO

Changeset 11098


Ignore:
Timestamp:
2019-06-11T15:17:21+02:00 (5 years ago)
Author:
agn
Message:

Undid premature check into release-4.0

Location:
NEMO/releases/release-4.0/src/OCE
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • NEMO/releases/release-4.0/src/OCE/C1D/step_c1d.F90

    r11096 r11098  
    8686      !<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<< 
    8787                         CALL dia_wri( kstp )       ! ocean model: outputs 
    88       IF( ll_diahth  )   CALL dia_hth( kstp )       ! Thermocline depth (20°C) 
     88      IF( lk_diahth  )   CALL dia_hth( kstp )       ! Thermocline depth (20°C) 
    8989 
    9090 
  • NEMO/releases/release-4.0/src/OCE/DIA/diahth.F90

    r11097 r11098  
    55   !!====================================================================== 
    66   !! History :  OPA  !  1994-09  (J.-P. Boulanger)  Original code 
    7    !!                 !  1996-11  (E. Guilyardi)  OPA8 
     7   !!                 !  1996-11  (E. Guilyardi)  OPA8  
    88   !!                 !  1997-08  (G. Madec)  optimization 
    9    !!                 !  1999-07  (E. Guilyardi)  hd28 + heat content 
     9   !!                 !  1999-07  (E. Guilyardi)  hd28 + heat content  
    1010   !!   NEMO     1.0  !  2002-06  (G. Madec)  F90: Free form and module 
    1111   !!            3.2  !  2009-07  (S. Masson) hc300 bugfix + cleaning + add new diag 
    1212   !!---------------------------------------------------------------------- 
     13#if   defined key_diahth 
    1314   !!---------------------------------------------------------------------- 
    1415   !!   'key_diahth' :                              thermocline depth diag. 
     
    2324   USE lib_mpp         ! MPP library 
    2425   USE iom             ! I/O library 
     26   USE timing          ! preformance summary 
    2527 
    2628   IMPLICIT NONE 
     
    2830 
    2931   PUBLIC   dia_hth       ! routine called by step.F90 
    30    PUBLIC   dia_hth_init  ! routine called by nemogcm.F90 
    31  
    32    LOGICAL, PUBLIC ::   ll_diahth   !: Compute further diagnostics of ML and thermocline depth 
    33  
     32 
     33   LOGICAL , PUBLIC, PARAMETER ::   lk_diahth = .TRUE.    !: thermocline-20d depths flag 
     34    
    3435   !!---------------------------------------------------------------------- 
    3536   !! NEMO/OCE 4.0 , NEMO Consortium (2018) 
     
    4849     !!      the depth of strongest vertical temperature gradient 
    4950     !!      the mixed layer depth with density     criteria: rho = rho(10m or surf) + 0.03(or 0.01) 
    50      !!      the mixed layer depth with temperature criteria: abs( tn - tn(10m) ) = 0.2 
    51      !!      the top of the thermochine: tn = tn(10m) - ztem2 
    52      !!      the pycnocline depth with density criteria equivalent to a temperature variation 
    53      !!                rho = rho10m + (dr/dT)(T,S,10m)*(-0.2 degC) 
     51     !!      the mixed layer depth with temperature criteria: abs( tn - tn(10m) ) = 0.2        
     52     !!      the top of the thermochine: tn = tn(10m) - ztem2  
     53     !!      the pycnocline depth with density criteria equivalent to a temperature variation  
     54     !!                rho = rho10m + (dr/dT)(T,S,10m)*(-0.2 degC)  
    5455     !!      the barrier layer thickness 
    5556     !!      the maximal verical inversion of temperature and its depth max( 0, max of tn - tn(10m) ) 
     
    5859     !!      the heat content of first 300 m 
    5960     !! 
    60      !! ** Method : 
     61     !! ** Method :  
    6162     !!------------------------------------------------------------------- 
    6263     INTEGER, INTENT( in ) ::   kt      ! ocean time-step index 
     
    6465     INTEGER                          ::   ji, jj, jk            ! dummy loop arguments 
    6566     INTEGER                          ::   iid, ilevel           ! temporary integers 
    66      INTEGER, DIMENSION(jpi,jpj) ::   ik20, ik28  ! levels 
     67     INTEGER, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   ik20, ik28  ! levels 
    6768     REAL(wp)                         ::   zavt5 = 5.e-4_wp      ! Kz criterion for the turbocline depth 
    6869     REAL(wp)                         ::   zrho3 = 0.03_wp       ! density     criterion for mixed layer depth 
     
    7273     REAL(wp)                         ::   zztmp, zzdep          ! temporary scalars inside do loop 
    7374     REAL(wp)                         ::   zu, zv, zw, zut, zvt  ! temporary workspace 
    74      REAL(wp), DIMENSION(jpi,jpj) ::   zabs2      ! MLD: abs( tn - tn(10m) ) = ztem2 
    75      REAL(wp), DIMENSION(jpi,jpj) ::   ztm2       ! Top of thermocline: tn = tn(10m) - ztem2 
    76      REAL(wp), DIMENSION(jpi,jpj) ::   zrho10_3   ! MLD: rho = rho10m + zrho3 
    77      REAL(wp), DIMENSION(jpi,jpj) ::   zpycn      ! pycnocline: rho = rho10m + (dr/dT)(T,S,10m)*(-0.2 degC) 
    78      REAL(wp), DIMENSION(jpi,jpj) ::   ztinv      ! max of temperature inversion 
    79      REAL(wp), DIMENSION(jpi,jpj) ::   zdepinv    ! depth of temperature inversion 
    80      REAL(wp), DIMENSION(jpi,jpj) ::   zrho0_3    ! MLD rho = rho(surf) = 0.03 
    81      REAL(wp), DIMENSION(jpi,jpj) ::   zrho0_1    ! MLD rho = rho(surf) = 0.01 
    82      REAL(wp), DIMENSION(jpi,jpj) ::   zmaxdzT    ! max of dT/dz 
    83      REAL(wp), DIMENSION(jpi,jpj) ::   zthick     ! vertical integration thickness 
    84      REAL(wp), DIMENSION(jpi,jpj) ::   zdelr      ! delta rho equivalent to deltaT = 0.2 
    85    ! note: following variables should move to local variables once iom_put is always used 
    86      REAL(wp), DIMENSION(jpi,jpj) ::   zhth    !: depth of the max vertical temperature gradient [m] 
    87      REAL(wp), DIMENSION(jpi,jpj) ::   zhd20   !: depth of 20 C isotherm                         [m] 
    88      REAL(wp), DIMENSION(jpi,jpj) ::   zhd28   !: depth of 28 C isotherm                         [m] 
    89      REAL(wp), DIMENSION(jpi,jpj) ::   zhtc3   !: heat content of first 300 m                    [W] 
    90  
    91      IF (iom_use("mlddzt") .OR. iom_use("mldr0_3") .OR. iom_use("mldr0_1")) THEN 
     75     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zabs2      ! MLD: abs( tn - tn(10m) ) = ztem2  
     76     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   ztm2       ! Top of thermocline: tn = tn(10m) - ztem2      
     77     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zrho10_3   ! MLD: rho = rho10m + zrho3       
     78     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zpycn      ! pycnocline: rho = rho10m + (dr/dT)(T,S,10m)*(-0.2 degC) 
     79     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   ztinv      ! max of temperature inversion 
     80     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zdepinv    ! depth of temperature inversion 
     81     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zrho0_3    ! MLD rho = rho(surf) = 0.03 
     82     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zrho0_1    ! MLD rho = rho(surf) = 0.01 
     83     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zmaxdzT    ! max of dT/dz 
     84     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zthick     ! vertical integration thickness  
     85     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zdelr      ! delta rho equivalent to deltaT = 0.2 
     86   ! note: following variables should move to local variables once iom_put is always used  
     87     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zhth    !: depth of the max vertical temperature gradient [m] 
     88     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zhd20   !: depth of 20 C isotherm                         [m] 
     89     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zhd28   !: depth of 28 C isotherm                         [m] 
     90     REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:) ::   zhtc3   !: heat content of first 300 m                    [W] 
     91 
     92     !!---------------------------------------------------------------------- 
     93     IF( ln_timing )   CALL timing_start('dia_hth') 
     94 
     95     IF( kt == nit000 ) THEN 
     96        !                                      ! allocate dia_hth array 
     97        IF(.NOT. ALLOCATED(ik20) ) THEN 
     98           ALLOCATE(ik20(jpi,jpj), ik28(jpi,jpj), & 
     99                &      zhth(jpi,jpj),   & 
     100                &      zhd20(jpi,jpj),   & 
     101                &      zhd28(jpi,jpj),   & 
     102                &      zhtc3(jpi,jpj),   & 
     103                &      zabs2(jpi,jpj),   & 
     104                &      ztm2(jpi,jpj),    & 
     105                &      zrho10_3(jpi,jpj),& 
     106                &      zpycn(jpi,jpj),   & 
     107                &      ztinv(jpi,jpj),   & 
     108                &      zdepinv(jpi,jpj), & 
     109                &      zrho0_3(jpi,jpj), & 
     110                &      zrho0_1(jpi,jpj), & 
     111                &      zmaxdzT(jpi,jpj), & 
     112                &      zthick(jpi,jpj),  & 
     113                &      zdelr(jpi,jpj), STAT=ji) 
     114           IF( lk_mpp  )   CALL mpp_sum(ji) 
     115           IF( ji /= 0 )   CALL ctl_stop( 'STOP', 'dia_hth : unable to allocate standard ocean arrays' ) 
     116        END IF 
     117 
     118        IF(lwp) WRITE(numout,*) 
     119        IF(lwp) WRITE(numout,*) 'dia_hth : diagnostics of the thermocline depth' 
     120        IF(lwp) WRITE(numout,*) '~~~~~~~ ' 
     121        IF(lwp) WRITE(numout,*) 
     122     ENDIF 
     123 
     124     IF(iom_use("mlddzt").OR.iom_use("mldr0_3").OR.iom_use("mldr0_1").OR.iom_use("mld_dt02") & 
     125          & .OR.iom_use("topthdep").OR.iom_use("mldr10_3").OR.iom_use("pycndep").OR.iom_use("tinv").OR.iom_use("depti")) THEN 
     126        ! initialization 
     127        ztinv  (:,:) = 0._wp   
     128        zdepinv(:,:) = 0._wp   
     129        zmaxdzT(:,:) = 0._wp   
     130        DO jj = 1, jpj 
     131           DO ji = 1, jpi 
     132              zztmp = gdepw_n(ji,jj,mbkt(ji,jj)+1)  
     133              zhth     (ji,jj) = zztmp 
     134              zabs2   (ji,jj) = zztmp 
     135              ztm2    (ji,jj) = zztmp 
     136              zrho10_3(ji,jj) = zztmp 
     137              zpycn   (ji,jj) = zztmp 
     138           END DO 
     139        END DO 
     140        IF( nla10 > 1 ) THEN  
     141           DO jj = 1, jpj 
     142              DO ji = 1, jpi 
     143                 zztmp = gdepw_n(ji,jj,mbkt(ji,jj)+1)  
     144                 zrho0_3(ji,jj) = zztmp 
     145                 zrho0_1(ji,jj) = zztmp 
     146              END DO 
     147           END DO 
     148        ENDIF 
     149     ENDIF 
     150 
     151     IF (iom_use("mlddzt").OR.iom_use("mldr0_3").OR.iom_use("mldr0_1")) THEN 
    92152        ! ------------------------------------------------------------- ! 
    93153        ! thermocline depth: strongest vertical gradient of temperature ! 
     
    96156        ! MLD: rho = rho(1) + zrho1                                     ! 
    97157        ! ------------------------------------------------------------- ! 
    98         zmaxdzT(:,:) = 0._wp 
    99         IF( nla10 > 1 ) THEN 
    100            DO jj = 1, jpj 
    101               DO ji = 1, jpi 
    102                  zztmp = gdepw_n(ji,jj,mbkt(ji,jj)+1) 
    103                  zrho0_3(ji,jj) = zztmp 
    104                  zrho0_1(ji,jj) = zztmp 
    105                  zhth(ji,jj) = zztmp 
    106               END DO 
    107            END DO 
    108         ELSE IF (iom_use("mlddzt")) THEN 
    109            DO jj = 1, jpj 
    110               DO ji = 1, jpi 
    111                  zztmp = gdepw_n(ji,jj,mbkt(ji,jj)+1) 
    112                  zhth(ji,jj) = zztmp 
    113               END DO 
    114            END DO 
    115         ELSE 
    116            zhth(:,:) = 0._wp 
    117  
    118         ENDIF 
    119  
    120158        DO jk = jpkm1, 2, -1   ! loop from bottom to 2 
    121159           DO jj = 1, jpj 
     
    126164                 zzdep = zzdep * tmask(ji,jj,1) 
    127165 
    128                  IF( zztmp > zmaxdzT(ji,jj) ) THEN 
     166                 IF( zztmp > zmaxdzT(ji,jj) ) THEN                         
    129167                    zmaxdzT(ji,jj) = zztmp   ;   zhth    (ji,jj) = zzdep                ! max and depth of dT/dz 
    130168                 ENDIF 
    131169 
    132                  IF( nla10 > 1 ) THEN 
     170                 IF( nla10 > 1 ) THEN  
    133171                    zztmp = rhop(ji,jj,jk) - rhop(ji,jj,1)                             ! delta rho(1) 
    134172                    IF( zztmp > zrho3 )          zrho0_3(ji,jj) = zzdep                ! > 0.03 
     
    141179 
    142180        IF (iom_use("mlddzt")) CALL iom_put( "mlddzt", zhth*tmask(:,:,1) )            ! depth of the thermocline 
    143         IF( nla10 > 1 ) THEN 
     181        IF( nla10 > 1 ) THEN  
    144182           IF (iom_use("mldr0_3")) CALL iom_put( "mldr0_3", zrho0_3*tmask(:,:,1) )   ! MLD delta rho(surf) = 0.03 
    145183           IF (iom_use("mldr0_1")) CALL iom_put( "mldr0_1", zrho0_1*tmask(:,:,1) )   ! MLD delta rho(surf) = 0.01 
     
    147185     ENDIF 
    148186 
    149      IF (iom_use("mld_dt02") .OR. iom_use("topthdep") .OR. iom_use("mldr10_3") .OR.  & 
    150           & iom_use("pycndep") .OR. iom_use("tinv") .OR. iom_use("depti")) THEN 
    151         DO jj = 1, jpj 
    152            DO ji = 1, jpi 
    153               zztmp = gdepw_n(ji,jj,mbkt(ji,jj)+1) 
    154               zabs2   (ji,jj) = zztmp 
    155               ztm2    (ji,jj) = zztmp 
    156               zrho10_3(ji,jj) = zztmp 
    157               zpycn   (ji,jj) = zztmp 
    158            END DO 
    159         END DO 
    160         ztinv  (:,:) = 0._wp 
    161         zdepinv(:,:) = 0._wp 
    162  
     187     IF (iom_use("mld_dt02").OR.iom_use("topthdep").OR.iom_use("mldr10_3").OR. & 
     188          & iom_use("pycndep").OR.iom_use("tinv").OR.iom_use("depti")) THEN 
    163189        IF (iom_use("pycndep")) THEN 
    164190           ! Preliminary computation 
     
    181207              END DO 
    182208           END DO 
    183         ELSE 
    184            zdelr(:,:) = 0._wp 
    185209        ENDIF 
    186210 
     
    219243        IF (iom_use("mldr10_3")) CALL iom_put( "mldr10_3", zrho10_3*tmask(:,:,1)     )   ! MLD delta rho(10m) = 0.03 
    220244        IF (iom_use("pycndep")) CALL iom_put( "pycndep" , zpycn*tmask(:,:,1)        )   ! MLD delta rho equi. delta T(10m) = 0.2 
    221         IF (iom_use("tinv")) CALL iom_put( "tinv"    , ztinv*tmask(:,:,1)        )   ! max. temp. inv. (t10 ref) 
    222         IF (iom_use("depti")) CALL iom_put( "depti"   , zdepinv*tmask(:,:,1)      )   ! depth of max. temp. inv. (t10 ref) 
    223      ENDIF 
    224  
    225      IF(iom_use("20d") .OR. iom_use("28d")) THEN 
     245        IF (iom_use("tinv")) CALL iom_put( "tinv"    , ztinv*tmask(:,:,1)        )   ! max. temp. inv. (t10 ref)  
     246        IF (iom_use("depti")) CALL iom_put( "depti"   , zdepinv*tmask(:,:,1)      )   ! depth of max. temp. inv. (t10 ref)  
     247     ENDIF 
     248 
     249     IF(iom_use("20d").OR.iom_use("28d")) THEN 
    226250        ! ----------------------------------- ! 
    227251        ! search deepest level above 20C/28C  ! 
     
    248272              ! 
    249273              iid = ik20(ji,jj) 
    250               IF( iid /= 1 ) THEN 
     274              IF( iid /= 1 ) THEN  
    251275                 zztmp =      gdept_n(ji,jj,iid  )   &                     ! linear interpolation 
    252276                      &  + (    gdept_n(ji,jj,iid+1) - gdept_n(ji,jj,iid)                       )   & 
     
    254278                      &  / ( tsn(ji,jj,iid+1,jp_tem) - tsn(ji,jj,iid,jp_tem) + (1.-tmask(ji,jj,1)) ) 
    255279                 zhd20(ji,jj) = MIN( zztmp , zzdep) * tmask(ji,jj,1)       ! bound by the ocean depth 
    256               ELSE 
     280              ELSE  
    257281                 zhd20(ji,jj) = 0._wp 
    258282              ENDIF 
    259283              ! 
    260284              iid = ik28(ji,jj) 
    261               IF( iid /= 1 ) THEN 
     285              IF( iid /= 1 ) THEN  
    262286                 zztmp =      gdept_n(ji,jj,iid  )   &                     ! linear interpolation 
    263287                      &  + (    gdept_n(ji,jj,iid+1) - gdept_n(ji,jj,iid)                       )   & 
     
    265289                      &  / (  tsn(ji,jj,iid+1,jp_tem) -    tsn(ji,jj,iid,jp_tem) + (1.-tmask(ji,jj,1)) ) 
    266290                 zhd28(ji,jj) = MIN( zztmp , zzdep ) * tmask(ji,jj,1)      ! bound by the ocean depth 
    267               ELSE 
     291              ELSE  
    268292                 zhd28(ji,jj) = 0._wp 
    269293              ENDIF 
     
    282306        ilevel   = 0 
    283307        zthick_0 = 0._wp 
    284         DO jk = 1, jpkm1 
     308        DO jk = 1, jpkm1                       
    285309           zthick_0 = zthick_0 + e3t_1d(jk) 
    286310           IF( zthick_0 < 300. )   ilevel = jk 
    287311        END DO 
    288312        ! surface boundary condition 
    289         IF( ln_linssh ) THEN   ;   zthick(:,:) = sshn(:,:)   ;   zhtc3(:,:) = tsn(:,:,1,jp_tem) * sshn(:,:) * tmask(:,:,1) 
    290         ELSE                   ;   zthick(:,:) = 0._wp       ;   zhtc3(:,:) = 0._wp 
     313        IF( ln_linssh ) THEN   ;   zthick(:,:) = sshn(:,:)   ;   zhtc3(:,:) = tsn(:,:,1,jp_tem) * sshn(:,:) * tmask(:,:,1)   
     314        ELSE                   ;   zthick(:,:) = 0._wp       ;   zhtc3(:,:) = 0._wp                                    
    291315        ENDIF 
    292316        ! integration down to ilevel 
     
    309333     ENDIF 
    310334     ! 
     335      IF( ln_timing )   CALL timing_stop('dia_hth') 
     336     ! 
    311337   END SUBROUTINE dia_hth 
    312338 
    313  
    314    SUBROUTINE dia_hth_init 
    315       !!--------------------------------------------------------------------------- 
    316       !!                  ***  ROUTINE dia_hth_init  *** 
    317       !! 
    318       !! ** Purpose: Initialization for ML and thermocline depths 
    319       !! 
    320       !! ** Action : If any upper ocean diagnostic required by xml file, set in dia_hth 
    321       !!--------------------------------------------------------------------------- 
    322        ! 
    323       IF(lwp) THEN 
    324          WRITE(numout,*) 
    325          WRITE(numout,*) 'dia_hth_init : heat and salt budgets diagnostics' 
    326          WRITE(numout,*) '~~~~~~~~~~~~ ' 
    327       ENDIF 
    328       ll_diahth = iom_use("mlddzt") .OR. iom_use("mldr0_3") .OR. iom_use("mldr0_1") .OR.  & 
    329            & iom_use("mld_dt02") .OR. iom_use("topthdep") .OR. iom_use("mldr10_3") .OR.  & 
    330            & iom_use("pycndep") .OR. iom_use("tinv") .OR. iom_use("depti").OR. & 
    331            & iom_use("20d") .OR. iom_use("28d") .OR. iom_use("hc300") 
    332       IF(lwp) THEN 
    333          WRITE(numout,*) '   output upper ocean diagnostics (T) or not (F)       ll_diahth = ', ll_diahth 
    334       ENDIF 
    335       ! 
    336    END SUBROUTINE dia_hth_init 
     339#else 
     340   !!---------------------------------------------------------------------- 
     341   !!   Default option :                                       Empty module 
     342   !!---------------------------------------------------------------------- 
     343   LOGICAL , PUBLIC, PARAMETER ::   lk_diahth = .FALSE.  !: thermocline-20d depths flag 
     344CONTAINS 
     345   SUBROUTINE dia_hth( kt )         ! Empty routine 
     346      IMPLICIT NONE 
     347      INTEGER, INTENT( in ) :: kt 
     348      WRITE(*,*) 'dia_hth: You should not have seen this print! error?', kt 
     349   END SUBROUTINE dia_hth 
     350#endif 
     351 
     352   !!====================================================================== 
    337353END MODULE diahth 
  • NEMO/releases/release-4.0/src/OCE/nemogcm.F90

    r11091 r11098  
    485485      IF( lk_diadct    )   CALL dia_dct_init    ! Sections tranports 
    486486                           CALL dia_hsb_init    ! heat content, salt content and volume budgets 
    487                            CALL dia_hth_init    ! extra ML depth diagnostics, thermocline depths 
    488487                           CALL     trd_init    ! Mixed-layer/Vorticity/Integral constraints trends 
    489488                           CALL dia_obs_init    ! Initialize observational data 
  • NEMO/releases/release-4.0/src/OCE/step.F90

    r11096 r11098  
    212212      ! diagnostics and outputs 
    213213      !<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<< 
    214       IF( lk_floats  )   CALL flo_stp( kstp )         ! drifting Floats 
    215       IF( ln_diacfl  )   CALL dia_cfl( kstp )         ! Courant number diagnostics 
    216       IF( ll_diahth  )   CALL dia_hth( kstp )         ! Thermocline depth (20 degres isotherm depth) 
    217       IF( lk_diadct  )   CALL dia_dct( kstp )         ! Transports 
    218                          CALL dia_ar5( kstp )         ! ar5 diag 
     214      IF( lk_floats  )   CALL flo_stp ( kstp )        ! drifting Floats 
     215      IF( ln_diacfl  )   CALL dia_cfl ( kstp )        ! Courant number diagnostics 
     216      IF( lk_diahth  )   CALL dia_hth ( kstp )        ! Thermocline depth (20 degres isotherm depth) 
     217      IF( lk_diadct  )   CALL dia_dct ( kstp )        ! Transports 
     218                         CALL dia_ar5 ( kstp )        ! ar5 diag 
    219219      IF( lk_diaharm )   CALL dia_harm( kstp )        ! Tidal harmonic analysis 
    220220                         CALL dia_wri ( kstp )        ! ocean model: outputs 
Note: See TracChangeset for help on using the changeset viewer.