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 6906 – NEMO

Changeset 6906


Ignore:
Timestamp:
2016-09-02T15:06:17+02:00 (8 years ago)
Author:
flavoni
Message:

#1692 and ROBUST-3 : commit zgr and some update for LOCK EXCHANGE case

Location:
branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG
Files:
1 added
9 edited

Legend:

Unmodified
Added
Removed
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/LOCK_EXCHANGE/EXP00/namelist_cfg

    r6901 r6906  
    66!----------------------------------------------------------------------- 
    77   ln_zco      =  .true.   ! z-coordinate flag 
    8    ln_zps      = .false.   ! z-partial-step coordinate flag 
    9    ln_sco      = .false.   ! s-coordinate flag 
    108   rn_dx       =    500.   ! horizontal resolution in meters 
    119   rn_dz       =      1.   ! vertical   resolution in meters 
     
    2523&namcfg        !   parameters of the configuration 
    2624!----------------------------------------------------------------------- 
    27    ln_read_cfg = .true.   !  (=T) read the domain configuration in 'domain_cfg.nc" file 
     25   ln_read_cfg = .false.   !  (=T) read the domain configuration in 'domain_cfg.nc" file 
    2826   !                       !  (=F) user defined configuration  ==>>>  see usrdef(_...) modules 
    29    ln_write_cfg= .false.    !  (=T) create the domain configuration file 
     27   ln_write_cfg= .false.   !  (=T) create the domain configuration file 
    3028   ! 
    3129   cp_cfg      = "lock" !  name of the configuration 
     
    4947/ 
    5048!----------------------------------------------------------------------- 
    51 &namcrs        !   Grid coarsening for dynamics output and/or 
    52                !   passive tracer coarsened online simulations 
    53 !----------------------------------------------------------------------- 
    54 / 
    55 !----------------------------------------------------------------------- 
    5649&namtsd    !   data : Temperature  & Salinity 
    5750!----------------------------------------------------------------------- 
    58 !          !  file name            ! frequency (hours) ! variable  ! time interp. !  clim  ! 'yearly'/ ! weights  ! rotation ! land/sea mask ! 
    59 !          !                       !  (if <0  months)  !   name    !   (logical)  !  (T/F) ! 'monthly' ! filename ! pairing  ! filename      ! 
    60    sn_tem  = 'output.init_0000'    ,          1        ,'votemper' ,    .true.    , .true. , 'yearly'   , ''       ,   ''    ,    '' 
    61    sn_sal  = 'output.init_0000'    ,          1        ,'vosaline' ,    .true.    , .true. , 'yearly'   , ''       ,   ''    ,    '' 
    62    ! 
    63    cn_dir        = './'     !  root directory for the location of the runoff files 
    64    ln_tsd_init   = .true.   !  Initialisation of ocean T & S with T &S input data (T) or not (F) 
     51   ln_tsd_init   = .false.   !  Initialisation of ocean T & S with T &S input data (T) or not (F) 
    6552   ln_tsd_tradmp = .false.   !  damping of ocean T & S toward T &S input data (T) or not (F) 
    6653/ 
     
    7865/ 
    7966!----------------------------------------------------------------------- 
    80 &namtra_qsr    !   penetrative solar radiation 
    81 !----------------------------------------------------------------------- 
    82 / 
    83 !----------------------------------------------------------------------- 
    84 &namsbc_rnf    !   runoffs namelist surface boundary condition 
    85 !----------------------------------------------------------------------- 
    86 / 
    87 !----------------------------------------------------------------------- 
    88 &namsbc_ssr    !   surface boundary condition : sea surface restoring 
    89 !----------------------------------------------------------------------- 
    90 / 
    91 !----------------------------------------------------------------------- 
    92 &namsbc_alb    !   albedo parameters 
    93 !----------------------------------------------------------------------- 
    94 / 
    95 !----------------------------------------------------------------------- 
    96 &namberg       !   iceberg parameters 
    97 !----------------------------------------------------------------------- 
    98 / 
    99 !----------------------------------------------------------------------- 
    10067&namlbc        !   lateral momentum boundary condition 
    10168!----------------------------------------------------------------------- 
    102 !   rn_shlat    =    0.     !  shlat = 0  !  0 < shlat < 2  !  shlat = 2  !  2 < shlat 
    103   rn_shlat    =    2.     !  shlat = 0  !  0 < shlat < 2  !  shlat = 2  !  2 < shlat 
     69!                         !  free slip  !   partial slip  !   no slip   ! strong slip 
     70  rn_shlat    =    0.     !  shlat = 0  !  0 < shlat < 2  !  shlat = 2  !  2 < shlat 
    10471/ 
    10572!----------------------------------------------------------------------- 
     
    11279&nambbc        !   bottom temperature boundary condition                (default: NO) 
    11380!----------------------------------------------------------------------- 
    114    ln_trabbc   = .false.    !  Apply a geothermal heating at the ocean bottom 
    11581/ 
    11682!----------------------------------------------------------------------- 
     
    12288!----------------------------------------------------------------------- 
    12389    nn_eos      =  1     !  type of equation of state and Brunt-Vaisala frequency 
    124                                  !  =-1, TEOS-10 
    125                                  !  = 0, EOS-80 
    126                                  !  = 1, S-EOS   (simplified eos) 
    127    !                            ! S-EOS coefficients (ln_seos=T): 
    128    !                            !  rd(T,S,Z)*rau0 = -a0*(1+.5*lambda*dT+mu*Z+nu*dS)*dT+b0*dS 
    129    rn_a0       =  2.e-1      !  thermal expension coefficient (nn_eos= 1) 
    130    rn_b0       =  8.e-1      !  saline  expension coefficient (nn_eos= 1) 
    131    rn_lambda1  =  0.      !  cabbeling coeff in T^2  (=0 for linear eos) 
    132    rn_lambda2  =  0.      !  cabbeling coeff in S^2  (=0 for linear eos) 
    133    rn_mu1      =  0.      !  thermobaric coeff. in T (=0 for linear eos) 
    134    rn_mu2      =  0.      !  thermobaric coeff. in S (=0 for linear eos) 
    135    rn_nu       =  0.      !  cabbeling coeff in T*S  (=0 for linear eos) 
     90                              !  =-1, TEOS-10 
     91                              !  = 0, EOS-80 
     92                              !  = 1, S-EOS   (simplified eos) 
     93   !                     ! S-EOS coefficients (nn_eos=1): 
     94   !                          !  rd(T,S,Z)*rau0 = -a0*(1+.5*lambda*dT+mu*Z+nu*dS)*dT+b0*dS 
     95   rn_a0       =  0.2         !  thermal expension coefficient (nn_eos= 1) 
     96   rn_b0       =  0.          !  saline  expension coefficient (nn_eos= 1) 
     97   rn_lambda1  =  0.          !  cabbeling coeff in T^2  (=0 for linear eos) 
     98   rn_lambda2  =  0.          !  cabbeling coeff in S^2  (=0 for linear eos) 
     99   rn_mu1      =  0.          !  thermobaric coeff. in T (=0 for linear eos) 
     100   rn_mu2      =  0.          !  thermobaric coeff. in S (=0 for linear eos) 
     101   rn_nu       =  0.          !  cabbeling coeff in T*S  (=0 for linear eos) 
    136102/ 
    137103!----------------------------------------------------------------------- 
     
    153119/ 
    154120!----------------------------------------------------------------------- 
    155 &namtra_adv_mle !  mixed layer eddy parametrisation (Fox-Kemper param) 
    156 !----------------------------------------------------------------------- 
    157   ln_mle      = .false.   ! (T) use the Mixed Layer Eddy (MLE) parameterisation 
    158 / 
    159 !---------------------------------------------------------------------------------- 
     121&namtra_adv_mle !   mixed layer eddy parametrisation (Fox-Kemper param) (default: NO) 
     122!----------------------------------------------------------------------- 
     123/ 
     124!----------------------------------------------------------------------- 
    160125&namtra_ldf    !   lateral diffusion scheme for tracers 
    161126!---------------------------------------------------------------------------------- 
     
    203168/ 
    204169!----------------------------------------------------------------------- 
    205 &namtra_dmp    !   tracer: T & S newtonian damping 
     170&namtra_ldfeiv !   eddy induced velocity param.                         (default: NO) 
     171!----------------------------------------------------------------------- 
     172/ 
     173!----------------------------------------------------------------------- 
     174&namtra_dmp    !   tracer: T & S newtonian damping                       (default: YES) 
    206175!----------------------------------------------------------------------- 
    207176   ln_tradmp   =  .false.   !  add a damping termn (T) or not (F) 
     
    220189!----------------------------------------------------------------------- 
    221190   ln_vvl_zstar  = .true.           !  zstar vertical coordinate 
    222 !----------------------------------------------------------------------- 
    223 &namdyn_vor    !   option of physics/algorithm (not control by CPP keys) 
     191/ 
     192!----------------------------------------------------------------------- 
     193&namdyn_vor    !   option of physics/algorithm 
    224194!----------------------------------------------------------------------- 
    225195   ln_dynvor_ene = .false. !  enstrophy conserving scheme 
     
    252222   !                       !  Type of the operator : 
    253223   !                           !  no diffusion: set ln_dynldf_lap=..._blp=F  
    254    ln_dynldf_lap =  .true.     !    laplacian operator 
     224   ln_dynldf_lap =  .false.    !    laplacian operator 
    255225   ln_dynldf_blp =  .false.    !  bilaplacian operator 
    256226   !                       !  Direction of action  : 
     
    276246   rn_avm0     =   1.e-4  !  vertical eddy viscosity   [m2/s]          (background Kz if not "key_zdfcst") 
    277247   rn_avt0     =   0.     !  vertical eddy diffusivity [m2/s]          (background Kz if not "key_zdfcst") 
    278    ln_zdfevd   = .false.  !  enhanced vertical diffusion (evd) (T) or not (F) 
    279    ln_zdfnpc   = .false.  !  Non-Penetrative Convective algorithm (T) or not (F) 
    280 / 
    281 !----------------------------------------------------------------------- 
    282 &namzdf_tke    !   turbulent eddy kinetic dependent vertical diffusion  ("key_zdftke") 
    283 !----------------------------------------------------------------------- 
    284 / 
    285 !----------------------------------------------------------------------- 
    286 &namzdf_ddm    !   double diffusive mixing parameterization             ("key_zdfddm") 
    287 !----------------------------------------------------------------------- 
    288 / 
    289 !----------------------------------------------------------------------- 
    290 &namzdf_tmx    !   tidal mixing parameterization                        ("key_zdftmx") 
    291 !----------------------------------------------------------------------- 
     248   ln_zdfevd   = .false.  !  enhanced vertical diffusion (evd) 
     249   ln_zdfnpc   = .false.  !  Non-Penetrative Convective algorithm 
    292250/ 
    293251!----------------------------------------------------------------------- 
     
    299257!----------------------------------------------------------------------- 
    300258/ 
    301 !----------------------------------------------------------------------- 
    302 &namptr       !   Poleward Transport Diagnostic 
    303 !----------------------------------------------------------------------- 
    304 / 
    305 !----------------------------------------------------------------------- 
    306 &namhsb       !  Heat and salt budgets 
    307 !----------------------------------------------------------------------- 
    308 / 
    309 !----------------------------------------------------------------------- 
    310 &namobs       !  observation usage 
    311 !----------------------------------------------------------------------- 
    312 / 
    313 !----------------------------------------------------------------------- 
    314 &nam_asminc   !   assimilation increments                               ('key_asminc') 
    315 !----------------------------------------------------------------------- 
    316 / 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/LOCK_EXCHANGE/MY_SRC/usrdef_hgr.F90

    r6901 r6906  
    1010   !!---------------------------------------------------------------------- 
    1111 
    12    !!---------------------------------------------------------------------- 
     12   !!---------------------------------------------------------------------------------- 
    1313   !!   usr_def_hgr    : initialize the horizontal mesh for LOCK_EXCHANGE configuration 
    14    !!---------------------------------------------------------------------- 
     14   !!---------------------------------------------------------------------------------- 
    1515   USE dom_oce  ,  ONLY: nimpp, njmpp       ! ocean space and time domain 
    1616   USE par_oce         ! ocean space and time domain 
     
    4646      !! 
    4747      !! ** Method  :   set all intent(out) argument to a proper value 
    48       !!                LOCK_EXCHANGE configuration : uniform grid spacing (1km) 
     48      !!                LOCK_EXCHANGE configuration : uniform grid spacing (500m) 
    4949      !!                without Coriolis force (f=0) 
    5050      !! 
     
    7171      IF(lwp) WRITE(numout,*) 
    7272      IF(lwp) WRITE(numout,*) 'usr_def_hgr : LOCK_EXCHANGE configuration bassin' 
    73       IF(lwp) WRITE(numout,*) '~~~~~~~~~~~   uniform 1km grid spacing WITHOUT Coriolis force (f=0)' 
     73      IF(lwp) WRITE(numout,*) '~~~~~~~~~~~   uniform grid spacing WITHOUT Coriolis force (f=0)' 
    7474      ! 
    7575      !                       !==  grid point position  ==!   (in kilometers) 
     
    7777      DO jj = 1, jpj 
    7878         DO ji = 1, jpi             ! longitude 
    79             pglamt(ji,jj) = zfact * (  - 0.5 + ( REAL( ji-1 + nimpp-1 )       , wp )  ) 
    80             pglamu(ji,jj) = zfact * (  - 0.5 + ( REAL( ji-1 + nimpp-1 ) + 0.5 , wp )  ) 
    81             pglamv(ji,jj) = pglamt(ji,jj) 
    82             pglamf(ji,jj) = pglamu(ji,jj) 
     79            plamt(ji,jj) = zfact * (  - 0.5 + REAL( ji-1 + nimpp-1 , wp )  )   
     80            plamu(ji,jj) = zfact * (          REAL( ji-1 + nimpp-1 , wp )  ) 
     81            plamv(ji,jj) = plamt(ji,jj) 
     82            plamf(ji,jj) = plamu(ji,jj) 
    8383            !                       ! latitude 
    84             pgphit(ji,jj) = zfact * (  - 0.5 + ( REAL( jj-1 + njmpp-1 )      , wp )  ) 
    85             pgphiu(ji,jj) = pgphit(ji,jj) 
    86             pgphiv(ji,jj) = zfact * (  - 0.5 + ( REAL( jj-1 + njmpp-1 ) + 0.5 , wp )  ) 
    87             pgphif(ji,jj) = pgphiv(ji,jj) 
     84            pphit(ji,jj) = zfact * (  - 0.5 + REAL( jj-1 + njmpp-1 , wp )  ) 
     85            pphiu(ji,jj) = pphit(ji,jj) 
     86            pphiv(ji,jj) = zfact * (          REAL( jj-1 + njmpp-1 , wp )  ) 
     87            pphif(ji,jj) = pphiv(ji,jj) 
    8888         END DO 
    8989      END DO 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/LOCK_EXCHANGE/MY_SRC/usrdef_istate.F90

    r6901 r6906  
    1414   !!---------------------------------------------------------------------- 
    1515   USE par_oce        ! ocean space and time domain 
     16   USE dom_oce , ONLY : glamt  
    1617   USE phycst         ! physical constants 
    1718   ! 
     
    4950      ! 
    5051      INTEGER  ::   jk     ! dummy loop indices 
     52      REAL(wp) ::   zdam   ! location of dam [Km] 
    5153      !!---------------------------------------------------------------------- 
    5254      ! 
    5355      IF(lwp) WRITE(numout,*) 
    54       IF(lwp) WRITE(numout,*) 'usr_def_istate : LOCK_EXCHANGE configuration, analytical definition of initial state ' 
    55       IF(lwp) WRITE(numout,*) '~~~~~~~~~~~~~~   Ocean at rest, with a dam on T profile, and uniform S profile' 
     56      IF(lwp) WRITE(numout,*) 'usr_def_istate : LOCK_EXCHANGE configuration, analytical definition of initial state' 
     57      IF(lwp) WRITE(numout,*) '~~~~~~~~~~~~~~   Ocean at rest, with a constant salinity (not used as rho=F(T) ' 
     58      IF(lwp) WRITE(numout,*) '                 and a vertical density front with a 5 kg/m3 difference located at glam=32km' 
     59      IF(lwp) WRITE(numout,*) '                 (i.e. a temperature difference of 25 degrees with rn_a0 = 0.2' 
     60      ! 
     61      !  rn_a0 =  2.e-1   !  thermal expension coefficient (nn_eos= 1) 
     62      !  rho = rau0 - rn_a0 * (T-10)  
     63      !  delta_T = 25 degrees  ==>>  delta_rho = 25 * rn_a0 = 5 kg/m3 
    5664      ! 
    5765      pu  (:,:,:) = 0._wp        ! ocean at rest 
     
    6068      ! 
    6169      !                          ! T & S profiles 
    62       pts(:,:,:,jp_tem) = 30._wp * tmask(:,:,:) 
     70      zdam = 32.                      ! in kilometers 
     71      pts(:,:,:,jp_tem) = 30._wp * ptmask(:,:,:) 
    6372      DO jk = 1, jpkm1 
    64 !SF   ADD rn_dx2 
    65          WHERE( gphit(:,:) <= zdam )   pts(:,:,jk,jp_tem) = 5._wp * tmask(:,:,jk) 
     73         WHERE( glamt(:,:) <= zdam )   pts(:,:,jk,jp_tem) = 5._wp * ptmask(:,:,jk) 
    6674      END DO 
    6775      ! 
    68       pts(:,:,:,jp_sal) = 35. * tmask(:,:,:) 
     76      pts(:,:,:,jp_sal) = 35._wp * ptmask(:,:,:) 
    6977      !    
    7078   END SUBROUTINE usr_def_istate 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/LOCK_EXCHANGE/MY_SRC/usrdef_nam.F90

    r6901 r6906  
    5555      INTEGER                       , INTENT(out) ::   kperio          ! lateral global domain b.c.  
    5656      ! 
    57       INTEGER ::   ios   ! Local integer 
     57      INTEGER ::   ios, ii   ! Local integer 
    5858      !! 
    5959      NAMELIST/namusr_def/ ln_zco, ln_zps, ln_sco, rn_dx, rn_dz 
    6060      !!---------------------------------------------------------------------- 
     61      ! 
     62      ii = 1 
    6163      ! 
    6264      REWIND( numnam_cfg )          ! Namelist namusr_def (exist in namelist_cfg only) 
     
    6466902   IF( ios /= 0 )   CALL ctl_nam ( ios , 'namusr_def in configuration namelist', .TRUE. ) 
    6567      ! 
    66 !!gm  This does not work...  I don't know how to write namusr_def in "output.namelist.dyn" 
    67       WRITE( ldnam(ii), namusr_def ) 
    68 !!gm 
     68      WRITE( ldnam(:), namusr_def ) 
    6969      ! 
    7070      ! Global Domain size:  LOCK_EXCHANGE domain is 64 km x 3 grid-points x 20 m 
    7171      kpi = INT(  64.e3 / rn_dx ) + 2 
    7272      kpj = 3 
    73       kpk = INT(   (2.e-1 ) * 1.e3  / rn_dz ) + 1 
     73      kpk = INT(  20.  / rn_dz ) + 1 
    7474      ! 
    7575      !                             ! control print 
     
    7777      WRITE(ldtxt(ii),*) 'usr_def_nam  : read the user defined namelist (namusr_def) in namelist_cfg'   ;   ii = ii + 1 
    7878      WRITE(ldtxt(ii),*) '~~~~~~~~~~~ '                                                                 ;   ii = ii + 1 
    79       WRITE(ldtxt(ii),*) '   Namelist namusr_def : LOCK_EXCHANGE test case'                                  ;   ii = ii + 1 
     79      WRITE(ldtxt(ii),*) '   Namelist namusr_def : LOCK_EXCHANGE test case'                             ;   ii = ii + 1 
    8080      WRITE(ldtxt(ii),*) '      type of vertical coordinate : '                                         ;   ii = ii + 1 
    8181      WRITE(ldtxt(ii),*) '         z-coordinate flag                     ln_zco = ', ln_zco             ;   ii = ii + 1 
     
    8484      WRITE(ldtxt(ii),*) '      horizontal resolution                    rn_dx  = ', rn_dx, ' meters'   ;   ii = ii + 1 
    8585      WRITE(ldtxt(ii),*) '      vertical   resolution                    rn_dz  = ', rn_dz, ' meters'   ;   ii = ii + 1 
    86       WRITE(ldtxt(ii),*) '      LOCK_EXCHANGE domain = 64 km  x  3 grid-points  x  20 m'                  ;   ii = ii + 1 
     86      WRITE(ldtxt(ii),*) '      LOCK_EXCHANGE domain = 64 km  x  3 grid-points  x  20 m'                ;   ii = ii + 1 
    8787      WRITE(ldtxt(ii),*) '         resulting global domain size :        jpiglo = ', kpi                ;   ii = ii + 1 
    8888      WRITE(ldtxt(ii),*) '                                               jpjglo = ', kpj                ;   ii = ii + 1 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/LOCK_EXCHANGE/cpp_LOCK_EXCHANGE.fcm

    r6901 r6906  
    1  bld::tool::fppkeys key_zdfcst key_iomput key_mpp_mpi key_mpp_rep 
     1 bld::tool::fppkeys key_zdfcst key_iomput key_mpp_mpi key_mpp_rep key_nosignedzero 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/OVERFLOW/EXP00/namelist_cfg

    r6905 r6906  
    66!----------------------------------------------------------------------- 
    77   !                       !  type of vertical coordinate 
    8    ln_zco      = .false.       ! z-coordinate 
     8   ln_zco      = .false.      ! z-coordinate 
    99   ln_zps      = .false.      ! z-partial-step coordinate 
    10    ln_sco      = .true.      ! s-coordinate    
     10   ln_sco      = .true.       ! s-coordinate    
    1111   rn_dx       = 1000.     !  horizontal resolution   [meters] 
    1212   rn_dz       =   20.     !  vertical   resolution   [meters] 
     
    1919   cn_exp      =   "overfl-FCT2-flux-ubs-ens"  !  experience name 
    2020   nn_it000    =       1   !  first time step 
    21    nn_itend    =   180   ! for 34h of simulation  (=12240)  
     21   nn_itend    =   12240   ! for 34h of simulation  (=12240)  
    2222   nn_istate   =       1   !  output the initial state (1) or not (0) 
    2323   nn_stock    =   12240   !  frequency of creation of a restart file (modulo referenced to 1) 
     
    2929   ln_read_cfg = .false.   !  (=T) read the domain configuration in 'domain_cfg.nc" file 
    3030   !                       !  (=F) user defined configuration  ==>>>  see usrdef(_...) modules 
    31    ln_write_cfg= .true. !.false.   !  (=T) create the domain configuration file 
     31   ln_write_cfg= .false.   !  (=T) create the domain configuration file 
    3232   ! 
    3333   cp_cfg      = "overflow" !  name of the configuration 
     
    5151/ 
    5252!----------------------------------------------------------------------- 
    53 &namcrs        !   Grid coarsening for dynamics output and/or 
    54                !   passive tracer coarsened online simulations 
    55 !----------------------------------------------------------------------- 
    56 / 
    57 !----------------------------------------------------------------------- 
    5853&namtsd    !   data : Temperature  & Salinity 
    5954!----------------------------------------------------------------------- 
    60 !          !  file name            ! frequency (hours) ! variable  ! time interp. !  clim  ! 'yearly'/ ! weights  ! rotation ! land/sea mask ! 
    61 !          !                       !  (if <0  months)  !   name    !   (logical)  !  (T/F) ! 'monthly' ! filename ! pairing  ! filename      ! 
    62    sn_tem  = 'output.init_0000'    ,          1        ,'votemper' ,    .true.    , .true. , 'yearly'   , ''       ,   ''    ,    '' 
    63    sn_sal  = 'output.init_0000'    ,          1        ,'vosaline' ,    .true.    , .true. , 'yearly'   , ''       ,   ''    ,    '' 
    64    ! 
    65    cn_dir        = './'      !  root directory for the location of the runoff files 
    6655   ln_tsd_init   = .false.   !  Initialisation of ocean T & S with T &S input data (T) or not (F) 
    6756   ln_tsd_tradmp = .false.   !  damping of ocean T & S toward T &S input data (T) or not (F) 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/OVERFLOW/MY_SRC/usrdef_istate.F90

    r6905 r6906  
    5050      ! 
    5151      INTEGER  ::   jk     ! dummy loop indices 
    52       REAL(wp) ::   zdam   ! location of dam [m] 
     52      REAL(wp) ::   zdam   ! location of dam [Km] 
    5353      !!---------------------------------------------------------------------- 
    5454      ! 
     
    5656      IF(lwp) WRITE(numout,*) 'usr_def_istate : OVERFLOW configuration, analytical definition of initial state' 
    5757      IF(lwp) WRITE(numout,*) '~~~~~~~~~~~~~~   Ocean at rest, with a constant salinity (not used as rho=F(T) ' 
    58       IF(lwp) WRITE(numout,*) '                 and a vertical density front with a 2 kg/m3 difference located' 
    5958      IF(lwp) WRITE(numout,*) '                 and a vertical density front with a 2 kg/m3 difference located at glam=20km' 
    6059      IF(lwp) WRITE(numout,*) '                 (i.e. a temperature difference of 10 degrees with rn_a0 = 0.2' 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/OVERFLOW/MY_SRC/usrdef_nam.F90

    r6905 r6906  
    4747      !! ** Method  :   read in namusr_def containing all the user specific namelist parameter 
    4848      !! 
    49       !!                Here GYRE configuration 
     49      !!                Here OVERFLOW configuration 
    5050      !! 
    5151      !! ** input   : - namusr_def namelist found in namelist_cfg 
     
    6868      WRITE( ldnam(:), namusr_def ) 
    6969      ! 
    70       ! Global Domain size:  OVERFLOW domain is   200 km x 3 grid-points x 2000 m 
     70      ! Global Domain size:  OVERFLOW domain is  200 km x 3 grid-points x 2000 m 
    7171      kpi = INT( 200.e3 / rn_dx ) + 2 
    7272      kpj = 3 
     
    7878      WRITE(ldtxt(ii),*) '~~~~~~~~~~~ '                                                                 ;   ii = ii + 1 
    7979      WRITE(ldtxt(ii),*) '   Namelist namusr_def : OVERFLOW test case'                                  ;   ii = ii + 1 
    80       WRITE(ldtxt(ii),*) '      type of vertical coordinate : '                                           ;   ii = ii + 1 
     80      WRITE(ldtxt(ii),*) '      type of vertical coordinate : '                                         ;   ii = ii + 1 
    8181      WRITE(ldtxt(ii),*) '         z-coordinate flag                     ln_zco = ', ln_zco             ;   ii = ii + 1 
    8282      WRITE(ldtxt(ii),*) '         z-partial-step coordinate flag        ln_zps = ', ln_zps             ;   ii = ii + 1 
     
    8484      WRITE(ldtxt(ii),*) '      horizontal resolution                    rn_dx  = ', rn_dx, ' meters'   ;   ii = ii + 1 
    8585      WRITE(ldtxt(ii),*) '      vertical   resolution                    rn_dz  = ', rn_dz, ' meters'   ;   ii = ii + 1 
    86       WRITE(ldtxt(ii),*) '      OVERFLOW domain = 3 grid-points x 200 km  x 2000 m'                     ;   ii = ii + 1 
     86      WRITE(ldtxt(ii),*) '      OVERFLOW domain = 200 km x 3 grid-points x 2000 m'                      ;   ii = ii + 1 
    8787      WRITE(ldtxt(ii),*) '         resulting global domain size :        jpiglo = ', kpi                ;   ii = ii + 1 
    8888      WRITE(ldtxt(ii),*) '                                               jpjglo = ', kpj                ;   ii = ii + 1 
  • branches/2016/dev_r6409_SIMPLIF_2_usrdef/NEMOGCM/CONFIG/OVERFLOW/MY_SRC/usrdef_zgr.F90

    r6905 r6906  
    77   !! 
    88   !!============================================================================== 
    9    !! History :  4.0  ! 2016-08  (S. Flavoni)  Original code 
     9   !! History :  4.0  ! 2016-08  (G. Madec)  Original code 
    1010   !!---------------------------------------------------------------------- 
    1111 
     
    154154      ! 
    155155      IF ( ln_zps ) THEN      !==  zps-coordinate  ==!   (partial bottom-steps) 
    156          ! 
    157 !         CALL ctl_stop( 'STOP', ' zps coordinate not yet coded' ) 
    158156         ! 
    159157         ze3min = 0.1_wp * rn_dz 
Note: See TracChangeset for help on using the changeset viewer.