ru_module.f90 Source File


Files dependent on this one

sourcefile~~ru_module.f90~~AfferentGraph sourcefile~ru_module.f90 ru_module.f90 sourcefile~calsoft_chsed.f90 calsoft_chsed.f90 sourcefile~calsoft_chsed.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd.f90 calsoft_hyd.f90 sourcefile~calsoft_hyd.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd_bfr.f90 calsoft_hyd_bfr.f90 sourcefile~calsoft_hyd_bfr.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd_bfr_et.f90 calsoft_hyd_bfr_et.f90 sourcefile~calsoft_hyd_bfr_et.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd_bfr_latq.f90 calsoft_hyd_bfr_latq.f90 sourcefile~calsoft_hyd_bfr_latq.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd_bfr_perc.f90 calsoft_hyd_bfr_perc.f90 sourcefile~calsoft_hyd_bfr_perc.f90->sourcefile~ru_module.f90 sourcefile~calsoft_hyd_bfr_surq.f90 calsoft_hyd_bfr_surq.f90 sourcefile~calsoft_hyd_bfr_surq.f90->sourcefile~ru_module.f90 sourcefile~calsoft_plant.f90 calsoft_plant.f90 sourcefile~calsoft_plant.f90->sourcefile~ru_module.f90 sourcefile~calsoft_sed.f90 calsoft_sed.f90 sourcefile~calsoft_sed.f90->sourcefile~ru_module.f90 sourcefile~caltsoft_hyd.f90 caltsoft_hyd.f90 sourcefile~caltsoft_hyd.f90->sourcefile~ru_module.f90 sourcefile~channel_surf_link.f90 channel_surf_link.f90 sourcefile~channel_surf_link.f90->sourcefile~ru_module.f90 sourcefile~command.f90 command.f90 sourcefile~command.f90->sourcefile~ru_module.f90 sourcefile~dr_ru.f90 dr_ru.f90 sourcefile~dr_ru.f90->sourcefile~ru_module.f90 sourcefile~hru_fr_change.f90 hru_fr_change.f90 sourcefile~hru_fr_change.f90->sourcefile~ru_module.f90 sourcefile~hyd_connect.f90 hyd_connect.f90 sourcefile~hyd_connect.f90->sourcefile~ru_module.f90 sourcefile~ru_read.f90 ru_read.f90 sourcefile~ru_read.f90->sourcefile~ru_module.f90 sourcefile~sd_channel_surf_link.f90 sd_channel_surf_link.f90 sourcefile~sd_channel_surf_link.f90->sourcefile~ru_module.f90 sourcefile~time_conc_init.f90 time_conc_init.f90 sourcefile~time_conc_init.f90->sourcefile~ru_module.f90 sourcefile~unit_hyd_ru_hru.f90 unit_hyd_ru_hru.f90 sourcefile~unit_hyd_ru_hru.f90->sourcefile~ru_module.f90

Source Code

      module ru_module
    
      implicit none 

      integer :: iru = 0                           !none            |counter
      integer :: mru_db = 0                        !                |
      real, dimension (:), allocatable :: ru_tc    !                |    
      real, dimension (:), allocatable :: ru_n     !                |
      integer, dimension (:), allocatable :: itsb  !none            |end of loop
   
      type ru_databases_char
        character(len=16) :: elem_def = ""
        character(len=16) :: elem_dr = ""
        character(len=16) :: toposub_db = ""
        character(len=16) :: field_db = ""
      end type ru_databases_char
      
      type ru_databases
        integer :: elem_def = 1
        integer :: elem_dr = 1
        integer :: toposub_db = 1
        integer :: field_db = 1
      end type ru_databases
          
      type field
        character(len=13) :: name = "default"
        real :: length = 500. !!               |m             |field length for wind erosion
        real :: wid = 100.    !!               |m             |field width for wind erosion
        real :: ang = 30.     !!               |deg           |field angle for wind erosion
      end type field
      
      type ru_parameters
        character(len=16) :: name = ""
        real :: da_km2 = 0.                         !! km2      |drainage area
        type (ru_databases_char) :: dbsc
        type (ru_databases) :: dbs
        type (field) :: field
      end type ru_parameters
      type (ru_parameters), dimension(:), allocatable :: ru

      end module ru_module