SlideShare a Scribd company logo
Performing Extreme Value Analysis (EVA) using R
Performing Extreme Value Analysis (EVA)
using R
Whitney Huang
October 23, 2017
Data: Fort Collins daily precipitation
Read the data
Plot the data
Summarize the data
EVA: Block Maxima Approach
Step I: Determine the block size and compute maxima for blocks
Step II: Fit a GEV to the maxima and assess the fit
Step III: Perform inference for return levels
EVA: Peak Over Threshold Approach
Step I: Pick a threshold and extract the threshold exceedances
Step II: Fit a GPD to threshold excesses and assess the fit
Step III: Perform inference for return levels
Data: Fort Collins daily precipitation
We will analyze the daily precipitation amounts (inches) in Fort Collins, Colorado
from 1900 to 1999. (Source Colorado Climate Center, Colorado State University
http://ulysses.atmos.colostate.edu.)
Read the data
# Install the packages for this demos
#install.packages(c("extRemes", "scales", "dplyr", "ismev"))
library(extRemes) # Load the extRemes package for performing EVA
data(Fort) # Load the preciptation data (it is a built-in data sets in extRemes)
head(Fort) # Look at the first few observations
## obs tobs month day year Prec
## 1 1 1 1 1 1900 0
## 2 2 2 1 2 1900 0
## 3 3 3 1 3 1900 0
## 4 4 4 1 4 1900 0
Performing Extreme Value Analysis (EVA) using R
## 5 5 5 1 5 1900 0
## 6 6 6 1 6 1900 0
tail(Fort) # Look at the last few observations
## obs tobs month day year Prec
## 36519 36519 360 12 26 1999 0
## 36520 36520 361 12 27 1999 0
## 36521 36521 362 12 28 1999 0
## 36522 36522 363 12 29 1999 0
## 36523 36523 364 12 30 1999 0
## 36524 36524 365 12 31 1999 0
str(Fort) # Look at the structure of the data set
## 'data.frame': 36524 obs. of 6 variables:
## $ obs : num 1 2 3 4 5 6 7 8 9 10 ...
## $ tobs : num 1 2 3 4 5 6 7 8 9 10 ...
## $ month: num 1 1 1 1 1 1 1 1 1 1 ...
## $ day : num 1 2 3 4 5 6 7 8 9 10 ...
## $ year : num 1900 1900 1900 1900 1900 1900 1900 1900 1900 1900 ...
## $ Prec : num 0 0 0 0 0 0 0 0 0 0 ...
Plot the data
# Set up the time format
days_year <- table(Fort$year)
time_year <- Fort$tobs / rep.int(days_year, times = days_year)
time <- Fort$year + time_year
# Plot the spatial location of Fort Collins and the daily precip time series
par(mfrow = c(2, 1))
library(maps) # Load the package for map drawing
map("state", col = "gray", mar = rep(0, 4))
# Fort Collins, Lat Long Coordinates: 40.5853° N, 105.0844° W
points(-105.0844, 40.5853, pch = "*", col = "red", cex = 1.5)
par(las = 1, mar = c(5.1, 4.1, 1.1, 2.1))
plot(time, Fort$Prec, type = "h",
xlab = "Time (Year)",
ylab = "Daily precipitation (in)")
Performing Extreme Value Analysis (EVA) using R
# Zoom in to look at seasonal variation
par(mfrow = c(1, 2), mar = c(5.1, 4.1, 4.1, 0.6))
id <- which(Fort$year %in% 1999) # Look at year 1999
par(las = 1)
# Plot the 1999 daily precip time series
plot(1:365, Fort$Prec[id], type = "h",
xlab = " ",
ylab = "Daily precipitation (in)",
xaxt = "n", ylim = c(0, max(Fort$Prec)),
main = "1999")
par(las = 3)
axis(1, at = seq(15, 345, 30), labels = month.abb)
Leaf_Day <- seq(1520, 1520 + 1460 * 23, 1460)
par(las = 1)
library(scales) # Load the scales pacakge to modify color transparency
# Plot the daily precip as a function of the day of the year
plot(rep(1:365, 100), Fort$Prec[-Leaf_Day], pch = 1,
col = alpha("blue", 0.25), cex = 0.5,
xaxt = "n", xlab = " ", ylab = " ", main = "1900 ~ 1999",
ylim = c(0, max(Fort$Prec)))
par(las = 3)
axis(1, at = seq(15, 345, 30), labels = month.abb)
Performing Extreme Value Analysis (EVA) using R
# Define "summer" and "winter" daily precip
summer <- which(Fort$month %in% 6:8)
winter <- which(Fort$month %in% c(12, 1, 2))
prec_summer <- Fort$Prec[summer]
prec_winter <- Fort$Prec[winter]
# Plot the histograms for summer and winter non-zero daily precip
par(mfrow = c(1, 2), mar = c(5.1, 4.1, 4.1, 1.1))
max_precip <- max(prec_summer, prec_winter)
brk <- seq(0, max_precip, length.out = 60)
hist(prec_summer[prec_summer > 0], breaks = brk, col = alpha("red", 0.5),
prob = T, xlim = c(0, max_precip), xlab = "Summer (JJA) prec (in)",
ylab = "Density", main = "", ylim = c(0, 8))
rug(prec_summer, col = "red", lwd = 0.5)
hist(prec_winter[prec_winter > 0], breaks = brk, col = alpha("blue", 0.5),
prob = T, xlim = c(0, max_precip), xlab = "Winter (DJF) prec (in)",
ylab = " ", main = "", ylim = c(0, 8))
rug(prec_winter, col = "blue", lwd = 0.5)
Performing Extreme Value Analysis (EVA) using R
Summarize the data
# Six number summary for summer and winter daily precip
summary(prec_summer)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0.00000 0.00000 0.00000 0.05289 0.01000 4.63000
summary(prec_winter)
## Min. 1st Qu. Median Mean 3rd Qu. Max.
## 0.00000 0.00000 0.00000 0.01477 0.00000 1.32000
# Variation
sd(prec_summer)
## [1] 0.2004784
sd(prec_winter)
## [1] 0.0641466
IQR(prec_summer)
## [1] 0.01
Performing Extreme Value Analysis (EVA) using R
IQR(prec_winter)
## [1] 0
# Chance of rain
length(prec_summer[prec_summer > 0]) / length(prec_summer)
## [1] 0.2827174
length(prec_winter[prec_winter > 0]) / length(prec_winter)
## [1] 0.1476064
EVA: Block Maxima Approach
We are going to conduct an extreme value analysis using the extRemes package
developed and maintained by Eric Gilleland . In the previous lecture we
learned the block maxima method and threshold exceedances method for
doing EVA. Let’s see how that works in R .
Step I: Determine the block size and compute maxima for
blocks
library(dplyr)
grouped_summer <- group_by(Fort[summer, ], year)
# Extracting summer maxima and the timings when the maxima occur
summer_max <- summarise(grouped_summer, prec = max(Prec), t = which.max(Prec))
summer_max
## # A tibble: 100 × 3
## year prec t
## <dbl> <dbl> <int>
## 1 1900 0.51 13
## 2 1901 1.46 15
## 3 1902 1.02 28
## 4 1903 0.53 47
## 5 1904 1.10 35
## 6 1905 1.11 66
## 7 1906 0.64 23
## 8 1907 1.21 56
## 9 1908 1.93 60
## 10 1909 1.11 28
Performing Extreme Value Analysis (EVA) using R
## # ... with 90 more rows
Let’s plot the summer maxima
# Setting up the figure configuration
old.par <- par(no.readonly = TRUE)
mar.default <- par("mar")
mar.left <- mar.default
mar.right <- mar.default
mar.left[2] <- 0
mar.right[4] <- 0
# Time series plot
par(fig = c(0.2, 1, 0, 1), mar = mar.left)
plot(1900 + 1:9200 / 92, prec_summer,
xlab = "Year", ylab = "",
main = "Summer Maximum n Fort Collins",
type = "h", pch = 19, cex = 0.5, col = "lightblue",
ylim = c(0, max_precip), yaxt = "n")
par(las = 2)
axis(4, at = 0:5)
par(las = 0)
mtext("Precipitation (in)", side = 2, line = 4)
abline(v = 1900:2000, col = "gray", lty = 2)
points(1900:1999 + summer_max$t / 90, summer_max$prec,
pch = 16, col = "blue", cex = 0.5)
# Histogram
hs <- hist(summer_max$prec,
breaks = seq(0, max_precip, length.out = 40),
plot = FALSE)
par(fig = c(0, 0.2, 0, 1.0), mar = mar.right, new = T)
plot (NA, type = 'n', axes = FALSE, yaxt = 'n',
col = rgb(0, 0, 0.5, alpha = 0.5),
xlab = "Density", ylab = NA, main = NA,
xlim = c(-max(hs$density), 0),
ylim = c(0, max_precip))
axis(1, at = c(-0.8, -0.4, 0), c(0.8, 0.4, 0), las = 2)
arrows(rep(0, length(hs$breaks[-40])), hs$breaks[-40],
-hs$density, hs$breaks[-40], col = "blue",
length = 0, angle = 0, lwd = 1)
arrows(rep(0, length(hs$breaks[-1])), hs$breaks[-1],
-hs$density, hs$breaks[-1], col = "blue",
length = 0, angle = 0, lwd = 1)
arrows(-hs$density, hs$breaks[-40], -hs$density,
hs$breaks[-1], col = "blue", angle = 0,
length = 0)
mle <- fevd(summer_max$prec)$results$par
xg <- seq(0, max_precip, length.out = 100)
library(ismev)
lines(-gev.dens(mle, xg), xg, col = "red")
Performing Extreme Value Analysis (EVA) using R
par(old.par)
Step II: Fit a GEV to the maxima and assess the fit
# Fit a GEV to summer maximum daily precip using MLE
gevfit <- fevd(summer_max$prec)
# Print the results
gevfit
##
## fevd(x = summer_max$prec)
##
## [1] "Estimation Method used: MLE"
##
##
## Negative Log-Likelihood Value: 100.5622
##
##
## Estimated parameters:
## location scale shape
## 0.8262256 0.4974066 0.2158052
Performing Extreme Value Analysis (EVA) using R
##
## Standard Error Estimates:
## location scale shape
## 0.05627189 0.04516721 0.08241033
##
## Estimated parameter covariance matrix.
## location scale shape
## location 0.003166526 0.0014583680 -0.0013849537
## scale 0.001458368 0.0020400766 -0.0001826602
## shape -0.001384954 -0.0001826602 0.0067914617
##
## AIC = 207.1244
##
## BIC = 214.9399
#QQ plot
p <- 1:100 / 101
qm <- gevq(mle, 1 - p)
plot(qm, sort(summer_max$prec), xlim = c(0, 5), ylim = c(0, 5),
pch = 16, cex = 0.5, col = alpha("blue", 0.5),
xlab = "Model", ylab = "Empirical", main = "Quantile Plot")
abline(0, 1, lwd = 1.5)
Performing Extreme Value Analysis (EVA) using R
Step III: Perform inference for return levels
Suppose we are interested in estimating 100-year return level
RL100 <- return.level(gevfit, return.period = 100) # Estimate of the 100-year event
RL100
## fevd(x = summer_max$prec)
## return.level.fevd.mle(x = gevfit, return.period = 100)
##
## GEV model fitted to summer_max$prec
## Data are assumed to be stationary
## [1] "Return Levels for period units in years"
Performing Extreme Value Analysis (EVA) using R
## 100-year level
## 4.741325
# Quantify the estimate uncertainty
## Delta method
CI_delta <- ci(gevfit, return.period = 100, verbose = T)
##
## Preparing to calculate 95 % CI for 100-year return level
##
## Model is fixed
##
## Using Normal Approximation Method.
CI_delta
## fevd(x = summer_max$prec)
##
## [1] "Normal Approx."
##
## [1] "100-year return level: 4.741"
##
## [1] "95% Confidence Interval: (2.9471, 6.5356)"
## Profile likelihood method
CI_prof <- ci(gevfit, method = "proflik", xrange = c(2.5, 8),
return.period = 100, verbose = F)
CI_prof
## fevd(x = summer_max$prec)
##
## [1] "Profile Likelihood"
##
## [1] "100-year return level: 4.741"
##
## [1] "95% Confidence Interval: (3.5081, 7.5811)"
hist(summer_max$prec, breaks = seq(0, max_precip, length.out = 35),
col = alpha("lightblue", 0.2), border = "gray",
xlim = c(0, 8), prob = T, ylim = c(0, 1.2),
xlab = "summer max (in)",
main = "95% CI for 100-yr RL")
xg <- seq(0, 8, len = 1000)
mle <- gevfit$results$par
lines(xg, gev.dens(mle, xg), lwd = 1.5)
#for (i in 1:3) abline(v = CI_delta[i], lty = 2, col = "blue")
for (i in c(1, 3)) abline(v = CI_prof[i], lty = 2, col = "red")
abline(v = RL100, lwd = 1.5, lty = 2)
Performing Extreme Value Analysis (EVA) using R
#legend("topleft", legend = c("Delta CI", "Prof CI"),
#col = c("blue", "red"), lty = c(2, 3))
EVA: Peak Over Threshold Approach
Step I: Pick a threshold and extract the threshold
exceedances
old.par <- par(no.readonly = TRUE)
mar.default <- par('mar')
mar.left <- mar.default
mar.right <- mar.default
Performing Extreme Value Analysis (EVA) using R
mar.left[2] <- 0
mar.right[4] <- 0
# Time series plot
par(fig = c(0.2, 1, 0, 1), mar = mar.left)
plot(1900 + 1:9200 / 92, prec_summer, type = "h", col = "lightblue",
xlab = "Year", ylab = "Daily Precip (inches)", yaxt = "n")
#Threshold exceedances
thres <- 0.4
ex <- prec_summer[prec_summer >= thres]
length(ex)
## [1] 344
#Extract the timing of POT
ex_t <- which(prec_summer >= thres)
abline(h = thres, col = "blue", lty = 2)
points(1900 + ex_t / 92, ex, col = alpha("blue", 0.5), pch = 16,
cex = 0.75)
par(las = 2)
axis(4, at = 0:5)
par(las = 0)
mtext("Precipitation (in)", side = 2, line = 5)
grid()
hs <- hist(ex, seq(thres, max_precip, len = 50), plot = FALSE)
par(fig = c(0, 0.2, 0, 1.0), mar = mar.right, new = T)
plot (NA, type = 'n', axes = FALSE, yaxt = 'n',
col = rgb(0,0,0.5, alpha = 0.5),
xlab = "Density", ylab = NA, main = NA,
xlim = c(-max(hs$density), 0),
ylim = c(0, max_precip))
axis(1, at = c(-3, -2, -1, 0), c(3, 2, 1, 0), las = 2)
#abline(h = 21, col = "red", lty = 5)
arrows(rep(0, length(hs$breaks[-50])), hs$breaks[-50],
-hs$density, hs$breaks[-50], col = "blue",
length = 0, angle = 0, lwd = 1)
arrows(rep(0, length(hs$breaks[-1])), hs$breaks[-1],
-hs$density, hs$breaks[-1], col = "blue",
length = 0, angle = 0, lwd = 1)
arrows(-hs$density, hs$breaks[-50], -hs$density,
hs$breaks[-1], col = "blue", angle = 0,
length = 0)
mle <- fevd(prec_summer, threshold = thres, type = "GP")$results$par
xg <- seq(thres, max_precip, length.out = 100)
lines(-gpd.dens(mle, thres, xg), xg, col = "red")
Performing Extreme Value Analysis (EVA) using R
par(old.par)
How to choose the “right” threshold?
# Mean residula life plot
mrlplot(prec_summer, main = "Mean Residual Life", xlab = "Threshold (in)")
# I choose 0.4 as the threshold but note that the "straightness"
# is difficult to assess
abline(v = 0.4, col = "blue", lty = 2)
Performing Extreme Value Analysis (EVA) using R
Step II: Fit a GPD to threshold excesses and assess the fit
# Fit a GPD for threshold exceenances using MLE
gpdfit1 <- fevd(prec_summer, threshold = thres, type = "GP")
# Print the results
gpdfit1
##
## fevd(x = prec_summer, threshold = thres, type = "GP")
##
## [1] "Estimation Method used: MLE"
##
##
## Negative Log-Likelihood Value: 46.14484
Performing Extreme Value Analysis (EVA) using R
##
##
## Estimated parameters:
## scale shape
## 0.3053321 0.3236911
##
## Standard Error Estimates:
## scale shape
## 0.02784980 0.07520322
##
## Estimated parameter covariance matrix.
## scale shape
## scale 0.0007756112 -0.001337429
## shape -0.0013374289 0.005655524
##
## AIC = 96.28967
##
## BIC = 103.9239
# QQ plot
p <- 1:344 / 345
qm <- gpdq(mle, 0.4, 1 - p)
plot(qm, sort(ex), xlim = c(0, 6), ylim = c(0, 6),
pch = 16, cex = 0.5, col = alpha("blue", 0.5),
xlab = "Model", ylab = "Empirical", main = "Quantile Plot")
abline(0, 1, lwd = 1.5)
Performing Extreme Value Analysis (EVA) using R
Step III: Perform inference for return levels
Again we are interested in estimating 100-year return level
# Here we need to adjust the return period as here we are
#estimating the return level for summer precip
RL100 <- return.level(gpdfit1, return.period = 100 * 92 / 365.25)
RL100
## fevd(x = prec_summer, threshold = thres, type = "GP")
## return.level.fevd.mle(x = gpdfit1, return.period = 100 * 92/365.25)
##
## GP model fitted to prec_summer
Performing Extreme Value Analysis (EVA) using R
## Data are assumed to be stationary
## [1] "Return Levels for period units in years"
## 25.1882272416153-year level
## 5.656769
CI_delta <- ci(gpdfit1, return.period = 100 * 92 / 365.25,
verbose = F)
CI_delta
## fevd(x = prec_summer, threshold = thres, type = "GP")
##
## [1] "Normal Approx."
##
## [1] "25.1882272416153-year return level: 5.657"
##
## [1] "95% Confidence Interval: (3.2246, 8.089)"
CI_prof <- ci(gpdfit1, method = "proflik", xrange = c(3, 10),
return.period = 100 * 92 / 365.25, verbose = F)
CI_prof
## fevd(x = prec_summer, threshold = thres, type = "GP")
##
## [1] "Profile Likelihood"
##
## [1] "25.1882272416153-year return level: 5.657"
##
## [1] "95% Confidence Interval: (3.9572, 9.4964)"
hist(ex, 40, col = alpha("lightblue", 0.2), border = "gray",
xlim = c(thres, 10), prob = T, ylim = c(0, 4),
xlab = "Threshold excess (in)",
main = "95% CI for 100-yr RL")
xg <- seq(thres, 10, len = 1000)
mle <- gpdfit1$results$par
lines(xg, gpd.dens(mle, thres, xg), lwd = 1.5)
#for (i in c(1, 3)) abline(v = CI_delta[i], lty = 2, col = "blue")
for (i in c(1,3)) abline(v = CI_prof[i], lty = 2, col = "red")
abline(v = RL100, lwd = 1.5, lty = 2)
Performing Extreme Value Analysis (EVA) using R
#legend("topleft", legend = c("Delta CI", "Prof CI"),
#col = c("blue", "red"), lty = c(2, 3))

More Related Content

What's hot

10. Getting Spatial
10. Getting Spatial10. Getting Spatial
10. Getting Spatial
FAO
 
Gaussian Integration
Gaussian IntegrationGaussian Integration
Gaussian Integration
Reza Rahimi
 
H2O World - Consensus Optimization and Machine Learning - Stephen Boyd
H2O World - Consensus Optimization and Machine Learning - Stephen BoydH2O World - Consensus Optimization and Machine Learning - Stephen Boyd
H2O World - Consensus Optimization and Machine Learning - Stephen Boyd
Sri Ambati
 
Maximizing Submodular Function over the Integer Lattice
Maximizing Submodular Function over the Integer LatticeMaximizing Submodular Function over the Integer Lattice
Maximizing Submodular Function over the Integer Lattice
Tasuku Soma
 
Gaussian quadratures
Gaussian quadraturesGaussian quadratures
Gaussian quadratures
Tarun Gehlot
 
Num Integration
Num IntegrationNum Integration
Num Integrationmuhdisys
 
Tailored Bregman Ball Trees for Effective Nearest Neighbors
Tailored Bregman Ball Trees for Effective Nearest NeighborsTailored Bregman Ball Trees for Effective Nearest Neighbors
Tailored Bregman Ball Trees for Effective Nearest Neighbors
Frank Nielsen
 
Aem
AemAem
Prob-Dist-Toll-Forecast-Uncertainty
Prob-Dist-Toll-Forecast-UncertaintyProb-Dist-Toll-Forecast-Uncertainty
Prob-Dist-Toll-Forecast-UncertaintyAnkoor Bhagat
 
Chapter 1 Basic Concepts
Chapter 1 Basic ConceptsChapter 1 Basic Concepts
Chapter 1 Basic Concepts
Hareem Aslam
 
Interpolation
InterpolationInterpolation
Interpolation
Dmytro Mitin
 
Optimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
Optimal Budget Allocation: Theoretical Guarantee and Efficient AlgorithmOptimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
Optimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
Tasuku Soma
 
Oscilador de duffing forzado - codicación en matlab
Oscilador de duffing forzado - codicación en matlabOscilador de duffing forzado - codicación en matlab
Oscilador de duffing forzado - codicación en matlab
Jose Leon
 
Understanding Reed-Solomon code
Understanding Reed-Solomon codeUnderstanding Reed-Solomon code
Understanding Reed-Solomon code
继顺(Jeffrey) 王
 
Quantum espresso G Vector distributon
Quantum espresso G Vector distributonQuantum espresso G Vector distributon
Quantum espresso G Vector distributonEric Pascolo
 
Pdfcode
PdfcodePdfcode
Lesson 9: Parametric Surfaces
Lesson 9: Parametric SurfacesLesson 9: Parametric Surfaces
Lesson 9: Parametric Surfaces
Matthew Leingang
 
C++ ammar .s.q
C++  ammar .s.qC++  ammar .s.q
C++ ammar .s.q
ammarsalem5
 
Cg my own programs
Cg my own programsCg my own programs
Cg my own programsAmit Kapoor
 
A nonlinear approximation of the Bayesian Update formula
A nonlinear approximation of the Bayesian Update formulaA nonlinear approximation of the Bayesian Update formula
A nonlinear approximation of the Bayesian Update formula
Alexander Litvinenko
 

What's hot (20)

10. Getting Spatial
10. Getting Spatial10. Getting Spatial
10. Getting Spatial
 
Gaussian Integration
Gaussian IntegrationGaussian Integration
Gaussian Integration
 
H2O World - Consensus Optimization and Machine Learning - Stephen Boyd
H2O World - Consensus Optimization and Machine Learning - Stephen BoydH2O World - Consensus Optimization and Machine Learning - Stephen Boyd
H2O World - Consensus Optimization and Machine Learning - Stephen Boyd
 
Maximizing Submodular Function over the Integer Lattice
Maximizing Submodular Function over the Integer LatticeMaximizing Submodular Function over the Integer Lattice
Maximizing Submodular Function over the Integer Lattice
 
Gaussian quadratures
Gaussian quadraturesGaussian quadratures
Gaussian quadratures
 
Num Integration
Num IntegrationNum Integration
Num Integration
 
Tailored Bregman Ball Trees for Effective Nearest Neighbors
Tailored Bregman Ball Trees for Effective Nearest NeighborsTailored Bregman Ball Trees for Effective Nearest Neighbors
Tailored Bregman Ball Trees for Effective Nearest Neighbors
 
Aem
AemAem
Aem
 
Prob-Dist-Toll-Forecast-Uncertainty
Prob-Dist-Toll-Forecast-UncertaintyProb-Dist-Toll-Forecast-Uncertainty
Prob-Dist-Toll-Forecast-Uncertainty
 
Chapter 1 Basic Concepts
Chapter 1 Basic ConceptsChapter 1 Basic Concepts
Chapter 1 Basic Concepts
 
Interpolation
InterpolationInterpolation
Interpolation
 
Optimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
Optimal Budget Allocation: Theoretical Guarantee and Efficient AlgorithmOptimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
Optimal Budget Allocation: Theoretical Guarantee and Efficient Algorithm
 
Oscilador de duffing forzado - codicación en matlab
Oscilador de duffing forzado - codicación en matlabOscilador de duffing forzado - codicación en matlab
Oscilador de duffing forzado - codicación en matlab
 
Understanding Reed-Solomon code
Understanding Reed-Solomon codeUnderstanding Reed-Solomon code
Understanding Reed-Solomon code
 
Quantum espresso G Vector distributon
Quantum espresso G Vector distributonQuantum espresso G Vector distributon
Quantum espresso G Vector distributon
 
Pdfcode
PdfcodePdfcode
Pdfcode
 
Lesson 9: Parametric Surfaces
Lesson 9: Parametric SurfacesLesson 9: Parametric Surfaces
Lesson 9: Parametric Surfaces
 
C++ ammar .s.q
C++  ammar .s.qC++  ammar .s.q
C++ ammar .s.q
 
Cg my own programs
Cg my own programsCg my own programs
Cg my own programs
 
A nonlinear approximation of the Bayesian Update formula
A nonlinear approximation of the Bayesian Update formulaA nonlinear approximation of the Bayesian Update formula
A nonlinear approximation of the Bayesian Update formula
 

Viewers also liked

CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
The Statistical and Applied Mathematical Sciences Institute
 
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
The Statistical and Applied Mathematical Sciences Institute
 
Summer Program on Transportation Statistics, Statistical Challenges for Advan...
Summer Program on Transportation Statistics, Statistical Challenges for Advan...Summer Program on Transportation Statistics, Statistical Challenges for Advan...
Summer Program on Transportation Statistics, Statistical Challenges for Advan...
The Statistical and Applied Mathematical Sciences Institute
 
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
The Statistical and Applied Mathematical Sciences Institute
 
Summer Program on Transportation Statistics, What about the Driver in Driver...
Summer Program on Transportation Statistics, What about the Driver in  Driver...Summer Program on Transportation Statistics, What about the Driver in  Driver...
Summer Program on Transportation Statistics, What about the Driver in Driver...
The Statistical and Applied Mathematical Sciences Institute
 
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
The Statistical and Applied Mathematical Sciences Institute
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
The Statistical and Applied Mathematical Sciences Institute
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
The Statistical and Applied Mathematical Sciences Institute
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
The Statistical and Applied Mathematical Sciences Institute
 
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
The Statistical and Applied Mathematical Sciences Institute
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
The Statistical and Applied Mathematical Sciences Institute
 

Viewers also liked (20)

CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
CLIM Undergraduate Workshop: Undergraduate Workshop Introduction - Elvan Ceyh...
 
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
CLIM Undergraduate Workshop: Tutorial on R Software - Huang Huang, Oct 23, 2017
 
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
CLIM Undergraduate Workshop: Introduction to Spatial Data Analysis with R - M...
 
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
CLIM Undergraduate Workshop: How was this Made?: Making Dirty Data into Somet...
 
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
CLIM Undergraduate Workshop: Statistical Development and challenges for Paleo...
 
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
CLIM Undergraduate Workshop: Applications in Climate Context - Michael Wehner...
 
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
CLIM Undergraduate Workshop: Extreme Value Analysis for Climate Research - Wh...
 
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
Summer Program on Transportation Statistics, Dynamic Modeling of Transportati...
 
Summer Program on Transportation Statistics, Statistical Challenges for Advan...
Summer Program on Transportation Statistics, Statistical Challenges for Advan...Summer Program on Transportation Statistics, Statistical Challenges for Advan...
Summer Program on Transportation Statistics, Statistical Challenges for Advan...
 
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
Summer Program on Transportation Statistics, Assessing Crash Risk for Highly ...
 
Summer Program on Transportation Statistics, What about the Driver in Driver...
Summer Program on Transportation Statistics, What about the Driver in  Driver...Summer Program on Transportation Statistics, What about the Driver in  Driver...
Summer Program on Transportation Statistics, What about the Driver in Driver...
 
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
Summer Program on Transportation Statistics, Why Highway Crashes Have Recurri...
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
 
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
CLIM Fall 2017 Course: Statistics for Climate Research, Climate Informatics -...
 
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
CLIM Fall 2017 Course: Statistics for Climate Research, Detection & Attributi...
 
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
CLIM Fall 2017 Course: Statistics for Climate Research, Geostats for Large Da...
 
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
CLIM Fall 2017 Course: Statistics for Climate Research, Guest lecture: Data F...
 
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
Program on Mathematical and Statistical Methods for Climate and the Earth Sys...
 

Similar to CLIM Undergraduate Workshop: (Attachment) Performing Extreme Value Analysis (EVA) Using R - Whitney Huang, Oct 23, 2017

CLUSTERGRAM
CLUSTERGRAMCLUSTERGRAM
CLUSTERGRAM
Dr. Volkan OBAN
 
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
Ken'ichi Matsui
 
Regression and Classification with R
Regression and Classification with RRegression and Classification with R
Regression and Classification with R
Yanchang Zhao
 
Pumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency AnalysisPumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency Analysis
University of Illinois,Chicago
 
Pumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency AnalysisPumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency Analysis
University of Illinois,Chicago
 
Econometric Analysis 8th Edition Greene Solutions Manual
Econometric Analysis 8th Edition Greene Solutions ManualEconometric Analysis 8th Edition Greene Solutions Manual
Econometric Analysis 8th Edition Greene Solutions Manual
LewisSimmonss
 
Seminar PSU 10.10.2014 mme
Seminar PSU 10.10.2014 mmeSeminar PSU 10.10.2014 mme
Seminar PSU 10.10.2014 mme
Vyacheslav Arbuzov
 
Introduction to R
Introduction to RIntroduction to R
Introduction to R
Sander Kieft
 
Advanced Data Visualization Examples with R-Part II
Advanced Data Visualization Examples with R-Part IIAdvanced Data Visualization Examples with R-Part II
Advanced Data Visualization Examples with R-Part II
Dr. Volkan OBAN
 
BOXPLOT EXAMPLES in R And An Example for BEESWARM:
BOXPLOT EXAMPLES in R And  An Example for BEESWARM:BOXPLOT EXAMPLES in R And  An Example for BEESWARM:
BOXPLOT EXAMPLES in R And An Example for BEESWARM:
Dr. Volkan OBAN
 
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
The Statistical and Applied Mathematical Sciences Institute
 
Data manipulation on r
Data manipulation on rData manipulation on r
Data manipulation on r
Abhik Seal
 
ComputeFest 2012: Intro To R for Physical Sciences
ComputeFest 2012: Intro To R for Physical SciencesComputeFest 2012: Intro To R for Physical Sciences
ComputeFest 2012: Intro To R for Physical Sciencesalexstorer
 
ggtimeseries-->ggplot2 extensions
ggtimeseries-->ggplot2 extensions ggtimeseries-->ggplot2 extensions
ggtimeseries-->ggplot2 extensions
Dr. Volkan OBAN
 
A Shiny Example-- R
A Shiny Example-- RA Shiny Example-- R
A Shiny Example-- R
Dr. Volkan OBAN
 
Time Series Analysis and Mining with R
Time Series Analysis and Mining with RTime Series Analysis and Mining with R
Time Series Analysis and Mining with R
Yanchang Zhao
 
User Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love StoryUser Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love Story
Databricks
 
User Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love StoryUser Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love Story
Databricks
 
Chapter 16 Inference for RegressionClimate ChangeThe .docx
Chapter 16 Inference for RegressionClimate ChangeThe .docxChapter 16 Inference for RegressionClimate ChangeThe .docx
Chapter 16 Inference for RegressionClimate ChangeThe .docx
keturahhazelhurst
 

Similar to CLIM Undergraduate Workshop: (Attachment) Performing Extreme Value Analysis (EVA) Using R - Whitney Huang, Oct 23, 2017 (20)

CLUSTERGRAM
CLUSTERGRAMCLUSTERGRAM
CLUSTERGRAM
 
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
第13回数学カフェ「素数!!」二次会 LT資料「乱数!!」
 
Regression and Classification with R
Regression and Classification with RRegression and Classification with R
Regression and Classification with R
 
Pumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency AnalysisPumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency Analysis
 
Pumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency AnalysisPumps, Compressors and Turbine Fault Frequency Analysis
Pumps, Compressors and Turbine Fault Frequency Analysis
 
Econometric Analysis 8th Edition Greene Solutions Manual
Econometric Analysis 8th Edition Greene Solutions ManualEconometric Analysis 8th Edition Greene Solutions Manual
Econometric Analysis 8th Edition Greene Solutions Manual
 
Struct examples
Struct examplesStruct examples
Struct examples
 
Seminar PSU 10.10.2014 mme
Seminar PSU 10.10.2014 mmeSeminar PSU 10.10.2014 mme
Seminar PSU 10.10.2014 mme
 
Introduction to R
Introduction to RIntroduction to R
Introduction to R
 
Advanced Data Visualization Examples with R-Part II
Advanced Data Visualization Examples with R-Part IIAdvanced Data Visualization Examples with R-Part II
Advanced Data Visualization Examples with R-Part II
 
BOXPLOT EXAMPLES in R And An Example for BEESWARM:
BOXPLOT EXAMPLES in R And  An Example for BEESWARM:BOXPLOT EXAMPLES in R And  An Example for BEESWARM:
BOXPLOT EXAMPLES in R And An Example for BEESWARM:
 
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
NCCU: Statistics in the Criminal Justice System, R basics and Simulation - Pr...
 
Data manipulation on r
Data manipulation on rData manipulation on r
Data manipulation on r
 
ComputeFest 2012: Intro To R for Physical Sciences
ComputeFest 2012: Intro To R for Physical SciencesComputeFest 2012: Intro To R for Physical Sciences
ComputeFest 2012: Intro To R for Physical Sciences
 
ggtimeseries-->ggplot2 extensions
ggtimeseries-->ggplot2 extensions ggtimeseries-->ggplot2 extensions
ggtimeseries-->ggplot2 extensions
 
A Shiny Example-- R
A Shiny Example-- RA Shiny Example-- R
A Shiny Example-- R
 
Time Series Analysis and Mining with R
Time Series Analysis and Mining with RTime Series Analysis and Mining with R
Time Series Analysis and Mining with R
 
User Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love StoryUser Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love Story
 
User Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love StoryUser Defined Aggregation in Apache Spark: A Love Story
User Defined Aggregation in Apache Spark: A Love Story
 
Chapter 16 Inference for RegressionClimate ChangeThe .docx
Chapter 16 Inference for RegressionClimate ChangeThe .docxChapter 16 Inference for RegressionClimate ChangeThe .docx
Chapter 16 Inference for RegressionClimate ChangeThe .docx
 

More from The Statistical and Applied Mathematical Sciences Institute

Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
The Statistical and Applied Mathematical Sciences Institute
 
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Difference-in-differences: more than meet...
Causal Inference Opening Workshop - Difference-in-differences: more than meet...Causal Inference Opening Workshop - Difference-in-differences: more than meet...
Causal Inference Opening Workshop - Difference-in-differences: more than meet...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
The Statistical and Applied Mathematical Sciences Institute
 
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
The Statistical and Applied Mathematical Sciences Institute
 
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
The Statistical and Applied Mathematical Sciences Institute
 
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
The Statistical and Applied Mathematical Sciences Institute
 
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
The Statistical and Applied Mathematical Sciences Institute
 
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
The Statistical and Applied Mathematical Sciences Institute
 

More from The Statistical and Applied Mathematical Sciences Institute (20)

Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
Causal Inference Opening Workshop - Latent Variable Models, Causal Inference,...
 
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
2019 Fall Series: Special Guest Lecture - 0-1 Phase Transitions in High Dimen...
 
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
Causal Inference Opening Workshop - Causal Discovery in Neuroimaging Data - F...
 
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
Causal Inference Opening Workshop - Smooth Extensions to BART for Heterogeneo...
 
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
Causal Inference Opening Workshop - A Bracketing Relationship between Differe...
 
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
Causal Inference Opening Workshop - Testing Weak Nulls in Matched Observation...
 
Causal Inference Opening Workshop - Difference-in-differences: more than meet...
Causal Inference Opening Workshop - Difference-in-differences: more than meet...Causal Inference Opening Workshop - Difference-in-differences: more than meet...
Causal Inference Opening Workshop - Difference-in-differences: more than meet...
 
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
Causal Inference Opening Workshop - New Statistical Learning Methods for Esti...
 
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
Causal Inference Opening Workshop - Bipartite Causal Inference with Interfere...
 
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
Causal Inference Opening Workshop - Bridging the Gap Between Causal Literatur...
 
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
Causal Inference Opening Workshop - Some Applications of Reinforcement Learni...
 
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
Causal Inference Opening Workshop - Bracketing Bounds for Differences-in-Diff...
 
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
Causal Inference Opening Workshop - Assisting the Impact of State Polcies: Br...
 
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
Causal Inference Opening Workshop - Experimenting in Equilibrium - Stefan Wag...
 
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
Causal Inference Opening Workshop - Targeted Learning for Causal Inference Ba...
 
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
Causal Inference Opening Workshop - Bayesian Nonparametric Models for Treatme...
 
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
2019 Fall Series: Special Guest Lecture - Adversarial Risk Analysis of the Ge...
 
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
2019 Fall Series: Professional Development, Writing Academic Papers…What Work...
 
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
2019 GDRR: Blockchain Data Analytics - Machine Learning in/for Blockchain: Fu...
 
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
2019 GDRR: Blockchain Data Analytics - QuTrack: Model Life Cycle Management f...
 

Recently uploaded

Model Attribute Check Company Auto Property
Model Attribute  Check Company Auto PropertyModel Attribute  Check Company Auto Property
Model Attribute Check Company Auto Property
Celine George
 
Cambridge International AS A Level Biology Coursebook - EBook (MaryFosbery J...
Cambridge International AS  A Level Biology Coursebook - EBook (MaryFosbery J...Cambridge International AS  A Level Biology Coursebook - EBook (MaryFosbery J...
Cambridge International AS A Level Biology Coursebook - EBook (MaryFosbery J...
AzmatAli747758
 
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
siemaillard
 
How to Break the cycle of negative Thoughts
How to Break the cycle of negative ThoughtsHow to Break the cycle of negative Thoughts
How to Break the cycle of negative Thoughts
Col Mukteshwar Prasad
 
Chapter 3 - Islamic Banking Products and Services.pptx
Chapter 3 - Islamic Banking Products and Services.pptxChapter 3 - Islamic Banking Products and Services.pptx
Chapter 3 - Islamic Banking Products and Services.pptx
Mohd Adib Abd Muin, Senior Lecturer at Universiti Utara Malaysia
 
TESDA TM1 REVIEWER FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
TESDA TM1 REVIEWER  FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...TESDA TM1 REVIEWER  FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
TESDA TM1 REVIEWER FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
EugeneSaldivar
 
Ethnobotany and Ethnopharmacology ......
Ethnobotany and Ethnopharmacology ......Ethnobotany and Ethnopharmacology ......
Ethnobotany and Ethnopharmacology ......
Ashokrao Mane college of Pharmacy Peth-Vadgaon
 
Synthetic Fiber Construction in lab .pptx
Synthetic Fiber Construction in lab .pptxSynthetic Fiber Construction in lab .pptx
Synthetic Fiber Construction in lab .pptx
Pavel ( NSTU)
 
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
siemaillard
 
The Challenger.pdf DNHS Official Publication
The Challenger.pdf DNHS Official PublicationThe Challenger.pdf DNHS Official Publication
The Challenger.pdf DNHS Official Publication
Delapenabediema
 
Home assignment II on Spectroscopy 2024 Answers.pdf
Home assignment II on Spectroscopy 2024 Answers.pdfHome assignment II on Spectroscopy 2024 Answers.pdf
Home assignment II on Spectroscopy 2024 Answers.pdf
Tamralipta Mahavidyalaya
 
Additional Benefits for Employee Website.pdf
Additional Benefits for Employee Website.pdfAdditional Benefits for Employee Website.pdf
Additional Benefits for Employee Website.pdf
joachimlavalley1
 
Palestine last event orientationfvgnh .pptx
Palestine last event orientationfvgnh .pptxPalestine last event orientationfvgnh .pptx
Palestine last event orientationfvgnh .pptx
RaedMohamed3
 
MARUTI SUZUKI- A Successful Joint Venture in India.pptx
MARUTI SUZUKI- A Successful Joint Venture in India.pptxMARUTI SUZUKI- A Successful Joint Venture in India.pptx
MARUTI SUZUKI- A Successful Joint Venture in India.pptx
bennyroshan06
 
Polish students' mobility in the Czech Republic
Polish students' mobility in the Czech RepublicPolish students' mobility in the Czech Republic
Polish students' mobility in the Czech Republic
Anna Sz.
 
ESC Beyond Borders _From EU to You_ InfoPack general.pdf
ESC Beyond Borders _From EU to You_ InfoPack general.pdfESC Beyond Borders _From EU to You_ InfoPack general.pdf
ESC Beyond Borders _From EU to You_ InfoPack general.pdf
Fundacja Rozwoju Społeczeństwa Przedsiębiorczego
 
1.4 modern child centered education - mahatma gandhi-2.pptx
1.4 modern child centered education - mahatma gandhi-2.pptx1.4 modern child centered education - mahatma gandhi-2.pptx
1.4 modern child centered education - mahatma gandhi-2.pptx
JosvitaDsouza2
 
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCECLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
BhavyaRajput3
 
Digital Tools and AI for Teaching Learning and Research
Digital Tools and AI for Teaching Learning and ResearchDigital Tools and AI for Teaching Learning and Research
Digital Tools and AI for Teaching Learning and Research
Vikramjit Singh
 
special B.ed 2nd year old paper_20240531.pdf
special B.ed 2nd year old paper_20240531.pdfspecial B.ed 2nd year old paper_20240531.pdf
special B.ed 2nd year old paper_20240531.pdf
Special education needs
 

Recently uploaded (20)

Model Attribute Check Company Auto Property
Model Attribute  Check Company Auto PropertyModel Attribute  Check Company Auto Property
Model Attribute Check Company Auto Property
 
Cambridge International AS A Level Biology Coursebook - EBook (MaryFosbery J...
Cambridge International AS  A Level Biology Coursebook - EBook (MaryFosbery J...Cambridge International AS  A Level Biology Coursebook - EBook (MaryFosbery J...
Cambridge International AS A Level Biology Coursebook - EBook (MaryFosbery J...
 
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
 
How to Break the cycle of negative Thoughts
How to Break the cycle of negative ThoughtsHow to Break the cycle of negative Thoughts
How to Break the cycle of negative Thoughts
 
Chapter 3 - Islamic Banking Products and Services.pptx
Chapter 3 - Islamic Banking Products and Services.pptxChapter 3 - Islamic Banking Products and Services.pptx
Chapter 3 - Islamic Banking Products and Services.pptx
 
TESDA TM1 REVIEWER FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
TESDA TM1 REVIEWER  FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...TESDA TM1 REVIEWER  FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
TESDA TM1 REVIEWER FOR NATIONAL ASSESSMENT WRITTEN AND ORAL QUESTIONS WITH A...
 
Ethnobotany and Ethnopharmacology ......
Ethnobotany and Ethnopharmacology ......Ethnobotany and Ethnopharmacology ......
Ethnobotany and Ethnopharmacology ......
 
Synthetic Fiber Construction in lab .pptx
Synthetic Fiber Construction in lab .pptxSynthetic Fiber Construction in lab .pptx
Synthetic Fiber Construction in lab .pptx
 
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
aaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaaa
 
The Challenger.pdf DNHS Official Publication
The Challenger.pdf DNHS Official PublicationThe Challenger.pdf DNHS Official Publication
The Challenger.pdf DNHS Official Publication
 
Home assignment II on Spectroscopy 2024 Answers.pdf
Home assignment II on Spectroscopy 2024 Answers.pdfHome assignment II on Spectroscopy 2024 Answers.pdf
Home assignment II on Spectroscopy 2024 Answers.pdf
 
Additional Benefits for Employee Website.pdf
Additional Benefits for Employee Website.pdfAdditional Benefits for Employee Website.pdf
Additional Benefits for Employee Website.pdf
 
Palestine last event orientationfvgnh .pptx
Palestine last event orientationfvgnh .pptxPalestine last event orientationfvgnh .pptx
Palestine last event orientationfvgnh .pptx
 
MARUTI SUZUKI- A Successful Joint Venture in India.pptx
MARUTI SUZUKI- A Successful Joint Venture in India.pptxMARUTI SUZUKI- A Successful Joint Venture in India.pptx
MARUTI SUZUKI- A Successful Joint Venture in India.pptx
 
Polish students' mobility in the Czech Republic
Polish students' mobility in the Czech RepublicPolish students' mobility in the Czech Republic
Polish students' mobility in the Czech Republic
 
ESC Beyond Borders _From EU to You_ InfoPack general.pdf
ESC Beyond Borders _From EU to You_ InfoPack general.pdfESC Beyond Borders _From EU to You_ InfoPack general.pdf
ESC Beyond Borders _From EU to You_ InfoPack general.pdf
 
1.4 modern child centered education - mahatma gandhi-2.pptx
1.4 modern child centered education - mahatma gandhi-2.pptx1.4 modern child centered education - mahatma gandhi-2.pptx
1.4 modern child centered education - mahatma gandhi-2.pptx
 
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCECLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
CLASS 11 CBSE B.St Project AIDS TO TRADE - INSURANCE
 
Digital Tools and AI for Teaching Learning and Research
Digital Tools and AI for Teaching Learning and ResearchDigital Tools and AI for Teaching Learning and Research
Digital Tools and AI for Teaching Learning and Research
 
special B.ed 2nd year old paper_20240531.pdf
special B.ed 2nd year old paper_20240531.pdfspecial B.ed 2nd year old paper_20240531.pdf
special B.ed 2nd year old paper_20240531.pdf
 

CLIM Undergraduate Workshop: (Attachment) Performing Extreme Value Analysis (EVA) Using R - Whitney Huang, Oct 23, 2017

  • 1. Performing Extreme Value Analysis (EVA) using R Performing Extreme Value Analysis (EVA) using R Whitney Huang October 23, 2017 Data: Fort Collins daily precipitation Read the data Plot the data Summarize the data EVA: Block Maxima Approach Step I: Determine the block size and compute maxima for blocks Step II: Fit a GEV to the maxima and assess the fit Step III: Perform inference for return levels EVA: Peak Over Threshold Approach Step I: Pick a threshold and extract the threshold exceedances Step II: Fit a GPD to threshold excesses and assess the fit Step III: Perform inference for return levels Data: Fort Collins daily precipitation We will analyze the daily precipitation amounts (inches) in Fort Collins, Colorado from 1900 to 1999. (Source Colorado Climate Center, Colorado State University http://ulysses.atmos.colostate.edu.) Read the data # Install the packages for this demos #install.packages(c("extRemes", "scales", "dplyr", "ismev")) library(extRemes) # Load the extRemes package for performing EVA data(Fort) # Load the preciptation data (it is a built-in data sets in extRemes) head(Fort) # Look at the first few observations ## obs tobs month day year Prec ## 1 1 1 1 1 1900 0 ## 2 2 2 1 2 1900 0 ## 3 3 3 1 3 1900 0 ## 4 4 4 1 4 1900 0
  • 2. Performing Extreme Value Analysis (EVA) using R ## 5 5 5 1 5 1900 0 ## 6 6 6 1 6 1900 0 tail(Fort) # Look at the last few observations ## obs tobs month day year Prec ## 36519 36519 360 12 26 1999 0 ## 36520 36520 361 12 27 1999 0 ## 36521 36521 362 12 28 1999 0 ## 36522 36522 363 12 29 1999 0 ## 36523 36523 364 12 30 1999 0 ## 36524 36524 365 12 31 1999 0 str(Fort) # Look at the structure of the data set ## 'data.frame': 36524 obs. of 6 variables: ## $ obs : num 1 2 3 4 5 6 7 8 9 10 ... ## $ tobs : num 1 2 3 4 5 6 7 8 9 10 ... ## $ month: num 1 1 1 1 1 1 1 1 1 1 ... ## $ day : num 1 2 3 4 5 6 7 8 9 10 ... ## $ year : num 1900 1900 1900 1900 1900 1900 1900 1900 1900 1900 ... ## $ Prec : num 0 0 0 0 0 0 0 0 0 0 ... Plot the data # Set up the time format days_year <- table(Fort$year) time_year <- Fort$tobs / rep.int(days_year, times = days_year) time <- Fort$year + time_year # Plot the spatial location of Fort Collins and the daily precip time series par(mfrow = c(2, 1)) library(maps) # Load the package for map drawing map("state", col = "gray", mar = rep(0, 4)) # Fort Collins, Lat Long Coordinates: 40.5853° N, 105.0844° W points(-105.0844, 40.5853, pch = "*", col = "red", cex = 1.5) par(las = 1, mar = c(5.1, 4.1, 1.1, 2.1)) plot(time, Fort$Prec, type = "h", xlab = "Time (Year)", ylab = "Daily precipitation (in)")
  • 3. Performing Extreme Value Analysis (EVA) using R # Zoom in to look at seasonal variation par(mfrow = c(1, 2), mar = c(5.1, 4.1, 4.1, 0.6)) id <- which(Fort$year %in% 1999) # Look at year 1999 par(las = 1) # Plot the 1999 daily precip time series plot(1:365, Fort$Prec[id], type = "h", xlab = " ", ylab = "Daily precipitation (in)", xaxt = "n", ylim = c(0, max(Fort$Prec)), main = "1999") par(las = 3) axis(1, at = seq(15, 345, 30), labels = month.abb) Leaf_Day <- seq(1520, 1520 + 1460 * 23, 1460) par(las = 1) library(scales) # Load the scales pacakge to modify color transparency # Plot the daily precip as a function of the day of the year plot(rep(1:365, 100), Fort$Prec[-Leaf_Day], pch = 1, col = alpha("blue", 0.25), cex = 0.5, xaxt = "n", xlab = " ", ylab = " ", main = "1900 ~ 1999", ylim = c(0, max(Fort$Prec))) par(las = 3) axis(1, at = seq(15, 345, 30), labels = month.abb)
  • 4. Performing Extreme Value Analysis (EVA) using R # Define "summer" and "winter" daily precip summer <- which(Fort$month %in% 6:8) winter <- which(Fort$month %in% c(12, 1, 2)) prec_summer <- Fort$Prec[summer] prec_winter <- Fort$Prec[winter] # Plot the histograms for summer and winter non-zero daily precip par(mfrow = c(1, 2), mar = c(5.1, 4.1, 4.1, 1.1)) max_precip <- max(prec_summer, prec_winter) brk <- seq(0, max_precip, length.out = 60) hist(prec_summer[prec_summer > 0], breaks = brk, col = alpha("red", 0.5), prob = T, xlim = c(0, max_precip), xlab = "Summer (JJA) prec (in)", ylab = "Density", main = "", ylim = c(0, 8)) rug(prec_summer, col = "red", lwd = 0.5) hist(prec_winter[prec_winter > 0], breaks = brk, col = alpha("blue", 0.5), prob = T, xlim = c(0, max_precip), xlab = "Winter (DJF) prec (in)", ylab = " ", main = "", ylim = c(0, 8)) rug(prec_winter, col = "blue", lwd = 0.5)
  • 5. Performing Extreme Value Analysis (EVA) using R Summarize the data # Six number summary for summer and winter daily precip summary(prec_summer) ## Min. 1st Qu. Median Mean 3rd Qu. Max. ## 0.00000 0.00000 0.00000 0.05289 0.01000 4.63000 summary(prec_winter) ## Min. 1st Qu. Median Mean 3rd Qu. Max. ## 0.00000 0.00000 0.00000 0.01477 0.00000 1.32000 # Variation sd(prec_summer) ## [1] 0.2004784 sd(prec_winter) ## [1] 0.0641466 IQR(prec_summer) ## [1] 0.01
  • 6. Performing Extreme Value Analysis (EVA) using R IQR(prec_winter) ## [1] 0 # Chance of rain length(prec_summer[prec_summer > 0]) / length(prec_summer) ## [1] 0.2827174 length(prec_winter[prec_winter > 0]) / length(prec_winter) ## [1] 0.1476064 EVA: Block Maxima Approach We are going to conduct an extreme value analysis using the extRemes package developed and maintained by Eric Gilleland . In the previous lecture we learned the block maxima method and threshold exceedances method for doing EVA. Let’s see how that works in R . Step I: Determine the block size and compute maxima for blocks library(dplyr) grouped_summer <- group_by(Fort[summer, ], year) # Extracting summer maxima and the timings when the maxima occur summer_max <- summarise(grouped_summer, prec = max(Prec), t = which.max(Prec)) summer_max ## # A tibble: 100 × 3 ## year prec t ## <dbl> <dbl> <int> ## 1 1900 0.51 13 ## 2 1901 1.46 15 ## 3 1902 1.02 28 ## 4 1903 0.53 47 ## 5 1904 1.10 35 ## 6 1905 1.11 66 ## 7 1906 0.64 23 ## 8 1907 1.21 56 ## 9 1908 1.93 60 ## 10 1909 1.11 28
  • 7. Performing Extreme Value Analysis (EVA) using R ## # ... with 90 more rows Let’s plot the summer maxima # Setting up the figure configuration old.par <- par(no.readonly = TRUE) mar.default <- par("mar") mar.left <- mar.default mar.right <- mar.default mar.left[2] <- 0 mar.right[4] <- 0 # Time series plot par(fig = c(0.2, 1, 0, 1), mar = mar.left) plot(1900 + 1:9200 / 92, prec_summer, xlab = "Year", ylab = "", main = "Summer Maximum n Fort Collins", type = "h", pch = 19, cex = 0.5, col = "lightblue", ylim = c(0, max_precip), yaxt = "n") par(las = 2) axis(4, at = 0:5) par(las = 0) mtext("Precipitation (in)", side = 2, line = 4) abline(v = 1900:2000, col = "gray", lty = 2) points(1900:1999 + summer_max$t / 90, summer_max$prec, pch = 16, col = "blue", cex = 0.5) # Histogram hs <- hist(summer_max$prec, breaks = seq(0, max_precip, length.out = 40), plot = FALSE) par(fig = c(0, 0.2, 0, 1.0), mar = mar.right, new = T) plot (NA, type = 'n', axes = FALSE, yaxt = 'n', col = rgb(0, 0, 0.5, alpha = 0.5), xlab = "Density", ylab = NA, main = NA, xlim = c(-max(hs$density), 0), ylim = c(0, max_precip)) axis(1, at = c(-0.8, -0.4, 0), c(0.8, 0.4, 0), las = 2) arrows(rep(0, length(hs$breaks[-40])), hs$breaks[-40], -hs$density, hs$breaks[-40], col = "blue", length = 0, angle = 0, lwd = 1) arrows(rep(0, length(hs$breaks[-1])), hs$breaks[-1], -hs$density, hs$breaks[-1], col = "blue", length = 0, angle = 0, lwd = 1) arrows(-hs$density, hs$breaks[-40], -hs$density, hs$breaks[-1], col = "blue", angle = 0, length = 0) mle <- fevd(summer_max$prec)$results$par xg <- seq(0, max_precip, length.out = 100) library(ismev) lines(-gev.dens(mle, xg), xg, col = "red")
  • 8. Performing Extreme Value Analysis (EVA) using R par(old.par) Step II: Fit a GEV to the maxima and assess the fit # Fit a GEV to summer maximum daily precip using MLE gevfit <- fevd(summer_max$prec) # Print the results gevfit ## ## fevd(x = summer_max$prec) ## ## [1] "Estimation Method used: MLE" ## ## ## Negative Log-Likelihood Value: 100.5622 ## ## ## Estimated parameters: ## location scale shape ## 0.8262256 0.4974066 0.2158052
  • 9. Performing Extreme Value Analysis (EVA) using R ## ## Standard Error Estimates: ## location scale shape ## 0.05627189 0.04516721 0.08241033 ## ## Estimated parameter covariance matrix. ## location scale shape ## location 0.003166526 0.0014583680 -0.0013849537 ## scale 0.001458368 0.0020400766 -0.0001826602 ## shape -0.001384954 -0.0001826602 0.0067914617 ## ## AIC = 207.1244 ## ## BIC = 214.9399 #QQ plot p <- 1:100 / 101 qm <- gevq(mle, 1 - p) plot(qm, sort(summer_max$prec), xlim = c(0, 5), ylim = c(0, 5), pch = 16, cex = 0.5, col = alpha("blue", 0.5), xlab = "Model", ylab = "Empirical", main = "Quantile Plot") abline(0, 1, lwd = 1.5)
  • 10. Performing Extreme Value Analysis (EVA) using R Step III: Perform inference for return levels Suppose we are interested in estimating 100-year return level RL100 <- return.level(gevfit, return.period = 100) # Estimate of the 100-year event RL100 ## fevd(x = summer_max$prec) ## return.level.fevd.mle(x = gevfit, return.period = 100) ## ## GEV model fitted to summer_max$prec ## Data are assumed to be stationary ## [1] "Return Levels for period units in years"
  • 11. Performing Extreme Value Analysis (EVA) using R ## 100-year level ## 4.741325 # Quantify the estimate uncertainty ## Delta method CI_delta <- ci(gevfit, return.period = 100, verbose = T) ## ## Preparing to calculate 95 % CI for 100-year return level ## ## Model is fixed ## ## Using Normal Approximation Method. CI_delta ## fevd(x = summer_max$prec) ## ## [1] "Normal Approx." ## ## [1] "100-year return level: 4.741" ## ## [1] "95% Confidence Interval: (2.9471, 6.5356)" ## Profile likelihood method CI_prof <- ci(gevfit, method = "proflik", xrange = c(2.5, 8), return.period = 100, verbose = F) CI_prof ## fevd(x = summer_max$prec) ## ## [1] "Profile Likelihood" ## ## [1] "100-year return level: 4.741" ## ## [1] "95% Confidence Interval: (3.5081, 7.5811)" hist(summer_max$prec, breaks = seq(0, max_precip, length.out = 35), col = alpha("lightblue", 0.2), border = "gray", xlim = c(0, 8), prob = T, ylim = c(0, 1.2), xlab = "summer max (in)", main = "95% CI for 100-yr RL") xg <- seq(0, 8, len = 1000) mle <- gevfit$results$par lines(xg, gev.dens(mle, xg), lwd = 1.5) #for (i in 1:3) abline(v = CI_delta[i], lty = 2, col = "blue") for (i in c(1, 3)) abline(v = CI_prof[i], lty = 2, col = "red") abline(v = RL100, lwd = 1.5, lty = 2)
  • 12. Performing Extreme Value Analysis (EVA) using R #legend("topleft", legend = c("Delta CI", "Prof CI"), #col = c("blue", "red"), lty = c(2, 3)) EVA: Peak Over Threshold Approach Step I: Pick a threshold and extract the threshold exceedances old.par <- par(no.readonly = TRUE) mar.default <- par('mar') mar.left <- mar.default mar.right <- mar.default
  • 13. Performing Extreme Value Analysis (EVA) using R mar.left[2] <- 0 mar.right[4] <- 0 # Time series plot par(fig = c(0.2, 1, 0, 1), mar = mar.left) plot(1900 + 1:9200 / 92, prec_summer, type = "h", col = "lightblue", xlab = "Year", ylab = "Daily Precip (inches)", yaxt = "n") #Threshold exceedances thres <- 0.4 ex <- prec_summer[prec_summer >= thres] length(ex) ## [1] 344 #Extract the timing of POT ex_t <- which(prec_summer >= thres) abline(h = thres, col = "blue", lty = 2) points(1900 + ex_t / 92, ex, col = alpha("blue", 0.5), pch = 16, cex = 0.75) par(las = 2) axis(4, at = 0:5) par(las = 0) mtext("Precipitation (in)", side = 2, line = 5) grid() hs <- hist(ex, seq(thres, max_precip, len = 50), plot = FALSE) par(fig = c(0, 0.2, 0, 1.0), mar = mar.right, new = T) plot (NA, type = 'n', axes = FALSE, yaxt = 'n', col = rgb(0,0,0.5, alpha = 0.5), xlab = "Density", ylab = NA, main = NA, xlim = c(-max(hs$density), 0), ylim = c(0, max_precip)) axis(1, at = c(-3, -2, -1, 0), c(3, 2, 1, 0), las = 2) #abline(h = 21, col = "red", lty = 5) arrows(rep(0, length(hs$breaks[-50])), hs$breaks[-50], -hs$density, hs$breaks[-50], col = "blue", length = 0, angle = 0, lwd = 1) arrows(rep(0, length(hs$breaks[-1])), hs$breaks[-1], -hs$density, hs$breaks[-1], col = "blue", length = 0, angle = 0, lwd = 1) arrows(-hs$density, hs$breaks[-50], -hs$density, hs$breaks[-1], col = "blue", angle = 0, length = 0) mle <- fevd(prec_summer, threshold = thres, type = "GP")$results$par xg <- seq(thres, max_precip, length.out = 100) lines(-gpd.dens(mle, thres, xg), xg, col = "red")
  • 14. Performing Extreme Value Analysis (EVA) using R par(old.par) How to choose the “right” threshold? # Mean residula life plot mrlplot(prec_summer, main = "Mean Residual Life", xlab = "Threshold (in)") # I choose 0.4 as the threshold but note that the "straightness" # is difficult to assess abline(v = 0.4, col = "blue", lty = 2)
  • 15. Performing Extreme Value Analysis (EVA) using R Step II: Fit a GPD to threshold excesses and assess the fit # Fit a GPD for threshold exceenances using MLE gpdfit1 <- fevd(prec_summer, threshold = thres, type = "GP") # Print the results gpdfit1 ## ## fevd(x = prec_summer, threshold = thres, type = "GP") ## ## [1] "Estimation Method used: MLE" ## ## ## Negative Log-Likelihood Value: 46.14484
  • 16. Performing Extreme Value Analysis (EVA) using R ## ## ## Estimated parameters: ## scale shape ## 0.3053321 0.3236911 ## ## Standard Error Estimates: ## scale shape ## 0.02784980 0.07520322 ## ## Estimated parameter covariance matrix. ## scale shape ## scale 0.0007756112 -0.001337429 ## shape -0.0013374289 0.005655524 ## ## AIC = 96.28967 ## ## BIC = 103.9239 # QQ plot p <- 1:344 / 345 qm <- gpdq(mle, 0.4, 1 - p) plot(qm, sort(ex), xlim = c(0, 6), ylim = c(0, 6), pch = 16, cex = 0.5, col = alpha("blue", 0.5), xlab = "Model", ylab = "Empirical", main = "Quantile Plot") abline(0, 1, lwd = 1.5)
  • 17. Performing Extreme Value Analysis (EVA) using R Step III: Perform inference for return levels Again we are interested in estimating 100-year return level # Here we need to adjust the return period as here we are #estimating the return level for summer precip RL100 <- return.level(gpdfit1, return.period = 100 * 92 / 365.25) RL100 ## fevd(x = prec_summer, threshold = thres, type = "GP") ## return.level.fevd.mle(x = gpdfit1, return.period = 100 * 92/365.25) ## ## GP model fitted to prec_summer
  • 18. Performing Extreme Value Analysis (EVA) using R ## Data are assumed to be stationary ## [1] "Return Levels for period units in years" ## 25.1882272416153-year level ## 5.656769 CI_delta <- ci(gpdfit1, return.period = 100 * 92 / 365.25, verbose = F) CI_delta ## fevd(x = prec_summer, threshold = thres, type = "GP") ## ## [1] "Normal Approx." ## ## [1] "25.1882272416153-year return level: 5.657" ## ## [1] "95% Confidence Interval: (3.2246, 8.089)" CI_prof <- ci(gpdfit1, method = "proflik", xrange = c(3, 10), return.period = 100 * 92 / 365.25, verbose = F) CI_prof ## fevd(x = prec_summer, threshold = thres, type = "GP") ## ## [1] "Profile Likelihood" ## ## [1] "25.1882272416153-year return level: 5.657" ## ## [1] "95% Confidence Interval: (3.9572, 9.4964)" hist(ex, 40, col = alpha("lightblue", 0.2), border = "gray", xlim = c(thres, 10), prob = T, ylim = c(0, 4), xlab = "Threshold excess (in)", main = "95% CI for 100-yr RL") xg <- seq(thres, 10, len = 1000) mle <- gpdfit1$results$par lines(xg, gpd.dens(mle, thres, xg), lwd = 1.5) #for (i in c(1, 3)) abline(v = CI_delta[i], lty = 2, col = "blue") for (i in c(1,3)) abline(v = CI_prof[i], lty = 2, col = "red") abline(v = RL100, lwd = 1.5, lty = 2)
  • 19. Performing Extreme Value Analysis (EVA) using R #legend("topleft", legend = c("Delta CI", "Prof CI"), #col = c("blue", "red"), lty = c(2, 3))