aqu_read_init.f90 Source File


This file depends on

sourcefile~~aqu_read_init.f90~~EfferentGraph sourcefile~aqu_read_init.f90 aqu_read_init.f90 sourcefile~aqu_pesticide_module.f90 aqu_pesticide_module.f90 sourcefile~aqu_read_init.f90->sourcefile~aqu_pesticide_module.f90 sourcefile~aquifer_module.f90 aquifer_module.f90 sourcefile~aqu_read_init.f90->sourcefile~aquifer_module.f90 sourcefile~basin_module.f90 basin_module.f90 sourcefile~aqu_read_init.f90->sourcefile~basin_module.f90 sourcefile~constituent_mass_module.f90 constituent_mass_module.f90 sourcefile~aqu_read_init.f90->sourcefile~constituent_mass_module.f90 sourcefile~hydrograph_module.f90 hydrograph_module.f90 sourcefile~aqu_read_init.f90->sourcefile~hydrograph_module.f90 sourcefile~input_file_module.f90 input_file_module.f90 sourcefile~aqu_read_init.f90->sourcefile~input_file_module.f90 sourcefile~maximum_data_module.f90 maximum_data_module.f90 sourcefile~aqu_read_init.f90->sourcefile~maximum_data_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

      !populate initial constituent data for aquifers
      subroutine aqu_read_init !rtb cs
      
      use basin_module
      use input_file_module
      use maximum_data_module
      use aquifer_module
      use aqu_pesticide_module
      use hydrograph_module
      use constituent_mass_module
      
      implicit none      
      
      character (len=80) :: titldum = ""  !             |title of file
      character (len=80) :: header = "" !             |header of file
      integer :: eof = 0                !             |end of file
      integer :: imax = 0               !             |determine max number for array (imax) and total number in file
      logical :: i_exist                !none         |check to determine if file exists
      integer :: iaqu = 0               !none         |counter
      integer :: iaq = 0
      integer :: ics = 0
      
      eof = 0
      imax = 0
      
      !read init
      inquire (file=in_aqu%init, exist=i_exist)
      if (.not. i_exist .or. in_aqu%init == "null") then
        allocate (aqu_init(0:0))
      else   
      do
       open (105,file=in_aqu%init)
       read (105,*,iostat=eof) titldum
       if (eof < 0) exit
       read (105,*,iostat=eof) header
       if (eof < 0) exit
        do while (eof == 0)
          read (105,*,iostat=eof) titldum
          if (eof < 0) exit
          imax = imax + 1
        end do

      allocate (aqu_init(0:imax))
      allocate (aqu_init_dat_c(0:imax))

      rewind (105)
      read (105,*,iostat=eof) titldum
      if (eof < 0) exit
      read (105,*,iostat=eof) header
      if (eof < 0) exit
           
       do iaqu = 1, imax
         read (105,*,iostat=eof) aqu_init_dat_c(iaqu)
         if (eof < 0) exit
       end do
       
       end do
       close (105)

      end if

      !! initialize organics and constituents for each aquifer object
      do iaq = 1, sp_ob%aqu

        !! initial organic mineral
        do ics = 1, db_mx%om_water_init
          !! initializing organics in aqu_initial - do it here later
          !if (aqu_init(ini)%org_min == 0) write (9001,*) om_init_name(ics), " not found"
        end do
            
      end do

      return
      end subroutine aqu_read_init