11 INTEGER,
SAVE ::
nqtot
27 CHARACTER(len=20),
ALLOCATABLE,
DIMENSION(:),
SAVE ::
tname
28 CHARACTER(len=23),
ALLOCATABLE,
DIMENSION(:),
SAVE ::
ttext
36 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
niadv
40 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
nqfils
41 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
nqdesc
43 INTEGER,
ALLOCATABLE,
DIMENSION(:,:),
SAVE ::
iqfils
44 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
iqpere
48 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
conv_flg
52 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
pbl_flg
57 CHARACTER(len=8),
DIMENSION(:),
ALLOCATABLE,
SAVE ::
solsym
67 LOGICAL,
DIMENSION(niso_possibles),
SAVE ::
use_iso
69 INTEGER,
ALLOCATABLE,
DIMENSION(:,:),
SAVE ::
iqiso
71 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
iso_num
75 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
zone_num
77 INTEGER,
ALLOCATABLE,
DIMENSION(:),
SAVE ::
phase_num
89 niadv_,conv_flg_,pbl_flg_,solsym_,&
90 nqfils_,nqdesc_,nqdesc_tot_,iqfils_,iqpere_,&
91 ok_isotopes_,ok_iso_verif_,ok_isotrac_,&
92 ok_init_iso_,niso_possibles_,tnat_,&
93 alpha_ideal_,use_iso_,iqiso_,iso_num_,&
94 iso_indnum_,zone_num_,phase_num_,&
95 indnum_fn_num_,index_trac_,&
96 niso_,ntraceurs_zone_,ntraciso_)
100 INTEGER,
INTENT(IN) :: nqtot_
101 INTEGER,
INTENT(IN) :: nqo_
102 INTEGER,
INTENT(IN) :: nbtr_
103 CHARACTER(len=20),
INTENT(IN) :: tname_(nqtot_)
104 CHARACTER(len=23),
INTENT(IN) :: ttext_(nqtot_)
105 CHARACTER(len=4),
INTENT(IN) :: type_trac_
106 INTEGER,
INTENT(IN) :: niadv_ (nqtot_)
107 INTEGER,
INTENT(IN) :: conv_flg_(nbtr_)
108 INTEGER,
INTENT(IN) :: pbl_flg_(nbtr_)
109 CHARACTER(len=8),
INTENT(IN) :: solsym_(nbtr_)
111 INTEGER,
INTENT(IN) :: nqfils_(nqtot_)
112 INTEGER,
INTENT(IN) :: nqdesc_(nqtot_)
113 INTEGER,
INTENT(IN) :: nqdesc_tot_
114 INTEGER,
INTENT(IN) :: iqfils_(nqtot_,nqtot_)
115 INTEGER,
INTENT(IN) :: iqpere_(nqtot_)
116 LOGICAL,
INTENT(IN) :: ok_isotopes_
117 LOGICAL,
INTENT(IN) :: ok_iso_verif_
118 LOGICAL,
INTENT(IN) :: ok_isotrac_
119 LOGICAL,
INTENT(IN) :: ok_init_iso_
120 INTEGER,
INTENT(IN) :: niso_possibles_
121 REAL,
INTENT(IN) :: tnat_(niso_possibles_)
122 REAL,
INTENT(IN) :: alpha_ideal_(niso_possibles_)
123 LOGICAL,
INTENT(IN) :: use_iso_(niso_possibles_)
124 INTEGER,
INTENT(IN) :: iqiso_(ntraciso_,nqo_)
125 INTEGER,
INTENT(IN) :: iso_num_(nqtot_)
126 INTEGER,
INTENT(IN) :: iso_indnum_(nqtot_)
127 INTEGER,
INTENT(IN) :: zone_num_(nqtot_)
128 INTEGER,
INTENT(IN) :: phase_num_(nqtot_)
129 INTEGER,
INTENT(IN) :: indnum_fn_num_(niso_possibles_)
130 INTEGER,
INTENT(IN) :: index_trac_(ntraceurs_zone_,niso_)
131 INTEGER,
INTENT(IN) :: niso_
132 INTEGER,
INTENT(IN) :: ntraceurs_zone_
133 INTEGER,
INTENT(IN) :: ntraciso_
135 CHARACTER(LEN=30) :: modname=
"init_infotrac_phy"
163 "wrong value for parameter niso_possibles in infotrac_phy",1)
191 iqiso(:,:)=iqiso_(:,:)
character(len=8), dimension(:), allocatable, save solsym
integer, dimension(:), allocatable, save phase_num
integer, dimension(niso_possibles), save indnum_fn_num
integer, dimension(:), allocatable, save nqfils
integer, dimension(:,:), allocatable, save index_trac
real, dimension(niso_possibles), save alpha_ideal
real, dimension(niso_possibles), save tnat
integer, dimension(:), allocatable, save conv_flg
integer, dimension(:), allocatable, save pbl_flg
integer, dimension(:), allocatable, save niadv
integer, dimension(:), allocatable, save nqdesc
integer, dimension(:), allocatable, save iso_indnum
integer, dimension(:), allocatable, save iqpere
integer, dimension(:), allocatable, save zone_num
!FH On elimine toutes les clefs physiques dans la dynamique prt_level
!$Header!integer nvarmx parameter(nfmx=10, imx=200, jmx=150, lmx=200, nvarmx=1000) real xd(imx
character(len=23), dimension(:), allocatable, save ttext
integer, dimension(:,:), allocatable, save iqfils
logical, save ok_isotopes
character(len=20), dimension(:), allocatable, save tname
logical, dimension(niso_possibles), save use_iso
character(len=4), save type_trac
subroutine abort_physic(modname, message, ierr)
integer, save ntraceurs_zone
subroutine init_infotrac_phy(nqtot_, type_trac_)
logical, save ok_init_iso
integer, dimension(:,:), allocatable, save iqiso
integer, dimension(:), allocatable, save iso_num
!$Header!gestion des impressions de sorties et de débogage la sortie standard prt_level COMMON comprint lunout
logical, save ok_iso_verif