Skip to content

Commit

Permalink
Fixed white space and line length
Browse files Browse the repository at this point in the history
  • Loading branch information
adcroft committed Jan 20, 2021
1 parent c05b042 commit ea5e245
Show file tree
Hide file tree
Showing 4 changed files with 17 additions and 17 deletions.
2 changes: 1 addition & 1 deletion config_src/nuopc_driver/mom_surface_forcing_nuopc.F90
Original file line number Diff line number Diff line change
Expand Up @@ -862,7 +862,7 @@ subroutine convert_IOB_to_forces(IOB, forces, index_bounds, Time, G, US, CS)
enddo; enddo
call pass_vector(forces%ustkb(:,:,istk),forces%vstkb(:,:,istk), G%domain )
enddo
endif
endif

! sea ice related dynamic fields
if (associated(IOB%ice_rigidity)) then
Expand Down
16 changes: 8 additions & 8 deletions src/core/MOM_forcing_type.F90
Original file line number Diff line number Diff line change
Expand Up @@ -3007,8 +3007,8 @@ subroutine allocate_mech_forcing_by_group(G, forces, stress, ustar, shelf, &
logical, optional, intent(in) :: shelf !< If present and true, allocate forces for ice-shelf
logical, optional, intent(in) :: press !< If present and true, allocate p_surf and related fields
logical, optional, intent(in) :: iceberg !< If present and true, allocate forces for icebergs
logical, optional, intent(in) :: waves !< If present and true, allocate wave fields
integer, optional, intent(in) :: num_stk_bands !< Number of Stokes bands to allocate
logical, optional, intent(in) :: waves !< If present and true, allocate wave fields
integer, optional, intent(in) :: num_stk_bands !< Number of Stokes bands to allocate

! Local variables
integer :: isd, ied, jsd, jed, IsdB, IedB, JsdB, JedB
Expand Down Expand Up @@ -3038,16 +3038,16 @@ subroutine allocate_mech_forcing_by_group(G, forces, stress, ustar, shelf, &
!These fields should only be allocated when waves
call myAlloc(forces%ustk0,isd,ied,jsd,jed, waves)
call myAlloc(forces%vstk0,isd,ied,jsd,jed, waves)
if (present(waves)) then; if (waves) then; if (.not.associated(forces%ustkb)) then
if (present(waves)) then; if (waves) then; if (.not.associated(forces%ustkb)) then
if (.not.(present(num_stk_bands))) call MOM_error(FATAL,"Requested to &
initialize with waves, but no waves are present.")
allocate(forces%stk_wavenumbers(num_stk_bands))
forces%stk_wavenumbers(:) = 0.0
allocate(forces%ustkb(isd:ied,jsd:jed,num_stk_bands))
initialize with waves, but no waves are present.")
allocate(forces%stk_wavenumbers(num_stk_bands))
forces%stk_wavenumbers(:) = 0.0
allocate(forces%ustkb(isd:ied,jsd:jed,num_stk_bands))
forces%ustkb(isd:ied,jsd:jed,:) = 0.0
endif ; endif ; endif

if (present(waves)) then; if (waves) then; if (.not.associated(forces%vstkb)) then
if (present(waves)) then; if (waves) then; if (.not.associated(forces%vstkb)) then
allocate(forces%vstkb(isd:ied,jsd:jed,num_stk_bands))
forces%vstkb(isd:ied,jsd:jed,:) = 0.0
endif ; endif ; endif
Expand Down
12 changes: 6 additions & 6 deletions src/tracer/MOM_lateral_boundary_diffusion.F90
Original file line number Diff line number Diff line change
Expand Up @@ -579,13 +579,13 @@ subroutine fluxes_layer_method(boundary, ke, hbl_L, hbl_R, h_L, h_R, phi_L, phi_
type(lbd_CS), pointer :: CS !< Lateral diffusion control structure
!! the boundary layer
! Local variables
real, dimension(:), allocatable :: dz_top !< The LBD z grid to be created [L ~ m]
real, dimension(:), allocatable :: phi_L_z !< Tracer values in the ztop grid (left) [conc]
real, dimension(:), allocatable :: phi_R_z !< Tracer values in the ztop grid (right) [conc]
real, dimension(:), allocatable :: F_layer_z !< Diffusive flux at U- or V-point in the ztop grid [H L2 conc ~> m3 conc]
real, dimension(:), allocatable :: dz_top !< The LBD z grid to be created [L ~ m]
real, dimension(:), allocatable :: phi_L_z !< Tracer values in the ztop grid (left) [conc]
real, dimension(:), allocatable :: phi_R_z !< Tracer values in the ztop grid (right) [conc]
real, dimension(:), allocatable :: F_layer_z !< Diffusive flux at U/V-point in the ztop grid [H L2 conc ~> m3 conc]
real, dimension(ke) :: h_vel !< Thicknesses at u- and v-points in the native grid
!! The harmonic mean is used to avoid zero values [H ~> m or kg m-2]
real :: khtr_avg !< Thickness-weighted diffusivity at the u-point [m^2 s^-1]
!! The harmonic mean is used to avoid zero values [H ~> m or kg m-2]
real :: khtr_avg !< Thickness-weighted diffusivity at the u-point [m^2 s^-1]
!! This is just to remind developers that khtr_avg should be
!! computed once khtr is 3D.
real :: htot !< Total column thickness [H ~> m or kg m-2]
Expand Down
4 changes: 2 additions & 2 deletions src/user/MOM_wave_interface.F90
Original file line number Diff line number Diff line change
Expand Up @@ -466,9 +466,9 @@ subroutine Update_Surface_Waves(G, GV, US, Day, dt, CS, forces)
if (DataSource==DATAOVR) then
call Surface_Bands_by_data_override(day_center, G, GV, US, CS)
elseif (DataSource==Coupler) then
if (.not.present(FORCES)) then
if (.not.present(FORCES)) then
call MOM_error(FATAL,"The option SURFBAND = COUPLER can not be used with "//&
"this driver. If you are using a coupled driver with a wave model then "//&
"this driver. If you are using a coupled driver with a wave model then "//&
"check the arguments in the subroutine call to Update_Surface_Waves, "//&
"otherwise select another option for SURFBAND_SOURCE.")
endif
Expand Down

0 comments on commit ea5e245

Please sign in to comment.