32SUBROUTINE writestate(year, latStart, latEnd, lonStart, lonEnd, nspc)
42 character*6:: yearChar
45 INTEGER,
INTENT(in) :: year
46 INTEGER,
INTENT(in) :: latStart, latEnd, lonStart, lonEnd, nspc
53 write (
logmessage,
"(A,I7)")
"Writing backup state for year: ", year
69 write (
logmessage,
"(A,I7)")
"Writing backup state for year: ", year
77 write (
logmessage,
"(A,I7)")
"Writing state optionally for year: ", year
109SUBROUTINE writestatefile(stateFile, year, latStart, latEnd, lonStart, lonEnd, nspc)
113 TYPE(
file),
INTENT(in) :: stateFile
114 INTEGER,
INTENT(in) :: year, &
115 latStart, latEnd, lonStart, lonEnd, nspc
120 call logwarning(
"Could not open statefile! Skip writing")
123 call writestateloops(year, latstart, latend, lonstart, lonend, nspc, statefile%unit)
153 INTEGER,
INTENT(in) :: year, & !> year of calculation [=..]
154 latStart, latEnd, lonStart, lonEnd, nspc, unit
158 INTEGER :: isp, & !>!> species loop-counter
159 lat, lon, output_year
160 character(len=5) :: asChar_maxhtc
164 looplat:
do lat = latstart, latend
165 looplon:
do lon = lonstart, lonend
169 write (aschar_maxhtc,
"(I5)")
spec(isp)%maxhtc+1
171 write (unit,
"(A,3I10,2F18.6,I5,"//aschar_maxhtc//
"F18.6)")
spec(isp)%nl, output_year, lat, lon, &
173 stategrid(lat, lon)%sp(isp)%antagonist, &
175 (
stategrid(lat, lon)%sp(isp)%numin(height), height=0,
spec(isp)%maxhtc)
subroutine writestateloops(year, latstart, latend, lonstart, lonend, nspc, unit)
WriteStateLoops.
subroutine writestate(year, latstart, latend, lonstart, lonend, nspc)
WriteState.
subroutine writestatefile(statefile, year, latstart, latend, lonstart, lonend, nspc)
WriteStateFile.
character(len=:), allocatable experimentid
real, dimension(:, :), allocatable stockability
type(specproperties), dimension(maxspc) spec
type(currstateincell), dimension(:, :), allocatable stategrid
integer, dimension(10) stateoutputyears
character(2) relativepathletter
subroutine closefile(thefile)
closeFile
subroutine openfilew(thefile, err)
openFileW
subroutine deletefile(thefile)
deleteFile
type(file) statebackupout_file_0
type(file) statebackupout_file_1
type(file) statebackupout_file
subroutine logwarning(msg)
LogError
subroutine loginfo(msg)
LogInfo
character(len=1024) logmessage