Skip to content

Commit

Permalink
clean up code
Browse files Browse the repository at this point in the history
  • Loading branch information
pjpegion committed Jan 6, 2021
1 parent 2cba995 commit 1d7ffa3
Show file tree
Hide file tree
Showing 4 changed files with 6 additions and 35 deletions.
7 changes: 3 additions & 4 deletions src/core/MOM.F90
Original file line number Diff line number Diff line change
Expand Up @@ -911,7 +911,6 @@ subroutine step_MOM(forces_in, fluxes_in, sfc_state, Time_start, time_int_in, CS
call enable_averages(CS%time_in_thermo_cycle, Time_local, CS%diag)
call post_surface_thermo_diags(CS%sfc_IDs, G, GV, US, CS%diag, CS%time_in_thermo_cycle, &
sfc_state_diag, CS%tv, ssh, CS%ave_ssh_ibc)
!sfc_state_diag, CS%tv, ssh,fluxes%t_rp,fluxes%sppt_wts, CS%ave_ssh_ibc)
endif
call disable_averaging(CS%diag)
call cpu_clock_end(id_clock_diagnostics)
Expand Down Expand Up @@ -1699,9 +1698,9 @@ subroutine initialize_MOM(Time, Time_init, param_file, dirs, CS, restart_CSp, &
integer :: dynamics_stencil ! The computational stencil for the calculations
! in the dynamic core.
integer,allocatable :: pelist(:) ! list of pes for this instance of the ocean
integer :: mom_comm ! list of pes for this instance of the ocean
integer :: num_procs,iret
! model
integer :: mom_comm ! list of pes for this instance of the ocean
integer :: num_procs ! number of processors to pass to stochastic physics
integer :: iret ! return code from stochastic physics
integer :: me ! my pe
integer :: master ! root pe
real :: conv2watt, conv2salt
Expand Down
26 changes: 0 additions & 26 deletions src/core/MOM_forcing_type.F90
Original file line number Diff line number Diff line change
Expand Up @@ -141,10 +141,6 @@ module MOM_forcing_type
!< Pressure at the top ocean interface [R L2 T-2 ~> Pa] that is used in corrections to the sea surface
!! height field that is passed back to the calling routines.
!! p_surf_SSH may point to p_surf or to p_surf_full.
! real, pointer, dimension(:,:) :: t_rp => NULL()
! !< random pattern at t-points
! real, pointer, dimension(:,:) :: sppt_wts => NULL()
! !< random pattern at t-points
logical :: accumulate_p_surf = .false. !< If true, the surface pressure due to the atmosphere
!! and various types of ice needs to be accumulated, and the
!! surface pressure explicitly reset to zero at the driver level
Expand Down Expand Up @@ -242,10 +238,6 @@ module MOM_forcing_type
!! u-points [L4 Z-1 T-1 ~> m3 s-1]
rigidity_ice_v => NULL() !< Depth-integrated lateral viscosity of ice shelves or sea ice at
!! v-points [L4 Z-1 T-1 ~> m3 s-1]
! real, pointer, dimension(:,:) :: t_rp => NULL()
! !< random pattern at t-points
! real, pointer, dimension(:,:) :: sppt_wts => NULL()
! !< random pattern at t-points
real :: dt_force_accum = -1.0 !< The amount of time over which the mechanical forcing fluxes
!! have been averaged [s].
logical :: net_mass_src_set = .false. !< If true, an estimate of net_mass_src has been provided.
Expand Down Expand Up @@ -2086,18 +2078,6 @@ subroutine copy_common_forcing_fields(forces, fluxes, G, skip_pres)

do_pres = .true. ; if (present(skip_pres)) do_pres = .not.skip_pres

! if (associated(forces%t_rp) .and. associated(fluxes%t_rp)) then
! do j=js,je ; do i=is,ie
! fluxes%t_rp(i,j) = forces%t_rp(i,j)
! enddo ; enddo
! endif
!
! if (associated(forces%sppt_wts) .and. associated(fluxes%sppt_wts)) then
! do j=js,je ; do i=is,ie
! fluxes%sppt_wts(i,j) = forces%sppt_wts(i,j)
! enddo ; enddo
! endif

if (associated(forces%ustar) .and. associated(fluxes%ustar)) then
do j=js,je ; do i=is,ie
fluxes%ustar(i,j) = forces%ustar(i,j)
Expand Down Expand Up @@ -3041,8 +3021,6 @@ subroutine allocate_mech_forcing_by_group(G, forces, stress, ustar, shelf, &
call myAlloc(forces%p_surf,isd,ied,jsd,jed, press)
call myAlloc(forces%p_surf_full,isd,ied,jsd,jed, press)
call myAlloc(forces%net_mass_src,isd,ied,jsd,jed, press)
! call myAlloc(forces%t_rp,isd,ied,jsd,jed, press)
! call myAlloc(forces%sppt_wts,isd,ied,jsd,jed, press)

call myAlloc(forces%rigidity_ice_u,IsdB,IedB,jsd,jed, shelf)
call myAlloc(forces%rigidity_ice_v,isd,ied,JsdB,JedB, shelf)
Expand Down Expand Up @@ -3198,8 +3176,6 @@ subroutine deallocate_forcing_type(fluxes)
if (associated(fluxes%seaice_melt)) deallocate(fluxes%seaice_melt)
if (associated(fluxes%salt_flux)) deallocate(fluxes%salt_flux)
if (associated(fluxes%p_surf_full)) deallocate(fluxes%p_surf_full)
! if (associated(fluxes%t_rp)) deallocate(fluxes%t_rp)
! if (associated(fluxes%sppt_wts)) deallocate(fluxes%sppt_wts)
if (associated(fluxes%p_surf)) deallocate(fluxes%p_surf)
if (associated(fluxes%TKE_tidal)) deallocate(fluxes%TKE_tidal)
if (associated(fluxes%ustar_tidal)) deallocate(fluxes%ustar_tidal)
Expand All @@ -3224,8 +3200,6 @@ subroutine deallocate_mech_forcing(forces)
if (associated(forces%ustar)) deallocate(forces%ustar)
if (associated(forces%p_surf)) deallocate(forces%p_surf)
if (associated(forces%p_surf_full)) deallocate(forces%p_surf_full)
! if (associated(forces%t_rp)) deallocate(forces%t_rp)
! if (associated(forces%sppt_wts)) deallocate(forces%sppt_wts)
if (associated(forces%net_mass_src)) deallocate(forces%net_mass_src)
if (associated(forces%rigidity_ice_u)) deallocate(forces%rigidity_ice_u)
if (associated(forces%rigidity_ice_v)) deallocate(forces%rigidity_ice_v)
Expand Down
2 changes: 1 addition & 1 deletion src/diagnostics/MOM_diagnostics.F90
Original file line number Diff line number Diff line change
Expand Up @@ -177,7 +177,7 @@ module MOM_diagnostics
integer :: id_salt_deficit = -1
integer :: id_Heat_PmE = -1
integer :: id_intern_heat = -1
!!@}
!>@}
end type surface_diag_IDs


