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.
trcini_c14.F90 in branches/UKMO/r8395_India_uncoupled/NEMOGCM/NEMO/TOP_SRC/C14 – NEMO

source: branches/UKMO/r8395_India_uncoupled/NEMOGCM/NEMO/TOP_SRC/C14/trcini_c14.F90 @ 10684

Last change on this file since 10684 was 10684, checked in by jcastill, 5 years ago

Remove svn keywords

File size: 3.4 KB
Line 
1MODULE trcini_c14
2   !!======================================================================
3   !!                         ***  MODULE trcini_c14  ***
4   !! TOP :   initialisation of the C14 tracers
5   !!======================================================================
6   !! History :   2.0  !  2007-12  (C. Ethe, G. Madec) Original code
7   !! History :   3.0  !  2015 (A. Mouchet) C14 Code
8   !!----------------------------------------------------------------------
9   !! trc_ini_c14   : C14 model initialisation
10   !!----------------------------------------------------------------------
11   USE par_trc         ! TOP parameters
12   USE oce_trc
13   USE trc
14   USE sms_c14
15   USE trcatm_c14
16   USE trcnam_c14
17   USE iom
18
19   IMPLICIT NONE
20   PRIVATE
21
22   PUBLIC   trc_ini_c14   ! called by trcini.F90 module
23   
24   !
25
26   !!----------------------------------------------------------------------
27   !! NEMO/TOP 3.3 , NEMO Consortium (2010)
28   !! $Id$
29   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt)
30   !!----------------------------------------------------------------------
31CONTAINS
32
33   SUBROUTINE trc_ini_c14
34      !!----------------------------------------------------------------------
35      !!                     ***  trc_ini_c14  *** 
36      !!
37      !! ** Purpose :   initialization for C14 model
38      !!
39      !! ** Method  :
40      !!----------------------------------------------------------------------
41      !
42      REAL(wp) :: ztrai
43      INTEGER  :: jn
44      CHARACTER(len = 20)  ::  cltra
45      !!----------------------------------------------------------------------
46      !
47      CALL trc_nam_c14
48      !                       ! Allocate c14 arrays
49      IF( sms_c14_alloc() /= 0 )   CALL ctl_stop( 'STOP', 'trc_ini_c14: unable to allocate C14 arrays' )
50
51      IF(lwp) WRITE(numout,*)
52      IF(lwp) WRITE(numout,*) ' trc_ini_c14: initialisation of C14 model'
53      !
54      IF( .NOT. ln_rsttr )  THEN
55         !
56         IF(lwp) WRITE(numout,*) '                      ==>    PRESCRIBED initial VALUES'
57         IF(lwp) WRITE(numout,*) '                      ==>    Ocean C14/C :', rc14init 
58         !
59         trn(:,:,:,jp_c14) = rc14init * tmask(:,:,:)
60         !
61         qtr_c14(:,:) = 0._wp           ! Init of air-sea BC
62         !
63      ELSE
64
65        IF(lwp) WRITE(numout,*)
66        IF(lwp) WRITE(numout,*) ' trc_rst_read_c14 : Read specific variables for c14 model '
67        IF(lwp) WRITE(numout,*) ' ~~~~~~~~~~~~~~'
68        !
69        CALL iom_get( numrtr, 'co2sbc', co2sbc ) 
70        CALL iom_get( numrtr, jpdom_autoglo, 'c14sbc', c14sbc ) 
71        CALL iom_get( numrtr, jpdom_autoglo, 'exch_co2', exch_co2 ) 
72        CALL iom_get( numrtr, jpdom_autoglo, 'exch_c14', exch_c14 ) 
73        CALL iom_get( numrtr, jpdom_autoglo, 'qtr_c14', qtr_c14 )
74        !
75      END IF
76      !
77      IF( ( nn_rsttr == 0 ) .OR. ( .NOT. ln_rsttr ) ) THEN
78      !
79      !                         !  qint set to zero <=== Initial of transient
80      !                         !                   <=== Restart=false
81         IF(lwp) WRITE(numout,*) '                    ==>    qint reset to ZERO '
82         qint_c14(:,:) = 0._wp
83      !
84      ELSE
85        !
86        CALL iom_get( numrtr, jpdom_autoglo, 'qint_c14', qint_c14 ) 
87        !
88      ENDIF
89      !
90      CALL trc_atm_c14_ini   ! Init atm values
91      !
92      IF(lwp) WRITE(numout,*) ' ~~~~~~~~~~~~~~'
93      !
94   END SUBROUTINE trc_ini_c14
95
96   !!======================================================================
97END MODULE trcini_c14
Note: See TracBrowser for help on using the repository browser.