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 10365 for NEMO – NEMO

Changeset 10365 for NEMO


Ignore:
Timestamp:
2018-12-01T12:33:31+01:00 (5 years ago)
Author:
smasson
Message:

dev_r10164_HPC09_ESIWACE_PREP_MERGE: merge with dev_r9866_HPC_03_globcom, see #2133

Location:
NEMO/branches/2018/dev_r10164_HPC09_ESIWACE_PREP_MERGE/src
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2018/dev_r10164_HPC09_ESIWACE_PREP_MERGE/src/ICE/icedyn_rhg_evp.F90

    r10345 r10365  
    143143      REAL(wp), DIMENSION(jpi,jpj) ::   zds                             ! shear 
    144144      REAL(wp), DIMENSION(jpi,jpj) ::   zs1, zs2, zs12                  ! stress tensor components 
    145       REAL(wp), DIMENSION(jpi,jpj) ::   zu_ice, zv_ice, zresr           ! check convergence 
     145!!$      REAL(wp), DIMENSION(jpi,jpj) ::   zu_ice, zv_ice, zresr           ! check convergence 
    146146      REAL(wp), DIMENSION(jpi,jpj) ::   zssh_lead_m                     ! array used for the calculation of ice surface slope: 
    147147      !                                                                 !    ocean surface (ssh_m) if ice is not embedded 
     
    324324      DO jter = 1 , nn_nevp                           !    loop over jter    ! 
    325325         !                                            !----------------------!         
    326          IF(ln_ctl) THEN   ! Convergence test 
    327             DO jj = 1, jpjm1 
    328                zu_ice(:,jj) = u_ice(:,jj) ! velocity at previous time step 
    329                zv_ice(:,jj) = v_ice(:,jj) 
    330             END DO 
    331          ENDIF 
     326!!$         IF(ln_ctl) THEN   ! Convergence test 
     327!!$            DO jj = 1, jpjm1 
     328!!$               zu_ice(:,jj) = u_ice(:,jj) ! velocity at previous time step 
     329!!$               zv_ice(:,jj) = v_ice(:,jj) 
     330!!$            END DO 
     331!!$         ENDIF 
    332332 
    333333         ! --- divergence, tension & shear (Appendix B of Hunke & Dukowicz, 2002) --- ! 
     
    636636            ! 
    637637         ENDIF 
    638           
    639          IF(ln_ctl) THEN   ! Convergence test 
    640             DO jj = 2 , jpjm1 
    641                zresr(:,jj) = MAX( ABS( u_ice(:,jj) - zu_ice(:,jj) ), ABS( v_ice(:,jj) - zv_ice(:,jj) ) ) 
    642             END DO 
    643             zresm = MAXVAL( zresr( 1:jpi, 2:jpjm1 ) ) 
    644             IF( lk_mpp )   CALL mpp_max( 'icedyn_rhg_evp', zresm )   ! max over the global domain 
    645          ENDIF 
     638 
     639!!$         IF(ln_ctl) THEN   ! Convergence test 
     640!!$            DO jj = 2 , jpjm1 
     641!!$               zresr(:,jj) = MAX( ABS( u_ice(:,jj) - zu_ice(:,jj) ), ABS( v_ice(:,jj) - zv_ice(:,jj) ) ) 
     642!!$            END DO 
     643!!$            zresm = MAXVAL( zresr( 1:jpi, 2:jpjm1 ) ) 
     644!!$            IF( lk_mpp )   CALL mpp_max( 'icedyn_rhg_evp', zresm )   ! max over the global domain 
     645!!$         ENDIF 
    646646         ! 
    647647         !                                                ! ==================== ! 
  • NEMO/branches/2018/dev_r10164_HPC09_ESIWACE_PREP_MERGE/src/OCE/SBC/sbcfwb.F90

    r10314 r10365  
    154154            WHERE( erp < 0._wp )   ztmsk_pos = 0._wp 
    155155            ztmsk_neg(:,:) = tmask_i(:,:) - ztmsk_pos(:,:) 
    156             ! 
    157             zsurf_neg = glob_sum( 'sbcfwb', e1e2t(:,:)*ztmsk_neg(:,:) )  ! Area filled by <0 and >0 erp  
    158             zsurf_pos = glob_sum( 'sbcfwb', e1e2t(:,:)*ztmsk_pos(:,:) ) 
    159156            !                                                  ! fwf global mean (excluding ocean to ice/snow exchanges)  
    160157            z_fwf     = glob_sum( 'sbcfwb', e1e2t(:,:) * ( emp(:,:) - rnf(:,:) + fwfisf(:,:) - snwice_fmass(:,:) ) ) / area 
    161158            !             
    162159            IF( z_fwf < 0._wp ) THEN         ! spread out over >0 erp area to increase evaporation 
    163                 zsurf_tospread      = zsurf_pos 
    164                 ztmsk_tospread(:,:) = ztmsk_pos(:,:) 
     160               zsurf_pos = glob_sum( 'sbcfwb', e1e2t(:,:)*ztmsk_pos(:,:) ) 
     161               zsurf_tospread      = zsurf_pos 
     162               ztmsk_tospread(:,:) = ztmsk_pos(:,:) 
    165163            ELSE                             ! spread out over <0 erp area to increase precipitation 
    166                 zsurf_tospread      = zsurf_neg 
    167                 ztmsk_tospread(:,:) = ztmsk_neg(:,:) 
     164               zsurf_neg = glob_sum( 'sbcfwb', e1e2t(:,:)*ztmsk_neg(:,:) )  ! Area filled by <0 and >0 erp  
     165               zsurf_tospread      = zsurf_neg 
     166               ztmsk_tospread(:,:) = ztmsk_neg(:,:) 
    168167            ENDIF 
    169168            ! 
  • NEMO/branches/2018/dev_r10164_HPC09_ESIWACE_PREP_MERGE/src/TOP/PISCES/P4Z/p4zflx.F90

    r10314 r10365  
    172172      END DO 
    173173 
    174       t_oce_co2_flx     = glob_sum( 'p4zflx', oce_co2(:,:) )                    !  Total Flux of Carbon 
     174      IF( iom_use("tcflx") .OR. iom_use("tcflxcum") .OR. kt == nitrst   & 
     175         &                 .OR. (ln_check_mass .AND. kt == nitend) )    & 
     176         t_oce_co2_flx  = glob_sum( 'p4zflx', oce_co2(:,:) )                    !  Total Flux of Carbon 
    175177      t_oce_co2_flx_cum = t_oce_co2_flx_cum + t_oce_co2_flx       !  Cumulative Total Flux of Carbon 
    176178!      t_atm_co2_flx     = glob_sum( 'p4zflx', satmco2(:,:) * e1e2t(:,:) )       ! Total atmospheric pCO2 
     
    205207           CALL iom_put( "Dpo2"  , zw2d ) 
    206208         ENDIF 
    207          IF( iom_use( "tcflx" ) )  CALL iom_put( "tcflx"    , t_oce_co2_flx * rfact2r )   ! molC/s 
    208          CALL iom_put( "tcflxcum" , t_oce_co2_flx_cum )      ! molC 
     209         CALL iom_put( "tcflx"    , t_oce_co2_flx * rfact2r )   ! molC/s 
     210         CALL iom_put( "tcflxcum" , t_oce_co2_flx_cum       )   ! molC 
    209211         ! 
    210212         DEALLOCATE( zw2d ) 
  • NEMO/branches/2018/dev_r10164_HPC09_ESIWACE_PREP_MERGE/src/TOP/TRP/trcrad.F90

    r10314 r10365  
    153153            ztrcorn = glob_sum( 'trcrad', MIN( 0., ptrn(:,:,:,jn) ) * cvol(:,:,:) ) 
    154154            ! 
    155             ztrmasb = glob_sum( 'trcrad', MAX( 0., ptrb(:,:,:,jn) ) * cvol(:,:,:) ) 
    156             ztrmasn = glob_sum( 'trcrad', MAX( 0., ptrn(:,:,:,jn) ) * cvol(:,:,:) ) 
    157             ! 
    158155            IF( ztrcorb /= 0 ) THEN 
     156               ztrmasb = glob_sum( 'trcrad', MAX( 0., ptrb(:,:,:,jn) ) * cvol(:,:,:) ) 
    159157               zcoef = 1. + ztrcorb / ztrmasb 
    160158               DO jk = 1, jpkm1 
     
    165163            ! 
    166164            IF( ztrcorn /= 0 ) THEN 
     165               ztrmasn = glob_sum( 'trcrad', MAX( 0., ptrn(:,:,:,jn) ) * cvol(:,:,:) ) 
    167166               zcoef = 1. + ztrcorn / ztrmasn 
    168167               DO jk = 1, jpkm1 
Note: See TracChangeset for help on using the changeset viewer.