Serie stagionali ottenute dalle serie di valori giornalieri SCIA.
rm(list = objects())
library("evd")
# elimina warnings
options(warn = -1)
# funzioni per il calcolo del massimo annuale (RX1) block-maxima approach
analisiGEV <- function(col) {
# data.frame per il livelli di ritorno
idColumn <- rep(NA, length = length(tempi.ritorno))
return.period <- rep(NA, length = length(tempi.ritorno))
return.level <- rep(NA, length = length(tempi.ritorno))
confidence.delta.lower <- rep(NA, length = length(tempi.ritorno))
confidence.delta.upper <- rep(NA, length = length(tempi.ritorno))
confidence.profile.lower <- rep(NA, length = length(tempi.ritorno))
confidence.profile.upper <- rep(NA, length = length(tempi.ritorno))
precReturn <- data.frame(idColumn, return.period, return.level, confidence.delta.lower,
confidence.delta.upper, confidence.profile.lower, confidence.profile.upper)
ID <- names(dati)[col]
cat(sprintf("Stazione: %s", ID))
# associamo i dati
x <- dati[, c(1, col)]
names(x) <- c("yy", "prcp")
# subset dei dati sulla base di quanto riportato nel file annoI
file.annoI <- list.files(pattern = "^annoI.+txt$")
if (length(file.annoI) != 1)
stop("Impossibile: ci deve essere un solo file")
# cerchiamo anno inizio
info.anni <- read.csv(file = file.annoI[1], sep = ";", head = T)
index.id <- which(info.anni$idstaz == ID)
if (!length(index.id))
stop(paste0(ID, "stazione non trovata in file annoI"))
YYYY <- info.anni[index.id, ]$annoI
# YYYY: prima di questo anno dobbiamo eliminare la serie
if (YYYY != 1951)
x <- subset(x, x >= YYYY)
plot(x$yy, x$prcp, type = "l", xlab = "Years", ylab = "mm", main = paste0("Station -- ",
ID))
points(x$yy, x$prcp, pch = 21, bg = "red")
index <- which(is.na(x$prcp))
# con pacchetto evd non sarebbe necessario
if (length(index))
x <- x[-index, ]
annual.fit <- tryCatch({
fgev(x$prcp)
}, error = function(err) {
print(paste(ID, "gev", sep = " "))
print(err)
precReturn <- data.frame(ID = ID, conf.level = NA, return.level = NA,
return.period = NA, confidence.delta.lower = NA, confidence.delta.upper = NA,
rl.confidence.profile.lower = NA, rl.confidence.profile.upperNA)
my.shape <- c(NA, NA, NA)
return(list(precReturn, my.shape))
})
plot(annual.fit, which = 1)
plot(annual.fit, which = 2)
plot(annual.fit, which = 3)
plot(annual.fit, which = 4)
parametri <- round(annual.fit$param, 2)
cat(sprintf("LOcation Scale and Shape; PACKAGE evd: %s\n", parametri))
lapply(1:length(tempi.ritorno), function(i) {
print(sprintf("Calcolo livello di ritorno per tempo: %s anni", tempi.ritorno[i]))
stima.evd <- fgev(x$prcp, prob = 1/(tempi.ritorno[i]))
livello.evd <- round(stima.evd$param["quantile"], 2)
cat(sprintf("RLevel; PACKAGE evd: %s\n", livello.evd))
profile.object <- evd:::profile.evd(stima.evd, which = "quantile", conf = 0.95)
plot(profile.object)
profile.int <- confint(profile.object, level = 0.95, parm = "quantile")
# intervallo mediante profile likelihood
profLow <- profile.int[, "lower"]
profUp <- profile.int[, "upper"]
# intervalli di confidenza assumendo ipotesi normalità
profLowW <- confint(stima.evd)[, 1][1]
profUpW <- confint(stima.evd)[, 2][1]
precReturn$idColumn[i] <<- ID
precReturn$return.period[i] <<- tempi.ritorno[i]
precReturn$return.level[i] <<- livello.evd
precReturn$confidence.delta.lower[i] <<- profLowW
precReturn$confidence.delta.upper[i] <<- profUpW
precReturn$confidence.profile.lower[i] <<- profLow
precReturn$confidence.profile.upper[i] <<- profUp
})
## fine lapply plot dei tempi di ritorno e intervalli di confidenza (in
## rosso) con profile likelihood
lineaL <- approx(seq(10, 100, 10), precReturn$confidence.profile.lower)
lineaU <- approx(seq(10, 100, 10), precReturn$confidence.profile.upper)
plot(annual.fit, which = 4)
lines(lineaL$x, lineaL$y, col = "red")
lines(lineaU$x, lineaU$y, col = "red")
########################### fine parte su ismev
# delta intervals for shape
shapeFi.delta <- confint(annual.fit, parm = "shape")
# parametro shape e intervalli di confidenza mediante profile likelihood
profile.object <- profile(annual.fit, which = "shape")
shapeFi.prof <- confint(profile.object)
my.shape <- c(ID = as.numeric(ID), xi = parametri[3], xi.delta.dwn = shapeFi.delta[1],
xi.delta.up = shapeFi.delta[2], xi.prof.dwn = shapeFi.prof[1], xi.prof.up = shapeFi.prof[2])
list(precReturn, my.shape)
} #fine analisiGEV
###################### inizio programma
tempi.ritorno <- seq(10, 100, by = 10)
# dati di input: serie che cominciano dal 1951
dati <- read.csv(file = "dati1951.csv", sep = ";", head = T, check.names = F)
colonne <- ncol(dati)
risultati.gev <- lapply(2:colonne, analisiGEV)
## Stazione: 6220
## LOcation Scale and Shape; PACKAGE evd: 57.56
## LOcation Scale and Shape; PACKAGE evd: 24.25
## LOcation Scale and Shape; PACKAGE evd: 0.08
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 117.68
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 139.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 151.13
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 159.12
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 165.29
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 170.33
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 176.57
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 178.24
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 181.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 184.37
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6225
## LOcation Scale and Shape; PACKAGE evd: 59.89
## LOcation Scale and Shape; PACKAGE evd: 30.27
## LOcation Scale and Shape; PACKAGE evd: -0.05
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 124.17
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 143.53
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 154.93
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 161.97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 167.86
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 171.52
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 175.63
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 179.62
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 188.33
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 191.38
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6259
## LOcation Scale and Shape; PACKAGE evd: 45.72
## LOcation Scale and Shape; PACKAGE evd: 26.54
## LOcation Scale and Shape; PACKAGE evd: 0.33
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 134.84
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 176.3
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 191.77
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 204.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 222.93
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 225.89
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 234.73
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 232.07
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 242.04
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 247.15
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6278
## LOcation Scale and Shape; PACKAGE evd: 36.71
## LOcation Scale and Shape; PACKAGE evd: 15.82
## LOcation Scale and Shape; PACKAGE evd: 0.05
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 74.2
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 87.05
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 94.51
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 99.5
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 103.35
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 107.39
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 109.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 112.26
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 115.15
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 115.26
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6429
## LOcation Scale and Shape; PACKAGE evd: 58.75
## LOcation Scale and Shape; PACKAGE evd: 31.49
## LOcation Scale and Shape; PACKAGE evd: 0.11
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 141.3
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 166.99
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 181.76
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 198.22
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 206.53
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 214.19
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 225.12
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 232.01
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 232.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 225.09
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6709
## LOcation Scale and Shape; PACKAGE evd: 36.09
## LOcation Scale and Shape; PACKAGE evd: 16.98
## LOcation Scale and Shape; PACKAGE evd: -0.01
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 73.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 85.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 92.57
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 97.37
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 101.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 103.96
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 106.73
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 108.97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 110.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 113.29
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6720
## LOcation Scale and Shape; PACKAGE evd: 39.94
## LOcation Scale and Shape; PACKAGE evd: 17.85
## LOcation Scale and Shape; PACKAGE evd: -0.06
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 77.64
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 88.72
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 96.73
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 99.21
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 102.56
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 105.11
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 107.37
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 109.07
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 110.94
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 112.38
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6721
## LOcation Scale and Shape; PACKAGE evd: 36.34
## LOcation Scale and Shape; PACKAGE evd: 13.77
## LOcation Scale and Shape; PACKAGE evd: 0.02
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 68.02
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 78.44
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 84.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 88.77
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 92.09
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 94.82
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 97.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 99.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 100.88
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 102.33
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6723
## LOcation Scale and Shape; PACKAGE evd: 36.02
## LOcation Scale and Shape; PACKAGE evd: 12.72
## LOcation Scale and Shape; PACKAGE evd: -0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 63.58
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 71.95
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 76.7
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 80
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 82.54
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 84.63
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 86.25
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 88.15
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 89.07
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 90.27
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6729
## LOcation Scale and Shape; PACKAGE evd: 38.22
## LOcation Scale and Shape; PACKAGE evd: 15.59
## LOcation Scale and Shape; PACKAGE evd: 0.07
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 76.12
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 89.4
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 97.53
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 103.27
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 107.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 111.41
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 114.36
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 117.06
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 119.19
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 121.71
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6736
## LOcation Scale and Shape; PACKAGE evd: 42.06
## LOcation Scale and Shape; PACKAGE evd: 14.05
## LOcation Scale and Shape; PACKAGE evd: -0.07
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 71.2
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 79.54
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 84.16
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 87.34
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 89.72
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 91.72
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 93.28
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 94.66
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 95.91
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 96.98
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6769
## LOcation Scale and Shape; PACKAGE evd: 33.11
## LOcation Scale and Shape; PACKAGE evd: 15.95
## LOcation Scale and Shape; PACKAGE evd: 0.11
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 73.72
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 88.59
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 96.21
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 101.57
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 105.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 109.12
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 111.97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 122.16
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 125.02
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 118.56
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6773
## LOcation Scale and Shape; PACKAGE evd: 47.82
## LOcation Scale and Shape; PACKAGE evd: 24.59
## LOcation Scale and Shape; PACKAGE evd: 0.11
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 112.84
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 133.23
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 144.94
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 158.06
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 165
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 164.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 169.11
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 184.1
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 176.24
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 179.27
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6779
## LOcation Scale and Shape; PACKAGE evd: 36.62
## LOcation Scale and Shape; PACKAGE evd: 14.85
## LOcation Scale and Shape; PACKAGE evd: 0.16
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 76.94
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 89.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 96.54
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 101.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 105.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 108.58
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 111.24
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 113.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 131.95
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 134.99
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6782
## LOcation Scale and Shape; PACKAGE evd: 45.23
## LOcation Scale and Shape; PACKAGE evd: 14.28
## LOcation Scale and Shape; PACKAGE evd: 0.09
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 80.75
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 93.21
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 101.59
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 107.31
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 111.81
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 115.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 118.27
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 121.12
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 122.6
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 125.98
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6794
## LOcation Scale and Shape; PACKAGE evd: 37.39
## LOcation Scale and Shape; PACKAGE evd: 19.25
## LOcation Scale and Shape; PACKAGE evd: 0.29
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 98.44
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 128.83
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 145.65
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 160.9
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 168.87
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 172.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 182.31
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 181.83
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 184.45
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 189.19
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6812
## LOcation Scale and Shape; PACKAGE evd: 24.03
## LOcation Scale and Shape; PACKAGE evd: 12.97
## LOcation Scale and Shape; PACKAGE evd: 0.15
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 58.81
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 72.8
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 81.27
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 87.59
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 92.67
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 97.02
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 100.63
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 103.82
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 107.37
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 109.85
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6817
## LOcation Scale and Shape; PACKAGE evd: 35.86
## LOcation Scale and Shape; PACKAGE evd: 13.4
## LOcation Scale and Shape; PACKAGE evd: 0.04
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 67.36
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 78.05
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 84.3
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 88.87
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 92.3
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 95.17
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 99
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 101.02
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 101.93
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 103.33
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6820
## LOcation Scale and Shape; PACKAGE evd: 44.72
## LOcation Scale and Shape; PACKAGE evd: 17.34
## LOcation Scale and Shape; PACKAGE evd: -0.02
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 82.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 94.66
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 101.4
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 106.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 109.71
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 112.71
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 115.13
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 117.38
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 119.28
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 121.04
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6822
## LOcation Scale and Shape; PACKAGE evd: 46.23
## LOcation Scale and Shape; PACKAGE evd: 20.75
## LOcation Scale and Shape; PACKAGE evd: -0.07
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 89.44
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 101.92
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 109
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 113.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 117.46
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 120.38
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 122.78
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 124.91
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 126.36
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 128.25
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6826
## LOcation Scale and Shape; PACKAGE evd: 26.41
## LOcation Scale and Shape; PACKAGE evd: 11
## LOcation Scale and Shape; PACKAGE evd: -0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 50.38
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 57.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 61.9
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 64.81
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 67.05
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 68.87
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 70.41
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 71.75
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 72.95
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 74.07
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6827
## LOcation Scale and Shape; PACKAGE evd: 42.38
## LOcation Scale and Shape; PACKAGE evd: 13.39
## LOcation Scale and Shape; PACKAGE evd: 0.22
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 81.36
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 98.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 109.1
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 117.31
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 123.84
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 130.58
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 134.63
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 139.21
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 141.69
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 143.31
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6841
## LOcation Scale and Shape; PACKAGE evd: 41.63
## LOcation Scale and Shape; PACKAGE evd: 18.83
## LOcation Scale and Shape; PACKAGE evd: -0.05
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 81.5
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 93.33
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 99.92
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 104.46
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 108.02
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 110.63
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 112.92
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 115.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 116.93
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 118.77
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6850
## LOcation Scale and Shape; PACKAGE evd: 35.89
## LOcation Scale and Shape; PACKAGE evd: 13.11
## LOcation Scale and Shape; PACKAGE evd: 0.04
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 66.9
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 77.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 83.56
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 88.11
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 91.5
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 94.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 99.11
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 101
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 102.7
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6851
## LOcation Scale and Shape; PACKAGE evd: 30.1
## LOcation Scale and Shape; PACKAGE evd: 16.22
## LOcation Scale and Shape; PACKAGE evd: 0.26
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 79.83
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 102.33
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 115.71
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 128.6
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 138.35
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 145.35
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 146.07
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 148.85
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 157.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 163.77
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6856
## LOcation Scale and Shape; PACKAGE evd: 37.33
## LOcation Scale and Shape; PACKAGE evd: 18.37
## LOcation Scale and Shape; PACKAGE evd: 0.02
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 79.45
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 93.19
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 101.2
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 106.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 111.24
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 114.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 117.69
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 120.11
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 121.53
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 124.41
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6869
## LOcation Scale and Shape; PACKAGE evd: 45.14
## LOcation Scale and Shape; PACKAGE evd: 20.85
## LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 93.93
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 110.44
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 119.66
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 126.7
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 131.77
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 136.19
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 139.08
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 141.91
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 145.49
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 146.33
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6874
## LOcation Scale and Shape; PACKAGE evd: 28.16
## LOcation Scale and Shape; PACKAGE evd: 11.55
## LOcation Scale and Shape; PACKAGE evd: 0.12
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 57.97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 69.28
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 77.82
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 82.14
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 85.47
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 88.89
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 91.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 94.29
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 96.91
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 95.73
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6881
## LOcation Scale and Shape; PACKAGE evd: 42.08
## LOcation Scale and Shape; PACKAGE evd: 17.3
## LOcation Scale and Shape; PACKAGE evd: 0.19
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 90.5
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 110.56
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 123.43
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 121.8
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 139.44
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 145.76
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 152.41
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 157.09
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 161.15
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 164.25
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6883
## LOcation Scale and Shape; PACKAGE evd: 31.07
## LOcation Scale and Shape; PACKAGE evd: 15.89
## LOcation Scale and Shape; PACKAGE evd: 0.23
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 77.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 97.94
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 108.15
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 120.96
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 115.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 119.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 143.52
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 144.59
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 138.32
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 146.1
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6891
## LOcation Scale and Shape; PACKAGE evd: 30.98
## LOcation Scale and Shape; PACKAGE evd: 18
## LOcation Scale and Shape; PACKAGE evd: 0.02
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 72.21
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 85.74
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 93.35
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 98.88
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 103.04
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 106.42
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 109.49
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 111.6
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 113.59
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 115.46
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6897
## LOcation Scale and Shape; PACKAGE evd: 34.72
## LOcation Scale and Shape; PACKAGE evd: 21.45
## LOcation Scale and Shape; PACKAGE evd: 0.11
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 89.35
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 110.13
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 122.87
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 130.98
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 136.8
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 143.79
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 149.29
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 153.45
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 158.55
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 161.45
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6901
## LOcation Scale and Shape; PACKAGE evd: 36.24
## LOcation Scale and Shape; PACKAGE evd: 23.33
## LOcation Scale and Shape; PACKAGE evd: 0.13
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 99.31
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 120.65
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 135.36
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 141.64
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 145.97
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 157.64
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 160.34
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 157.09
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 176.88
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 163.22
## [1] "profiling quantile"
## [1] "profiling shape"
## Stazione: 6923
## LOcation Scale and Shape; PACKAGE evd: 22.51
## LOcation Scale and Shape; PACKAGE evd: 12.75
## LOcation Scale and Shape; PACKAGE evd: 0.21
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 59.07
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 74.89
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 85.22
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 92.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 99.15
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 103.86
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 108.51
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 112.48
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 116.84
## [1] "profiling quantile"
## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 111.98
## [1] "profiling quantile"
## [1] "profiling shape"
rl.gevDataFrame <- do.call("rbind", lapply(1:(colonne - 1), function(i) {
risultati.gev[[i]][[1]]
}))
xi.gevDataFrame <- do.call("rbind", lapply(1:(colonne - 1), function(i) {
risultati.gev[[i]][[2]]
}))
write.table(rl.gevDataFrame, file = "rl.gevDataFrame1951.csv", sep = ";", col.names = T,
row.names = F, quote = F)
write.table(xi.gevDataFrame, file = "xi.gevDataFrame1951.csv", sep = ";", col.names = T,
row.names = F, quote = F)