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

Changeset 12761 for NEMO/branches


Ignore:
Timestamp:
2020-04-17T10:28:12+02:00 (4 years ago)
Author:
techene
Message:

add the computation of r3._f before trc_src in stepMLF.F90 for that there is to change ssh_atf to be able to compute a filtrered ssh without changing the ssh field

Location:
NEMO/branches/2020/dev_r12377_KERNEL-06_techene_e3/src/OCE
Files:
3 edited

Legend:

Unmodified
Added
Removed
  • NEMO/branches/2020/dev_r12377_KERNEL-06_techene_e3/src/OCE/DYN/sshwzv.F90

    r12724 r12761  
    229229 
    230230 
    231    SUBROUTINE ssh_atf( kt, Kbb, Kmm, Kaa, pssh ) 
     231   SUBROUTINE ssh_atf( kt, Kbb, Kmm, Kaa, pssh, pssh_f ) 
    232232      !!---------------------------------------------------------------------- 
    233233      !!                    ***  ROUTINE ssh_atf  *** 
     
    244244      !! Reference  : Leclair, M., and G. Madec, 2009, Ocean Modelling. 
    245245      !!---------------------------------------------------------------------- 
    246       INTEGER                         , INTENT(in   ) ::   kt             ! ocean time-step index 
    247       INTEGER                         , INTENT(in   ) ::   Kbb, Kmm, Kaa  ! ocean time level indices 
    248       REAL(wp), DIMENSION(jpi,jpj,jpt), INTENT(inout) ::   pssh           ! SSH field 
     246      INTEGER                                   , INTENT(in   ) ::   kt             ! ocean time-step index 
     247      INTEGER                                   , INTENT(in   ) ::   Kbb, Kmm, Kaa  ! ocean time level indices 
     248      REAL(wp), DIMENSION(jpi,jpj,jpt)          , TARGET, INTENT(inout) ::   pssh           ! SSH field 
     249      REAL(wp), DIMENSION(jpi,jpj    ), OPTIONAL, TARGET, INTENT(  out) ::   pssh_f         ! filtered SSH field 
    249250      ! 
    250251      REAL(wp) ::   zcoef   ! local scalar 
     252      REAL(wp), POINTER, DIMENSION(:,:) ::   zssh   ! pointer for filtered SSH  
    251253      !!---------------------------------------------------------------------- 
    252254      ! 
     
    260262      !              !==  Euler time-stepping: no filter, just swap  ==! 
    261263      IF ( .NOT.( l_1st_euler ) ) THEN   ! Only do time filtering for leapfrog timesteps 
     264         IF( PRESENT( pssh_f ) ) THEN   ;   zssh => pssh_f 
     265         ELSE                           ;   zssh => pssh(:,:,Kmm) 
     266         ENDIF 
    262267         !                                                  ! filtered "now" field 
    263268         pssh(:,:,Kmm) = pssh(:,:,Kmm) + rn_atfp * ( pssh(:,:,Kbb) - 2 * pssh(:,:,Kmm) + pssh(:,:,Kaa) ) 
     
    281286   END SUBROUTINE ssh_atf 
    282287 
     288    
    283289   SUBROUTINE wAimp( kt, Kmm ) 
    284290      !!---------------------------------------------------------------------- 
  • NEMO/branches/2020/dev_r12377_KERNEL-06_techene_e3/src/OCE/oce.F90

    r12724 r12761  
    3232   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   Cu_adv                   !: vertical Courant number (adaptive-implicit) 
    3333 
    34    !! free surface                                      !  before  ! now    ! after  ! 
    35    !! ------------                                      !  fields  ! fields ! fields ! 
     34   !! free surface 
     35   !! ------------ 
    3636   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:,:) ::   ssh, uu_b,  vv_b   !: SSH [m] and barotropic velocities [m/s] 
    37  
     37   !REAL(wp), PUBLIC, ALLOCATABLE, SAVE, TARGET, DIMENSION(:,:,:) ::   ssh           !: SSH [m] 
     38   !REAL(wp), PUBLIC, ALLOCATABLE, SAVE        , DIMENSION(:,:,:) ::   uu_b,  vv_b   !: barotropic velocities [m/s] 
     39    
    3840   !! Arrays at barotropic time step:                   ! befbefore! before !  now   ! after  ! 
    3941   REAL(wp), PUBLIC, ALLOCATABLE, SAVE, DIMENSION(:,:) ::   ubb_e  ,  ub_e  ,  un_e  , ua_e   !: u-external velocity 
  • NEMO/branches/2020/dev_r12377_KERNEL-06_techene_e3/src/OCE/stpMLF.F90

    r12732 r12761  
    9191      INTEGER ::   kcall        ! optional integer argument (dom_vvl_sf_nxt) 
    9292!!st patch 
    93       REAL(wp), DIMENSION(jpi,jpj,jpk) :: zgdept  
     93      REAL(wp),              DIMENSION(jpi,jpj,jpk) ::   zgdept 
     94      REAL(wp), ALLOCATABLE, DIMENSION(:,:)         ::   zssh_f 
    9495      !! --------------------------------------------------------------------- 
    9596#if defined key_agrif 
     
    248249      ! Passive Tracer Model 
    249250      !<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<<< 
    250                          CALL trc_stp       ( kstp, Nbb, Nnn, Nrhs, Naa )  ! time-stepping 
     251                         ALLOCATE( zssh_f(jpi,jpj) ) 
     252                         CALL ssh_atf    ( kstp, Nbb, Nnn, Naa , ssh, zssh_f )   ! time filtering of "now" sea surface height 
     253                         CALL dom_qco_r3c( zssh_f, r3t_f, r3u_f, r3v_f )         ! "now" ssh/h_0 ratio from filtrered ssh 
     254                         ! 
     255                         CALL trc_stp    ( kstp, Nbb, Nnn, Nrhs, Naa )           ! time-stepping 
     256                         DEALLOCATE( zssh_f ) 
    251257#endif 
    252258 
     
    297303                         CALL finalize_sbc  ( kstp, Nbb, Naa, uu, vv, ts )          ! boundary condifions 
    298304                         CALL ssh_atf       ( kstp, Nbb, Nnn, Naa, ssh )            ! time filtering of "now" sea surface height 
    299                          CALL dom_qco_r3c    ( ssh(:,:,Nnn), r3t_f, r3u_f, r3v_f )   ! "now" ssh/h_0 ratio from filtrered ssh 
     305                         CALL dom_qco_r3c   ( ssh(:,:,Nnn), r3t_f, r3u_f, r3v_f )   ! "now" ssh/h_0 ratio from filtrered ssh 
    300306                         CALL tra_atf_qco   ( kstp, Nbb, Nnn, Naa, ts )             ! time filtering of "now" tracer arrays 
    301307                         CALL dyn_atf_qco   ( kstp, Nbb, Nnn, Naa, uu, vv  )        ! time filtering of "now" velocities and scale factors 
Note: See TracChangeset for help on using the changeset viewer.