5 & (file_desc,path,ncar,cas_file,dico_file)
34 CHARACTER(LEN=PATH_LEN),
INTENT(INOUT) :: FILE_DESC(4,
maxkeyword)
35 INTEGER,
INTENT(IN) :: NCAR
36 CHARACTER(LEN=PATH_LEN),
INTENT(IN) :: PATH
38 CHARACTER(LEN=PATH_LEN),
INTENT(IN) :: DICO_FILE
39 CHARACTER(LEN=PATH_LEN),
INTENT(IN) :: CAS_FILE
48 CHARACTER(LEN=PATH_LEN) :: NOM_CAS
49 CHARACTER(LEN=PATH_LEN) :: NOM_DIC
62 INTEGER :: ID_DICO, ID_CAS
69 2
FORMAT(1x,/,19x,
'********************************************',/,
70 & 19x,
'* SUBROUTINE LECDON_WAQTEL *',/,
71 & 19x,
'* CALL OF DAMOCLES *',/,
72 & 19x,
'* VERIFICATION OF READ DATA *',/,
73 & 19x,
'* ON STEERING FILE *',/,
74 & 19x,
'********************************************',/)
100 nom_dic=path(1:ncar)//
'WAQDICO' 101 nom_cas=path(1:ncar)//
'WAQCAS' 109 IF((cas_file(1:1).NE.
' ').AND.(dico_file(1:1).NE.
' '))
THEN 114 CALL get_free_id(id_dico)
115 OPEN(id_dico,file=nom_dic,form=
'FORMATTED',action=
'READ')
116 CALL get_free_id(id_cas)
117 OPEN(id_cas,file=nom_cas,form=
'FORMATTED',action=
'READ')
121 & motrea, motlog, motcar, motcle , trouve, id_dico, id_cas,
140 IF (
waq_files(i)%TELNAME.EQ.
'WAQGEO')
THEN 142 ELSEIF(
waq_files(i)%TELNAME.EQ.
'WAQCLI')
THEN 144 ELSEIF(
waq_files(i)%TELNAME.EQ.
'WAQHYD')
THEN 146 ELSEIF(
waq_files(i)%TELNAME.EQ.
'WAQREF')
THEN 148 ELSEIF(
waq_files(i)%TELNAME.EQ.
'WAQRES')
THEN 163 leoprd = motint( adress(1, 1) )
165 formk2 = motint( adress(1, 3) )
167 formrs = motint( adress(1, 4) )
169 formcs = motint( adress(1, 5) )
175 debug = motint( adress(1, 11) )
177 mextinc = motint( adress(1, 12) )
185 ro0 = motrea( adress(2, 2) )
187 vce = motrea( adress(2, 8) )
188 ldisp = motrea( adress(2, 11) )
189 tdisp = motrea( adress(2, 12) )
190 k120 = motrea( adress(2, 21) )
191 k520 = motrea( adress(2, 22) )
192 o2photo= motrea( adress(2, 25) )
193 o2nitri= motrea( adress(2, 26) )
194 demben = motrea( adress(2, 29) )
195 k22 = motrea( adress(2, 31) )
196 rsw = motrea( adress(2, 32) )
197 o2satu = motrea( adress(2, 33) )
198 abrs(1)= motrea( adress(2, 34) )
199 abrs(2)= motrea( adress(2, 34)+1)
200 wpor = motrea( adress(2, 36) )
201 wnor = motrea( adress(2, 39) )
202 cmax = motrea( adress(2, 42) )
203 zsd = motrea( adress(2, 45) )
204 extinc = motrea( adress(2, 46) )
206 kpe = motrea( adress(2, 51) )
207 ik = motrea( adress(2, 54) )
208 kp = motrea( adress(2, 57) )
209 kn = motrea( adress(2, 60) )
210 ctoxic = motrea( adress(2, 63) )
211 trespir= motrea( adress(2, 66) )
212 prophoc= motrea( adress(2, 69) )
213 dtp = motrea( adress(2, 71) )
217 WRITE(
lu,*)
'PERCENTAGE OF PHYSPHORUS ASSIMILABLE ' 218 WRITE(
lu,*)
'IN DEAD PHYTOPLANKTON GREATER THAN 100 %' 222 k320 = motrea( adress(2, 73) )
223 pronitc= motrea( adress(2, 75) )
224 pernits= motrea( adress(2, 77) )
228 WRITE(
lu,*)
'PERCENTAGE OF ASSIMILABLE NITROGEN ' 229 WRITE(
lu,*)
'IN DEAD PHYTOPLANKTON GREATER THAN 100 %' 233 k360 = motrea( adress(2, 79) )
234 cmoralg= motrea( adress(2, 81) )
235 wlor = motrea( adress(2, 85) )
236 k1 = motrea( adress(2, 90) )
237 k44 = motrea( adress(2, 93) )
238 photo = motrea( adress(2, 95) )
239 resp = motrea( adress(2, 97) )
240 wattemp= motrea( adress(2, 99) )
241 ero = motrea( adress(2,104) )
242 taur = motrea( adress(2,106) )
243 taus = motrea( adress(2,109) )
244 vitchu = motrea( adress(2,111) )
245 ccsedim= motrea( adress(2,113) )
247 kdesorp= motrea( adress(2,117) )
248 cp_eau = motrea( adress(2,119) )
249 cp_air = motrea( adress(2,121) )
250 cfaer = motrea( adress(2,125) )
251 coef_k = motrea( adress(2,127) )
252 ema = motrea( adress(2,129) )
253 emi_eau= motrea( adress(2,131) )
254 i0 = motrea( adress(2,133) )
255 c_atmos= motrea( adress(2,135) )
258 IF(trouve(2,125).EQ.2)
THEN 262 WRITE(
lu,*)
'IF NEEDED IN 3D, A WIND FUNCTION WITH 2 PARAMETERS' 263 WRITE(
lu,*)
'WILL BE USED FOR ATMOSPHER-WATER EXCHANGE MODEL' 275 wqvalid = motlog( adress(3, 3) )
282 titwaqcas = motcar( adress(4, 2) ) (1:72)
303 IF( (trouve(1,8).EQ.2).OR.(trouve(2,78).EQ.2) )
THEN 304 IF( (dimen(1,8).LE.
waqtr).AND.(dimen(2,78).LE.
waqtr) )
THEN 312 loitrac(i) = motint(adress(1,8)+i-1)
319 WRITE(
lu,*)
'THE NUMBER OF TRACERS DEFINED BY THE LAW OF' 320 WRITE(
lu,*)
' TRACERS DEGRADATION SHOULD BE AT LEAST EQUAL' 321 WRITE(
lu,*)
' TO THE NUMBER OF TRACERS NAMED ',
waqtr
integer, dimension(:), allocatable loitrac
logical, dimension(maxwqvar) sorimp
double precision, dimension(2) ctoxic
integer, parameter maxwqvar
character(len=72) titwaqcas
subroutine read_submit(FILES, NFILES, SUBMIT, NMOT)
subroutine lecdon_waqtel(FILE_DESC, PATH, NCAR, CAS_FILE, DICO_FILE)
double precision, dimension(:), allocatable coef1trac
integer, parameter maxkeyword
double precision, dimension(2) abrs
double precision cdistrib
double precision, dimension(2) cfaer
type(bief_file), dimension(maxlu_waq), target waq_files
double precision, dimension(2) cmoralg
subroutine damocle(ADRESS, DIMENS, NMAX, DOC, LLNG, LLU, MOTINT, MOTREA, MOTLOG, MOTCAR, MOTCLE, TROUVE, NFICMO, NFICDA, GESTD, MOTATT)
double precision, target cp_eau
double precision evaporation
double precision, target c_atmos
integer, parameter maxlu_waq