27INTEGER,
INTENT(IN) :: vid
29DOUBLE PRECISION :: mamp, eamp
30DOUBLE PRECISION :: tamp, etamp
31DOUBLE PRECISION,
DIMENSION(:),
ALLOCATABLE :: amp
32DOUBLE PRECISION,
DIMENSION(:),
ALLOCATABLE :: ringspna, ectrpna
33DOUBLE PRECISION,
DIMENSION(:),
ALLOCATABLE :: emin, emax
34DOUBLE PRECISION,
DIMENSION(:,:),
ALLOCATABLE :: mpna
35DOUBLE PRECISION,
DIMENSION(:),
ALLOCATABLE :: rtab
49if (
allocated(rtab))
deallocate(rtab)
52 call show_error (
"Impossible to allocate memory"//char(0), &
53 "Function: RECRINGS"//char(0),
"Table: RTAB"//char(0))
60 call show_error (
"Impossible to allocate memory"//char(0), &
61 "Function: RECRINGS"//char(0),
"Table: MOYRED"//char(0))
65if (
allocated(
red))
deallocate(
red)
68 call show_error (
"Impossible to allocate memory"//char(0), &
69 "Function: RECRINGS"//char(0),
"Table: RED"//char(0))
76 call show_error (
"Impossible to allocate memory"//char(0), &
77 "Function: RECRINGS"//char(0),
"Table: ECTYPE"//char(0))
132 tamp = tamp + rtab(
i)
135if (tamp .eq. 0.0)
then
144if (
allocated(mpna))
deallocate(mpna)
147 call show_error (
"Impossible to allocate memory"//char(0), &
148 "Function: RECRINGS"//char(0),
"Table: MPNA"//char(0))
152if (
allocated(
epna))
deallocate(
epna)
155 call show_error (
"Impossible to allocate memory"//char(0), &
156 "Function: RECRINGS"//char(0),
"Table: EPNA"//char(0))
160if (
allocated(ringspna))
deallocate(ringspna)
163 call show_error (
"Impossible to allocate memory"//char(0), &
164 "Function: RECRINGS"//char(0),
"Table: RINGSPNA"//char(0))
168if (
allocated(ectrpna))
deallocate(ectrpna)
171 call show_error (
"Impossible to allocate memory"//char(0), &
172 "Function: RECRINGS"//char(0),
"Table: ECTPNA"//char(0))
179 call show_error (
"Impossible to allocate memory"//char(0), &
180 "Function: RECRINGS"//char(0),
"Table: RNAMAX"//char(0))
187 call show_error (
"Impossible to allocate memory"//char(0), &
188 "Function: RECRINGS"//char(0),
"Table: RNAMIN"//char(0))
192if (
allocated(emax))
deallocate(emax)
195 call show_error (
"Impossible to allocate memory"//char(0), &
196 "Function: RECRINGS"//char(0),
"Table: EMAX"//char(0))
200if (
allocated(emin))
deallocate(emin)
203 call show_error (
"Impossible to allocate memory"//char(0), &
204 "Function: RECRINGS"//char(0),
"Table: EMIN"//char(0))
211 call show_error (
"Impossible to allocate memory"//char(0), &
212 "Function: RECRINGS"//char(0),
"Table: MTABL"//char(0))
240 if (
i.eq.
j) ringspna(
i)=mpna(
i,
j)
255 if (
pna(
i,
i,
j) .eq. 0)
then
275 if (
pna(
i,
i,
j) .eq. 0)
then
294 if (
pna(
i,
i,1).eq.0.0)
then
319if (
allocated(amp))
deallocate(amp)
320allocate(amp(
ns), stat=
err)
322 call show_error (
"Impossible to allocate memory"//char(0), &
323 "Function: RECRINGS"//char(0),
"Table: AMP"//char(0))
350 call show_error (
"Impossible to allocate memory"//char(0), &
351 "Function: RECRINGS"//char(0),
"Table: TOTPSTEP"//char(0))
367call save_rings_data (
taillr,
ectype, ectrpna, emax, emin, tamp, etamp, mamp, eamp)
373if (
allocated(rtab))
deallocate(rtab)
375if (
allocated(amp))
deallocate(amp)
378if (
allocated(
red))
deallocate(
red)
383if (
allocated(mpna))
deallocate(mpna)
384if (
allocated(
epna))
deallocate(
epna)
385if (
allocated(ringspna))
deallocate(ringspna)
386if (
allocated(ectrpna))
deallocate(ectrpna)
389if (
allocated(emax))
deallocate(emax)
390if (
allocated(emin))
deallocate(emin)
void show_error(char *error, int val, GtkWidget *win)
show error message
double precision, dimension(:), allocatable mtabl
double precision, dimension(:), allocatable moyred
double precision, dimension(:), allocatable totpstep
integer, dimension(:,:), allocatable ampat
integer, dimension(:,:), allocatable maxpna
integer, dimension(:,:), allocatable minpna
double precision, dimension(:), allocatable red
double precision, dimension(:), allocatable ectype
integer, dimension(:,:,:), allocatable pna
double precision, dimension(:,:), allocatable epna
double precision, dimension(:), allocatable rnamin
double precision, dimension(:), allocatable rnamax
integer, dimension(:,:), allocatable, target nring
integer function recrings(vid)
subroutine moyenne(tableau, longtm, moytab)
subroutine ect_type(moyenne, tableau, longte, ec_type)
subroutine ect_type_rings(moyenne, tableau, longte, lrepres, ec_type)