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.
sms_pisces.F90 in trunk/NEMOGCM/NEMO/TOP_SRC/PISCES – NEMO

source: trunk/NEMOGCM/NEMO/TOP_SRC/PISCES/sms_pisces.F90 @ 4529

Last change on this file since 4529 was 4529, checked in by cetlod, 10 years ago

Bugfix and minor improvment on PISCES, see ticket #1258

  • Property svn:keywords set to Id
File size: 8.9 KB
Line 
1MODULE sms_pisces   
2   !!----------------------------------------------------------------------
3   !!                     ***  sms_pisces.F90  *** 
4   !! TOP :   PISCES Source Minus Sink variables
5   !!----------------------------------------------------------------------
6   !! History :   1.0  !  2000-02 (O. Aumont) original code
7   !!             3.2  !  2009-04 (C. Ethe & NEMO team) style
8   !!----------------------------------------------------------------------
9#if defined key_pisces || defined key_pisces_reduced 
10   !!----------------------------------------------------------------------
11   !!   'key_pisces'                                         PISCES model
12   !!----------------------------------------------------------------------
13   USE par_oce
14   USE par_trc
15
16   IMPLICIT NONE
17   PUBLIC
18
19   INTEGER ::   numnatp_ref = -1           !! Logical units for namelist pisces
20   INTEGER ::   numnatp_cfg = -1           !! Logical units for namelist pisces
21   INTEGER ::   numonp      = -1           !! Logical unit for namelist pisces output
22
23   !!*  Biological fluxes for light : variables shared by pisces & lobster
24   INTEGER , ALLOCATABLE, SAVE, DIMENSION(:,:)   ::  neln  !: number of T-levels + 1 in the euphotic layer
25   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:)   ::  heup  !: euphotic layer depth
26   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::  etot  !: par (photosynthetic available radiation)
27   !
28   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:)   ::  xksi  !:  LOBSTER : zooplakton closure
29   !                                                       !:  PISCES  : silicon dependant half saturation
30
31#if defined key_pisces 
32   !!*  Time variables
33   INTEGER  ::   nrdttrc           !: ???
34   INTEGER  ::   ndayflxtr         !: ???
35   REAL(wp) ::   rfact , rfactr    !: ???
36   REAL(wp) ::   rfact2, rfact2r   !: ???
37   REAL(wp) ::   xstep             !: Time step duration for biology
38
39   !!*  Biological parameters
40   INTEGER  ::   niter1max, niter2max   !: Maximum number of iterations for sinking
41   REAL(wp) ::   rno3              !: ???
42   REAL(wp) ::   o2ut              !: ???
43   REAL(wp) ::   po4r              !: ???
44   REAL(wp) ::   rdenit            !: ???
45   REAL(wp) ::   rdenita           !: ???
46   REAL(wp) ::   o2nit             !: ???
47   REAL(wp) ::   wsbio, wsbio2     !: ???
48   REAL(wp) ::   xkmort            !: ???
49   REAL(wp) ::   ferat3            !: ???
50
51   !!*  diagnostic parameters
52   REAL(wp) ::  tpp                !: total primary production
53   REAL(wp) ::  t_oce_co2_exp      !: total carbon export
54   REAL(wp) ::  t_oce_co2_flx      !: Total ocean carbon flux
55   REAL(wp) ::  t_atm_co2_flx      !: global mean of atmospheric pco2
56
57   !!* restoring
58   LOGICAL  ::  ln_pisdmp          !: restoring or not of nutrients to a mean value
59   INTEGER  ::  nn_pisdmp          !: frequency of relaxation or not of nutrients to a mean value
60
61   !!* Mass conservation
62   LOGICAL  ::  ln_check_mass      !: Flag to check mass conservation
63
64   !!*  Biological fluxes for primary production
65   REAL(wp), ALLOCATABLE, SAVE,   DIMENSION(:,:)  ::   xksimax    !: ???
66   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xnanono3   !: ???
67   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xdiatno3   !: ???
68   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xnanonh4   !: ???
69   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xdiatnh4   !: ???
70   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xnanopo4   !: ???
71   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xdiatpo4   !: ???
72   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xlimphy    !: ???
73   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xlimdia    !: ???
74   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   concdfe    !: ???
75   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   concnfe    !: ???
76   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xlimnfe    !: ???
77   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xlimdfe    !: ???
78   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   xlimsi     !: ???
79   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:)  ::   biron      !: bioavailable fraction of iron
80
81
82   !!*  SMS for the organic matter
83   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   xfracal    !: ??
84   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   nitrfac    !: ??
85   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   xlimbac    !: ??
86   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   xlimbacl   !: ??
87   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   xdiss      !: ??
88   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   prodcal    !: Calcite production
89
90   !!* Variable for chemistry of the CO2 cycle
91   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   akb3       !: ???
92   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   ak13       !: ???
93   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   ak23       !: ???
94   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   aksp       !: ???
95   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   akw3       !: ???
96   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   borat      !: ???
97   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   hi         !: ???
98   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   excess     !: ???
99
100   !!* Temperature dependancy of SMS terms
101   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   tgfunc    !: Temp. dependancy of various biological rates
102   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   tgfunc2   !: Temp. dependancy of mesozooplankton rates
103
104   !!* Array used to indicate negative tracer values
105   REAL(wp), ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   xnegtr     !: ???
106
107#if defined key_kriest
108   !!*  Kriest parameter for aggregation
109   REAL(wp) ::   xkr_eta                            !: Sinking  exponent
110   REAL(wp) ::   xkr_zeta                           !:  N content exponent
111   REAL(wp) ::   xkr_ncontent                       !:  N content factor   
112   REAL(wp) ::   xkr_massp                          !:
113   REAL(wp) ::   xkr_mass_min, xkr_mass_max         !:  Minimum, Maximum mass for Aggregates
114#endif
115
116#endif
117   !!----------------------------------------------------------------------
118   !! NEMO/TOP 3.3 , NEMO Consortium (2010)
119   !! $Id$
120   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt)
121   !!----------------------------------------------------------------------
122CONTAINS
123
124   INTEGER FUNCTION sms_pisces_alloc()
125      !!----------------------------------------------------------------------
126      !!        *** ROUTINE sms_pisces_alloc ***
127      !!----------------------------------------------------------------------
128      USE lib_mpp , ONLY: ctl_warn
129      INTEGER ::   ierr(6)        ! Local variables
130      !!----------------------------------------------------------------------
131      ierr(:) = 0
132      !*  Biological fluxes for light : shared variables for pisces & lobster
133      ALLOCATE( etot(jpi,jpj,jpk), neln(jpi,jpj), heup(jpi,jpj), xksi(jpi,jpj), STAT=ierr(1) )
134      !
135#if defined key_pisces
136      !*  Biological fluxes for primary production
137      ALLOCATE( xksimax(jpi,jpj)     , biron   (jpi,jpj,jpk),       &
138         &      xnanono3(jpi,jpj,jpk), xdiatno3(jpi,jpj,jpk),       &
139         &      xnanonh4(jpi,jpj,jpk), xdiatnh4(jpi,jpj,jpk),       &
140         &      xnanopo4(jpi,jpj,jpk), xdiatpo4(jpi,jpj,jpk),       &
141         &      xlimphy (jpi,jpj,jpk), xlimdia (jpi,jpj,jpk),       &
142         &      xlimnfe (jpi,jpj,jpk), xlimdfe (jpi,jpj,jpk),       &
143         &      xlimsi  (jpi,jpj,jpk), concdfe (jpi,jpj,jpk),       &
144         &      concnfe (jpi,jpj,jpk),                           STAT=ierr(2) ) 
145         !
146      !*  SMS for the organic matter
147      ALLOCATE( xfracal (jpi,jpj,jpk), nitrfac(jpi,jpj,jpk),       &
148         &      xlimbac (jpi,jpj,jpk), xdiss  (jpi,jpj,jpk),       & 
149         &      xlimbacl(jpi,jpj,jpk), prodcal(jpi,jpj,jpk),     STAT=ierr(3) )
150
151      !* Variable for chemistry of the CO2 cycle
152      ALLOCATE( akb3(jpi,jpj,jpk)    , ak13  (jpi,jpj,jpk) ,       &
153         &      ak23(jpi,jpj,jpk)    , aksp  (jpi,jpj,jpk) ,       &
154         &      akw3(jpi,jpj,jpk)    , borat (jpi,jpj,jpk) ,       &
155         &      hi  (jpi,jpj,jpk)    , excess(jpi,jpj,jpk) ,     STAT=ierr(4) )
156         !
157      !* Temperature dependancy of SMS terms
158      ALLOCATE( tgfunc(jpi,jpj,jpk)  , tgfunc2(jpi,jpj,jpk) ,    STAT=ierr(5) )
159         !
160      !* Array used to indicate negative tracer values 
161      ALLOCATE( xnegtr(jpi,jpj,jpk)  ,                           STAT=ierr(6) )
162#endif
163      !
164      sms_pisces_alloc = MAXVAL( ierr )
165      !
166      IF( sms_pisces_alloc /= 0 )   CALL ctl_warn('sms_pisces_alloc: failed to allocate arrays') 
167      !
168   END FUNCTION sms_pisces_alloc
169
170#else
171   !!----------------------------------------------------------------------   
172   !!  Empty module :                                     NO PISCES model
173   !!----------------------------------------------------------------------
174#endif
175   
176   !!======================================================================   
177END MODULE sms_pisces   
Note: See TracBrowser for help on using the repository browser.