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

Changeset 8771 for branches/UKMO


Ignore:
Timestamp:
2017-11-21T17:28:51+01:00 (6 years ago)
Author:
clem
Message:

add 1st layer temperature for Jules

Location:
branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3
Files:
5 edited

Legend:

Unmodified
Added
Removed
  • branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3/ice.F90

    r8768 r8771  
    313313   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:)   ::   rn_amax_2d     !: maximum ice concentration 2d array 
    314314   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   ftr_ice        !: transmitted solar radiation under ice 
     315   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   t1_ice         !: temperature of the first layer (Jules coupling) [K] 
    315316   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   cnd_ice        !: effective conductivity at the top of ice/snow (Jules coupling) [W.m-2.K-1] 
    316317 
     
    450451      ! * Ice global state variables 
    451452      ii = ii + 1 
    452       ALLOCATE( ftr_ice(jpi,jpj,jpl) ,cnd_ice(jpi,jpj,jpl),                           & 
     453      ALLOCATE( ftr_ice(jpi,jpj,jpl) ,cnd_ice(jpi,jpj,jpl), t1_ice(jpi,jpj,jpl) ,     & 
    453454         &      h_i   (jpi,jpj,jpl) , a_i   (jpi,jpj,jpl) , v_i   (jpi,jpj,jpl) ,     & 
    454455         &      v_s    (jpi,jpj,jpl) , h_s  (jpi,jpj,jpl) , t_su  (jpi,jpj,jpl) ,     & 
  • branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3/ice1d.F90

    r8768 r8771  
    4040   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   qcn_ice_1d     !: heat available for snow / ice surface sublimation [W/m2]  
    4141   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   qsr_ice_tr_1d  !: solar flux transmitted below the ice surface [W/m2]  
     42   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   t1_ice_1d      !: temperature of the 1st layer (Jules coupling) [K] 
    4243   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:) ::   cnd_ice_1d     !: conductivity at the top of ice/snow (Jules coupling) [W/K/m2] 
    4344 
     
    181182         &      qns_ice_1d(jpij)  ,   & 
    182183         &      qml_ice_1d(jpij), qcn_ice_1d(jpij) , qsr_ice_tr_1d(jpij) , & 
    183          &      cnd_ice_1d(jpij), t_bo_1d   (jpij) ,                       & 
     184         &      cnd_ice_1d(jpij), t1_ice_1d(jpij), t_bo_1d   (jpij) ,      & 
    184185         &      hfx_sum_1d(jpij) , hfx_bom_1d(jpij) ,hfx_bog_1d(jpij) ,    &  
    185186         &      hfx_dif_1d(jpij) , hfx_opw_1d(jpij) ,hfx_dyn_1d(jpij) ,    & 
  • branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3/icestp.F90

    r8768 r8771  
    260260      CALL ice_dia_init                ! initialization for diags 
    261261      ! 
    262       fr_i  (:,:)   = at_i(:,:)        ! initialisation of sea-ice fraction 
    263       tn_ice(:,:,:) = t_su(:,:,:)      ! initialisation of surface temp for coupled simu 
     262      fr_i   (:,:)   = at_i(:,:)       ! initialisation of sea-ice fraction 
     263      tn_ice (:,:,:) = t_su(:,:,:)     ! initialisation of surface temp for coupled simu 
     264      t1_ice (:,:,:) = t_i (:,:,1,:)   ! initialisation of 1st layer temp for coupled simu 
     265      cnd_ice(:,:,:) = 0._wp           ! initialisation of the effective conductivity at the top of ice/snow (Jules coupling) 
    264266      ! 
    265267      !                                ! set max concentration in both hemispheres 
  • branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3/icethd.F90

    r8768 r8771  
    529529         ! effective conductivity (for Jules coupling) 
    530530         CALL tab_1d_2d( npti, nptidx(1:npti), cnd_ice_1d(1:npti), cnd_ice(:,:,kl) ) 
     531         CALL tab_1d_2d( npti, nptidx(1:npti), t1_ice_1d (1:npti), t1_ice (:,:,kl) ) 
    531532         ! SIMIP diagnostics          
    532533         CALL tab_1d_2d( npti, nptidx(1:npti), t_si_1d      (1:npti), t_si(:,:,kl) ) 
  • branches/UKMO/dev_r8183_ICEMODEL_svn_removed/NEMOGCM/NEMO/LIM_SRC_3/icethd_zdf.F90

    r8768 r8771  
    909909      ! 11) Jules coupling: reset inner snow and ice temperatures, update conduction fluxes 
    910910      !--------------------------------------------------------------------------------------- 
    911       ! effective conductivity (10cm treshold to avoid cnd_ice to be too big) 
     911      ! effective conductivity and 1st layer temperature (Jules coupling) 
    912912      DO ji = 1, npti 
    913          IF( zh_s(ji) >= 0.1_wp ) THEN   ;   cnd_ice_1d(ji) = zkappa_s(ji,0) * 2._wp 
    914          ELSE                            ;   cnd_ice_1d(ji) = zkappa_i(ji,0) * 2._wp 
    915          ENDIF 
     913         cnd_ice_1d(ji) = 2._wp * ( isnow(ji) * zkappa_s(ji,0) + ( 1._wp - isnow(ji) ) * zkappa_i(ji,0) ) 
     914         t1_ice_1d (ji) =         ( isnow(ji) * t_s_1d  (ji,1) + ( 1._wp - isnow(ji) ) * t_i_1d  (ji,1) ) 
    916915      END DO 
    917916      ! 
Note: See TracChangeset for help on using the changeset viewer.