solt_db_read.f90 Source File


This file depends on

sourcefile~~solt_db_read.f90~~EfferentGraph sourcefile~solt_db_read.f90 solt_db_read.f90 sourcefile~input_file_module.f90 input_file_module.f90 sourcefile~solt_db_read.f90->sourcefile~input_file_module.f90 sourcefile~maximum_data_module.f90 maximum_data_module.f90 sourcefile~solt_db_read.f90->sourcefile~maximum_data_module.f90 sourcefile~soil_data_module.f90 soil_data_module.f90 sourcefile~solt_db_read.f90->sourcefile~soil_data_module.f90

Source Code

      subroutine solt_db_read
      
      use input_file_module
      use maximum_data_module
      use soil_data_module
      
      implicit none
      
      character (len=80) :: titldum = ""!           |title of file
      character (len=80) :: header = "" !           |header of file
      integer :: eof = 0              !           |end of file
      integer :: msolt_db = 0         !           |
      integer :: imax = 0             !none       |determine max number for array (imax) and total number in file
      logical :: i_exist              !none       |check to determine if file exists
      integer :: isolt = 0            !           |
      
      msolt_db = 0
      eof = 0
      imax = 0
      
      !! read all soil test operations data from soiltest.dat
      inquire (file=in_sol%nut_sol,exist=i_exist)
      if (.not. i_exist .or. in_sol%nut_sol == "null") then
        allocate (solt_db(0:0))
      else
        do
          open (107,file=in_sol%nut_sol)
          read (107,*,iostat=eof) titldum
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
          do while (eof == 0)
            read (107,*,iostat=eof) titldum
            if (eof < 0) exit
            imax = imax + 1
          end do
                
          allocate (solt_db(0:imax))
         
          rewind (107)
          read (107,*,iostat=eof) titldum
          if (eof < 0) exit
          read (107,*,iostat=eof) header
          if (eof < 0) exit
                
          do isolt = 1, imax
            read (107,*,iostat=eof) solt_db(isolt)
            if (eof < 0) exit
            if (solt_db(isolt)%exp_co > 0.005) solt_db(isolt)%exp_co = 0.001
          end do 
          exit
        enddo
      endif
      
      db_mx%soiltest = imax
      
      close(107)      
      return  
      end subroutine solt_db_read