ANALISI BLOCK MAXIMA PER RX1 STAGIONALI

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

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 74.41
##  LOcation Scale and Shape; PACKAGE evd: 30.02
##  LOcation Scale and Shape; PACKAGE evd: 0.08
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 148.15
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 179.11
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 193.66
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 202.7
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 211.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 218.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 223.79
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 228.95
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 233.65
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 237.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6225

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 46.75
##  LOcation Scale and Shape; PACKAGE evd: 21.92
##  LOcation Scale and Shape; PACKAGE evd: 0.15
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 105.42
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 129.23
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 144.83
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 157.69
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 164.7
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 170.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 175.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 180.99
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 185.49
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 189.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6259

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 35.88
##  LOcation Scale and Shape; PACKAGE evd: 15.26
##  LOcation Scale and Shape; PACKAGE evd: 0.3
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 85.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 108.42
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 122.35
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 116.9
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 146.35
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 148.9
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 147.87
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 150.39
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 157.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 152.57
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6278

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 26.24
##  LOcation Scale and Shape; PACKAGE evd: 10.7
##  LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 51.2
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 59.57
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 64.48
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 67.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 70.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 73.02
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 74.84
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 76.39
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 77.79
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 79.24
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6429

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 48.28
##  LOcation Scale and Shape; PACKAGE evd: 24.42
##  LOcation Scale and Shape; PACKAGE evd: 0.29
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 128.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 160.91
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 178.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 190.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 216
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 196.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 237.2
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 228.39
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 225.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 225.88
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6709

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 15.74
##  LOcation Scale and Shape; PACKAGE evd: 10.17
##  LOcation Scale and Shape; PACKAGE evd: 0.2
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 44.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 56.5
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 65.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 71.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 76.38
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 71.48
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 84.23
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 86.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 90.07
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 92.35
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6720

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 25.44
##  LOcation Scale and Shape; PACKAGE evd: 11.28
##  LOcation Scale and Shape; PACKAGE evd: 0.2
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 57.6
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 71.41
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 80.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 86.96
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 92.46
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 96.7
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 96.29
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 98.53
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 107.33
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 110.72
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6721

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 23.9
##  LOcation Scale and Shape; PACKAGE evd: 10.68
##  LOcation Scale and Shape; PACKAGE evd: 0.07
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 49.8
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 58.92
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 64.3
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 68.31
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 71.39
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 73.91
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 75.92
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 77.97
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 79.63
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 81.1
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6723

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 18.86
##  LOcation Scale and Shape; PACKAGE evd: 9.05
##  LOcation Scale and Shape; PACKAGE evd: -0.01
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 39.1
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 45.52
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 49.2
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 51.8
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 53.82
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 55.46
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 56.83
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 58.02
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 59.07
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 60.05
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6729

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 25.96
##  LOcation Scale and Shape; PACKAGE evd: 13.52
##  LOcation Scale and Shape; PACKAGE evd: -0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 55.47
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 64.57
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 69.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 73.3
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 76.05
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 78.29
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 80.17
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 81.78
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 83.22
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 84.72
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6736

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 29.16
##  LOcation Scale and Shape; PACKAGE evd: 10.16
##  LOcation Scale and Shape; PACKAGE evd: -0.09
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 49.92
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 55.75
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 58.93
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 61.11
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 62.76
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 64.1
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 65.24
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 66.12
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 66.95
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 67.69
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6769

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 23.24
##  LOcation Scale and Shape; PACKAGE evd: 11.2
##  LOcation Scale and Shape; PACKAGE evd: 0.13
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 52.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 63.63
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 71.38
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 75.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 78.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 81.35
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 83.55
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 88.51
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 90.79
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 93.18
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6773

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 27.93
##  LOcation Scale and Shape; PACKAGE evd: 8.91
##  LOcation Scale and Shape; PACKAGE evd: 0.17
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 52.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 61.56
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 68.62
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 73.39
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 77.17
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 80.18
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 82.83
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 85.57
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 87.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 90.02
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6779

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 25.82
##  LOcation Scale and Shape; PACKAGE evd: 12.61
##  LOcation Scale and Shape; PACKAGE evd: -0.14
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 50.19
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 56.51
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 59.86
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 62.17
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 63.9
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 65.18
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 66.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 67.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 68.07
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 68.76
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6782

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 31.54
##  LOcation Scale and Shape; PACKAGE evd: 11.57
##  LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 58.47
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 67.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 72.69
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 76.49
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 79.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 81.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 83.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 85.32
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 86.73
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 88.38
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6794

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 25.33
##  LOcation Scale and Shape; PACKAGE evd: 11.16
##  LOcation Scale and Shape; PACKAGE evd: 0.07
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 52.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 62.02
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 67.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 71.8
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 75.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 78.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 80.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 82.19
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 83.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 85.12
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6812

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 14.01
##  LOcation Scale and Shape; PACKAGE evd: 6.96
##  LOcation Scale and Shape; PACKAGE evd: 0.32
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 37.03
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 48.79
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 56.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 62.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 68.09
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 73.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 77.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 68.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 82.13
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 84.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6817

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 31.8
##  LOcation Scale and Shape; PACKAGE evd: 12.85
##  LOcation Scale and Shape; PACKAGE evd: -0.14
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 56.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 63.13
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 66.56
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 68.91
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 70.63
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 72.01
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 73.13
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 74.08
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 74.89
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 75.61
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6820

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 33.84
##  LOcation Scale and Shape; PACKAGE evd: 13.82
##  LOcation Scale and Shape; PACKAGE evd: 0.1
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 68.84
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 80.61
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 89.87
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 95.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 100.16
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 103.83
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 107.38
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 110.26
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 112.81
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 114.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6822

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 30.33
##  LOcation Scale and Shape; PACKAGE evd: 14.58
##  LOcation Scale and Shape; PACKAGE evd: 0.19
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 71.23
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 88.47
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 99.17
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 105.78
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 113.65
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 119.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 124.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 128.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 132.05
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 135.73
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6826

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 23.41
##  LOcation Scale and Shape; PACKAGE evd: 7.68
##  LOcation Scale and Shape; PACKAGE evd: 0.26
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 46.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 57.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 66.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 70.11
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 74.91
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 78.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 82.25
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 85.42
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 86.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 88.73
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6827

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 32.63
##  LOcation Scale and Shape; PACKAGE evd: 11.88
##  LOcation Scale and Shape; PACKAGE evd: -0.01
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 58.99
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 67.29
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 72.05
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 75.4
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 77.99
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 79.95
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 81.7
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 83.21
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 84.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 86.22
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6841

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 29.51
##  LOcation Scale and Shape; PACKAGE evd: 14.17
##  LOcation Scale and Shape; PACKAGE evd: 0.09
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 64.95
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 77.93
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 85.64
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 91.29
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 95.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 99.44
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 102.49
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 105.33
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 107.75
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 110.38
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6850

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 27.81
##  LOcation Scale and Shape; PACKAGE evd: 8.53
##  LOcation Scale and Shape; PACKAGE evd: 0.05
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 48.04
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 54.97
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 59.06
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 61.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 64.24
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 66.1
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 67.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 69.19
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 70.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 71.52
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6851

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 30.68
##  LOcation Scale and Shape; PACKAGE evd: 13.16
##  LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 61.43
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 71.75
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 77.87
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 82.18
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 85.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 88.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 90.47
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 92.37
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 94.08
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 95.8
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6856

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 29.64
##  LOcation Scale and Shape; PACKAGE evd: 13.08
##  LOcation Scale and Shape; PACKAGE evd: 0.18
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 65.78
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 80.6
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 90.26
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 97.25
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 102.92
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 107.23
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 112.12
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 115.5
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 118.78
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 121
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6869

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 31.03
##  LOcation Scale and Shape; PACKAGE evd: 12.3
##  LOcation Scale and Shape; PACKAGE evd: 0.22
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 66.99
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 82.88
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 91.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 96.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 100.46
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 112.75
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 115.44
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 121.88
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 125.82
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 126.22
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6874

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 20.74
##  LOcation Scale and Shape; PACKAGE evd: 8.12
##  LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 39.67
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 46.03
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 49.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 52.36
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 54.41
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 56.09
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 57.51
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 58.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 59.81
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 60.78
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6881

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 37.85
##  LOcation Scale and Shape; PACKAGE evd: 10.7
##  LOcation Scale and Shape; PACKAGE evd: 0.03
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 62.75
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 71.08
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 75.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 79.46
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 82.16
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 84.35
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 86.22
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 87.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 89.34
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 90.68
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6883

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 21.32
##  LOcation Scale and Shape; PACKAGE evd: 9.16
##  LOcation Scale and Shape; PACKAGE evd: 0.16
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 46.11
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 56.12
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 62.42
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 69.94
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 72.98
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 74.11
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 77.5
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 79.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 80.85
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 83.54
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6891

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 30.69
##  LOcation Scale and Shape; PACKAGE evd: 16.74
##  LOcation Scale and Shape; PACKAGE evd: 0.39
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 92.41
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 126.45
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 142.97
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 158.82
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 173.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 165.84
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 204.02
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 184.19
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 190.01
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 192.32
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6897

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 25.77
##  LOcation Scale and Shape; PACKAGE evd: 14.71
##  LOcation Scale and Shape; PACKAGE evd: 0.41
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 80.31
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 107.61
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 127.65
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 111.65
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 141.48
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 150.88
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 148.26
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 150.94
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 154.64
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 160.63
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6901

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 30.2
##  LOcation Scale and Shape; PACKAGE evd: 17.07
##  LOcation Scale and Shape; PACKAGE evd: 0.14
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 75.14
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 92.87
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 103.88
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 111.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 117.05
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 123.28
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 127.55
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 127.14
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 136.31
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 138.77
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [1] "profiling shape"
## Stazione: 6923

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## LOcation Scale and Shape; PACKAGE evd: 19.95
##  LOcation Scale and Shape; PACKAGE evd: 9.44
##  LOcation Scale and Shape; PACKAGE evd: 0.44
## [1] "Calcolo livello di ritorno per tempo: 10 anni"
## RLevel; PACKAGE evd: 56.03
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 20 anni"
## RLevel; PACKAGE evd: 77.41
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 30 anni"
## RLevel; PACKAGE evd: 91.17
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 40 anni"
## RLevel; PACKAGE evd: 100.21
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 50 anni"
## RLevel; PACKAGE evd: 107.59
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 60 anni"
## RLevel; PACKAGE evd: 115.9
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 70 anni"
## RLevel; PACKAGE evd: 117.92
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 80 anni"
## RLevel; PACKAGE evd: 123.82
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 90 anni"
## RLevel; PACKAGE evd: 125.71
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1

## [1] "Calcolo livello di ritorno per tempo: 100 anni"
## RLevel; PACKAGE evd: 125.74
## [1] "profiling quantile"

plot of chunk unnamed-chunk-1 plot of chunk unnamed-chunk-1

## [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)