Expand Down
6 changes: 2 additions & 4 deletions src/parameterizations/vertical/MOM_energetic_PBL.F90
Original file line number Diff line number Diff line change
Expand Up @@ -465,8 +465,6 @@ subroutine energetic_PBL(h_3d, u_3d, v_3d, tv, fluxes, t_rp, stoch_epbl, dt, Kd_
u_star, u_star_mean, dt, MLD_io, Kd, mixvel, mixlen, GV, &
US, CS, eCD, t_rp(i,j,1),t_rp(i,j,2), stoch_epbl, dt_diag=dt_diag, Waves=Waves, G=G, i=i, j=j)

! applly stochastic perturbation to TKE generation

! Copy the diffusivities to a 2-d array.
do K=1,nz+1
Kd_2d(i,K) = Kd(K)
Expand Down Expand Up @@ -972,8 +970,8 @@ subroutine ePBL_column(h, u, v, T0, S0, dSV_dT, dSV_dS, TKE_forcing, B_flux, abs
exp_kh = 1.0
if (Idecay_len_TKE > 0.0) exp_kh = exp(-h(k-1)*Idecay_len_TKE)
if (CS%TKE_diagnostics) &
!eCD%dTKE_mech_decay = eCD%dTKE_mech_decay + (exp_kh-1.0) * mech_TKE * I_dtdiag
eCD%dTKE_mech_decay = exp_kh
eCD%dTKE_mech_decay = eCD%dTKE_mech_decay + (exp_kh-1.0) * mech_TKE * I_dtdiag
mech_TKE = mech_TKE * exp_kh
if (stoch_epbl) mech_TKE = mech_TKE * (1+(exp_kh-1) * t_rp2)

! Accumulate any convectively released potential energy to contribute
Expand Down

0 comments on commit 1d7ffa3

Please sign in to comment.