5 & (file_desc,path,ncar)
34 CHARACTER(LEN=PATH_LEN),
INTENT(INOUT) :: FILE_DESC(4,
maxkeyword)
35 INTEGER,
INTENT(IN) :: NCAR
36 CHARACTER(LEN=PATH_LEN),
INTENT(IN) :: PATH
40 CHARACTER(LEN=8) :: MNEMO(
maxvar)
42 DOUBLE PRECISION :: ANG
43 CHARACTER(LEN=2) CHAR2
45 CHARACTER(LEN=PATH_LEN) :: NOM_CAS
46 CHARACTER(LEN=PATH_LEN) :: NOM_DIC
61 INTEGER :: ID_DICO, ID_CAS
65 IF (
lng.EQ.1)
WRITE(
lu,1)
66 IF (
lng.EQ.2)
WRITE(
lu,2)
67 1
FORMAT(1x,/,19x,
'********************************************',/,
68 & 19x,
'* SOUS-PROGRAMME LECDON_KHIONE *',/,
69 & 19x,
'* APPEL DE DAMOCLES *',/,
70 & 19x,
'* VERIFICATION DES DONNEES LUES *',/,
71 & 19x,
'* SUR LE FICHIER CAS *',/,
72 & 19x,
'********************************************',/)
73 2
FORMAT(1x,/,19x,
'********************************************',/,
74 & 19x,
'* SUBROUTINE LECDON_KHIONE *',/,
75 & 19x,
'* CALL OF DAMOCLES *',/,
76 & 19x,
'* VERIFICATION OF READ DATA *',/,
77 & 19x,
'* ON STEERING FILE *',/,
78 & 19x,
'********************************************',/)
106 nom_dic=path(1:ncar)//
'ICEDICO' 107 nom_cas=path(1:ncar)//
'ICECAS' 116 CALL get_free_id(id_dico)
117 OPEN(id_dico,file=nom_dic,form=
'FORMATTED',action=
'READ')
118 CALL get_free_id(id_cas)
119 OPEN(id_cas,file=nom_cas,form=
'FORMATTED',action=
'READ')
125 & motrea, motlog, motcar, motcle , trouve, id_dico, id_cas,
143 IF (
ice_files(i)%TELNAME.EQ.
'ICECLI')
THEN 145 ELSEIF(
ice_files(i)%TELNAME.EQ.
'ICEGEO')
THEN 147 ELSEIF(
ice_files(i)%TELNAME.EQ.
'ICEREF')
THEN 149 ELSEIF(
ice_files(i)%TELNAME.EQ.
'ICERES')
THEN 151 ELSEIF(
ice_files(i)%TELNAME.EQ.
'ICECOV')
THEN 153 ELSEIF(
ice_files(i)%TELNAME.EQ.
'ICEBLK')
THEN 155 ELSEIF(
ice_files(i)%TELNAME.EQ.
'CLGRFO')
THEN 164 nadvar = motint( adress(1,13) )
171 WRITE(char2,
'(I2)') i
172 names_advar(i) =
'DERIVATIVE '//adjustl(char2)//
' ' 190 leoprd = motint( adress(1, 1) )
193 lisprd = motint( adress(1, 2) )
222 vardes = motcar( adress(4, 10) )(1:72)
225 varimp = motcar( adress(4, 11) )(1:72)
234 xnu = motrea( adress(2,8) )
237 ro0 = motrea( adress(2, 1) )
238 rho_air = motrea( adress(2, 11) )
239 rho_ice = motrea( adress(2, 12) )
242 cp_eau = motrea( adress(2, 5) )
243 cp_ice = motrea( adress(2, 16) )
244 lh_ice = motrea( adress(2, 17) )
247 albe = motrea( adress(2,34) )
256 windz = motrea( adress(2,22) )
257 modelz = motrea( adress(2,23) )
260 alphsd = motrea( adress(2,25) )
261 alphrd = motrea( adress(2,26) )
264 sio = motrea( adress(2,33) )
307 de = motrea( adress(2,28) )
308 nuss = motrea( adress(2,24) )
309 nussi = motint( adress(1, 9) )
310 ibuoy = motint( adress(1,10) )
311 isnuc = motint( adress(1,12) )
312 snnmax= motrea( adress(2,13) )
313 ifloc = motint( adress(1,15) )
314 afloc = motrea( adress(2,14) )
315 inrjb = motint( adress(1,18) )
316 iseed = motint( adress(1,19) )
317 minnk = motint( adress(1,20) )
318 seedr = motrea( adress(2,40) )
324 ifrot = motint(adress(1,8))
325 ifice = motint(adress(1,16))
326 fice = motrea(adress(2,4))
328 thie = motrea( adress(2,75) )
335 bch = motrea( adress(2,98) )
336 tc = motrea( adress(2,71) )
337 vcrbor = motrea(adress(2,50))
343 vcrbom = motrea(adress(2,73))
354 alsm = motrea( adress(2,30) )
355 allm = motrea( adress(2,31) )
356 etadir = motrea( adress(2,32) )
357 af = motrea( adress(2,29) )
358 surf_ef = motrea( adress(2,39) )
359 tc_wt = motrea( adress(2,44) )
361 clog_ef = motrea( adress(2,37) )
363 IF( dimens(2,35).EQ.4 )
THEN 371 IF(modulo(dimens(1,3),2).EQ.1)
THEN 372 IF ( motint( adress(1,3) ).EQ.0 )
THEN 376 WRITE(
lu,*)
'LECDON_KHIONE' 377 WRITE(
lu,*)
'CLOOGING SECTION WORKS BY PAIR' 378 WRITE(
lu,*)
'PLEASE GIVE A MULTIPLE OF 2 NUMBER OF NODES' 386 IF( motint( adress(1,14) ).EQ.0 )
nfrclog = 0
404 numclog(k) = motint( adress(1,14) + k-1 )
407 seclog(k) = motint( adress(1,3) + k-1 )
410 lines%CELLS(k)%NVAL = 0
424 cwi1 = motrea( adress(2,62) )
425 ciw1 = motrea( adress(2,63) )
426 ata = motrea( adress(2,64) )
427 iturb = motint( adress(1,4) )
428 tc_bi = motrea( adress(2,65) )
430 tc_s = motrea( adress(2,67) )
431 sgma = motrea( adress(2,69) )
434 anfem0 = motrea( adress(2,74) )
448 IF(dimens(2, 27).GE.k)
THEN 449 rk_frzl(k) = motrea( adress(2, 27) + k-1 )
456 WRITE(
lu,*)
'WARNING: THE VALUE OF FRAZIL CRISTAL RADIUS ',k
457 WRITE(
lu,*)
' IS NOT GIVEN, RADIUS IS SET TO ',
rk_frzl(k)
double precision clog_vdist
double precision fice_max
double precision cst_watair
double precision, dimension(:), allocatable clog_volum
double precision, dimension(:), allocatable un1
type(str_line_type) lines
double precision coef_phib
double precision clog_vdiam
double precision, dimension(:), allocatable vbk
double precision coef_phip
double precision cst_iceair
double precision coef_phie
subroutine nomvar_khione(TEXTE, TEXTPR, MNEMO, NADVAR, NAMES_ADVAR)
double precision clog_tdist
integer, dimension(:), allocatable seclog
double precision clog_tdiam
double precision, dimension(:), allocatable nusst
double precision function, public buoyancy_velocity(RADIUS, THICKNESS)
subroutine read_submit(FILES, NFILES, SUBMIT, NMOT)
double precision, dimension(:), allocatable clog_vlgth
character(len=72) titicecas
double precision coef_phih
double precision, dimension(:), allocatable ek_frzl
integer, parameter maxkeyword
integer, dimension(:), allocatable numclog
double precision, dimension(:), allocatable clog_tlgth
character(len=32), dimension(maxvar) textpr
double precision, dimension(:), allocatable vk_frzl
character(len=32), dimension(maxvar) texte
double precision, dimension(:), allocatable rk_frzl
double precision lin_iceair
double precision, public alphsd
type(bief_file), dimension(maxlu_ice) ice_files
double precision, dimension(:), allocatable clog_twdth
subroutine sortie(CHAINE, MNEMO, NBRE, SORLEO)
logical, dimension(maxvar) sorleo
subroutine damocle(ADRESS, DIMENS, NMAX, DOC, LLNG, LLU, MOTINT, MOTREA, MOTLOG, MOTCAR, MOTCLE, TROUVE, NFICMO, NFICDA, GESTD, MOTATT)
double precision, public cst_tdew
double precision, public cst_visbi
subroutine lecdon_khione(FILE_DESC, PATH, NCAR)
double precision, dimension(:), allocatable clog_vwdth
double precision clog_theta
double precision lin_watair
integer, parameter maxlu_ice
double precision, public alphrd
double precision, dimension(:), allocatable un2
character(len=32), dimension(maxvar) names_advar
double precision, public modelz
double precision cst_tmelt
double precision, public windz
logical, dimension(maxvar) sorimp
integer, parameter maxvar