rls_routesoil.f90 Source File


This file depends on

sourcefile~~rls_routesoil.f90~~EfferentGraph sourcefile~rls_routesoil.f90 rls_routesoil.f90 sourcefile~hru_module.f90 hru_module.f90 sourcefile~rls_routesoil.f90->sourcefile~hru_module.f90 sourcefile~hydrograph_module.f90 hydrograph_module.f90 sourcefile~rls_routesoil.f90->sourcefile~hydrograph_module.f90 sourcefile~soil_module.f90 soil_module.f90 sourcefile~rls_routesoil.f90->sourcefile~soil_module.f90 sourcefile~basin_module.f90 basin_module.f90 sourcefile~hydrograph_module.f90->sourcefile~basin_module.f90 sourcefile~time_module.f90 time_module.f90 sourcefile~hydrograph_module.f90->sourcefile~time_module.f90

Source Code

      subroutine rls_routesoil (iob)
      
!!    ~ ~ ~ PURPOSE ~ ~ ~

!!    ~ ~ ~ INCOMING VARIABLES ~ ~ ~
!!    name        |units         |definition
!!    ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ 
!!    ~ ~ ~ OUTGOING VARIABLES ~ ~ ~
!!    name        |units         |definition
!!    ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ ~ 
!!
      use hru_module, only : ihru, latqrunon
      use soil_module
      use hydrograph_module
      
      implicit none

      real :: latqlyr = 0.          !mm         |lateral flow into layer 
      integer :: j = 0              !           |hru number
      integer, intent (in) :: iob   !           |object number
      integer :: lyr = 0            !           |layer number

      j = ihru
      
      latqrunon = ob(iob)%hin_lat%flo
      if (latqrunon > 1.e-9) then
      !!put in soil layers - weighted by depth of soil layer
        do lyr = 1, soil(j)%nly
          latqlyr = (soil(j)%phys(lyr)%thick / soil(j)%phys(soil(j)%nly)%d) * latqrunon
          soil(j)%phys(lyr)%st = soil(j)%phys(lyr)%st + latqlyr
        end do
        !! excess above ul is added to surface storage in saturation excess routine
      end if

      return
      end subroutine rls_routesoil