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 12726 for NEMO/branches – NEMO

Changeset 12726 for NEMO/branches


Ignore:
Timestamp:
2020-04-09T16:30:48+02:00 (4 years ago)
Author:
clem
Message:

clean useless variables

Location:
NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src
Files:
8 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/ice.F90

    r12725 r12726  
    279279   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   hfx_snw     !: heat flux for snow melt                             [W.m-2] 
    280280   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   hfx_err_dif !: heat flux remaining due to change in non-solar flux [W.m-2] 
    281    REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   hfx_err_rem !: heat flux error after heat remapping => must be 0   [W.m-2] 
    282281   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   qt_atm_oi   !: heat flux at the interface atm-[oce+ice]            [W.m-2] 
    283282   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   qt_oce_ai   !: heat flux at the interface oce-[atm+ice]            [W.m-2] 
     
    437436         &      hfx_sum    (jpi,jpj) , hfx_bom   (jpi,jpj) , hfx_bog(jpi,jpj) , hfx_dif(jpi,jpj) ,     & 
    438437         &      hfx_opw    (jpi,jpj) , hfx_thd   (jpi,jpj) , hfx_dyn(jpi,jpj) , hfx_spr(jpi,jpj) ,     & 
    439          &      hfx_err_dif(jpi,jpj) , hfx_err_rem(jpi,jpj) , wfx_err_sub(jpi,jpj)             , STAT=ierr(ii) ) 
     438         &      hfx_err_dif(jpi,jpj) , wfx_err_sub(jpi,jpj)                   , STAT=ierr(ii) ) 
    440439 
    441440      ! * Ice global state variables 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/ice1d.F90

    r12725 r12726  
    5151   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   hfx_snw_1d 
    5252   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   hfx_dyn_1d 
    53    REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   hfx_err_rem_1d 
    5453   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   hfx_err_dif_1d 
    5554   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   qt_oce_ai_1d 
     
    127126   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   v_ip_1d       !: 
    128127   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   h_ip_1d       !: 
    129    REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   a_ip_frac_1d  !: 
    130128   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   v_il_1d       !: Ice pond lid 
    131129   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   h_il_1d       !: 
     
    192190         &      hfx_thd_1d(jpij) , hfx_spr_1d    (jpij) ,                      & 
    193191         &      hfx_snw_1d(jpij) , hfx_sub_1d    (jpij) ,                      & 
    194          &      hfx_res_1d(jpij) , hfx_err_rem_1d(jpij) , hfx_err_dif_1d(jpij) , qt_oce_ai_1d(jpij), STAT=ierr(ii) ) 
     192         &      hfx_res_1d(jpij) , hfx_err_dif_1d(jpij) , qt_oce_ai_1d(jpij), STAT=ierr(ii) ) 
    195193      ! 
    196194      ii = ii + 1 
     
    212210         &      dh_i_sub(jpij) , dh_s_mlt(jpij) , dh_snowice(jpij) , s_i_1d  (jpij) , s_i_new (jpij) ,  & 
    213211         &      a_ip_1d (jpij) , v_ip_1d (jpij) , v_i_1d    (jpij) , v_s_1d  (jpij) , v_il_1d (jpij) ,  & 
    214          &      h_il_1d (jpij) , h_ip_1d (jpij) , a_ip_frac_1d(jpij) ,                                  & 
     212         &      h_il_1d (jpij) , h_ip_1d (jpij) ,                                                       & 
    215213         &      sv_i_1d (jpij) , oa_i_1d (jpij) , o_i_1d    (jpij) , STAT=ierr(ii) ) 
    216214      ! 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/iceistate.F90

    r12725 r12726  
    157157      v_ip     (:,:,:) = 0._wp 
    158158      v_il     (:,:,:) = 0._wp 
    159       a_ip_frac(:,:,:) = 0._wp 
    160159      a_ip_eff (:,:,:) = 0._wp 
    161160      h_ip     (:,:,:) = 0._wp 
     
    377376 
    378377         ! Melt ponds 
    379          WHERE( a_i > epsi10 )   ;   a_ip_frac(:,:,:) = a_ip(:,:,:) / a_i(:,:,:) 
    380          ELSEWHERE               ;   a_ip_frac(:,:,:) = 0._wp 
     378         WHERE( a_i > epsi10 )   ;   a_ip_eff(:,:,:) = a_ip(:,:,:) / a_i(:,:,:) 
     379         ELSEWHERE               ;   a_ip_eff(:,:,:) = 0._wp 
    381380         END WHERE 
    382          a_ip_eff(:,:,:) = a_ip_frac(:,:,:) 
    383381         v_ip(:,:,:) = h_ip(:,:,:) * a_ip(:,:,:) 
    384382         v_il(:,:,:) = h_il(:,:,:) * a_ip(:,:,:) 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/icestp.F90

    r12725 r12726  
    414414      hfx_res(:,:) = 0._wp   ;   hfx_sub(:,:) = 0._wp 
    415415      hfx_spr(:,:) = 0._wp   ;   hfx_dif(:,:) = 0._wp 
    416       hfx_err_rem(:,:) = 0._wp 
    417416      hfx_err_dif(:,:) = 0._wp 
    418417      wfx_err_sub(:,:) = 0._wp 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/icethd.F90

    r12725 r12726  
    354354         CALL tab_2d_1d( npti, nptidx(1:npti), a_ip_1d     (1:npti), a_ip     (:,:,kl) ) 
    355355         CALL tab_2d_1d( npti, nptidx(1:npti), h_ip_1d     (1:npti), h_ip     (:,:,kl) ) 
    356          CALL tab_2d_1d( npti, nptidx(1:npti), a_ip_frac_1d(1:npti), a_ip_frac(:,:,kl) ) 
    357356         CALL tab_2d_1d( npti, nptidx(1:npti), h_il_1d     (1:npti), h_il     (:,:,kl) ) 
    358357         ! 
     
    407406         CALL tab_2d_1d( npti, nptidx(1:npti), hfx_res_1d    (1:npti), hfx_res       ) 
    408407         CALL tab_2d_1d( npti, nptidx(1:npti), hfx_err_dif_1d(1:npti), hfx_err_dif   ) 
    409          CALL tab_2d_1d( npti, nptidx(1:npti), hfx_err_rem_1d(1:npti), hfx_err_rem   ) 
    410408         CALL tab_2d_1d( npti, nptidx(1:npti), qt_oce_ai_1d  (1:npti), qt_oce_ai     ) 
    411409         ! 
     
    462460         CALL tab_1d_2d( npti, nptidx(1:npti), a_ip_1d     (1:npti), a_ip     (:,:,kl) ) 
    463461         CALL tab_1d_2d( npti, nptidx(1:npti), h_ip_1d     (1:npti), h_ip     (:,:,kl) ) 
    464          CALL tab_1d_2d( npti, nptidx(1:npti), a_ip_frac_1d(1:npti), a_ip_frac(:,:,kl) ) 
    465462         CALL tab_1d_2d( npti, nptidx(1:npti), h_il_1d     (1:npti), h_il     (:,:,kl) ) 
    466463         ! 
     
    501498         CALL tab_1d_2d( npti, nptidx(1:npti), hfx_res_1d    (1:npti), hfx_res     ) 
    502499         CALL tab_1d_2d( npti, nptidx(1:npti), hfx_err_dif_1d(1:npti), hfx_err_dif ) 
    503          CALL tab_1d_2d( npti, nptidx(1:npti), hfx_err_rem_1d(1:npti), hfx_err_rem ) 
    504500         CALL tab_1d_2d( npti, nptidx(1:npti), qt_oce_ai_1d  (1:npti), qt_oce_ai   ) 
    505501         ! 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/icethd_ent.F90

    r10069 r12726  
    128128      ! comment: if input h_i_old and eh_i_old are already multiplied by a_i (as in icethd_do),  
    129129      ! then we should not (* a_i) again but not important since this is just to check that remap error is ~0 
    130       DO ji = 1, npti 
    131          hfx_err_rem_1d(ji) = hfx_err_rem_1d(ji) + a_i_1d(ji) * r1_rdtice *  & 
    132             &               ( SUM( qnew(ji,1:nlay_i) ) * zhnew(ji) - SUM( eh_i_old(ji,0:nlay_i+1) ) )  
    133       END DO 
     130      !DO ji = 1, npti 
     131      !   hfx_err_rem_1d(ji) = hfx_err_rem_1d(ji) + a_i_1d(ji) * r1_rdtice *  & 
     132      !      &               ( SUM( qnew(ji,1:nlay_i) ) * zhnew(ji) - SUM( eh_i_old(ji,0:nlay_i+1) ) )  
     133      !END DO 
    134134       
    135135   END SUBROUTINE ice_thd_ent 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/ICE/icethd_pnd.F90

    r12725 r12726  
    8888         ! 
    8989         IF( a_i_1d(ji) > 0._wp .AND. t_su_1d(ji) >= rt0 ) THEN 
    90             a_ip_frac_1d(ji) = rn_apnd 
    9190            h_ip_1d(ji)      = rn_hpnd     
    92             a_ip_1d(ji)      = a_ip_frac_1d(ji) * a_i_1d(ji) 
     91            a_ip_1d(ji)      = rn_apnd * a_i_1d(ji) 
    9392            h_il_1d(ji)      = 0._wp    ! no pond lids whatsoever 
    9493         ELSE 
    95             a_ip_frac_1d(ji) = 0._wp 
    9694            h_ip_1d(ji)      = 0._wp     
    9795            a_ip_1d(ji)      = 0._wp 
     
    184182            !--- Remove ponds on thin ice or tiny ice fractions 
    185183            a_ip_1d(ji)      = 0._wp 
    186             a_ip_frac_1d(ji) = 0._wp 
    187184            h_ip_1d(ji)      = 0._wp 
    188185            h_il_1d(ji)      = 0._wp 
     
    261258            ! a_ip/a_i = a_ip_frac = h_ip / zaspect (cf Holland 2012, fitting SHEBA so that knowing v_ip we can distribute it to a_ip and h_ip) 
    262259            a_ip_1d(ji)      = MIN( a_i_1d(ji), SQRT( v_ip_1d(ji) * z1_aspect * a_i_1d(ji) ) ) ! make sure a_ip < a_i 
    263             a_ip_frac_1d(ji) = a_ip_1d(ji) / a_i_1d(ji) 
    264             h_ip_1d(ji)      = zaspect * a_ip_frac_1d(ji) 
     260            h_ip_1d(ji)      = zaspect * a_ip_1d(ji) / a_i_1d(ji) 
    265261 
    266262            !---------------!             
     
    269265            IF( ln_pnd_flush ) THEN 
    270266               ! height of top of the pond above sea-level 
    271                zhp = ( h_i_1d(ji) * ( rau0 - rhoi ) + h_ip_1d(ji) * ( rau0 - rhow * a_ip_frac_1d(ji) ) ) * r1_rau0 
     267               zhp = ( h_i_1d(ji) * ( rau0 - rhoi ) + h_ip_1d(ji) * ( rau0 - rhow * a_ip_1d(ji) / a_i_1d(ji) ) ) * r1_rau0 
    272268 
    273269               ! Calculate the permeability of the ice (Assur 1958) 
     
    288284               !--- Set new pond area and depth ---! assuming linear relation between h_ip and a_ip_frac 
    289285               a_ip_1d(ji)      = MIN( a_i_1d(ji), SQRT( v_ip_1d(ji) * z1_aspect * a_i_1d(ji) ) ) ! make sure a_ip < a_i 
    290                a_ip_frac_1d(ji) = a_ip_1d(ji) / a_i_1d(ji) 
    291                h_ip_1d(ji)      = zaspect * a_ip_frac_1d(ji) 
     286               h_ip_1d(ji)      = zaspect * a_ip_1d(ji) / a_i_1d(ji) 
    292287 
    293288            ENDIF 
     
    302297               IF ( h_il_1d(ji) > h_ip_1d(ji) * 10._wp ) THEN 
    303298                  a_ip_1d(ji)      = 0._wp 
    304                   a_ip_frac_1d(ji) = 0._wp 
    305299                  h_ip_1d(ji)      = 0._wp 
    306300                  h_il_1d(ji)      = 0._wp 
  • NEMO/branches/2020/r4.0-HEAD_r12713_clem_dan_fixcpl/src/OCE/BDY/bdyice.F90

    r12720 r12726  
    271271               ! 
    272272               ! melt ponds 
    273                IF( a_i(ji,jj,jl) > epsi10 ) THEN 
    274                   a_ip_frac(ji,jj,jl) = a_ip(ji,jj,jl) / a_i (ji,jj,jl) 
    275                ELSE 
    276                   a_ip_frac(ji,jj,jl) = 0._wp 
    277                ENDIF 
    278273               v_ip(ji,jj,jl) = h_ip(ji,jj,jl) * a_ip(ji,jj,jl) 
    279274               v_il(ji,jj,jl) = h_il(ji,jj,jl) * a_ip(ji,jj,jl) 
     
    289284               t_i (ji,jj,:,jl) = rt0  
    290285 
    291                a_ip_frac(ji,jj,jl) = 0._wp 
    292                a_ip     (ji,jj,jl) = 0._wp 
    293                h_ip     (ji,jj,jl) = 0._wp 
    294                h_il     (ji,jj,jl) = 0._wp 
     286               a_ip(ji,jj,jl) = 0._wp 
     287               h_ip(ji,jj,jl) = 0._wp 
     288               h_il(ji,jj,jl) = 0._wp 
    295289                
    296290               IF( nn_icesal == 1 ) THEN     ! if constant salinity 
Note: See TracChangeset for help on using the changeset viewer.