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 in trunk/CONFIG/GYRE/EXP00 – NEMO

source: trunk/CONFIG/GYRE/EXP00/namelist @ 165

Last change on this file since 165 was 165, checked in by opalod, 19 years ago

CT + CL : UPDATE105 : Add the subroutine albedo_init() in the albedo.F90 module to read the namelist namalb to set albedo parameters

  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 23.8 KB
Line 
1!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
2! OPA namelist :  model option and parameter input
3! -------------
4!>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>>
5!
6!-----------------------------------------------------------------------
7!       namrun   parameters of the run
8!-----------------------------------------------------------------------
9!  no         job number
10!  cexper     experience name for vairmer format
11!  ln_rstart  boolean term for restart (true or false)
12!  nrstdt     control of the restart timestep:
13!                = 0 restart, do not control nit000 in the restart file.
14!                = 1 restart, control nit000 in the restart file. Do not
15!                    use the date in the restart file (use ndate0 in namelist)
16!                = 2 restart, control nit000 in the restart file, use the date
17!                    in the restart file. ndate0 in the namelist is ignored.
18!  nit000     number of the first time step
19!  nitend     number of the last time step
20!  ndate0     initial calendar date aammjj
21!  nleapy     Leap year calendar (0/1)
22!  nprint     level of print (0 no print)
23!  nstock     frequency of restart file
24!  nwrite     frequency of OUTPUT file
25!  nrunoff    = 0 no, 1 runoff, 2 runoff+river mouth ups adv
26!  ln_ctl     trend control print (expensive!)
27!  nictl      max i indice to make the control SUM (very usefull to compare mono-
28!  njctl      max j indice to make the control SUM (-versus multi processor runs)
29!  nbench     Bench parameter (0/1): CAUTION it must be zero except for bench
30!             for which we don't care about physical meaning of the results
31!
32!  CAUTION: for usual run scripts, logical value of
33!  *******  ln_rstart must be .true. or .false.
34!                     and NOT .TRUE. or .FALSE.
35&namrun
36   no         =       0
37   cexper     =  "GYRE"
38   ln_rstart  = .false.
39   nrstdt     =       0
40   nit000     =       1
41   nitend     =    4320
42   ndate0     =  010101
43   nleapy     =      30
44   nprint     =       0
45   nstock     =    4320
46   nwrite     =      60
47   nrunoff    =       0
48   ln_ctl     =  .true.
49   nictl      =      10
50   njctl      =      10
51   nbench     =       0
52/
53!-----------------------------------------------------------------------
54!       nam_traadv   advection scheme for tracer (option not control by CPP keys)
55!-----------------------------------------------------------------------
56!  ln_traadv_cen2     2nd order centered scheme    (default T)
57!  ln_traadv_tvd      TVD scheme                   (default F)
58!  ln_traadv_muscl    MUSCL scheme                 (default F)
59!  ln_traadv_muscl2   MUSCL2 scheme                (default F)
60&nam_traadv
61   ln_traadv_cen2   =  .true.
62   ln_traadv_tvd    =  .false.
63   ln_traadv_muscl  =  .false.
64   ln_traadv_muscl2 =  .false.
65/
66!-----------------------------------------------------------------------
67!       nam_traldf   lateral diffusion scheme for tracer (option not control by CPP keys)
68!-----------------------------------------------------------------------
69!  Type of the operator :
70!     ln_traldf_lap    laplacian operator          (default T)
71!     ln_traldf_bilap  bilaplacian operator        (default F)
72!  Direction of action  :
73!     ln_traldf_level  iso-level                   (default F)
74!     ln_traldf_hor    horizontal (geopotential)   (default F)^**
75!     ln_traldf_iso    iso-neutral                 (default T)^*
76!  Coefficient
77!     aht0    horizontal eddy diffusivity for tracers (m2/s)
78!     ahtb0   background eddy diffusivity for isopycnal diffusion (m2/s)
79!     aeiv0   eddy induced velocity coefficient (m2/s)
80! ^* require key_ldfslp to compute the direction of the lateral diffusion
81! ^** require key_ldfslp in s-coordinate
82&nam_traldf
83   ln_traldf_lap    =  .true.
84   ln_traldf_bilap  =  .false.
85   ln_traldf_level  =  .false.
86   ln_traldf_hor    =  .false.
87   ln_traldf_iso    =  .true.
88   aht0    =  1000.
89   ahtb0   =     0.
90   aeiv0   =  1000.
91/
92!-----------------------------------------------------------------------
93!       nam_dynldf   lateral diffusion on momentum
94!-----------------------------------------------------------------------
95!  Type of the operator :
96!     ln_dynldf_lap    laplacian operator          (default T)
97!     ln_dynldf_bilap  bilaplacian operator        (default F)
98!  Direction of action  :
99!     ln_dynldf_level  iso-level                   (default F)
100!     ln_dynldf_hor    horizontal (geopotential)   (default F)^**
101!     ln_dynldf_iso    iso-neutral                 (default T)^*
102!  Coefficient
103!  ahm0    horizontal eddy viscosity for the dynamics (m2/s)
104!  ahmb0   background eddy viscosity for isopycnal diffusion (m2/s)
105&nam_dynldf
106   ln_dynldf_lap    =  .true.
107   ln_dynldf_bilap  =  .false.
108   ln_dynldf_level  =  .false.
109   ln_dynldf_hor    =  .true.
110   ln_dynldf_iso    =  .false.
111   ahm0    = 100000.
112   ahmb0   =      0.
113/
114!-----------------------------------------------------------------------
115!       namflg   algorithm flags (algorithm not control by CPP keys)
116!-----------------------------------------------------------------------
117!  ln_dynhpg_imp   hydrostatic pressure gradient: semi-implicit time scheme  (T)
118!                                                  centered      time scheme  (F)
119&namflg
120   ln_dynhpg_imp   =  .false.
121/
122!-----------------------------------------------------------------------
123!       nam_dynvor   option of physics/algorithm (not control by CPP keys)
124!-----------------------------------------------------------------------
125!  ln_dynvor_ens   vorticity trends: enstrophy conserving scheme (default T)
126!  ln_dynvor_ene      "         "  : energy conserving scheme    (default F)
127!  ln_dynvor_mix      "         "  : mixed scheme                (default F)
128!  ln_dynvor_een      "         "  : energy & enstrophy scheme   (default F)
129&nam_dynvor
130   ln_dynvor_ene = .FALSE.
131   ln_dynvor_ens = .TRUE.
132   ln_dynvor_mix = .FALSE.
133   ln_dynvor_een = .FALSE.
134/
135!-----------------------------------------------------------------------
136!       namtau   surface wind stress
137!-----------------------------------------------------------------------
138!  ntau000   gently increase the stress over the first ntau_rst time-steps
139!  tau0x     uniform value used as default surface heat flux
140!  tau0y     uniform value used as default solar radiation flux
141&namtau
142   ntau000 =    100
143   tau0x   =      0.1e0
144   tau0y   =      0.e0
145/
146!-----------------------------------------------------------------------
147!       namflx   surface fluxes
148!-----------------------------------------------------------------------
149!  q0       uniform value used as default surface heat flux
150!  qsr0     uniform value used as default solar radiation flux
151!  emp0     uniform value used as default surface freswater budget (E-P)
152&namflx
153   q0      =      0.e0
154   qsr0    =    150.e0
155   emp0    =      0.e0
156/
157!-----------------------------------------------------------------------
158!       namalb   albedo parameters
159!-----------------------------------------------------------------------
160!  cgren    correction of the snow or ice albedo to take into account
161!  albice   albedo of melting ice in the arctic and antarctic
162!  alphd    coefficients for linear interpolation used to compute albedo
163!           between two extremes values (Pyane, 1972)
164!  alphc     "                                         "
165!  alphdi    "                                         "
166&namalb
167   cgren    =      0.06
168   albice   =      0.5
169   alphd    =      0.80
170   alphc    =      0.65
171   alphdi   =      0.72
172/
173!-----------------------------------------------------------------------
174!       namdom   space and time domain (bathymetry, mesh, timestep)
175!-----------------------------------------------------------------------
176!  ntopo      = 0/1 ,compute/read the bathymetry file
177!               (mbathy, nb of T-ocean levels)
178!  e3zps_min  the thickness of the partial step is set larger than the
179!  e3zps_rat     the minimum of e3zps_min and e3zps_rat * e3t
180!                (N.B. 0<e3zps_rat<1)
181!  ngrid      = 0/1, compute/read the horizontal mesh
182!                  (coordinates, scale factors)
183!  nmsh       =1 create a mesh file (coordinates, scale factors, masks)
184!  nacc       the acceleration of convergence method
185!             = 0, no acceleration, rdt = rdttra
186!             = 1, acceleration used, rdt < rdttra(k)
187!  atfp       asselin time filter parameter
188!  rdt        time step for the dynamics (and tracer if nacc=0)
189!  rdtmin     minimum time step on tracers
190!  rdtmax     maximum time step on tracers
191!  rdth       depth variation of tracer time step
192!  nfice      frequency of ice model call
193!  nfbulk     frequency of bulk formulea call (not used if ice used)
194!  nclosea    = 0 no closed sea
195!             = 1 closed sea (Black Sea, Caspian Sea, Great US Lakes...)
196&namdom
197   ntopo     =     0
198   e3zps_min =     5.
199   e3zps_rat =     0.1
200   ngrid     =     0
201   nmsh      =     1
202   nacc      =     0
203   atfp      =     0.1
204   rdt       =  7200.
205   rdtmin    =  7200.
206   rdtmax    =  7200.
207   rdth      =   800.
208   nfice     =     5 
209   nfbulk    =     5 
210   nclosea   =     0
211/
212!-----------------------------------------------------------------------
213!       namfwb   freshwater budget correction
214!-----------------------------------------------------------------------
215!  ln_fwb     logical flag for freshwater budget correction (0 annual mean)
216&namfwb
217   ln_fwb    = .false.
218/
219!-----------------------------------------------------------------------
220!       namptr   Poleward Transport Diagnostic
221!-----------------------------------------------------------------------
222!  ln_diaptr  logical flag for Poleward transport computation
223!  nf_ptr     Frequency of computation
224&namptr
225   ln_diaptr = .false.
226   nf_ptr    =  15
227/
228!-----------------------------------------------------------------------
229!       namcro   cross land advection
230!-----------------------------------------------------------------------
231!  n_cla   advection between 2 ocean pts separates by land
232&namcla
233   n_cla   = 0
234/
235!-----------------------------------------------------------------------
236!       namzdf   vertical physics
237!-----------------------------------------------------------------------
238!  ln_zdfevd  enhanced vertical diffusion         (default T)
239!  ln_zdfnpc  Non-Penetrative Convection          (default T)
240!  avm0       vertical eddy viscosity for the dynamic (m2/s)
241!  avt0       vertical eddy diffusivity for tracers (m2/s)
242!  avevd      vertical coefficient for enhanced diffusion scheme (m2/s)
243!  nevdm      = 0  apply enhanced mixing on tracer only
244!             = 1  apply enhanced mixing on both tracer and momentum
245!  ln_zdfexp   vertical physics: (=T)  time splitting (T)     (Default=F)
246!                               (=F)  euler backward (F)
247!  n_zdfexp   number of sub-timestep for time splitting scheme
248&namzdf
249   ln_zdfevd = .true.
250   ln_zdfnpc = .false.
251   avm0     = 1.2e-4
252   avt0     = 1.2e-5
253   avevd    =   100.
254   nevdm    =     1
255   ln_zdfexp =  .false.
256   n_zdfexp =      3
257/
258!-----------------------------------------------------------------------
259!       namnpc   vnon penetrative convection
260!-----------------------------------------------------------------------
261!  nnpc1   non penetrative convective scheme frequency
262!  nnpc2   non penetrative convective scheme print frequency
263&namnpc
264   nnpc1  =      1
265   nnpc2  =    365
266/
267!-----------------------------------------------------------------------
268!       nambbl   bottom boundary layer scheme
269!-----------------------------------------------------------------------
270!  atrbbl   lateral tracer coeff. for bottom boundary layer scheme(m2/s)
271&nambbl
272   atrbbl = 10000.
273/
274!-----------------------------------------------------------------------
275!       namric   richardson number dependent vertical diffusion
276!                ( #ifdef "key_zdfrichardson" )
277!-----------------------------------------------------------------------
278!  avmri   maximum value of the vertical viscosity
279!  alp     coefficient of the parameterization
280!  nric    coefficient of the parameterization
281&namwri
282   avmri = 100.e-4
283   alp   =      5.
284   nric  =       2
285/
286!-----------------------------------------------------------------------
287!       namtke   turbulent eddy kinetic dependent vertical diffusion
288!                ( #ifdef "key_zdftke" )
289!-----------------------------------------------------------------------
290!  ln_rstke flag to restart with tke from a run without tke (default F)
291!  ediff    coef. to compute vertical eddy coef. (avt=ediff*mxl*sqrt(e) )
292!  ediss    coef. of the Kolmogoroff dissipation 
293!  ebb      coef. of the surface input of tke
294!  efave    coef. to applied to the tke diffusion ( avtke=efave*avm )
295!  emin     minimum value of tke (m^2/s^2)
296!  emin0    surface minimum value of tke (m^2/s^2)
297!  nitke    number of restart iterative loops
298!  ri_c     critic richardson number
299!  nmxl     flag on mixing length used
300!           = 0 bounded by the distance to surface and bottom
301!           = 1 bounded by the local vertical scale factor
302!           = 2 first vertical derivative of mixing length bounded by 1
303!  npdl     flag on prandtl number
304!           = 0 no vertical prandtl number (avt=avm)
305!           = 1 prandtl number function of richarson number (avt=pdl*avm)
306!           = 2 same as = 1 but a shapiro filter is applied on pdl
307!  nave     =  horizontal averaged (=1) or not (=0) of avt  (default =1)
308!  navb     = 0 cst background avt0, avm0 / =1 profile used on avtb
309&namtke
310   ln_rstke = .false.
311   ediff =       0.1
312   ediss =       0.7
313   ebb   =      3.75
314   efave =        1.
315   emin  =     1.e-6
316   emin0 =     1.e-4
317   nitke =        50
318   nmxl  =         2
319   npdl  =         1
320   navb  =         0
321/
322!-----------------------------------------------------------------------
323!       namddm   double diffusive mixing parameterization
324!-----------------------------------------------------------------------
325!   avts    maximum avs for dd mixing
326!   hsbfr   heat/salt buoyancy flux ratio
327&namddm
328      avts  = 1.e-4
329      hsbfr = 1.6
330/
331!-----------------------------------------------------------------------
332!       namlbc   lateral momentum boundary condition
333!-----------------------------------------------------------------------
334!  shlat   lateral boundary condition on velocity
335!                   shlat = 0 , free slip
336!               0 < shlat < 2 , partial slip
337!                   shlat = 2 , no slip
338!               2 < shlat     , strong slip
339&namlbc
340   shlat  =      0.
341/
342!-----------------------------------------------------------------------
343!       nambfr   bottom friction
344!-----------------------------------------------------------------------
345!  nbotfr  type of bottom friction
346!                  nbotfr = 0 , no slip
347!                  nbotfr = 1 , linear friction
348!                  nbotfr = 2 , nonlinear friction
349!                  nbotfr = 3 , free slip
350!  bfri1   bottom drag coefficient (linear case)
351!  bfri2   bottom drag coefficient (non linear case)
352!  bfeb2   bottom turbulent kinetic energy  (m^2/s^2)
353&nambfr
354   nbotfr =       2
355   bfri1  =   4.e-4
356   bfri2  =   1.e-3
357   bfeb2  =  2.5e-3
358/
359!-----------------------------------------------------------------------
360!       nambbc   bottom temperature boundary condition
361!-----------------------------------------------------------------------
362!  ngeo_flux  = 0 no geothermal heat flux
363!             = 1 constant geothermal heat flux
364!             = 2 variable geothermal heat flux (read in geothermal_heating.nc)
365!                 ( C A U T I O N : flux in mW/m2 in the NetCDF file )
366!  ngeo_flux_const   Constant value of geothermal heat flux (W/m2)
367&nambbc
368   ngeo_flux =  0
369   ngeo_flux_const = 86.4e-3
370/
371!-----------------------------------------------------------------------
372!       namqsr   penetrative solar radiation
373!-----------------------------------------------------------------------
374!  ln_traqsr : penetrative solar radiation (T) or not (F)     (Default=T)
375!  rabs       fraction of qsr associated with xsi1
376!  xsi1       first depth of extinction
377!  xsi2       second depth of extinction
378&namqsr
379   ln_traqsr = .true.
380   rabs     =   0.58
381   xsi1     =   0.35
382   xsi2     =   23.0
383/
384!-----------------------------------------------------------------------
385!       namtdp   tracer newtonian damping ('key_tradmp')
386!-----------------------------------------------------------------------
387!  ndmp    type of damping in temperature and salinity
388!          (='latitude', damping poleward of 'ndmp' degrees and function
389!             of the distance-to-coast. Red and Med Seas as ndmp=-1)
390!          (=-1 damping only in Med and Red Seas)
391!  ndmpf   =1 create a damping.coeff NetCDF file (the 3D damping array)
392!  nmldmp  type of damping in the mixed layer
393!          (=0 damping throughout the water column)
394!     (=1 no damping in the mixed layer defined by avt >5cm2/s )
395!     (=2 no damping in the mixed layer defined rho<rho(surf)+.01 )
396!  sdmp    surface time scale for internal damping (days)
397!  bdmp    bottom time scale for internal damping (days)
398!  hdmp    depth of transition between sdmp and bdmp (meters)
399&namtdp
400   ndmp   =   -1
401   ndmpf  =    1
402   nmldmp =    1
403   sdmp   =  50.
404   bdmp   = 360.
405   hdmp   = 800.
406/
407!-----------------------------------------------------------------------
408!       nameos   ocean physical parameters
409!-----------------------------------------------------------------------
410!  neos    type of equation of state and Brunt-Vaisala frequency
411!          = 0, UNESCO (formulation of Jackett and McDougall (1994)
412!                                         and of McDougall (1987) )
413!          = 1, linear: rho(T)   = rau0 * ( 1.028 - ralpha * T )
414!          = 2, linear: rho(T,S) = rau0 * ( rbeta * S - ralpha * T )
415!                               with rau0=1020 set in parcst routine
416!  ralpha  thermal expension coefficient (linear equation of state)
417!  rbeta   saline  expension coefficient (linear equation of state)
418&nameos
419   neos   =      0
420   ralpha =  2.e-4
421   rbeta  =  7.7e-4
422/
423!-----------------------------------------------------------------------
424!       namsol   elliptic solver / island / free surface
425!-----------------------------------------------------------------------
426!  nsolv     elliptic solver (=1 preconditioned conjugate gradient: pcg)
427!                            (=2 successive-over-relaxation: sor)
428!                            (=3 FETI: fet, all require "key_feti" defined)
429!  nsol_arp  absolute/relative (0/1) precision convergence test
430!  nmin      minimum of iterations for the SOR solver
431!  nmax      maximum of iterations for the SOR solver
432!  nmod      frequency of test for the SOR solver
433!  eps       absolute precision of the solver
434!  resmax    absolute precision for the SOR solver
435!  sor       optimal coefficient for SOR solver
436!  epsisl    absolute precision on stream function solver
437!  nmisl     maximum pcg iterations for island
438!  rnu       strength of the additional force used in free surface b.c.
439&namsol
440   nsolv     =      2
441   nsol_arp  =      0
442   nmin      =    300
443   nmax      =    800
444   nmod      =     10
445   eps       =  1.E-6
446   resmax    = 1.E-14
447   sor       =   1.96
448   epsisl    = 1.e-10
449   nmisl     =   4000
450   rnu       =     1.
451/
452!=======================================================================
453!   Diagnostics namelists
454!       namtrd    dynamics and/or tracer trends
455!       namgap    level mean model-data gap
456!       namznl    zonal mean heat & freshwater fluxes computation
457!       namspr    surface pressure in rigid-lid
458!=======================================================================
459!-----------------------------------------------------------------------
460!       namtrd    diagnostics on dynamics and/or tracer trends
461!                         ('key_diatrdyn' and/or 'key_diatrtra')
462!                 or mixed-layer trends ('key_diatrdmld')
463!-----------------------------------------------------------------------
464!  ntrd    time step frequency dynamics and tracers trends
465!  nctls   control surface type in mixed-layer trends (0,1 or n<jpk)
466&namtrd
467   ntrd  = 365
468   nctls =   0
469/
470!-----------------------------------------------------------------------
471!       namgap    level mean model-data gap ('key_diagap')
472!-----------------------------------------------------------------------
473!  ngap    time-step frequency of model-data gap computation
474!  nprg    time-step frequency of gap print in model output
475&namgap
476   ngap =  15
477   nprg =  10
478/
479!-----------------------------------------------------------------------
480!       namznl    zonal mean heat & freshwater fluxes computation
481!                 (#ifdef "key_diaznl")
482!-----------------------------------------------------------------------
483!  nfznl   time-step frequency of zonal mean fluxes computation
484&namznl
485   nfznl =  15
486/
487!-----------------------------------------------------------------------
488!       namspr  surface pressure diagnostic
489!-----------------------------------------------------------------------
490!  nmaxp   maximum of iterations for the solver
491!  epsp    absolute precision of the solver
492!  niterp  number of iteration done by the solver
493&namspr
494   nmaxp   =   1000
495   epsp    =  1.e-3
496   niterp  =    400
497/
498!-----------------------------------------------------------------------
499!       namcpl    coupled ocean/atmosphere model  (#ifdef "key_coupled")
500!-----------------------------------------------------------------------
501!  nexco   coupling frequency in time steps
502!  cchan   coupling technique 'PIPE' or 'CLIM'
503&namcpl
504   nexco            =         24
505   cchan            =     'PIPE'
506   nmodcpl          =          2
507   cplmodnam        =   'opa.xx'
508   cploasis         =    'Oasis'
509   nfldo2c          =          2
510   nflxc2o          =          6
511   ntauc2o          =          4
512   cpl_writ(1)      = 'SOSSTSST'
513   cpl_f_writ(1)    =   'ocesst'
514   cpl_writ(2)      = 'SOICECOV'
515   cpl_f_writ(2)    =   'oceice'
516   cpl_readflx(1)   = 'SONSFLDO'
517   cpl_f_readflx(1) =   'oceflx'
518   cpl_readflx(2)   = 'SOSHFLDO'
519   cpl_f_readflx(2) =   'oceflx'
520   cpl_readflx(3)   = 'SOTOPRSU'
521   cpl_f_readflx(3) =   'oceflx'
522   cpl_readflx(4)   = 'SOTFSHSU'
523   cpl_f_readflx(4) =   'oceflx'
524   cpl_readflx(5)   = 'SORUNCOA'
525   cpl_f_readflx(5) =   'oceflx'
526   cpl_readflx(6)   = 'SORIVFLU'
527   cpl_f_readflx(6) =   'oceflx'
528   cpl_readtau(1)   = 'SOZOTAUX'
529   cpl_f_readtau(1) =   'ocetau'
530   cpl_readtau(2)   = 'SOZOTAU2'
531   cpl_f_readtau(2) =   'ocetau'
532   cpl_readtau(3)   = 'SOMETAUY'
533   cpl_f_readtau(3) =   'ocetau'
534   cpl_readtau(4)   = 'SOMETAU2'
535   cpl_f_readtau(4) =   'ocetau'
536/
537!-----------------------------------------------------------------------
538!       namobc    open boundaries parameters (#ifdef key_obc)
539!-----------------------------------------------------------------------
540!  nobc_dta   = 0 the obc data are equal to the initial state
541!             = 1 the obc data are read in 'obc   .dta' files
542!  rdpeob  time relaxation (days) for the east open boundary
543!  rdpwob  time relaxation (days) for the west open boundary
544!  rdpnob  time relaxation (days) for the north open boundary
545!  rdpsob  time relaxation (days) for the south open boundary
546!  zbsic1  barotropic stream function on isolated coastline 1
547!   zbsic2  barotropic stream function on isolated coastline 2
548!  zbsic3  barotropic stream function on isolated coastline 3
549&namobc
550    nobc_dta =    0
551    rdpein   =    1.
552    rdpwin   =    1.
553    rdpnin   =   30.
554    rdpsin   =    1.
555    rdpeob   = 1500.
556    rdpwob   =   15.
557    rdpnob   =  150.
558    rdpsob   =   15.
559    zbsic1   =  140.e+6
560    zbsic2   =    1.e+6
561    zbsic3   =    0.
562/
563!-----------------------------------------------------------------------
564!       namflo    float parameters (#ifdef key_float)
565!-----------------------------------------------------------------------
566!  ln_rstflo   boolean term for float restart (true or false)
567!  nwritefl   frequency of float output file
568!  nstockfl   frequency of float restart file
569!  ln_argo    Argo type floats (stay at the surface each 10 days)
570!  ln_flork4  = T trajectories computed with a 4th order Runge-Kutta
571!             = F  (default)   computed with Blanke' scheme
572&namflo
573    ln_rstflo = .false.
574    nwritefl  =      75
575    nstockfl  =    5475
576    ln_argo   = .false.
577    ln_flork4 = .false.
578/
Note: See TracBrowser for help on using the repository browser.