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 12276 for NEMO/trunk/src/OCE/SBC/sbccpl.F90 – NEMO

Ignore:
Timestamp:
2019-12-20T12:14:26+01:00 (4 years ago)
Author:
cetlod
Message:

trunk : merge in some cmip6 diagnostics into the trunk before copying it to release-4.0.2(-head). SETTE tests are OK and the is no difference with the revision 12248

File:
1 edited

Legend:

Unmodified
Added
Removed
  • NEMO/trunk/src/OCE/SBC/sbccpl.F90

    r12171 r12276  
    573573      IF ( TRIM( sn_rcv_emp%clcat    ) == 'yes' )   srcv(jpr_ievp)%nct       = nn_cats_cpl 
    574574 
    575 #if defined key_si3 
    576       IF( ln_cndflx .AND. .NOT.ln_cndemulate ) THEN  
    577          IF( .NOT.srcv(jpr_ts_ice)%laction )  & 
    578             &   CALL ctl_stop( 'sbc_cpl_init: srcv(jpr_ts_ice)%laction should be set to true when ln_cndflx=T' )      
    579       ENDIF 
    580 #endif 
    581575      !                                                      ! ------------------------- ! 
    582576      !                                                      !      Wave breaking        !     
     
    868862      ELSE IF( sn_snd_crt%clvgrd /= 'T' ) THEN   
    869863         CALL ctl_stop( 'sn_snd_crt%clvgrd must be equal to T' ) 
     864         ssnd(jps_ocx1:jps_ivz1)%clgrid  = 'T'      ! all oce and ice components on the same unique grid 
    870865      ENDIF 
    871866      ssnd(jps_ocx1:jps_ivz1)%laction = .TRUE.   ! default: all are send 
     
    10451040      ENDIF 
    10461041      xcplmask(:,:,0) = 1. - SUM( xcplmask(:,:,1:nn_cplmodel), dim = 3 ) 
     1042      ! 
     1043      ncpl_qsr_freq = cpl_freq( 'O_QsrOce' ) + cpl_freq( 'O_QsrMix' ) + cpl_freq( 'I_QsrOce' ) + cpl_freq( 'I_QsrMix' ) 
     1044      IF( ln_dm2dc .AND. ln_cpl .AND. ncpl_qsr_freq /= 86400 )   & 
     1045         &   CALL ctl_stop( 'sbc_cpl_init: diurnal cycle reconstruction (ln_dm2dc) needs daily couping for solar radiation' ) 
     1046      IF( ln_dm2dc .AND. ln_cpl ) ncpl_qsr_freq = 86400 / ncpl_qsr_freq 
    10471047      ! 
    10481048   END SUBROUTINE sbc_cpl_init 
     
    11101110      REAL(wp), DIMENSION(jpi,jpj) ::   ztx, zty, zmsk, zemp, zqns, zqsr 
    11111111      !!---------------------------------------------------------------------- 
    1112       ! 
    1113       IF( kt == nit000 ) THEN 
    1114       !   cannot be done in the init phase when we use agrif as cpl_freq requires that oasis_enddef is done 
    1115          ncpl_qsr_freq = cpl_freq( 'O_QsrOce' ) + cpl_freq( 'O_QsrMix' ) + cpl_freq( 'I_QsrOce' ) + cpl_freq( 'I_QsrMix' ) 
    1116          IF( ln_dm2dc .AND. ncpl_qsr_freq /= 86400 )   & 
    1117             &   CALL ctl_stop( 'sbc_cpl_rcv: diurnal cycle reconstruction (ln_dm2dc) needs daily couping for solar radiation' ) 
    1118          ncpl_qsr_freq = 86400 / ncpl_qsr_freq   ! used by top 
    1119       ENDIF 
    11201112      ! 
    11211113      IF( ln_mixcpl )   zmsk(:,:) = 1. - xcplmask(:,:,0) 
     
    12511243      IF( srcv(jpr_co2)%laction )   atm_co2(:,:) = frcv(jpr_co2)%z3(:,:,1) 
    12521244      ! 
     1245      !                                                      ! ================== ! 
     1246      !                                                      !   ice skin temp.   ! 
     1247      !                                                      ! ================== ! 
     1248#if defined key_si3 
     1249      ! needed by Met Office 
     1250      IF( srcv(jpr_ts_ice)%laction ) THEN  
     1251         WHERE    ( frcv(jpr_ts_ice)%z3(:,:,:) > 0.0  )   ;   tsfc_ice(:,:,:) = 0.0  
     1252         ELSEWHERE( frcv(jpr_ts_ice)%z3(:,:,:) < -60. )   ;   tsfc_ice(:,:,:) = -60. 
     1253         ELSEWHERE                                        ;   tsfc_ice(:,:,:) = frcv(jpr_ts_ice)%z3(:,:,:) 
     1254         END WHERE 
     1255      ENDIF  
     1256#endif 
    12531257      !                                                      ! ========================= !  
    12541258      !                                                      ! Mean Sea Level Pressure   !   (taum)  
     
    16261630      !!                   sprecip           solid precipitation over the ocean   
    16271631      !!---------------------------------------------------------------------- 
    1628       REAL(wp), INTENT(in)   , DIMENSION(:,:)             ::   picefr     ! ice fraction                [0 to 1] 
    1629       !                                                   !!           ! optional arguments, used only in 'mixed oce-ice' case or for Met-Office coupling 
    1630       REAL(wp), INTENT(in)   , DIMENSION(:,:,:), OPTIONAL ::   palbi      ! all skies ice albedo  
    1631       REAL(wp), INTENT(in)   , DIMENSION(:,:  ), OPTIONAL ::   psst       ! sea surface temperature     [Celsius] 
    1632       REAL(wp), INTENT(inout), DIMENSION(:,:,:), OPTIONAL ::   pist       ! ice surface temperature     [Kelvin] => inout for Met-Office 
    1633       REAL(wp), INTENT(in)   , DIMENSION(:,:,:), OPTIONAL ::   phs        ! snow depth                  [m] 
    1634       REAL(wp), INTENT(in)   , DIMENSION(:,:,:), OPTIONAL ::   phi        ! ice thickness               [m] 
     1632      REAL(wp), INTENT(in), DIMENSION(:,:)             ::   picefr     ! ice fraction                [0 to 1] 
     1633      !                                                !!           ! optional arguments, used only in 'mixed oce-ice' case 
     1634      REAL(wp), INTENT(in), DIMENSION(:,:,:), OPTIONAL ::   palbi      ! all skies ice albedo  
     1635      REAL(wp), INTENT(in), DIMENSION(:,:  ), OPTIONAL ::   psst       ! sea surface temperature     [Celsius] 
     1636      REAL(wp), INTENT(in), DIMENSION(:,:,:), OPTIONAL ::   pist       ! ice surface temperature     [Kelvin] 
     1637      REAL(wp), INTENT(in), DIMENSION(:,:,:), OPTIONAL ::   phs        ! snow depth                  [m] 
     1638      REAL(wp), INTENT(in), DIMENSION(:,:,:), OPTIONAL ::   phi        ! ice thickness               [m] 
    16351639      ! 
    16361640      INTEGER  ::   ji, jj, jl   ! dummy loop index 
     
    16391643      REAL(wp), DIMENSION(jpi,jpj)     ::   zemp_tot, zemp_ice, zemp_oce, ztprecip, zsprecip  , zevap_oce, zdevap_ice 
    16401644      REAL(wp), DIMENSION(jpi,jpj)     ::   zqns_tot, zqns_oce, zqsr_tot, zqsr_oce, zqprec_ice, zqemp_oce, zqemp_ice 
    1641       REAL(wp), DIMENSION(jpi,jpj,jpl) ::   zqns_ice, zqsr_ice, zdqns_ice, zqevap_ice, zevap_ice, zqtr_ice_top, ztsu 
     1645      REAL(wp), DIMENSION(jpi,jpj,jpl) ::   zqns_ice, zqsr_ice, zdqns_ice, zqevap_ice, zevap_ice    !!gm , zfrqsr_tr_i 
    16421646      !!---------------------------------------------------------------------- 
    16431647      ! 
     
    17701774      IF( iom_use('snow_ao_cea') )  CALL iom_put( 'snow_ao_cea' , sprecip(:,:) * ( 1._wp - zsnw(:,:) )                  )  ! Snow over ice-free ocean  (cell average) 
    17711775      IF( iom_use('snow_ai_cea') )  CALL iom_put( 'snow_ai_cea' , sprecip(:,:) *           zsnw(:,:)                    )  ! Snow over sea-ice         (cell average) 
     1776      IF( iom_use('rain_ao_cea') )  CALL iom_put( 'rain_ao_cea' , ( tprecip(:,:) - sprecip(:,:) ) * picefr(:,:)         )  ! liquid precipitation over ocean (cell average) 
    17721777      IF( iom_use('subl_ai_cea') )  CALL iom_put( 'subl_ai_cea' , frcv(jpr_ievp)%z3(:,:,1) * picefr(:,:) * tmask(:,:,1) )  ! Sublimation over sea-ice (cell average) 
    17731778      IF( iom_use('evap_ao_cea') )  CALL iom_put( 'evap_ao_cea' , ( frcv(jpr_tevp)%z3(:,:,1)  & 
     
    18061811! ** NEED TO SORT OUT HOW THIS SHOULD WORK IN THE MULTI-CATEGORY CASE - CURRENTLY NOT ALLOWED WHEN INTERFACE INITIALISED ** 
    18071812         zqns_tot(:,:  ) = frcv(jpr_qnsmix)%z3(:,:,1) 
    1808          IF ( TRIM(sn_rcv_qsr%clcat) == 'yes' ) THEN 
    1809             DO jl = 1, jpl 
    1810                zqns_ice(:,:,jl) = frcv(jpr_qnsmix)%z3(:,:,jl)    & 
    1811                   &             + frcv(jpr_dqnsdt)%z3(:,:,jl) * ( pist(:,:,jl) - ( ( rt0 + psst(:,:) ) * ziceld(:,:)   & 
    1812                   &                                                                + pist(:,:,jl) * picefr(:,:) ) ) 
    1813             END DO 
    1814          ELSE 
    1815             DO jl = 1, jpl 
    1816                zqns_ice(:,:,jl) = frcv(jpr_qnsmix)%z3(:,:, 1)    & 
    1817                   &             + frcv(jpr_dqnsdt)%z3(:,:, 1) * ( pist(:,:,jl) - ( ( rt0 + psst(:,:) ) * ziceld(:,:)   & 
    1818                   &                                                                + pist(:,:,jl) * picefr(:,:) ) ) 
    1819             END DO 
    1820          ENDIF 
     1813         zqns_ice(:,:,1) = frcv(jpr_qnsmix)%z3(:,:,1)    & 
     1814            &            + frcv(jpr_dqnsdt)%z3(:,:,1) * ( pist(:,:,1) - ( (rt0 + psst(:,:  ) ) * ziceld(:,:)   & 
     1815            &                                           + pist(:,:,1) * picefr(:,:) ) ) 
    18211816      END SELECT 
    18221817      !                                      
     
    19031898#endif 
    19041899      ! outputs 
    1905       IF ( srcv(jpr_cal)%laction       ) CALL iom_put('hflx_cal_cea'    , - frcv(jpr_cal)%z3(:,:,1) * rLfus )                      ! latent heat from calving 
    1906       IF ( srcv(jpr_icb)%laction       ) CALL iom_put('hflx_icb_cea'    , - frcv(jpr_icb)%z3(:,:,1) * rLfus )                      ! latent heat from icebergs melting 
    1907       IF ( iom_use('hflx_rain_cea')    ) CALL iom_put('hflx_rain_cea'   , ( tprecip(:,:) - sprecip(:,:) ) * zcptrain(:,:) )        ! heat flux from rain (cell average) 
    1908       IF ( iom_use('hflx_evap_cea')    ) CALL iom_put('hflx_evap_cea'   , ( frcv(jpr_tevp)%z3(:,:,1) - frcv(jpr_ievp)%z3(:,:,1) & 
     1900      IF( srcv(jpr_cal)%laction       ) CALL iom_put('hflx_cal_cea'    , - frcv(jpr_cal)%z3(:,:,1) * rLfus )                      ! latent heat from calving 
     1901      IF( srcv(jpr_icb)%laction       ) CALL iom_put('hflx_icb_cea'    , - frcv(jpr_icb)%z3(:,:,1) * rLfus )                      ! latent heat from icebergs melting 
     1902      IF( iom_use('hflx_rain_cea')    ) CALL iom_put('hflx_rain_cea'   , ( tprecip(:,:) - sprecip(:,:) ) * zcptrain(:,:) )        ! heat flux from rain (cell average) 
     1903      IF( iom_use('hflx_evap_cea')    ) CALL iom_put('hflx_evap_cea'   , ( frcv(jpr_tevp)%z3(:,:,1) - frcv(jpr_ievp)%z3(:,:,1) & 
    19091904           &                                                              * picefr(:,:) ) * zcptn(:,:) * tmask(:,:,1) )            ! heat flux from evap (cell average) 
    1910       IF ( iom_use('hflx_snow_cea')    ) CALL iom_put('hflx_snow_cea'   , sprecip(:,:) * ( zcptsnw(:,:) - rLfus )  )               ! heat flux from snow (cell average) 
    1911       IF ( iom_use('hflx_snow_ao_cea') ) CALL iom_put('hflx_snow_ao_cea', sprecip(:,:) * ( zcptsnw(:,:) - rLfus ) & 
     1905      IF( iom_use('hflx_prec_cea')    ) CALL iom_put('hflx_prec_cea'   ,  sprecip(:,:) * ( zcptsnw(:,:) - rLfus ) +  &                    ! heat flux from all precip (cell avg) 
     1906         &                                                               ( tprecip(:,:) - sprecip(:,:) ) * zcptrain(:,:) ) 
     1907      IF( iom_use('hflx_snow_cea')    ) CALL iom_put('hflx_snow_cea'   , sprecip(:,:) * ( zcptsnw(:,:) - rLfus )  )               ! heat flux from snow (cell average) 
     1908      IF( iom_use('hflx_snow_ao_cea') ) CALL iom_put('hflx_snow_ao_cea', sprecip(:,:) * ( zcptsnw(:,:) - rLfus ) & 
    19121909           &                                                              * ( 1._wp - zsnw(:,:) )                  )               ! heat flux from snow (over ocean) 
    1913       IF ( iom_use('hflx_snow_ai_cea') ) CALL iom_put('hflx_snow_ai_cea', sprecip(:,:) * ( zcptsnw(:,:) - rLfus ) &  
     1910      IF( iom_use('hflx_snow_ai_cea') ) CALL iom_put('hflx_snow_ai_cea', sprecip(:,:) * ( zcptsnw(:,:) - rLfus ) &  
    19141911           &                                                              *           zsnw(:,:)                    )               ! heat flux from snow (over ice) 
    19151912      ! note: hflx for runoff and iceshelf are done in sbcrnf and sbcisf resp. 
     
    19301927            END DO 
    19311928         ENDIF 
     1929         zqsr_tot(:,:  ) = frcv(jpr_qsrmix)%z3(:,:,1) 
     1930         zqsr_ice(:,:,1) = frcv(jpr_qsrice)%z3(:,:,1) 
    19321931      CASE( 'oce and ice' ) 
    19331932         zqsr_tot(:,:  ) =  ziceld(:,:) * frcv(jpr_qsroce)%z3(:,:,1) 
     
    19491948!       Create solar heat flux over ice using incoming solar heat flux and albedos 
    19501949!       ( see OASIS3 user guide, 5th edition, p39 ) 
    1951          IF ( TRIM(sn_rcv_qsr%clcat) == 'yes' ) THEN 
    1952             DO jl = 1, jpl 
    1953                zqsr_ice(:,:,jl) = frcv(jpr_qsrmix)%z3(:,:,jl) * ( 1.- palbi(:,:,jl) )   & 
    1954                   &            / (  1.- ( alb_oce_mix(:,:   ) * ziceld(:,:)       & 
    1955                   &                     + palbi      (:,:,jl) * picefr(:,:) ) ) 
    1956             END DO 
    1957          ELSE 
    1958             DO jl = 1, jpl 
    1959                zqsr_ice(:,:,jl) = frcv(jpr_qsrmix)%z3(:,:, 1) * ( 1.- palbi(:,:,jl) )   & 
    1960                   &            / (  1.- ( alb_oce_mix(:,:   ) * ziceld(:,:)       & 
    1961                   &                     + palbi      (:,:,jl) * picefr(:,:) ) ) 
    1962             END DO 
    1963          ENDIF 
     1950         zqsr_ice(:,:,1) = frcv(jpr_qsrmix)%z3(:,:,1) * ( 1.- palbi(:,:,1) )   & 
     1951            &            / (  1.- ( alb_oce_mix(:,:  ) * ziceld(:,:)       & 
     1952            &                     + palbi      (:,:,1) * picefr(:,:) ) ) 
    19641953      CASE( 'none'      )       ! Not available as for now: needs additional coding   
    19651954      !                         ! since fields received, here zqsr_tot,  are not defined with none option 
     
    20212010      !                                                      ! ========================= ! 
    20222011      CASE ('coupled') 
    2023          IF( ln_mixcpl ) THEN 
    2024             DO jl=1,jpl 
    2025                qml_ice(:,:,jl) = qml_ice(:,:,jl) * xcplmask(:,:,0) + frcv(jpr_topm)%z3(:,:,jl) * zmsk(:,:) 
    2026                qcn_ice(:,:,jl) = qcn_ice(:,:,jl) * xcplmask(:,:,0) + frcv(jpr_botm)%z3(:,:,jl) * zmsk(:,:) 
    2027             ENDDO 
    2028          ELSE 
    2029             qml_ice(:,:,:) = frcv(jpr_topm)%z3(:,:,:) 
    2030             qcn_ice(:,:,:) = frcv(jpr_botm)%z3(:,:,:) 
    2031          ENDIF 
     2012         qml_ice(:,:,:) = frcv(jpr_topm)%z3(:,:,:) 
     2013         qcn_ice(:,:,:) = frcv(jpr_botm)%z3(:,:,:) 
    20322014      END SELECT 
     2015      ! 
    20332016      !                                                      ! ========================= ! 
    20342017      !                                                      !      Transmitted Qsr      !   [W/m2] 
     
    20372020         ! 
    20382021         !                    ! ===> used prescribed cloud fraction representative for polar oceans in summer (0.81) 
    2039          ztri = 0.18 * ( 1.0 - cldf_ice ) + 0.35 * cldf_ice    ! surface transmission when hi>10cm (Grenfell Maykut 77) 
     2022         ztri = 0.18 * ( 1.0 - cldf_ice ) + 0.35 * cldf_ice    ! surface transmission parameter (Grenfell Maykut 77) 
    20402023         ! 
    2041          WHERE    ( phs(:,:,:) <= 0._wp .AND. phi(:,:,:) <  0.1_wp )       ! linear decrease from hi=0 to 10cm   
    2042             zqtr_ice_top(:,:,:) = qsr_ice(:,:,:) * ( ztri + ( 1._wp - ztri ) * ( 1._wp - phi(:,:,:) * 10._wp ) ) 
    2043          ELSEWHERE( phs(:,:,:) <= 0._wp .AND. phi(:,:,:) >= 0.1_wp )       ! constant (ztri) when hi>10cm 
    2044             zqtr_ice_top(:,:,:) = qsr_ice(:,:,:) * ztri 
    2045          ELSEWHERE                                                         ! zero when hs>0 
    2046             zqtr_ice_top(:,:,:) = 0._wp 
    2047          END WHERE 
     2024         qtr_ice_top(:,:,:) = ztri * qsr_ice(:,:,:) 
     2025         WHERE( phs(:,:,:) >= 0.0_wp )   qtr_ice_top(:,:,:) = 0._wp            ! snow fully opaque 
     2026         WHERE( phi(:,:,:) <= 0.1_wp )   qtr_ice_top(:,:,:) = qsr_ice(:,:,:)   ! thin ice transmits all solar radiation 
    20482027         !      
    20492028      ELSEIF( ln_cndflx .AND. .NOT.ln_cndemulate ) THEN      !==  conduction flux as surface forcing  ==! 
     
    20512030         !                    ! ===> here we must receive the qtr_ice_top array from the coupler 
    20522031         !                           for now just assume zero (fully opaque ice) 
    2053          zqtr_ice_top(:,:,:) = 0._wp 
    2054          ! 
    2055       ENDIF 
    2056       ! 
    2057       IF( ln_mixcpl ) THEN 
    2058          DO jl=1,jpl 
    2059             qtr_ice_top(:,:,jl) = qtr_ice_top(:,:,jl) * xcplmask(:,:,0) + zqtr_ice_top(:,:,jl) * zmsk(:,:) 
    2060          ENDDO 
    2061       ELSE 
    2062          qtr_ice_top(:,:,:) = zqtr_ice_top(:,:,:) 
    2063       ENDIF 
    2064       !                                                      ! ================== ! 
    2065       !                                                      !   ice skin temp.   ! 
    2066       !                                                      ! ================== ! 
    2067       ! needed by Met Office 
    2068       IF( srcv(jpr_ts_ice)%laction ) THEN  
    2069          WHERE    ( frcv(jpr_ts_ice)%z3(:,:,:) > 0.0  )   ;   ztsu(:,:,:) =   0. + rt0  
    2070          ELSEWHERE( frcv(jpr_ts_ice)%z3(:,:,:) < -60. )   ;   ztsu(:,:,:) = -60. + rt0 
    2071          ELSEWHERE                                        ;   ztsu(:,:,:) = frcv(jpr_ts_ice)%z3(:,:,:) + rt0 
    2072          END WHERE 
    2073          ! 
    2074          IF( ln_mixcpl ) THEN 
    2075             DO jl=1,jpl 
    2076                pist(:,:,jl) = pist(:,:,jl) * xcplmask(:,:,0) + ztsu(:,:,jl) * zmsk(:,:) 
    2077             ENDDO 
    2078          ELSE 
    2079             pist(:,:,:) = ztsu(:,:,:) 
    2080          ENDIF 
     2032         qtr_ice_top(:,:,:) = 0._wp 
    20812033         ! 
    20822034      ENDIF 
     
    22412193         CASE default    ;   CALL ctl_stop( 'sbc_cpl_snd: wrong definition of sn_snd_thick%clcat' ) 
    22422194         END SELECT 
    2243          CALL cpl_snd( jps_fice, isec, ztmp3, info ) 
     2195         IF( ssnd(jps_fice)%laction )   CALL cpl_snd( jps_fice, isec, ztmp3, info ) 
    22442196      ENDIF 
    22452197 
     
    23012253      !                                                      !      Ice melt ponds       !  
    23022254      !                                                      ! ------------------------- ! 
    2303       ! needed by Met Office: 1) fraction of ponded ice 2) local/actual pond depth  
     2255      ! needed by Met Office 
    23042256      IF( ssnd(jps_a_p)%laction .OR. ssnd(jps_ht_p)%laction ) THEN  
    23052257         SELECT CASE( sn_snd_mpnd%cldes)   
     
    23072259            SELECT CASE( sn_snd_mpnd%clcat )   
    23082260            CASE( 'yes' )   
    2309                ztmp3(:,:,1:jpl) =  a_ip_frac(:,:,1:jpl) 
    2310                ztmp4(:,:,1:jpl) =  h_ip(:,:,1:jpl)   
     2261               ztmp3(:,:,1:jpl) =  a_ip(:,:,1:jpl) 
     2262               ztmp4(:,:,1:jpl) =  v_ip(:,:,1:jpl)   
    23112263            CASE( 'no' )   
    23122264               ztmp3(:,:,:) = 0.0   
    23132265               ztmp4(:,:,:) = 0.0   
    23142266               DO jl=1,jpl   
    2315                  ztmp3(:,:,1) = ztmp3(:,:,1) + a_ip_frac(:,:,jpl)   
    2316                  ztmp4(:,:,1) = ztmp4(:,:,1) + h_ip(:,:,jpl)  
     2267                 ztmp3(:,:,1) = ztmp3(:,:,1) + a_ip(:,:,jpl)   
     2268                 ztmp4(:,:,1) = ztmp4(:,:,1) + v_ip(:,:,jpl)  
    23172269               ENDDO   
    23182270            CASE default   ;   CALL ctl_stop( 'sbc_cpl_snd: wrong definition of sn_snd_mpnd%clcat' )   
     
    23522304      !                                                      !  CO2 flux from PISCES     !  
    23532305      !                                                      ! ------------------------- ! 
    2354       IF( ssnd(jps_co2)%laction .AND. l_co2cpl )   CALL cpl_snd( jps_co2, isec, RESHAPE ( oce_co2, (/jpi,jpj,1/) ) , info ) 
     2306      IF( ssnd(jps_co2)%laction .AND. l_co2cpl )   THEN  
     2307         ztmp1(:,:) = oce_co2(:,:) * 1000.  ! conversion in molC/m2/s 
     2308         CALL cpl_snd( jps_co2, isec, RESHAPE ( ztmp1, (/jpi,jpj,1/) ) , info ) 
     2309      ENDIF 
    23552310      ! 
    23562311      !                                                      ! ------------------------- ! 
Note: See TracChangeset for help on using the changeset viewer.