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.
namelist_cfg in NEMO/trunk/cfgs/AMM12/EXPREF – NEMO

source: NEMO/trunk/cfgs/AMM12/EXPREF/namelist_cfg @ 12377

Last change on this file since 12377 was 12377, checked in by acc, 4 years ago

The big one. Merging all 2019 developments from the option 1 branch back onto the trunk.

This changeset reproduces 2019/dev_r11943_MERGE_2019 on the trunk using a 2-URL merge
onto a working copy of the trunk. I.e.:

svn merge --ignore-ancestry \

svn+ssh://acc@forge.ipsl.jussieu.fr/ipsl/forge/projets/nemo/svn/NEMO/trunk \
svn+ssh://acc@forge.ipsl.jussieu.fr/ipsl/forge/projets/nemo/svn/NEMO/branches/2019/dev_r11943_MERGE_2019 ./

The --ignore-ancestry flag avoids problems that may otherwise arise from the fact that
the merge history been trunk and branch may have been applied in a different order but
care has been taken before this step to ensure that all applicable fixes and updates
are present in the merge branch.

The trunk state just before this step has been branched to releases/release-4.0-HEAD
and that branch has been immediately tagged as releases/release-4.0.2. Any fixes
or additions in response to tickets on 4.0, 4.0.1 or 4.0.2 should be done on
releases/release-4.0-HEAD. From now on future 'point' releases (e.g. 4.0.2) will
remain unchanged with periodic releases as needs demand. Note release-4.0-HEAD is a
transitional naming convention. Future full releases, say 4.2, will have a release-4.2
branch which fulfills this role and the first point release (e.g. 4.2.0) will be made
immediately following the release branch creation.

2020 developments can be started from any trunk revision later than this one.

  • Property svn:mime-type set to text/x-fortran
