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 12608 for NEMO/branches/2020/ticket2377 – NEMO

Ignore:
Timestamp:
2020-03-26T11:52:25+01:00 (4 years ago)
Author:
smueller
Message:

Removal of the needless tracking of the freshwater-budget adjustment flux for the previous year (variable a_fwb_b) in option 2 of the freshwater-budget adjustment mechanism (ticket #2377)

Location:
NEMO/branches/2020/ticket2377/src/OCE
Files:
3 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2020/ticket2377/src/OCE/IOM/iom.F90

    r12602 r12608  
    547547        i = i + 1; fields(i)%vname="hbli";           fields(i)%grid="grid_N" 
    548548        i = i + 1; fields(i)%vname="wn";             fields(i)%grid="grid_N_3D" 
    549         i = i + 1; fields(i)%vname="a_fwb_b";        fields(i)%grid="grid_scalar" 
    550549        i = i + 1; fields(i)%vname="a_fwb";          fields(i)%grid="grid_scalar" 
    551550 
  • NEMO/branches/2020/ticket2377/src/OCE/IOM/iom_def.F90

    r12602 r12608  
    6767   END TYPE file_descriptor 
    6868   TYPE(file_descriptor), DIMENSION(jpmax_files), PUBLIC ::   iom_file !: array containing the info for all opened files 
    69    INTEGER, PARAMETER, PUBLIC                   :: max_rst_fields = 97 !: maximum number of restart variables defined in iom_set_rst_vars 
     69   INTEGER, PARAMETER, PUBLIC                   :: max_rst_fields = 96 !: maximum number of restart variables defined in iom_set_rst_vars 
    7070   TYPE, PUBLIC :: RST_FIELD   
    7171    CHARACTER(len=30) :: vname = "NO_NAME" ! names of variables in restart file 
  • NEMO/branches/2020/ticket2377/src/OCE/SBC/sbcfwb.F90

    r12602 r12608  
    3535   PUBLIC   sbc_fwb    ! routine called by step 
    3636 
    37    REAL(wp) ::   a_fwb_b   ! annual domain averaged freshwater budget 
    38    REAL(wp) ::   a_fwb     ! for 2 year before (_b) and before year. 
     37   REAL(wp) ::   a_fwb     ! annual domain averaged freshwater budget from the 
     38                           ! previous year 
    3939   REAL(wp) ::   fwfold    ! fwfold to be suppressed 
    4040   REAL(wp) ::   area      ! global mean ocean surface (interior domain) 
     
    116116         IF( kt == nit000 ) THEN                      ! initialisation 
    117117            !                                         ! Read the corrective factor on precipitations (fwfold) 
    118             IF ( ln_rstart .AND. iom_varid( numror, 'a_fwb_b', ldstop = .FALSE. ) > 0     & 
    119                &           .AND. iom_varid( numror, 'a_fwb',   ldstop = .FALSE. ) > 0 ) THEN 
     118            IF ( ln_rstart .AND. iom_varid( numror, 'a_fwb',   ldstop = .FALSE. ) > 0 ) THEN 
    120119               IF(lwp) WRITE(numout,*) 'sbc_fwb : reading FW-budget adjustment from restart file' 
    121                CALL iom_get( numror, 'a_fwb_b', a_fwb_b, ldxios = lrxios ) 
    122120               CALL iom_get( numror, 'a_fwb',   a_fwb,   ldxios = lrxios ) 
    123121            ELSE 
    124122               CALL ctl_opn( inum, 'EMPave_old.dat', 'OLD', 'FORMATTED', 'SEQUENTIAL', -1, numout, .FALSE. ) 
    125                READ ( inum, "(24X,I8,2ES24.16)" ) iyear, a_fwb_b, a_fwb 
     123               READ ( inum, "(24X,I8,2ES24.16)" ) iyear, a_fwb 
    126124               CLOSE( inum ) 
    127125            END IF 
     
    131129            IF(lwp)WRITE(numout,*)'sbc_fwb : year = ',iyear  , ' freshwater budget correction = ', fwfold 
    132130            IF(lwp)WRITE(numout,*)'          year = ',iyear-1, ' freshwater budget read       = ', a_fwb 
    133             IF(lwp)WRITE(numout,*)'          year = ',iyear-2, ' freshwater budget read       = ', a_fwb_b 
    134131            ! 
    135132            IF( lwxios ) THEN                         ! Activate output of restart variables 
    136                CALL iom_set_rstw_var_active( 'a_fwb_b' ) 
    137133               CALL iom_set_rstw_var_active( 'a_fwb'   ) 
    138134            END IF 
     
    141137         ikty = 365 * 86400 / rn_Dt                  !!bug  use of 365 days leap year or 360d year !!!!!!! 
    142138         IF( MOD( kt, ikty ) == 0 ) THEN 
    143             a_fwb_b = a_fwb                           ! mean sea level taking into account the ice+snow 
     139                                                      ! mean sea level taking into account the ice+snow 
    144140                                                      ! sum over the global domain 
    145141            a_fwb   = glob_sum( 'sbcfwb', e1e2t(:,:) * ( ssh(:,:,Kmm) + snwice_mass(:,:) * r1_rho0 ) ) 
     
    161157            IF(lwp) WRITE(numout,*) '~~~~' 
    162158            IF( lwxios ) CALL iom_swap( cwxios_context ) 
    163             CALL iom_rstput( kt, nitrst, numrow, 'a_fwb_b', a_fwb_b, ldxios = lwxios ) 
    164159            CALL iom_rstput( kt, nitrst, numrow, 'a_fwb',   a_fwb,   ldxios = lwxios ) 
    165160            IF( lwxios ) CALL iom_swap( cxios_context  ) 
     
    168163         IF( kt == nitend .AND. lwm ) THEN            ! save fwfold value in a file (only one required) 
    169164            CALL ctl_opn( inum, 'EMPave.dat', 'REPLACE', 'FORMATTED', 'SEQUENTIAL', -1, numout, .FALSE., narea ) 
    170             WRITE( inum, "(24X,I8,2ES24.16)" ) nyear, a_fwb_b, a_fwb 
     165            WRITE( inum, "(24X,I8,2ES24.16)" ) nyear, a_fwb 
    171166            CLOSE( inum ) 
    172167         ENDIF 
Note: See TracChangeset for help on using the changeset viewer.