salt_hru_read.f90 Source File


This file depends on

sourcefile~~salt_hru_read.f90~~EfferentGraph sourcefile~salt_hru_read.f90 salt_hru_read.f90 sourcefile~constituent_mass_module.f90 constituent_mass_module.f90 sourcefile~salt_hru_read.f90->sourcefile~constituent_mass_module.f90 sourcefile~input_file_module.f90 input_file_module.f90 sourcefile~salt_hru_read.f90->sourcefile~input_file_module.f90 sourcefile~maximum_data_module.f90 maximum_data_module.f90 sourcefile~salt_hru_read.f90->sourcefile~maximum_data_module.f90

Source Code

      subroutine salt_hru_read
    
      use constituent_mass_module
      use input_file_module
      use maximum_data_module
      
      implicit none
 
      character (len=80) :: titldum = ""
      character (len=80) :: header = ""
      integer :: isalt = 0
      integer :: isalti = 0
      integer :: eof = 0
      integer :: imax = 0
      logical :: i_exist              !none       |check to determine if file exists

      eof = 0
      
      !read salt data for soils and plants
      inquire (file='salt_hru.ini', exist=i_exist)
      if (i_exist .or. 'salt_hru.ini' /= "null") then
        do
          open (107,file='salt_hru.ini')
          read (107,*,iostat=eof) titldum
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          imax = 0
          do while (eof == 0)
            if (eof < 0) exit
            read (107,*,iostat=eof) titldum
            if (eof < 0) exit
            read (107,*,iostat=eof) titldum
            if (eof < 0) exit
            read (107,*,iostat=eof) titldum
            if (eof < 0) exit
            imax = imax + 1
          end do
          
          db_mx%salt_ini = imax
          
          allocate (salt_soil_ini(imax))
          do isalt = 1, imax
            allocate (salt_soil_ini(isalt)%soil(cs_db%num_salts+5), source = 0.)
            allocate (salt_soil_ini(isalt)%plt(cs_db%num_salts+5), source = 0.)
          end do
           
          rewind (107)
          read (107,*,iostat=eof) titldum
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit

          do isalti = 1, imax
            read (107,*,iostat=eof) salt_soil_ini(isalti)%name
            if (eof < 0) exit
            read (107,*,iostat=eof) salt_soil_ini(isalti)%soil
            if (eof < 0) exit
            read (107,*,iostat=eof) salt_soil_ini(isalti)%plt
            if (eof < 0) exit
          end do
          close (107)
          exit
        end do
      end if
      
      return
      end subroutine salt_hru_read