File size: 27.8 KB
Line 
1!!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
2!! NEMO/OCE Configuration namelist : overwrite default values defined in SHARED/namelist_ref
3!!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
4!                          AMM12 configuration                         !
5!!======================================================================
6!!              ***  Domain & Run management namelists  ***           !!
7!!                                                                    !!
8!!   namrun       parameters of the run
9!!   namdom       space and time domain
10!!   namcfg       parameters of the configuration                       (default: user defined GYRE)
11!!   namwad       Wetting and drying                                    (default: OFF)
12!!   namtsd       data: temperature & salinity                          (default: OFF)
13!!   namcrs       coarsened grid (for outputs and/or TOP)               (ln_crs =T)
14!!   namc1d       1D configuration options                              ("key_c1d")
15!!   namc1d_dyndmp 1D newtonian damping applied on currents             ("key_c1d")
16!!   namc1d_uvd   1D data (currents)                                    ("key_c1d")
17!!======================================================================
18!
19!-----------------------------------------------------------------------
20&namrun        !   parameters of the run
21!-----------------------------------------------------------------------
22   cn_exp      =  "AMM12"  !  experience name
23   nn_it000    =       1   !  first time step
24   nn_itend    =    1296   !  last  time step (std 1 day = 144)
25   nn_date0    =  20120102 !  date at nit_0000 (format yyyymmdd) used if ln_rstart=F or (ln_rstart=T and nn_rstctl=0 or 1)
26   nn_leapy    =       1   !  Leap year calendar (1) or not (0)
27   cn_ocerst_in   = "amm12_restart_oce"   !  suffix of ocean restart name (input)
28   cn_ocerst_out  = "restart"             !  suffix of ocean restart name (input)
29   nn_stock    =    1296   !  frequency of creation of a restart file (modulo referenced to 1)
30   nn_write    =     144   !  frequency of write in the output file   (modulo referenced to nit000)
31/
32!-----------------------------------------------------------------------
33&namdom        !   time and space domain
34!-----------------------------------------------------------------------
35   rn_rdt      =   600.    !  time step for the dynamics (and tracer if nn_acc=0)
36/
37!-----------------------------------------------------------------------
38&namcfg        !   parameters of the configuration                      (default: user defined GYRE)
39!-----------------------------------------------------------------------
40   ln_read_cfg = .true.   !  (=T) read the domain configuration file
41      cn_domcfg = "AMM_R12_sco_domcfg" ! domain configuration filename
42/
43!!======================================================================
44!!            ***  Surface Boundary Condition namelists  ***          !!
45!!                                                                    !!
46!!   namsbc          surface boundary condition manager                 (default: NO selection)
47!!   namsbc_flx      flux               formulation                     (ln_flx     =T)
48!!   namsbc_blk      Bulk formulae formulation                          (ln_blk     =T)
49!!   namsbc_cpl      CouPLed            formulation                     ("key_oasis3" )
50!!   namsbc_sas      Stand-Alone Surface module                         (SAS_SRC  only)
51!!   namsbc_iif      Ice-IF: use observed ice cover                     (nn_ice = 1   )
52!!   namtra_qsr      penetrative solar radiation                        (ln_traqsr  =T)
53!!   namsbc_ssr      sea surface restoring term (for T and/or S)        (ln_ssr     =T)
54!!   namsbc_rnf      river runoffs                                      (ln_rnf     =T)
55!!   namsbc_apr      Atmospheric Pressure                               (ln_apr_dyn =T)
56!!   namsbc_isf      ice shelf melting/freezing                         (ln_isfcav  =T : read (ln_read_cfg=T) or set or usr_def_zgr )
57!!   namsbc_iscpl    coupling option between land ice model and ocean   (ln_isfcav  =T)
58!!   namsbc_wave     external fields from wave model                    (ln_wave    =T)
59!!   namberg         iceberg floats                                     (ln_icebergs=T)
60!!======================================================================
61!
62!-----------------------------------------------------------------------
63&namsbc        !   Surface Boundary Condition (surface module)          (default: NO selection)
64!-----------------------------------------------------------------------
65   nn_fsbc     = 1         !  frequency of SBC module call
66   ln_flx      = .true.    !  flux formulation                          (T => fill namsbc_flx)
67   ln_traqsr   = .false.   !  Light penetration in the ocean            (T => fill namtra_qsr)
68   ln_ssr      = .false.   !  Sea Surface Restoring on T and/or S       (T => fill namsbc_ssr)
69   ln_rnf      = .false.   !  runoffs                                   (T => fill namsbc_rnf)
70   ln_apr_dyn  = .false.   !  Patm gradient added in ocean & ice Eqs.   (T => fill namsbc_apr )
71/
72!-----------------------------------------------------------------------
73&namsbc_flx    !   surface boundary condition : flux formulation
74!-----------------------------------------------------------------------
75   cn_dir      = './fluxes/'  !  root directory for the fluxes data location
76   !___________!_________________________!___________________!___________!_____________!________!___________!__________________!__________!_______________!
77   !           !  file name              ! frequency (hours) ! variable  ! time interp.!  clim  ! 'yearly'/ ! weights filename ! rotation ! land/sea mask !
78   !           !                         !  (if <0  months)  !   name    !   (logical) !  (T/F) ! 'monthly' !                  ! pairing  !    filename   !
79   sn_utau     = 'amm12_utau'            ,          1.       , 'utau'    ,  .false.    , .false., 'daily'   ,  ''              ,  ''      , ''
80   sn_vtau     = 'amm12_vtau'            ,          1.       , 'vtau'    ,  .false.    , .false., 'daily'   ,  ''              ,  ''      , ''
81   sn_qtot     = 'amm12_flx'             ,          3.       , 'sonsfldo',  .true.     , .false., 'daily'   ,  ''              ,  ''      , ''
82   sn_qsr      = 'amm12_flx'             ,          3.       , 'soshfldo',  .true.     , .false., 'daily'   ,  ''              ,  ''      , ''
83   sn_emp      = 'amm12_flx'             ,          3.       , 'sowafldo',  .true.     , .false., 'daily'   ,  ''              ,  ''      , ''
84/
85!-----------------------------------------------------------------------
86&namtra_qsr    !   penetrative solar radiation                          (ln_traqsr =T)
87!-----------------------------------------------------------------------
88   ln_qsr_rgb  = .true.      !  RGB light penetration (Red-Green-Blue)
89   nn_chldta   =      0      !  RGB : Chl data (=1) or cst value (=0)
90/
91!-----------------------------------------------------------------------
92&namsbc_ssr    !   surface boundary condition : sea surface restoring   (ln_ssr =T)
93!-----------------------------------------------------------------------
94   nn_sstr     =     1     !  add a retroaction term in the surface heat       flux (=1) or not (=0)
95   nn_sssr     =     0     !  add a damping     term in the surface freshwater flux (=2)
96                           !  or to SSS only (=1) or no damping term (=0)
97   rn_deds     =  -27.7    !  magnitude of the damping on salinity   [mm/day]
98
99   cn_dir      = 'fluxes/' !  root directory for the location of the runoff files
100   !___________!_________________________!___________________!___________!_____________!________!___________!__________________!__________!_______________!
101   !           !  file name              ! frequency (hours) ! variable  ! time interp.!  clim  ! 'yearly'/ ! weights filename ! rotation ! land/sea mask !
102   !           !                         !  (if <0  months)  !   name    !   (logical) !  (T/F) ! 'monthly' !                  ! pairing  !    filename   !
103   sn_sst      = 'amm12_sstref'          ,        24.        ,  'sst'     ,   .true.   , .false., 'daily'   , ''               , ''       , ''
104   sn_sss      = 'sss_data'              ,        -1.        ,  'sss'     ,   .true.   , .true. , 'yearly'  , ''               , ''       , ''
105/
106!-----------------------------------------------------------------------
107&namsbc_rnf    !   runoffs                                              (ln_rnf =T)
108!-----------------------------------------------------------------------
109   ln_rnf_mouth = .false.   !  specific treatment at rivers mouths
110   ln_rnf_depth = .true.    !  read in depth information for runoff
111   ln_rnf_tem   = .true.    !  read in temperature information for runoff
112   ln_rnf_sal   = .true.    !  read in salinity information for runoff
113
114   cn_dir = './'  !  root directory for the flux data location
115   !___________!_________________________!___________________!___________!_____________!________!___________!__________________!__________!_______________!
116   !           !  file name              ! frequency (hours) ! variable  ! time interp.!  clim  ! 'yearly'/ ! weights filename ! rotation ! land/sea mask !
117   !           !                         !  (if <0  months)  !   name    !   (logical) !  (T/F) ! 'monthly' !                  ! pairing  !    filename   !
118   sn_rnf      = 'amm12_rivers'          ,        24.        , 'rorunoff',   .false.   , .true. , 'yearly'  , ''               , ''       , ''
119   sn_cnf      = 'runoff_1m_nomask'      ,         0.        , 'socoefr0',   .false.   , .true. , 'yearly'  , ''               , ''       , ''
120   sn_s_rnf    = 'amm12_rivers'          ,        24.        , 'rosaline',   .false.   , .true. , 'yearly'  , ''               , ''       , ''
121   sn_t_rnf    = 'amm12_rivers'          ,        24.        , 'rotemper',   .false.   , .true. , 'yearly'  , ''               , ''       , ''
122   sn_dep_rnf  = 'amm12_rivers'          ,        24.        , 'rodepth' ,   .false.   , .true. , 'yearly'  , ''               , ''       , ''
123/
124!-----------------------------------------------------------------------
125&namsbc_apr    !   Atmospheric pressure used as ocean forcing           (ln_apr_dyn =T)
126!-----------------------------------------------------------------------
127   rn_pref     = 101000.   !  reference atmospheric pressure   [N/m2]
128   ln_ref_apr  = .false.   !  ref. pressure: global mean Patm (T) or a constant (F)
129   ln_apr_obc  = .true.    !  inverse barometer added to OBC ssh data
130
131   cn_dir = './fluxes/'    !  root directory for the Patm data location
132   !___________!_________________________!___________________!___________!_____________!________!___________!__________________!__________!_______________!
133   !           !  file name              ! frequency (hours) ! variable  ! time interp.!  clim  ! 'yearly'/ ! weights filename ! rotation ! land/sea mask !
134   !           !                         !  (if <0  months)  !   name    !   (logical) !  (T/F) ! 'monthly' !                  ! pairing  !    filename   !
135   sn_apr      = 'amm12_mslp'            ,          1.       ,'p_msl'    ,   .false.   , .false., 'daily'  ,    ''            ,    ''    ,      ''
136/
137!!======================================================================
138!!               ***  Lateral boundary condition  ***                 !!
139!!                                                                    !!
140!!   namlbc        lateral momentum boundary condition                  (default: NO selection)
141!!   namagrif      agrif nested grid ( read by child model only )       ("key_agrif")
142!!   nam_tide      Tidal forcing                                        (default: OFF)
143!!   nambdy        Unstructured open boundaries                         (default: OFF)
144!!   nambdy_dta    Unstructured open boundaries - external data         (see  nambdy)
145!!   nambdy_tide   tidal forcing at open boundaries                     (default: OFF)
146!!======================================================================
147!
148!-----------------------------------------------------------------------
149&namlbc        !   lateral momentum boundary condition                  (default: NO selection
150!-----------------------------------------------------------------------
151   rn_shlat    =     0     !  free slip
152/
153!-----------------------------------------------------------------------
154&nam_tide      !   tide parameters                                      (default: OFF)
155!-----------------------------------------------------------------------
156   ln_tide     = .true.        ! Activate tides
157      ln_tide_pot     = .true. !  use tidal potential forcing
158   sn_tide_cnames(1)  = 'Q1'   !  name of constituent
159   sn_tide_cnames(2)  = 'O1'
160   sn_tide_cnames(3)  = 'P1'
161   sn_tide_cnames(4)  = 'S1'
162   sn_tide_cnames(5)  = 'K1'
163   sn_tide_cnames(6)  = '2N2'
164   sn_tide_cnames(7)  = 'MU2'
165   sn_tide_cnames(8)  = 'N2'
166   sn_tide_cnames(9)  = 'NU2'
167   sn_tide_cnames(10) = 'M2'
168   sn_tide_cnames(11) = 'L2'
169   sn_tide_cnames(12) = 'T2'
170   sn_tide_cnames(13) = 'S2'
171   sn_tide_cnames(14) = 'K2'
172   sn_tide_cnames(15) = 'M4'
173/
174!-----------------------------------------------------------------------
175&nambdy        !  unstructured open boundaries                          (default: OFF)
176!-----------------------------------------------------------------------
177    ln_bdy     = .true.   !  Use unstructured open boundaries
178    nb_bdy     =  1       !  number of open boundary sets
179    !
180    cn_dyn2d     = 'flather'
181    nn_dyn2d_dta =  3
182    cn_tra       =  'frs'
183    nn_tra_dta   =   1 
184/
185!-----------------------------------------------------------------------
186&nambdy_dta    !  open boundaries - external data                       
187!-----------------------------------------------------------------------
188   ln_zinterp  = .false.      !  T if a vertical interpolation is required. Variables gdep[tuv] and e3[tuv] must exist in the file
189   !                          !  automatically defined to T if the number of vertical levels in bdy dta /= jpk
190   ln_full_vel = .false.      !  T if [uv]3d are "full" velocities and not only its baroclinic components
191   !                          !  in this case, baroclinic and barotropic velocities will be recomputed -> [uv]2d not needed
192   !
193   cn_dir  =    './bdydta/'
194   !___________!_________________________!___________________!___________!_____________!________!___________!__________________!__________!_______________!
195   !           !  file name              ! frequency (hours) ! variable  ! time interp.!  clim  ! 'yearly'/ ! weights filename ! rotation ! land/sea mask !
196   !           !                         !  (if <0  months)  !   name    !   (logical) !  (T/F) ! 'monthly' !                  ! pairing  !    filename   !
197   bn_ssh      = 'amm12_bdyT_dyn2d'      ,         24.       , 'sossheig',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
198   bn_u2d      = 'amm12_bdyU_dyn2d'      ,         24.       , 'vobtcrtx',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
199   bn_v2d      = 'amm12_bdyV_dyn2d'      ,         24.       , 'vobtcrty',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
200   bn_u3d      = 'amm12_bdyU_dyn3d'      ,         24.       , 'vozocrtx',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
201   bn_v3d      = 'amm12_bdyV_dyn3d'      ,         24.       , 'vomecrty',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
202   bn_tem      = 'amm12_bdyT_tra'        ,         24.       , 'votemper',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
203   bn_sal      = 'amm12_bdyT_tra'        ,         24.       , 'vosaline',    .true.   , .false.,  'daily'  ,    ''            ,   ''     , ''
204/
205!-----------------------------------------------------------------------
206&nambdy_tide   !  tidal forcing at open boundaries
207!-----------------------------------------------------------------------
208   filtide      = 'bdydta/amm12_bdytide_'         !  file name root of tidal forcing files
209/
210!!======================================================================
211!!                ***  Top/Bottom boundary condition  ***             !!
212!!                                                                    !!
213!!   namdrg        top/bottom drag coefficient                          (default: NO selection)
214!!   namdrg_top    top    friction                                      (ln_OFF =F & ln_isfcav=T)
215!!   namdrg_bot    bottom friction                                      (ln_OFF =F)
216!!   nambbc        bottom temperature boundary condition                (default: OFF)
217!!   nambbl        bottom boundary layer scheme                         (default: OFF)
218!!======================================================================
219!
220!-----------------------------------------------------------------------
221&namdrg        !   top/bottom drag coefficient                          (default: NO selection)
222!-----------------------------------------------------------------------
223   ln_loglayer = .true.     !  logarithmic drag: Cd = vkarmn/log(z/z0) |U|
224/
225!-----------------------------------------------------------------------
226&namdrg_bot    !   BOTTOM friction                                 
227!-----------------------------------------------------------------------
228   rn_Cd0     =  2.5e-3   !  drag coefficient [-]
229   rn_Uc0     =  0.4      !  ref. velocity [m/s] (linear drag=Cd0*Uc0)
230   rn_Cdmax   =  0.1      !  drag value maximum [-] (logarithmic drag)
231   rn_ke0     =  0.0e0    !  background kinetic energy  [m2/s2] (non-linear cases)
232   rn_z0      =  0.003    !  roughness [m]  (ln_loglayer=T)
233/
234!!======================================================================
235!!                        Tracer (T & S) namelists                    !!
236!!                                                                    !!
237!!   nameos        equation of state                                    (default: NO selection)
238!!   namtra_adv    advection scheme                                     (default: NO selection)
239!!   namtra_ldf    lateral diffusion scheme                             (default: NO selection)
240!!   namtra_mle    mixed layer eddy param. (Fox-Kemper param.)          (default: OFF)
241!!   namtra_eiv    eddy induced velocity param.                         (default: OFF)
242!!   namtra_dmp    T & S newtonian damping                              (default: OFF)
243!!======================================================================
244!
245!-----------------------------------------------------------------------
246&nameos        !   ocean Equation Of Seawater                           (default: NO selection)
247!-----------------------------------------------------------------------
248   ln_teos10   = .true.         !  = Use TEOS-10 equation of state
249/
250!-----------------------------------------------------------------------
251&namtra_adv    !   advection scheme for tracer                          (default: NO selection)
252!-----------------------------------------------------------------------
253   ln_traadv_fct = .true.     !  FCT scheme
254      nn_fct_h   =  2               !  =2/4, horizontal 2nd / 4th order
255      nn_fct_v   =  2               !  =2/4, vertical   2nd / COMPACT 4th order
256/
257!-----------------------------------------------------------------------
258&namtra_ldf    !   lateral diffusion scheme for tracers                 (default: NO selection)
259!-----------------------------------------------------------------------
260   ln_traldf_lap   =  .true.   !    laplacian operator
261   ln_traldf_hor   =  .true.   !  horizontal (geopotential)
262   !                       !  Coefficients:
263   nn_aht_ijk_t    = 0         !  =  0   constant = 1/2  Ud*Ld   (lap case)
264      rn_Ud        = 0.01           !  lateral diffusive velocity [m/s] (nn_aht_ijk_t= 0, 10, 20, 30)
265      rn_Ld        = 10.e+3         !  lateral diffusive length   [m]   (nn_aht_ijk_t= 0, 10)
266/
267!!======================================================================
268!!                      ***  Dynamics namelists  ***                  !!
269!!                                                                    !!
270!!   nam_vvl       vertical coordinate options                          (default: z-star)
271!!   namdyn_adv    formulation of the momentum advection                (default: NO selection)
272!!   namdyn_vor    advection scheme                                     (default: NO selection)
273!!   namdyn_hpg    hydrostatic pressure gradient                        (default: NO selection)
274!!   namdyn_spg    surface pressure gradient                            (default: NO selection)
275!!   namdyn_ldf    lateral diffusion scheme                             (default: NO selection)
276!!   namdta_dyn    offline TOP: dynamics read in files                  (OFF_SRC only)
277!!======================================================================
278!
279!-----------------------------------------------------------------------
280&nam_vvl       !   vertical coordinate options                          (default: z-star)
281!-----------------------------------------------------------------------
282/
283!-----------------------------------------------------------------------
284&namdyn_adv    !   formulation of the momentum advection                (default: NO selection)
285!-----------------------------------------------------------------------
286   ln_dynadv_vec = .true.  !  vector form - 2nd centered scheme
287     nn_dynkeg     = 0        ! grad(KE) scheme: =0   C2  ;  =1   Hollingsworth correction
288/
289!-----------------------------------------------------------------------
290&namdyn_vor    !   Vorticity / Coriolis scheme                          (default: NO selection)
291!-----------------------------------------------------------------------
292   ln_dynvor_een = .true.  !  energy & enstrophy scheme
293      nn_een_e3f = 1             !  e3f = masked averaging of e3t divided by 4 (=0) or by the sum of mask (=1)
294/
295!-----------------------------------------------------------------------
296&namdyn_hpg    !   Hydrostatic pressure gradient option                 (default: NO selection)
297!-----------------------------------------------------------------------
298   ln_hpg_prj  = .true.    !  s-coordinate (Pressure Jacobian scheme)
299/
300!-----------------------------------------------------------------------
301&namdyn_spg    !   surface pressure gradient                            (default: NO selection)
302!-----------------------------------------------------------------------
303   ln_dynspg_ts = .true.   ! split-explicit free surface
304   ln_bt_auto   = .false.  ! Number of sub-step defined from:
305   nn_baro      = 30       ! =F : the number of sub-step in rn_rdt seconds
306/
307!-----------------------------------------------------------------------
308&namdyn_ldf    !   lateral diffusion on momentum                        (default: NO selection)
309!-----------------------------------------------------------------------
310   ln_dynldf_blp =  .true.     !  bilaplacian operator
311   ln_dynldf_lev =  .true.     !  iso-level
312   nn_ahm_ijk_t  = 0           !  =0   constant = 1/12 Uv*Lv^3 (blp case)
313      rn_Uv      =  0.12            !  lateral viscous velocity [m/s]
314      rn_Lv      = 10.e+3           !  lateral viscous length   [m] 
315/
316!!======================================================================
317!!                     vertical physics namelists                     !!
318!!                                                                    !!
319!!    namzdf        vertical physics manager                            (default: NO selection)
320!!    namzdf_ric    richardson number vertical mixing                   (ln_zdfric=T)
321!!    namzdf_tke    TKE vertical mixing                                 (ln_zdftke=T)
322!!    namzdf_gls    GLS vertical mixing                                 (ln_zdfgls=T)
323!!    namzdf_osm    OSM vertical diffusion                              (ln_zdfosm=T)
324!!    namzdf_iwm    tidal mixing parameterization                       (ln_zdfiwm=T)
325!!======================================================================
326!
327!-----------------------------------------------------------------------
328&namzdf        !   vertical physics                                     (default: NO selection)
329!-----------------------------------------------------------------------
330   ln_zdfgls   = .true.    !  Generic Length Scale closure              (T =>   fill namzdf_gls)
331   !                       ! coefficients
332   rn_avm0     =   0.1e-6     !  vertical eddy viscosity   [m2/s]       (background Kz if ln_zdfcst=F)
333   rn_avt0     =   0.1e-6     !  vertical eddy diffusivity [m2/s]       (background Kz if ln_zdfcst=F)
334   nn_avb      =    0         !  profile for background avt & avm (=1) or not (=0)
335   nn_havtb    =    0         !  horizontal shape for avtb (=1) or not (=0)
336/
337!-----------------------------------------------------------------------
338&namzdf_gls    !   GLS vertical diffusion                               (ln_zdfgls =T)
339!-----------------------------------------------------------------------
340   rn_charn    =  100000.  !  Charnock constant for wb induced roughness length
341   nn_z0_met   = 1         !  Method for surface roughness computation (0/1/2)
342/
343!!======================================================================
344!!                  ***  Diagnostics namelists  ***                   !!
345!!                                                                    !!
346!!   namtrd       dynamics and/or tracer trends                         (default: OFF)
347!!   namptr       Poleward Transport Diagnostics                        (default: OFF)
348!!   namhsb       Heat and salt budgets                                 (default: OFF)
349!!   namdiu       Cool skin and warm layer models                       (default: OFF)
350!!   namdiu       Cool skin and warm layer models                       (default: OFF)
351!!   namflo       float parameters                                      (default: OFF)
352!!   nam_diadct   transports through some sections                      (default: OFF)
353!!   nam_dia25h   25h Mean Output                                       (default: OFF)
354!!   namnc4       netcdf4 chunking and compression settings             ("key_netcdf4")
355!!======================================================================
356!
357!-----------------------------------------------------------------------
358&nam_dia25h    !  25h Mean Output                                       (default F)
359!-----------------------------------------------------------------------
360   ln_dia25h  = .true.    ! Choose 25h mean output or not
361/
362!!======================================================================
363!!               ***  Observation & Assimilation  ***                 !!
364!!                                                                    !!
365!!   namobs       observation and model comparison                      (default: OFF)
366!!   nam_asminc   assimilation increments                               ('key_asminc')
367!!======================================================================
368!
369!!======================================================================
370!!                  ***  Miscellaneous namelists  ***                 !!
371!!                                                                    !!
372!!   nammpp            Massively Parallel Processing                    ("key_mpp_mpi")
373!!   namctl            Control prints                                   (default: OFF)
374!!   namsto            Stochastic parametrization of EOS                (default: OFF)
375!!======================================================================
376!
377!-----------------------------------------------------------------------
378&nammpp        !   Massively Parallel Processing                        ("key_mpp_mpi")
379!-----------------------------------------------------------------------
380/
381!-----------------------------------------------------------------------
382&namctl        !   Control prints                                       (default: OFF)
383!-----------------------------------------------------------------------
384/
385!-----------------------------------------------------------------------
386&namsto        ! Stochastic parametrization of EOS                      (default: OFF)
387!-----------------------------------------------------------------------
388/
Note: See TracBrowser for help on using the repository browser.