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 12406 for NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests – NEMO

Ignore:
Timestamp:
2020-02-19T10:22:15+01:00 (4 years ago)
Author:
davestorkey
Message:
  1. Rename the namelist timestep parameter: rn_rdt -> rn_Dt
  2. Use the namelist parameter instead of the non-DOCTOR parameter: rdt -> rn_Dt

This version has same SETTE results as the last version. Passes all tests but some
tests don't bit compare with the trunk.

Location:
NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests
Files:
47 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/BENCH/EXPREF/namelist_cfg_orca025_like

    r11536 r12406  
    3636&namdom        !   time and space domain 
    3737!----------------------------------------------------------------------- 
    38    rn_rdt      =    900.   !  time step for the dynamics (and tracer if nn_acc=0) 
     38   rn_Dt      =    900.   !  time step for the dynamics (and tracer if nn_acc=0) 
    3939   rn_atfp     =   0.05    !  asselin time filter parameter 
    4040/ 
     
    189189   ln_dynspg_ts   = .true.   ! split-explicit free surface 
    190190      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    191          nn_baro      =  30         ! =F : the number of sub-step in rn_rdt seconds 
     191         nn_baro      =  30         ! =F : the number of sub-step in rn_Dt seconds 
    192192/ 
    193193!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/BENCH/EXPREF/namelist_cfg_orca12_like

    r11536 r12406  
    3636&namdom        !   time and space domain 
    3737!----------------------------------------------------------------------- 
    38    rn_rdt      =    300.   !  time step for the dynamics (and tracer if nn_acc=0) 
     38   rn_Dt      =    300.   !  time step for the dynamics (and tracer if nn_acc=0) 
    3939   rn_atfp     =   0.05    !  asselin time filter parameter 
    4040/ 
     
    188188   ln_dynspg_ts   = .true.   ! split-explicit free surface 
    189189      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    190          nn_baro      =  30         ! =F : the number of sub-step in rn_rdt seconds 
     190         nn_baro      =  30         ! =F : the number of sub-step in rn_Dt seconds 
    191191/ 
    192192!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/BENCH/EXPREF/namelist_cfg_orca1_like

    r11536 r12406  
    3636&namdom        !   time and space domain 
    3737!----------------------------------------------------------------------- 
    38    rn_rdt      =   3600.   !  time step for the dynamics (and tracer if nn_acc=0) 
     38   rn_Dt      =   3600.   !  time step for the dynamics (and tracer if nn_acc=0) 
    3939   rn_atfp     =   0.05    !  asselin time filter parameter 
    4040/ 
     
    188188   ln_dynspg_ts   = .true.   ! split-explicit free surface 
    189189      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    190          nn_baro      =  30         ! =F : the number of sub-step in rn_rdt seconds 
     190         nn_baro      =  30         ! =F : the number of sub-step in rn_Dt seconds 
    191191/ 
    192192!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/CANAL/EXPREF/namelist_cfg

    r12377 r12406  
    5959!----------------------------------------------------------------------- 
    6060   ln_linssh   =  .false.  !  =T  linear free surface  ==>>  model level are fixed in time 
    61    rn_rdt      =   1440.   !  time step for the dynamics (and tracer if nn_acc=0) 
     61   rn_Dt      =   1440.   !  time step for the dynamics (and tracer if nn_acc=0) 
    6262   rn_atfp     =   0.05    !  asselin time filter parameter 
    6363/ 
     
    211211         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    212212      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    213          nn_baro      =  24         ! =F : the number of sub-step in rn_rdt seconds 
     213         nn_baro      =  24         ! =F : the number of sub-step in rn_Dt seconds 
    214214/ 
    215215!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/CANAL/MY_SRC/diawri.F90

    r12377 r12406  
    563563      clop = "x"         ! no use of the mask value (require less cpu time and otherwise the model crashes) 
    564564#if defined key_diainstant 
    565       zsto = nn_write * rdt 
     565      zsto = nn_write * rn_Dt 
    566566      clop = "inst("//TRIM(clop)//")" 
    567567#else 
    568       zsto=rdt 
     568      zsto=rn_Dt 
    569569      clop = "ave("//TRIM(clop)//")" 
    570570#endif 
    571       zout = nn_write * rdt 
    572       zmax = ( nitend - nit000 + 1 ) * rdt 
     571      zout = nn_write * rn_Dt 
     572      zmax = ( nitend - nit000 + 1 ) * rn_Dt 
    573573 
    574574      ! Define indices of the horizontal output zoom and vertical limit storage 
     
    590590 
    591591         ! Compute julian date from starting date of the run 
    592          CALL ymds2ju( nyear, nmonth, nday, rdt, zjulian ) 
     592         CALL ymds2ju( nyear, nmonth, nday, rn_Dt, zjulian ) 
    593593         zjulian = zjulian - adatrj   !   set calendar origin to the beginning of the experiment 
    594594         IF(lwp)WRITE(numout,*) 
     
    612612         CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit 
    613613            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    614             &          nit000-1, zjulian, rdt, nh_T, nid_T, domain_id=nidom, snc4chunks=snc4set ) 
     614            &          nit000-1, zjulian, rn_Dt, nh_T, nid_T, domain_id=nidom, snc4chunks=snc4set ) 
    615615         CALL histvert( nid_T, "deptht", "Vertical T levels",      &  ! Vertical grid: gdept 
    616616            &           "m", ipk, gdept_1d, nz_T, "down" ) 
     
    648648         CALL histbeg( clhstnam, jpi, glamu, jpj, gphiu,           &  ! Horizontal grid: glamu and gphiu 
    649649            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    650             &          nit000-1, zjulian, rdt, nh_U, nid_U, domain_id=nidom, snc4chunks=snc4set ) 
     650            &          nit000-1, zjulian, rn_Dt, nh_U, nid_U, domain_id=nidom, snc4chunks=snc4set ) 
    651651         CALL histvert( nid_U, "depthu", "Vertical U levels",      &  ! Vertical grid: gdept 
    652652            &           "m", ipk, gdept_1d, nz_U, "down" ) 
     
    661661         CALL histbeg( clhstnam, jpi, glamv, jpj, gphiv,           &  ! Horizontal grid: glamv and gphiv 
    662662            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    663             &          nit000-1, zjulian, rdt, nh_V, nid_V, domain_id=nidom, snc4chunks=snc4set ) 
     663            &          nit000-1, zjulian, rn_Dt, nh_V, nid_V, domain_id=nidom, snc4chunks=snc4set ) 
    664664         CALL histvert( nid_V, "depthv", "Vertical V levels",      &  ! Vertical grid : gdept 
    665665            &          "m", ipk, gdept_1d, nz_V, "down" ) 
     
    674674         CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit 
    675675            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    676             &          nit000-1, zjulian, rdt, nh_W, nid_W, domain_id=nidom, snc4chunks=snc4set ) 
     676            &          nit000-1, zjulian, rn_Dt, nh_W, nid_W, domain_id=nidom, snc4chunks=snc4set ) 
    677677         CALL histvert( nid_W, "depthw", "Vertical W levels",      &  ! Vertical grid: gdepw 
    678678            &          "m", ipk, gdepw_1d, nz_W, "down" ) 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/CANAL/MY_SRC/domvvl.F90

    r12397 r12406  
    209209         IF( ln_vvl_ztilde_as_zstar ) THEN   ! z-star emulation using z-tile 
    210210            frq_rst_e3t(:,:) = 0._wp               !Ignore namelist settings 
    211             frq_rst_hdv(:,:) = 1._wp / rdt 
     211            frq_rst_hdv(:,:) = 1._wp / rn_Dt 
    212212         ENDIF 
    213213         IF ( ln_vvl_zstar_at_eqtor ) THEN   ! use z-star in vicinity of the Equator 
     
    222222                     ! values inside the equatorial band (ztilde as zstar) 
    223223                     frq_rst_e3t(ji,jj) =  0.0_wp 
    224                      frq_rst_hdv(ji,jj) =  1.0_wp / rdt 
     224                     frq_rst_hdv(ji,jj) =  1.0_wp / rn_Dt 
    225225                  ELSE                                      ! transition band (2.5 to 6 degrees N/S) 
    226226                     !                                      ! (linearly transition from z-tilde to z-star) 
     
    228228                        &            * (  1.0_wp - COS( rad*(ABS(gphit(ji,jj))-2.5_wp)  & 
    229229                        &                                          * 180._wp / 3.5_wp ) ) 
    230                      frq_rst_hdv(ji,jj) = (1.0_wp / rdt)                                & 
    231                         &            + (  frq_rst_hdv(ji,jj)-(1.e0_wp / rdt) )*0.5_wp   & 
     230                     frq_rst_hdv(ji,jj) = (1.0_wp / rn_Dt)                                & 
     231                        &            + (  frq_rst_hdv(ji,jj)-(1.e0_wp / rn_Dt) )*0.5_wp   & 
    232232                        &            * (  1._wp  - COS( rad*(ABS(gphit(ji,jj))-2.5_wp)  & 
    233233                        &                                          * 180._wp / 3.5_wp ) ) 
     
    240240                  ij0 = 128   ;   ij1 = 135   ;    
    241241                  frq_rst_e3t( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  0.0_wp 
    242                   frq_rst_hdv( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  1.e0_wp / rdt 
     242                  frq_rst_hdv( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  1.e0_wp / rn_Dt 
    243243               ENDIF 
    244244            ENDIF 
     
    349349            IF( kt > nit000 ) THEN 
    350350               DO jk = 1, jpkm1 
    351                   hdiv_lf(:,:,jk) = hdiv_lf(:,:,jk) - rdt * frq_rst_hdv(:,:)   & 
     351                  hdiv_lf(:,:,jk) = hdiv_lf(:,:,jk) - rn_Dt * frq_rst_hdv(:,:)   & 
    352352                     &          * ( hdiv_lf(:,:,jk) - e3t(:,:,jk,Kmm) * ( hdiv(:,:,jk) - zhdiv(:,:) ) ) 
    353353               END DO 
     
    10101010            WRITE(numout,*) '                         rn_rst_e3t     = 0.e0' 
    10111011            WRITE(numout,*) '            hard-wired : z-tilde cutoff frequency of low-pass filter (days)' 
    1012             WRITE(numout,*) '                         rn_lf_cutoff   = 1.0/rdt' 
     1012            WRITE(numout,*) '                         rn_lf_cutoff   = 1.0/rn_Dt' 
    10131013         ELSE 
    10141014            WRITE(numout,*) '      z-tilde to zstar restoration timescale (days)        rn_rst_e3t   = ', rn_rst_e3t 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/CANAL/MY_SRC/sbcmod.F90

    r12377 r12406  
    186186      ! 
    187187      IF( .NOT.ln_usr ) THEN     ! the model calendar needs some specificities (except in user defined case) 
    188          IF( MOD( rday , rdt ) /= 0. )   CALL ctl_stop( 'the time step must devide the number of second of in a day' ) 
    189          IF( MOD( rday , 2.  ) /= 0. )   CALL ctl_stop( 'the number of second of in a day must be an even number'    ) 
    190          IF( MOD( rdt  , 2.  ) /= 0. )   CALL ctl_stop( 'the time step (in second) must be an even number'           ) 
     188         IF( MOD( rday , rn_Dt ) /= 0. )   CALL ctl_stop( 'the time step must devide the number of second of in a day' ) 
     189         IF( MOD( rday , 2.    ) /= 0. )   CALL ctl_stop( 'the number of second of in a day must be an even number'    ) 
     190         IF( MOD( rn_Dt, 2.    ) /= 0. )   CALL ctl_stop( 'the time step (in second) must be an even number'           ) 
    191191      ENDIF 
    192192      !                       !**  check option consistency 
     
    298298      !     SAS time-step has to be declared in OASIS (mandatory) -> nn_fsbc has to be modified accordingly 
    299299      IF( nn_components /= jp_iam_nemo ) THEN 
    300          IF( nn_components == jp_iam_opa )   nn_fsbc = cpl_freq('O_SFLX') / NINT(rdt) 
    301          IF( nn_components == jp_iam_sas )   nn_fsbc = cpl_freq('I_SFLX') / NINT(rdt) 
     300         IF( nn_components == jp_iam_opa )   nn_fsbc = cpl_freq('O_SFLX') / NINT(rn_Dt) 
     301         IF( nn_components == jp_iam_sas )   nn_fsbc = cpl_freq('I_SFLX') / NINT(rn_Dt) 
    302302         ! 
    303303         IF(lwp)THEN 
     
    316316      ENDIF 
    317317      ! 
    318       IF( MOD( rday, REAL(nn_fsbc, wp) * rdt ) /= 0 )   & 
     318      IF( MOD( rday, REAL(nn_fsbc, wp) * rn_Dt ) /= 0 )   & 
    319319         &  CALL ctl_warn( 'sbc_init : nn_fsbc is NOT a multiple of the number of time steps in a day' ) 
    320320      ! 
    321       IF( ln_dm2dc .AND. NINT(rday) / ( nn_fsbc * NINT(rdt) ) < 8  )   & 
     321      IF( ln_dm2dc .AND. NINT(rday) / ( nn_fsbc * NINT(rn_Dt) ) < 8  )   & 
    322322         &   CALL ctl_warn( 'sbc_init : diurnal cycle for qsr: the sampling of the diurnal cycle is too small...' ) 
    323323      ! 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/CANAL/MY_SRC/trazdf.F90

    r12377 r12406  
    6464      ENDIF 
    6565      ! 
    66       IF( neuler == 0 .AND. kt == nit000 ) THEN   ;   r2dt =      rdt   ! at nit000, =   rdt (restarting with Euler time stepping) 
    67       ELSEIF( kt <= nit000 + 1           ) THEN   ;   r2dt = 2. * rdt   ! otherwise, = 2 rdt (leapfrog) 
    68       ENDIF 
    69       ! 
    7066      IF( l_trdtra )   THEN                  !* Save ta and sa trends 
    7167         ALLOCATE( ztrdt(jpi,jpj,jpk) , ztrds(jpi,jpj,jpk) ) 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_ADV1D/EXPREF/namelist_cfg

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_ADV1D/EXPREF/namelist_cfg_120pts

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_ADV1D/EXPREF/namelist_cfg_240pts

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_ADV1D/EXPREF/namelist_cfg_60pts

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      =   2.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_ADV2D/EXPREF/namelist_cfg

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      = 1200.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      = 1200.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_AGRIF/EXPREF/1_namelist_cfg

    r12377 r12406  
    3939   ln_linssh   = .true.   !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      = 400.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      = 400.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ICE_AGRIF/EXPREF/namelist_cfg

    r12377 r12406  
    3939   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
    4040   ! 
    41    rn_rdt      = 1200.     !  time step for the dynamics (and tracer if nn_acc=0) 
     41   rn_Dt      = 1200.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4242   ! 
    4343   ln_meshmask = .true.   !  =T  create a mesh file 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ISOMIP+/EXPREF/namelist_cfg

    r12077 r12406  
    4444&namdom        !   time and space domain 
    4545!----------------------------------------------------------------------- 
    46 rn_rdt = 720. 
     46rn_Dt = 720. 
    4747/ 
    4848!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ISOMIP+/MY_SRC/sbcfwb.F90

    r12353 r12406  
    151151         ENDIF    
    152152         !                                         ! Update fwfold if new year start 
    153          ikty = 365 * 86400 / rdt                  !!bug  use of 365 days leap year or 360d year !!!!!!! 
     153         ikty = 365 * 86400 / rn_Dt               !!bug  use of 365 days leap year or 360d year !!!!!!! 
    154154         IF( MOD( kt, ikty ) == 0 ) THEN 
    155155            a_fwb_b = a_fwb                           ! mean sea level taking into account the ice+snow 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/ISOMIP/EXPREF/namelist_cfg

    r12377 r12406  
    4444!----------------------------------------------------------------------- 
    4545   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    46    rn_rdt      = 1800.     !  time step for the dynamics (and tracer if nn_acc=0) 
     46   rn_Dt      = 1800.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4747/ 
    4848!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_flux_cen2_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_flux_ubs_cfg

    r12377 r12406  
    4747   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    4848   ! 
    49    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     49   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    5050   rn_atfp     =    0.1    !  asselin time filter parameter 
    5151   ! 
     
    219219         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    220220      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    221          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     221         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    222222/ 
    223223!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_vect_eenH_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_vect_een_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_vect_ene_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT2_vect_ens_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_flux_cen2_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_flux_ubs_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_vect_eenH_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_vect_een_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_vect_ene_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/LOCK_EXCHANGE/EXPREF/namelist_FCT4_vect_ens_cfg

    r12377 r12406  
    3333   ln_linssh   = .false.   !  =T  linear free surface  ==>>  model level are fixed in time 
    3434   ! 
    35    rn_rdt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =    1.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737   ! 
     
    147147         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    148148      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    149          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     149         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    150150/ 
    151151!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_sco_FCT2_flux_cen-ahm1000_cfg

    r11848 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_sco_FCT2_flux_ubs_cfg

    r11848 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_sco_FCT4_flux_cen-ahm1000_cfg

    r10075 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_sco_FCT4_flux_ubs_cfg

    r11848 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_zps_FCT2_flux_ubs_cfg

    r11848 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_zps_FCT4_flux_ubs_cfg

    r12377 r12406  
    4646&namdom        !   time and space domain 
    4747!----------------------------------------------------------------------- 
    48    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     48   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    4949   rn_atfp     =    0.1    !  asselin time filter parameter 
    5050/ 
     
    219219         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    220220      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    221          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     221         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    222222/ 
    223223!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/OVERFLOW/EXPREF/namelist_zps_FCT4_vect_een_cfg

    r11848 r12406  
    3333&namdom        !   space and time domain (bathymetry, mesh, timestep) 
    3434!----------------------------------------------------------------------- 
    35    rn_rdt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
     35   rn_Dt      =   10.     !  time step for the dynamics (and tracer if nn_acc=0) 
    3636   rn_atfp     =    0.1    !  asselin time filter parameter 
    3737/ 
     
    158158         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    159159      ln_bt_auto    = .true.     ! Number of sub-step defined from: 
    160          nn_baro      =  1         ! =F : the number of sub-step in rn_rdt seconds 
     160         nn_baro      =  1         ! =F : the number of sub-step in rn_Dt seconds 
    161161/ 
    162162!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/EXPREF/namelist_coare3p6-noskin_cfg

    r12249 r12406  
    5757&namdom        !   time and space domain / STATION_ASF 
    5858!----------------------------------------------------------------------- 
    59    rn_rdt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
     59   rn_Dt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
    6060   ln_meshmask = .false. 
    6161   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/EXPREF/namelist_coare3p6_cfg

    r12249 r12406  
    5757&namdom        !   time and space domain / STATION_ASF 
    5858!----------------------------------------------------------------------- 
    59    rn_rdt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
     59   rn_Dt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
    6060   ln_meshmask = .false. 
    6161   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/EXPREF/namelist_ecmwf-noskin_cfg

    r12249 r12406  
    5757&namdom        !   time and space domain / STATION_ASF 
    5858!----------------------------------------------------------------------- 
    59    rn_rdt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
     59   rn_Dt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
    6060   ln_meshmask = .false. 
    6161   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/EXPREF/namelist_ecmwf_cfg

    r12249 r12406  
    5757&namdom        !   time and space domain / STATION_ASF 
    5858!----------------------------------------------------------------------- 
    59    rn_rdt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
     59   rn_Dt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
    6060   ln_meshmask = .false. 
    6161   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/EXPREF/namelist_ncar_cfg

    r12249 r12406  
    5757&namdom        !   time and space domain / STATION_ASF 
    5858!----------------------------------------------------------------------- 
    59    rn_rdt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
     59   rn_Dt      =  3600.    !  time step for the dynamics and tracer => frequency of atmospheric forcing 
    6060   ln_meshmask = .false. 
    6161   ln_linssh   = .true.    !  =T  linear free surface  ==>>  model level are fixed in time 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/STATION_ASF/MY_SRC/diawri.F90

    r12353 r12406  
    168168      clop = "x"         ! no use of the mask value (require less cpu time and otherwise the model crashes) 
    169169#if defined key_diainstant 
    170       zsto = nn_write * rdt 
     170      zsto = nn_write * rn_Dt 
    171171      clop = "inst("//TRIM(clop)//")" 
    172172#else 
    173       zsto=rdt 
     173      zsto=rn_Dt 
    174174      clop = "ave("//TRIM(clop)//")" 
    175175#endif 
    176       zout = nn_write * rdt 
    177       zmax = ( nitend - nit000 + 1 ) * rdt 
     176      zout = nn_write * rn_Dt 
     177      zmax = ( nitend - nit000 + 1 ) * rn_Dt 
    178178 
    179179      ! Define indices of the horizontal output zoom and vertical limit storage 
     
    195195 
    196196         ! Compute julian date from starting date of the run 
    197          CALL ymds2ju( nyear, nmonth, nday, rdt, zjulian ) 
     197         CALL ymds2ju( nyear, nmonth, nday, rn_Dt, zjulian ) 
    198198         zjulian = zjulian - adatrj   !   set calendar origin to the beginning of the experiment 
    199199         IF(lwp)WRITE(numout,*) 
     
    217217         CALL histbeg( clhstnam, jpi, glamt, jpj, gphit,           &  ! Horizontal grid: glamt and gphit 
    218218            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    219             &          nit000-1, zjulian, rdt, nh_T, nid_T, domain_id=nidom, snc4chunks=snc4set ) 
     219            &          nit000-1, zjulian, rn_Dt, nh_T, nid_T, domain_id=nidom, snc4chunks=snc4set ) 
    220220         CALL histvert( nid_T, "deptht", "Vertical T levels",      &  ! Vertical grid: gdept 
    221221            &           "m", ipk, gdept_1d, nz_T, "down" ) 
     
    229229         CALL histbeg( clhstnam, jpi, glamu, jpj, gphiu,           &  ! Horizontal grid: glamu and gphiu 
    230230            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    231             &          nit000-1, zjulian, rdt, nh_U, nid_U, domain_id=nidom, snc4chunks=snc4set ) 
     231            &          nit000-1, zjulian, rn_Dt, nh_U, nid_U, domain_id=nidom, snc4chunks=snc4set ) 
    232232         CALL histvert( nid_U, "depthu", "Vertical U levels",      &  ! Vertical grid: gdept 
    233233            &           "m", ipk, gdept_1d, nz_U, "down" ) 
     
    241241         CALL histbeg( clhstnam, jpi, glamv, jpj, gphiv,           &  ! Horizontal grid: glamv and gphiv 
    242242            &          iimi, iima-iimi+1, ijmi, ijma-ijmi+1,       & 
    243             &          nit000-1, zjulian, rdt, nh_V, nid_V, domain_id=nidom, snc4chunks=snc4set ) 
     243            &          nit000-1, zjulian, rn_Dt, nh_V, nid_V, domain_id=nidom, snc4chunks=snc4set ) 
    244244         CALL histvert( nid_V, "depthv", "Vertical V levels",      &  ! Vertical grid : gdept 
    245245            &          "m", ipk, gdept_1d, nz_V, "down" ) 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/VORTEX/EXPREF/1_namelist_cfg

    r12377 r12406  
    4040!----------------------------------------------------------------------- 
    4141   ln_linssh   =  .false.  !  =T  linear free surface  ==>>  model level are fixed in time 
    42    rn_rdt      =    480.   !  time step for the dynamics (and tracer if nn_acc=0) 
     42   rn_Dt      =    480.   !  time step for the dynamics (and tracer if nn_acc=0) 
    4343   rn_atfp     =   0.05    !  asselin time filter parameter 
    4444/ 
     
    216216         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    217217      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    218          nn_baro      =  24         ! =F : the number of sub-step in rn_rdt seconds 
     218         nn_baro      =  24         ! =F : the number of sub-step in rn_Dt seconds 
    219219/ 
    220220!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/VORTEX/EXPREF/namelist_cfg

    r12377 r12406  
    4040!----------------------------------------------------------------------- 
    4141   ln_linssh   =  .false.  !  =T  linear free surface  ==>>  model level are fixed in time 
    42    rn_rdt      =   1440.   !  time step for the dynamics (and tracer if nn_acc=0) 
     42   rn_Dt      =   1440.   !  time step for the dynamics (and tracer if nn_acc=0) 
    4343   rn_atfp     =   0.05    !  asselin time filter parameter 
    4444/ 
     
    207207         !                          !                     = 2 Boxcar over 2*nn_baro  "    " 
    208208      ln_bt_auto    = .false.    ! Number of sub-step defined from: 
    209          nn_baro      =  24         ! =F : the number of sub-step in rn_rdt seconds 
     209         nn_baro      =  24         ! =F : the number of sub-step in rn_Dt seconds 
    210210/ 
    211211!----------------------------------------------------------------------- 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/VORTEX/MY_SRC/domvvl.F90

    r12397 r12406  
    237237         IF( ln_vvl_ztilde_as_zstar ) THEN   ! z-star emulation using z-tile 
    238238            frq_rst_e3t(:,:) = 0._wp               !Ignore namelist settings 
    239             frq_rst_hdv(:,:) = 1._wp / rdt 
     239            frq_rst_hdv(:,:) = 1._wp / rn_Dt 
    240240         ENDIF 
    241241         IF ( ln_vvl_zstar_at_eqtor ) THEN   ! use z-star in vicinity of the Equator 
     
    250250                     ! values inside the equatorial band (ztilde as zstar) 
    251251                     frq_rst_e3t(ji,jj) =  0.0_wp 
    252                      frq_rst_hdv(ji,jj) =  1.0_wp / rdt 
     252                     frq_rst_hdv(ji,jj) =  1.0_wp / rn_Dt 
    253253                  ELSE                                      ! transition band (2.5 to 6 degrees N/S) 
    254254                     !                                      ! (linearly transition from z-tilde to z-star) 
     
    256256                        &            * (  1.0_wp - COS( rad*(ABS(gphit(ji,jj))-2.5_wp)  & 
    257257                        &                                          * 180._wp / 3.5_wp ) ) 
    258                      frq_rst_hdv(ji,jj) = (1.0_wp / rdt)                                & 
    259                         &            + (  frq_rst_hdv(ji,jj)-(1.e0_wp / rdt) )*0.5_wp   & 
     258                     frq_rst_hdv(ji,jj) = (1.0_wp / rn_Dt)                                & 
     259                        &            + (  frq_rst_hdv(ji,jj)-(1.e0_wp / rn_Dt) )*0.5_wp   & 
    260260                        &            * (  1._wp  - COS( rad*(ABS(gphit(ji,jj))-2.5_wp)  & 
    261261                        &                                          * 180._wp / 3.5_wp ) ) 
     
    268268                  ij0 = 128   ;   ij1 = 135   ;    
    269269                  frq_rst_e3t( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  0.0_wp 
    270                   frq_rst_hdv( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  1.e0_wp / rdt 
     270                  frq_rst_hdv( mi0(ii0):mi1(ii1) , mj0(ij0):mj1(ij1) ) =  1.e0_wp / rn_Dt 
    271271               ENDIF 
    272272            ENDIF 
     
    377377            IF( kt > nit000 ) THEN 
    378378               DO jk = 1, jpkm1 
    379                   hdiv_lf(:,:,jk) = hdiv_lf(:,:,jk) - rdt * frq_rst_hdv(:,:)   & 
     379                  hdiv_lf(:,:,jk) = hdiv_lf(:,:,jk) - rn_Dt * frq_rst_hdv(:,:)   & 
    380380                     &          * ( hdiv_lf(:,:,jk) - e3t(:,:,jk,Kmm) * ( hdiv(:,:,jk) - zhdiv(:,:) ) ) 
    381381               END DO 
     
    10341034            WRITE(numout,*) '                         rn_rst_e3t     = 0.e0' 
    10351035            WRITE(numout,*) '            hard-wired : z-tilde cutoff frequency of low-pass filter (days)' 
    1036             WRITE(numout,*) '                         rn_lf_cutoff   = 1.0/rdt' 
     1036            WRITE(numout,*) '                         rn_lf_cutoff   = 1.0/rn_Dt' 
    10371037         ELSE 
    10381038            WRITE(numout,*) '      z-tilde to zstar restoration timescale (days)        rn_rst_e3t   = ', rn_rst_e3t 
  • NEMO/branches/2020/KERNEL-03_Storkey_Coward_RK3_stage2/tests/WAD/EXPREF/namelist_cfg

    r12377 r12406  
    4343   ! 
    4444   ln_meshmask = .true.    !  create (>0) a mesh file or not (=0) 
    45    rn_rdt      =    18.    !  time step for the dynamics  
     45   rn_Dt      =    18.    !  time step for the dynamics  
    4646/ 
    4747!----------------------------------------------------------------------- 
     
    344344   ln_dynspg_ts  = .true.  !  split-explicit free surface 
    345345   ln_bt_auto    = .false. ! Number of sub-step defined from: 
    346    nn_baro       =  12     ! =F : the number of sub-step in rn_rdt seconds 
     346   nn_baro       =  12     ! =F : the number of sub-step in rn_Dt seconds 
    347347/ 
    348348!----------------------------------------------------------------------- 
Note: See TracChangeset for help on using the changeset viewer.