#Load the data:
# Notice: if reproduction of this code is of interst, delete blank columns to achieve this result.
PATH <- "/Users/weekly_in_situ_co2_mlo.csv"
Data <- read.csv(PATH, header = TRUE)
Let’s plot the data, it’s always helpful:
#Change the time
Time <- as.Date(Data$Date)
plot(Time,Data$CO2, xlab = "Year", ylab = "CO2 Levels",type="l")
Long-term trend: linear, \(C_0\) is an intercept, \(C_1\) a coefficient for time: \[C_0+C_1 t\] Seasonal variation: This is a periodic function, and therefore C_3 represents the phase: \[C_2\cdot cos (2 \pi t / 365.25+C_3)\] Noise: Gaussian with 0 mean and fixed standard deviation, \(C_4\) \[N(0,{C_4}^{2})\] The \(C_i\) variables are all unobserved parameters of the model. Combining these three components gives the following likelihood function:
\[p(X_t | \theta)=N(c_0+c_1 t+c_2\cdot cos(2 \pi t / 365.25+c3), {c_4}^2)\]
lm <- lm(CO2~Time, data = Data)
plot(Time,Data$CO2, xlab = "Year", ylab = "CO2 Levels",type="l")
abline(lm, col="red")
summary(lm)
##
## Call:
## lm(formula = CO2 ~ Time, data = Data)
##
## Residuals:
## Min 1Q Median 3Q Max
## -8.2175 -2.8694 -0.4439 2.4419 12.2218
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 3.248e+02 1.072e-01 3031.2 <2e-16 ***
## Time 4.231e-03 1.169e-05 361.8 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 4.01 on 3038 degrees of freedom
## Multiple R-squared: 0.9773, Adjusted R-squared: 0.9773
## F-statistic: 1.309e+05 on 1 and 3038 DF, p-value: < 2.2e-16
That’s Ok but not great, we see that both coefficients are significant for the model as predictors. \(R^{2}\) is .977 which sheds light on how time could explain variations in CO2 (very well), but standard error is 4.01.
Let’s add the seasonal variation, and convert the time to a class we can work with:
#turn the time parameter into days from day one:
Time <- c(Time-Time[1])
#Sanity check: we should have a length of 3040 (weeks between )
length(Time)
## [1] 3040
#Difference between first and last measure should be 21770 days:
Time[3040]
## Time difference of 21770 days
#turn time to numeric vector:
Time <- as.numeric(Time, units="days")
Time[3040]
## [1] 21770
Now we can create a numeric dataframe that it’d be easy to work with; time intervals should be seven day intervals.
#Create a numeric dataframe to work with:
numeric_data <- data.frame(Data$CO2,Time)
colnames(numeric_data) <-c("CO2","Time")
#Expect to get dbl type (int) for both variables:
head(numeric_data)
## CO2 Time
## 1 316.19 0
## 2 317.31 7
## 3 317.69 14
## 4 317.58 21
## 5 316.48 28
## 6 316.95 35
Let’s split the data to train and test:
#model-testing on the esixting data:
#use the first 70% to fit and 30% to predict:
set.seed(23)
train_size <- nrow(numeric_data)* .7 #<- train size
#let's split the data to train and test:
#train <- numeric_data[1:train_size, ]
train <- numeric_data[1:train_size,]
test_rows <- (nrow(numeric_data) - nrow(train))
test <- tail(numeric_data, test_rows)
#Sanity check: we should expect the test data to start at 2129 (one item after 70% of observations , and to have 3040-2128 = 912 )
head(test)
## CO2 Time
## 2129 369.61 15309
## 2130 370.11 15316
## 2131 370.09 15323
## 2132 370.98 15330
## 2133 370.86 15337
## 2134 371.04 15344
nrow(test)
## [1] 912
#Add the seasonal parameter:
seasonal_var <- ts(cos((2*pi*train$Time)/365.25))
train <- data.frame(train$Time, seasonal_var, CO2=train$CO2)
colnames(train) <-c("Time","seasonal_var","CO2")
head(train)
## Time seasonal_var CO2
## 1 0 1.0000000 316.19
## 2 7 0.9927586 317.31
## 3 14 0.9711394 317.69
## 4 21 0.9354554 317.58
## 5 28 0.8862235 316.48
## 6 35 0.8241566 316.95
#Fit the model:
tslm <- lm(CO2~Time+seasonal_var, data = train)
#Later we'd want to plot the fit of the model:
seasonal_var_numeric <- as.numeric(seasonal_var)
tslm_var_for_plot <-(tslm$coefficients[1]+tslm$coefficients[2]*Time[1:nrow(train)]+tslm$coefficients[3]*seasonal_var_numeric)
summary(tslm)
##
## Call:
## lm(formula = CO2 ~ Time + seasonal_var, data = train)
##
## Residuals:
## Min 1Q Median 3Q Max
## -4.2844 -1.6280 -0.2005 1.2968 6.1090
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 3.105e+02 9.116e-02 3406.23 <2e-16 ***
## Time 3.633e-03 1.020e-05 356.23 <2e-16 ***
## seasonal_var 2.544e+00 6.316e-02 40.27 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 2.055 on 2125 degrees of freedom
## Multiple R-squared: 0.9837, Adjusted R-squared: 0.9837
## F-statistic: 6.422e+04 on 2 and 2125 DF, p-value: < 2.2e-16
Nice, all predictors are important (seen by the “Pr (>|t|)”, “***“) and residual standard error has decreased to 2.05 with \(R^{2}\) of .983! (note: this is not prediction, but merely how well the model fits the data!)
plot(Time[1:nrow(train)],Data$CO2[1:nrow(train)], xlab = "Indexed Time", ylab = "CO2 Levels", main="CO2 (in black) fitted by the updated model(red) - Not bad at all!",type="l")
lines(Time[1:nrow(train)],tslm_var_for_plot, col="red")
The model does a fair job but as seen by the red graph, noise is missing since the data isn’t as smooth.
Well, so far it’s been only fitting the model to the data. Let’s evaluate the model on the test data:
#use the model and its predictor (time, seasonal variation) to predict CO2 for different times:
#X input for the model - copmlement the test set with the seasonal var:
seasonal_var <- ts(cos((2*pi*test$Time)/365.25))
test <- data.frame(test$Time, seasonal_var, CO2=test$CO2)
colnames(test) <-c("Time","seasonal_var","CO2")
head(test)
## Time seasonal_var CO2
## 1 15309 0.8567425 369.61
## 2 15316 0.9124929 370.11
## 3 15323 0.9550279 370.09
## 4 15330 0.9837315 370.98
## 5 15337 0.9981880 370.86
## 6 15344 0.9981880 371.04
tslm <- lm(CO2~Time+seasonal_var, data = train)
prediction<-predict(tslm, test)
summary(tslm)
##
## Call:
## lm(formula = CO2 ~ Time + seasonal_var, data = train)
##
## Residuals:
## Min 1Q Median 3Q Max
## -4.2844 -1.6280 -0.2005 1.2968 6.1090
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 3.105e+02 9.116e-02 3406.23 <2e-16 ***
## Time 3.633e-03 1.020e-05 356.23 <2e-16 ***
## seasonal_var 2.544e+00 6.316e-02 40.27 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 2.055 on 2125 degrees of freedom
## Multiple R-squared: 0.9837, Adjusted R-squared: 0.9837
## F-statistic: 6.422e+04 on 2 and 2125 DF, p-value: < 2.2e-16
pred_data <- data.frame(test$Time, prediction)
plot(test$Time,test$CO2, xlab = "Indexed Time", ylab = "CO2 Levels", main="Prediction: CO2 (in black) predicted by the updated model(red), \nnot so great...",type="l")
lines(pred_data, col="red")
We see that the model follows a somewhat linear trend, based on the training data. It is plausible that the rate of change (derivative) of the CO2 levels has increased in recent years with more transportation and manufacturing.Therefore, this model wouldn’t predict well CO2 levels, looking into the future.**
One way to deal with this change, is to predict the far past, i.e. train on the last 70% of the data and predict the first 30% (then the recent nonlinearity will be smoothed out by more linear period in the middle of the data).
#use the LAST 70% to fit and FIRST 30% to predict:
set.seed(24)
train_size <- nrow(numeric_data)* .7 #<- train size
#let's split the data to train and test:
test <- numeric_data[1:(3040-train_size),]
#Test should start at 1 and be of nrow(912):
head(test)
## CO2 Time
## 1 316.19 0
## 2 317.31 7
## 3 317.69 14
## 4 317.58 21
## 5 316.48 28
## 6 316.95 35
#nrow(test)
train_rows <- (3040-nrow(test))
train <- tail(numeric_data, train_rows)
#Sanity check: now train will start at 2129:
head(train)
## CO2 Time
## 913 328.85 6762
## 914 329.06 6769
## 915 329.60 6776
## 916 329.17 6783
## 917 329.03 6790
## 918 329.84 6797
#Fit the model:
seasonal_var <- ts(cos((2*pi*train$Time)/365.25))
tslm <- lm(CO2~Time+seasonal_var, data = train)
#Later we'd want to plot the fit of the model:
seasonal_var_numeric <- as.numeric(seasonal_var)
tslm_var_for_plot <-(Time[1:nrow(train)]+seasonal_var_numeric)
seasonal_var <- ts(cos((2*pi*test$Time)/365.25))
test <- data.frame(test$Time, seasonal_var, CO2=test$CO2)
colnames(test) <-c("Time","seasonal_var","CO2")
head(test)
## Time seasonal_var CO2
## 1 0 1.0000000 316.19
## 2 7 0.9927586 317.31
## 3 14 0.9711394 317.69
## 4 21 0.9354554 317.58
## 5 28 0.8862235 316.48
## 6 35 0.8241566 316.95
prediction<-predict(tslm, test, interval = "predict")
summary(tslm)
##
## Call:
## lm(formula = CO2 ~ Time + seasonal_var, data = train)
##
## Residuals:
## Min 1Q Median 3Q Max
## -4.5298 -1.6110 -0.1566 1.5006 7.0663
##
## Coefficients:
## Estimate Std. Error t value Pr(>|t|)
## (Intercept) 2.975e+02 1.612e-01 1845.46 <2e-16 ***
## Time 4.822e-03 1.082e-05 445.87 <2e-16 ***
## seasonal_var 2.718e+00 6.642e-02 40.92 <2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
##
## Residual standard error: 2.164 on 2125 degrees of freedom
## Multiple R-squared: 0.9895, Adjusted R-squared: 0.9895
## F-statistic: 1.002e+05 on 2 and 2125 DF, p-value: < 2.2e-16
We achieve 2.164 residual standard error on the training set versus the 2.05 beforehand. Lastly let’s add confidence intervals:
prediction<-predict(tslm, test ,interval=c("confidence"),level = 0.95,type="response")
#Noticed that the X axis "Indexed Time" should be of length 6755, since 7*912 = 6384 and there are non-documented gaps in the data, that are not pointed at by teh scrips website (thanks scripps!)
pred_data <- data.frame(test$Time, prediction)
plot(test$Time,test$CO2,xlab = "Indexed Time", ylab = "CO2 Levels", main="Prediction: CO2 (in black) predicted by the updated model(red), \nNot much better...",ylim=c(280,335),type="l")
lines(pred_data$test.Time,pred_data$lwr ,col="red",lty=1)
lines(pred_data$test.Time,pred_data$upr ,col="red",lty=1)
We shall add the noise parameter,optimize the model’s parameters, and use Bayesian approach to arrive at a posterior prediction.
#model test on the esixting data:
#use the first 70% to fit and 30% to predict:
set.seed(23)
train_size <- nrow(numeric_data)* .7 #<- train size
#let's split the data to train and test:
#train <- numeric_data[1:train_size, ]
train <- numeric_data[1:train_size,]
test_rows <- (nrow(numeric_data) - nrow(train))
test <- tail(numeric_data, test_rows)
#Sanity check: we should expect the test data to start at 2129 (one item after 70% of observations , and to have 3040-2128 = 912 )
head(test)
## CO2 Time
## 2129 369.61 15309
## 2130 370.11 15316
## 2131 370.09 15323
## 2132 370.98 15330
## 2133 370.86 15337
## 2134 371.04 15344
#nrow(test)
We shall take as priors the parameters realized by the previous models. We’ll start with priors as point estimate and later will turn those to distributions.
#This model builds on the models that we have used so far:
#priors (taken from the linear model):
tslm$coefficients
## (Intercept) Time seasonal_var
## 2.974534e+02 4.822144e-03 2.718172e+00
#notice that point-estimate priors are used here for simplicity, but eventualy the posterior should
#be a distribution over the parameters. Noise is assumed to be normally distributed with 0 mean and 1 SD.
c0 = 310.5; c1 = .003; c2 = 2.53; c3 = pi/2; c4=rnorm(1,0,1)
seasonal_var_df <- as.array(seasonal_var_numeric)
#constract the Bayes-Gaussian Model:
bayesian_model <- function(num_days){
return(rnorm(1,(c0+c1*num_days+c2*cos(2*pi*num_days/365.25 + c3)),c4))
}
#Let's see how this model fits the training data:
bayesian_results_func <- function(X_input) {
#see: the fastest way to iterate over a list with R:
# https://stackoverflow.com/questions/26508519/how-to-add-elements-to-a-list-in-r-loop
#generate list for iteration:
items_for_iteration <- length(X_input)
l <- vector("integer", items_for_iteration)
for (i in 1:length(X_input)){
l[i] <- bayesian_model(X_input[i])
}
return (subset(l,!is.na(l)) )
}
bayesian_results <- bayesian_results_func(c(train$Time))
#Sanity Check: we should expect 2128 obs, and head() values should be around 310+.
head(bayesian_results)
## [1] 310.4160 310.3935 310.2851 309.8613 309.6259 309.1184
length(bayesian_results)
## [1] 2128
plot(train$Time,train$CO2, xlab = "Indexed Time", ylab = "CO2 Levels", main="Bayesian Model Fit: CO2 (in black) ,model prediction(red)",ylim = c(310,375),type="l")
lines(train$Time,bayesian_results, col="red")
Let’s optimize parameters, and normalize them with RStan to predict into the future:
#Generate future data:
future <- seq(21791,36391,7) #36391-21791/(7*4*12) is roughly 43, so we get up until roughyl 2060.
data <- list(N = length(Data$Date),ppm = Data$CO2,t = numeric_data$Time,
N_future = length(future),t_future = future)
#package allows me to play rap ad libs to notify me when my stan code has finished running.
#install.packages("brr") <- comment out for the first run!
#install.packages("beepr") <- comment out for the first run!
library(rstan)
## Loading required package: ggplot2
## Loading required package: StanHeaders
## rstan (Version 2.16.2, packaged: 2017-07-03 09:24:58 UTC, GitRev: 2e1f913d3ca3)
## For execution on a local, multicore CPU with excess RAM we recommend calling
## rstan_options(auto_write = TRUE)
## options(mc.cores = parallel::detectCores())
library("brr")
library("ggplot2")
df <- numeric_data
colnames(df) <-c("co2","day_int")
#Rescalling the data is a useful practice especialy when we don't have a good hunch regarding the parameters:
rescale <- function(x){
# Rescales data vector 0 < data < 1 , this is a very straightforward scalling.
(x - min(x)) / (max(x) - min(x))
}
# "unscalling"
unscaleppm <- function(x){
x * (410.18 - 313.04) + 313.04
}
sDate <- rescale(df$day_int)
sCO2 <- rescale(df$co2)
# the last day integer is 21791
# the day integer forty years from now will be 36391
# the length of gendates is the number of datapoints to predict for
# sgendates will let me plot the predicted values directly
gendates <- seq(21791,36391,7)
sgendates <- seq(1,1.685508,length.out = 2086)
# Generate scalled and unscalled data:
data <- list(N = length(df$day_int),ppm = df$co2,t = df$day_int,
N_future = length(gendates),t_future = gendates)
sdata <- list(N = length(sDate),ppm = sCO2,t = sDate,
N_future = length(sgendates),t_future = sgendates)
model <- "
data {
int<lower=0> N; // length dates, scaled
real ppm[N]; // co2 levels in ppm, scaled
real t[N]; // timesteps
int<lower=0> N_future;
real t_future[N_future];
}
parameters {
real<lower=0,upper=1> c0;
real c1;
real c2;
real c3;
real c4;
real cs2;
}
transformed parameters {
real<lower=0> c0_transf;
real<lower=0> c1_transf;
real<lower=0> cs2_transf;
real<lower=0> c2_transf;
real<lower=0> c3_transf;
real<lower=0> c4_transf;
c0_transf = exp(c0);
c1_transf = exp(c1);
cs2_transf = exp(cs2);
c2_transf = exp(c2);
c3_transf = exp(c3);
c4_transf = exp(c4);
}
model {
c0 ~ normal(0,1); // after normalization, y-intercept will be near 0
c1 ~ normal(1,2); // after normalization, the slope over time is ~1
c2 ~ normal(1,10);
cs2 ~ normal(1,3);
c3 ~ normal(1,3); // should be periodic on [0,2pi], could use von mises dist
c4 ~ normal(1,2);
for(n in 1:N) {
ppm[n] ~ normal(c0 + c1*t[n] + cs2*t[n]*t[n] + c2*cos(2*3.14*t[n]/0.01676151 + c3),c4*c4);
}
}
generated quantities {
real ppm_future[N_future]; // future co2 levels
for(n in 1:N_future) {
ppm_future[n] = normal_rng(c0 + c1*t_future[n] + cs2*t_future[n]*t_future[n] + c2*cos(2*3.14*t_future[n]/0.01676151 + c3), c4*c4);
}
}
"
fit <- stan(
model_code = model,
data = sdata,
chains = 2, # number of Markov chains
warmup = 1000, # number of warmup iterations per chain
iter = 2000, # total number of iterations per chain
cores = 3, # number of cores (using 2 just for the vignette)
refresh = 1000, # show progress every 'refresh' iterations
control = list(adapt_delta = 0.99)
)
## In file included from file831c1ab5083.cpp:8:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/src/stan/model/model_header.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/mat.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core.hpp:12:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core/gevv_vvv_vari.hpp:5:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core/var.hpp:7:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/math/tools/config.hpp:13:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/config.hpp:39:
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/config/compiler/clang.hpp:196:11: warning: 'BOOST_NO_CXX11_RVALUE_REFERENCES' macro redefined [-Wmacro-redefined]
## # define BOOST_NO_CXX11_RVALUE_REFERENCES
## ^
## <command line>:6:9: note: previous definition is here
## #define BOOST_NO_CXX11_RVALUE_REFERENCES 1
## ^
## In file included from file831c1ab5083.cpp:8:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/src/stan/model/model_header.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/mat.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core.hpp:42:
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core/set_zero_all_adjoints.hpp:14:17: warning: unused function 'set_zero_all_adjoints' [-Wunused-function]
## static void set_zero_all_adjoints() {
## ^
## In file included from file831c1ab5083.cpp:8:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/src/stan/model/model_header.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/mat.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core.hpp:43:
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/core/set_zero_all_adjoints_nested.hpp:17:17: warning: 'static' function 'set_zero_all_adjoints_nested' declared in header file should be declared 'static inline' [-Wunneeded-internal-declaration]
## static void set_zero_all_adjoints_nested() {
## ^
## In file included from file831c1ab5083.cpp:8:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/src/stan/model/model_header.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/mat.hpp:12:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/prim/mat.hpp:58:
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/prim/mat/fun/autocorrelation.hpp:17:14: warning: function 'fft_next_good_size' is not needed and will not be emitted [-Wunneeded-internal-declaration]
## size_t fft_next_good_size(size_t N) {
## ^
## In file included from file831c1ab5083.cpp:8:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/src/stan/model/model_header.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math.hpp:4:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/rev/mat.hpp:12:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/prim/mat.hpp:298:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/prim/arr.hpp:38:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/StanHeaders/include/stan/math/prim/arr/functor/integrate_ode_rk45.hpp:13:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/numeric/odeint.hpp:61:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/numeric/odeint/util/multi_array_adaption.hpp:29:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array.hpp:21:
## In file included from /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array/base.hpp:28:
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array/concept_checks.hpp:42:43: warning: unused typedef 'index_range' [-Wunused-local-typedef]
## typedef typename Array::index_range index_range;
## ^
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array/concept_checks.hpp:43:37: warning: unused typedef 'index' [-Wunused-local-typedef]
## typedef typename Array::index index;
## ^
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array/concept_checks.hpp:53:43: warning: unused typedef 'index_range' [-Wunused-local-typedef]
## typedef typename Array::index_range index_range;
## ^
## /Library/Frameworks/R.framework/Versions/3.3/Resources/library/BH/include/boost/multi_array/concept_checks.hpp:54:37: warning: unused typedef 'index' [-Wunused-local-typedef]
## typedef typename Array::index index;
## ^
## 8 warnings generated.
# Comment out for fancy sounds:
#install.packages("devtools") <- if not installed yet.
#devtools::install_github("brooke-watson/BRRR") <- <- if not installed yet.
library("BRRR")
skrrrahh("sound = 26")
## Warning in skrrrahh("sound = 26"): "sound = 26" is not a valid sound nor
## path.
print(fit, probs=c(.05, 0.95))
## Inference for Stan model: 2f5a519da3d3e2d72ab6df7e850cc085.
## 2 chains, each with iter=2000; warmup=1000; thin=1;
## post-warmup draws per chain=1000, total post-warmup draws=2000.
##
## mean se_mean sd 5% 95% n_eff Rhat
## c0 0.01 0.00 0.00 0.01 0.02 636 1.00
## c1 0.48 0.00 0.00 0.48 0.48 662 1.00
## c2 0.00 0.03 0.03 -0.03 0.03 1 139.83
## c3 1.06 1.57 1.57 -0.52 2.64 1 207.77
## c4 0.00 0.10 0.10 -0.10 0.10 1 175.90
## cs2 0.46 0.00 0.00 0.46 0.47 734 1.00
## c0_transf 1.01 0.00 0.00 1.01 1.02 636 1.00
## c1_transf 1.62 0.00 0.00 1.61 1.62 663 1.00
## cs2_transf 1.59 0.00 0.00 1.58 1.60 734 1.00
## c2_transf 1.00 0.03 0.03 0.97 1.03 1 139.65
## c3_transf 7.26 6.66 6.66 0.59 14.08 1 91.15
## c4_transf 1.00 0.10 0.10 0.90 1.11 1 174.53
## ppm_future[1] 0.93 0.00 0.01 0.91 0.95 2000 1.00
## ppm_future[2] 0.93 0.00 0.01 0.92 0.95 1928 1.00
## ppm_future[3] 0.93 0.00 0.01 0.92 0.95 2000 1.00
## ppm_future[4] 0.94 0.00 0.01 0.92 0.95 2000 1.00
## ppm_future[5] 0.94 0.00 0.01 0.92 0.96 1925 1.00
## ppm_future[6] 0.94 0.00 0.01 0.93 0.96 1902 1.00
## ppm_future[7] 0.95 0.00 0.01 0.93 0.96 2000 1.00
## ppm_future[8] 0.95 0.00 0.01 0.93 0.97 1655 1.00
## ppm_future[9] 0.95 0.00 0.01 0.94 0.97 1669 1.00
## ppm_future[10] 0.96 0.00 0.01 0.94 0.97 1914 1.00
## ppm_future[11] 0.96 0.00 0.01 0.95 0.98 1902 1.00
## ppm_future[12] 0.97 0.00 0.01 0.95 0.98 1982 1.00
## ppm_future[13] 0.97 0.00 0.01 0.95 0.99 2000 1.00
## ppm_future[14] 0.97 0.00 0.01 0.96 0.99 2000 1.00
## ppm_future[15] 0.98 0.00 0.01 0.96 1.00 2000 1.00
## ppm_future[16] 0.98 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[17] 0.98 0.00 0.01 0.97 1.00 1953 1.00
## ppm_future[18] 0.99 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[19] 0.99 0.00 0.01 0.97 1.01 2000 1.00
## ppm_future[20] 0.99 0.00 0.01 0.98 1.01 1834 1.00
## ppm_future[21] 1.00 0.00 0.01 0.98 1.01 1933 1.00
## ppm_future[22] 1.00 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[23] 1.00 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[24] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[25] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[26] 1.00 0.00 0.01 0.98 1.02 1928 1.00
## ppm_future[27] 1.00 0.00 0.01 0.98 1.01 1998 1.00
## ppm_future[28] 1.00 0.00 0.01 0.98 1.01 1974 1.00
## ppm_future[29] 1.00 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[30] 0.99 0.00 0.01 0.98 1.01 1964 1.00
## ppm_future[31] 0.99 0.00 0.01 0.97 1.01 2000 1.00
## ppm_future[32] 0.99 0.00 0.01 0.97 1.01 2000 1.00
## ppm_future[33] 0.99 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[34] 0.98 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[35] 0.98 0.00 0.01 0.96 1.00 1684 1.00
## ppm_future[36] 0.98 0.00 0.01 0.96 0.99 1884 1.00
## ppm_future[37] 0.97 0.00 0.01 0.96 0.99 1873 1.00
## ppm_future[38] 0.97 0.00 0.01 0.95 0.99 2000 1.00
## ppm_future[39] 0.97 0.00 0.01 0.95 0.98 2000 1.00
## ppm_future[40] 0.97 0.00 0.01 0.95 0.98 1846 1.00
## ppm_future[41] 0.96 0.00 0.01 0.95 0.98 2000 1.00
## ppm_future[42] 0.96 0.00 0.01 0.94 0.98 1671 1.00
## ppm_future[43] 0.96 0.00 0.01 0.94 0.97 2000 1.00
## ppm_future[44] 0.96 0.00 0.01 0.94 0.97 1602 1.00
## ppm_future[45] 0.95 0.00 0.01 0.94 0.97 2000 1.00
## ppm_future[46] 0.95 0.00 0.01 0.94 0.97 1939 1.00
## ppm_future[47] 0.95 0.00 0.01 0.93 0.97 1891 1.00
## ppm_future[48] 0.95 0.00 0.01 0.93 0.97 1936 1.00
## ppm_future[49] 0.95 0.00 0.01 0.94 0.97 1956 1.00
## ppm_future[50] 0.95 0.00 0.01 0.93 0.97 2000 1.00
## ppm_future[51] 0.95 0.00 0.01 0.94 0.97 1970 1.00
## ppm_future[52] 0.95 0.00 0.01 0.94 0.97 2000 1.00
## ppm_future[53] 0.96 0.00 0.01 0.94 0.97 2000 1.00
## ppm_future[54] 0.96 0.00 0.01 0.94 0.97 2000 1.00
## ppm_future[55] 0.96 0.00 0.01 0.94 0.98 2000 1.00
## ppm_future[56] 0.96 0.00 0.01 0.95 0.98 2000 1.00
## ppm_future[57] 0.97 0.00 0.01 0.95 0.98 2000 1.00
## ppm_future[58] 0.97 0.00 0.01 0.95 0.99 1926 1.00
## ppm_future[59] 0.97 0.00 0.01 0.96 0.99 1932 1.00
## ppm_future[60] 0.98 0.00 0.01 0.96 0.99 1928 1.00
## ppm_future[61] 0.98 0.00 0.01 0.96 1.00 2000 1.00
## ppm_future[62] 0.99 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[63] 0.99 0.00 0.01 0.97 1.01 1705 1.00
## ppm_future[64] 0.99 0.00 0.01 0.98 1.01 1761 1.00
## ppm_future[65] 1.00 0.00 0.01 0.98 1.01 1904 1.00
## ppm_future[66] 1.00 0.00 0.01 0.99 1.02 1966 1.00
## ppm_future[67] 1.01 0.00 0.01 0.99 1.02 1918 1.00
## ppm_future[68] 1.01 0.00 0.01 0.99 1.03 1977 1.00
## ppm_future[69] 1.01 0.00 0.01 0.99 1.03 1937 1.00
## ppm_future[70] 1.02 0.00 0.01 1.00 1.03 1976 1.00
## ppm_future[71] 1.02 0.00 0.01 1.00 1.03 1907 1.00
## ppm_future[72] 1.02 0.00 0.01 1.00 1.04 1953 1.00
## ppm_future[73] 1.02 0.00 0.01 1.00 1.04 2000 1.00
## ppm_future[74] 1.02 0.00 0.01 1.01 1.04 1884 1.00
## ppm_future[75] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[76] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[77] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[78] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[79] 1.02 0.00 0.01 1.00 1.04 1841 1.00
## ppm_future[80] 1.02 0.00 0.01 1.00 1.04 1717 1.00
## ppm_future[81] 1.02 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[82] 1.02 0.00 0.01 1.00 1.03 1908 1.00
## ppm_future[83] 1.01 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[84] 1.01 0.00 0.01 0.99 1.03 1894 1.00
## ppm_future[85] 1.01 0.00 0.01 0.99 1.02 1996 1.00
## ppm_future[86] 1.00 0.00 0.01 0.99 1.02 1800 1.00
## ppm_future[87] 1.00 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[88] 1.00 0.00 0.01 0.98 1.01 1936 1.00
## ppm_future[89] 1.00 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[90] 0.99 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[91] 0.99 0.00 0.01 0.97 1.01 1932 1.00
## ppm_future[92] 0.99 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[93] 0.98 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[94] 0.98 0.00 0.01 0.96 1.00 2000 1.00
## ppm_future[95] 0.98 0.00 0.01 0.96 1.00 2000 1.00
## ppm_future[96] 0.98 0.00 0.01 0.96 0.99 2000 1.00
## ppm_future[97] 0.98 0.00 0.01 0.96 0.99 1982 1.00
## ppm_future[98] 0.98 0.00 0.01 0.96 0.99 2000 1.00
## ppm_future[99] 0.98 0.00 0.01 0.96 0.99 1978 1.00
## ppm_future[100] 0.98 0.00 0.01 0.96 0.99 1948 1.00
## ppm_future[101] 0.98 0.00 0.01 0.96 0.99 1863 1.00
## ppm_future[102] 0.98 0.00 0.01 0.96 0.99 1937 1.00
## ppm_future[103] 0.98 0.00 0.01 0.96 0.99 1892 1.00
## ppm_future[104] 0.98 0.00 0.01 0.96 1.00 2000 1.00
## ppm_future[105] 0.98 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[106] 0.98 0.00 0.01 0.97 1.00 1981 1.00
## ppm_future[107] 0.99 0.00 0.01 0.97 1.00 2000 1.00
## ppm_future[108] 0.99 0.00 0.01 0.97 1.01 2000 1.00
## ppm_future[109] 0.99 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[110] 1.00 0.00 0.01 0.98 1.01 2000 1.00
## ppm_future[111] 1.00 0.00 0.01 0.99 1.02 1927 1.00
## ppm_future[112] 1.01 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[113] 1.01 0.00 0.01 0.99 1.03 2000 1.00
## ppm_future[114] 1.01 0.00 0.01 1.00 1.03 1887 1.00
## ppm_future[115] 1.02 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[116] 1.02 0.00 0.01 1.01 1.04 1989 1.00
## ppm_future[117] 1.03 0.00 0.01 1.01 1.04 1985 1.00
## ppm_future[118] 1.03 0.00 0.01 1.01 1.05 2000 1.00
## ppm_future[119] 1.03 0.00 0.01 1.02 1.05 1977 1.00
## ppm_future[120] 1.04 0.00 0.01 1.02 1.05 1830 1.00
## ppm_future[121] 1.04 0.00 0.01 1.02 1.05 1700 1.00
## ppm_future[122] 1.04 0.00 0.01 1.02 1.06 1898 1.00
## ppm_future[123] 1.04 0.00 0.01 1.03 1.06 2000 1.00
## ppm_future[124] 1.04 0.00 0.01 1.03 1.06 2000 1.00
## ppm_future[125] 1.05 0.00 0.01 1.03 1.06 1965 1.00
## ppm_future[126] 1.05 0.00 0.01 1.03 1.06 1989 1.00
## ppm_future[127] 1.05 0.00 0.01 1.03 1.06 1904 1.00
## ppm_future[128] 1.05 0.00 0.01 1.03 1.06 1731 1.00
## ppm_future[129] 1.05 0.00 0.01 1.03 1.06 1863 1.00
## ppm_future[130] 1.05 0.00 0.01 1.03 1.06 1973 1.00
## ppm_future[131] 1.04 0.00 0.01 1.03 1.06 1989 1.00
## ppm_future[132] 1.04 0.00 0.01 1.03 1.06 1605 1.00
## ppm_future[133] 1.04 0.00 0.01 1.02 1.06 1765 1.00
## ppm_future[134] 1.04 0.00 0.01 1.02 1.05 2000 1.00
## ppm_future[135] 1.03 0.00 0.01 1.02 1.05 2000 1.00
## ppm_future[136] 1.03 0.00 0.01 1.02 1.05 2000 1.00
## ppm_future[137] 1.03 0.00 0.01 1.01 1.05 1995 1.00
## ppm_future[138] 1.03 0.00 0.01 1.01 1.04 1676 1.00
## ppm_future[139] 1.02 0.00 0.01 1.01 1.04 1923 1.00
## ppm_future[140] 1.02 0.00 0.01 1.00 1.04 1707 1.00
## ppm_future[141] 1.02 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[142] 1.01 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[143] 1.01 0.00 0.01 0.99 1.03 2000 1.00
## ppm_future[144] 1.01 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[145] 1.01 0.00 0.01 0.99 1.02 1928 1.00
## ppm_future[146] 1.00 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[147] 1.00 0.00 0.01 0.99 1.02 1954 1.00
## ppm_future[148] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[149] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[150] 1.00 0.00 0.01 0.98 1.02 1936 1.00
## ppm_future[151] 1.00 0.00 0.01 0.98 1.02 1936 1.00
## ppm_future[152] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[153] 1.00 0.00 0.01 0.98 1.02 2000 1.00
## ppm_future[154] 1.00 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[155] 1.00 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[156] 1.01 0.00 0.01 0.99 1.02 2000 1.00
## ppm_future[157] 1.01 0.00 0.01 0.99 1.02 1935 1.00
## ppm_future[158] 1.01 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[159] 1.01 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[160] 1.02 0.00 0.01 1.00 1.03 2000 1.00
## ppm_future[161] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[162] 1.03 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[163] 1.03 0.00 0.01 1.01 1.05 1885 1.00
## ppm_future[164] 1.03 0.00 0.01 1.02 1.05 2000 1.00
## ppm_future[165] 1.04 0.00 0.01 1.02 1.06 1728 1.00
## ppm_future[166] 1.04 0.00 0.01 1.03 1.06 2000 1.00
## ppm_future[167] 1.05 0.00 0.01 1.03 1.06 2000 1.00
## ppm_future[168] 1.05 0.00 0.01 1.03 1.07 2000 1.00
## ppm_future[169] 1.05 0.00 0.01 1.04 1.07 1999 1.00
## ppm_future[170] 1.06 0.00 0.01 1.04 1.07 2000 1.00
## ppm_future[171] 1.06 0.00 0.01 1.04 1.08 1923 1.00
## ppm_future[172] 1.06 0.00 0.01 1.05 1.08 1764 1.00
## ppm_future[173] 1.07 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[174] 1.07 0.00 0.01 1.05 1.08 1970 1.00
## ppm_future[175] 1.07 0.00 0.01 1.05 1.09 2000 1.00
## ppm_future[176] 1.07 0.00 0.01 1.05 1.09 1968 1.00
## ppm_future[177] 1.07 0.00 0.01 1.05 1.09 2000 1.00
## ppm_future[178] 1.07 0.00 0.01 1.05 1.09 1897 1.00
## ppm_future[179] 1.07 0.00 0.01 1.05 1.09 1882 1.00
## ppm_future[180] 1.07 0.00 0.01 1.05 1.09 2000 1.00
## ppm_future[181] 1.07 0.00 0.01 1.05 1.09 1893 1.00
## ppm_future[182] 1.07 0.00 0.01 1.05 1.08 1884 1.00
## ppm_future[183] 1.07 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[184] 1.06 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[185] 1.06 0.00 0.01 1.05 1.08 1770 1.00
## ppm_future[186] 1.06 0.00 0.01 1.04 1.07 1807 1.00
## ppm_future[187] 1.06 0.00 0.01 1.04 1.07 2000 1.00
## ppm_future[188] 1.05 0.00 0.01 1.04 1.07 1953 1.00
## ppm_future[189] 1.05 0.00 0.01 1.03 1.07 1961 1.00
## ppm_future[190] 1.05 0.00 0.01 1.03 1.06 1954 1.00
## ppm_future[191] 1.04 0.00 0.01 1.03 1.06 1931 1.00
## ppm_future[192] 1.04 0.00 0.01 1.02 1.06 1958 1.00
## ppm_future[193] 1.04 0.00 0.01 1.02 1.05 1810 1.00
## ppm_future[194] 1.03 0.00 0.01 1.02 1.05 1988 1.00
## ppm_future[195] 1.03 0.00 0.01 1.02 1.05 1869 1.00
## ppm_future[196] 1.03 0.00 0.01 1.01 1.05 2000 1.00
## ppm_future[197] 1.03 0.00 0.01 1.01 1.04 1981 1.00
## ppm_future[198] 1.03 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[199] 1.03 0.00 0.01 1.01 1.04 1814 1.00
## ppm_future[200] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[201] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[202] 1.02 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[203] 1.02 0.00 0.01 1.01 1.04 1988 1.00
## ppm_future[204] 1.03 0.00 0.01 1.01 1.04 2000 1.00
## ppm_future[205] 1.03 0.00 0.01 1.01 1.04 1918 1.00
## ppm_future[206] 1.03 0.00 0.01 1.01 1.05 2000 1.00
## ppm_future[207] 1.03 0.00 0.01 1.01 1.05 2000 1.00
## ppm_future[208] 1.03 0.00 0.01 1.02 1.05 2000 1.00
## ppm_future[209] 1.04 0.00 0.01 1.02 1.05 1996 1.00
## ppm_future[210] 1.04 0.00 0.01 1.02 1.06 1777 1.00
## ppm_future[211] 1.04 0.00 0.01 1.03 1.06 2000 1.00
## ppm_future[212] 1.05 0.00 0.01 1.03 1.06 1928 1.00
## ppm_future[213] 1.05 0.00 0.01 1.03 1.07 1744 1.00
## ppm_future[214] 1.05 0.00 0.01 1.04 1.07 1970 1.00
## ppm_future[215] 1.06 0.00 0.01 1.04 1.08 2000 1.00
## ppm_future[216] 1.06 0.00 0.01 1.05 1.08 1802 1.00
## ppm_future[217] 1.07 0.00 0.01 1.05 1.08 1635 1.00
## ppm_future[218] 1.07 0.00 0.01 1.05 1.09 2000 1.00
## ppm_future[219] 1.07 0.00 0.01 1.06 1.09 1581 1.00
## ppm_future[220] 1.08 0.00 0.01 1.06 1.09 1979 1.00
## ppm_future[221] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[222] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[223] 1.09 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[224] 1.09 0.00 0.01 1.07 1.11 2000 1.00
## ppm_future[225] 1.09 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[226] 1.09 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[227] 1.09 0.00 0.01 1.08 1.11 1996 1.00
## ppm_future[228] 1.10 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[229] 1.10 0.00 0.01 1.08 1.11 1731 1.00
## ppm_future[230] 1.10 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[231] 1.10 0.00 0.01 1.08 1.11 1980 1.00
## ppm_future[232] 1.09 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[233] 1.09 0.00 0.01 1.08 1.11 1893 1.00
## ppm_future[234] 1.09 0.00 0.01 1.07 1.11 1867 1.00
## ppm_future[235] 1.09 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[236] 1.09 0.00 0.01 1.07 1.10 1826 1.00
## ppm_future[237] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[238] 1.08 0.00 0.01 1.06 1.10 2000 1.00
## ppm_future[239] 1.08 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[240] 1.07 0.00 0.01 1.06 1.09 1825 1.00
## ppm_future[241] 1.07 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[242] 1.07 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[243] 1.07 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[244] 1.06 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[245] 1.06 0.00 0.01 1.04 1.08 2000 1.00
## ppm_future[246] 1.06 0.00 0.01 1.04 1.07 1864 1.00
## ppm_future[247] 1.05 0.00 0.01 1.04 1.07 1935 1.00
## ppm_future[248] 1.05 0.00 0.01 1.04 1.07 1913 1.00
## ppm_future[249] 1.05 0.00 0.01 1.04 1.07 1678 1.00
## ppm_future[250] 1.05 0.00 0.01 1.03 1.07 2000 1.00
## ppm_future[251] 1.05 0.00 0.01 1.03 1.07 2000 1.00
## ppm_future[252] 1.05 0.00 0.01 1.03 1.06 1928 1.00
## ppm_future[253] 1.05 0.00 0.01 1.03 1.07 1567 1.00
## ppm_future[254] 1.05 0.00 0.01 1.03 1.07 2000 1.00
## ppm_future[255] 1.05 0.00 0.01 1.03 1.07 2000 1.00
## ppm_future[256] 1.05 0.00 0.01 1.04 1.07 2000 1.00
## ppm_future[257] 1.05 0.00 0.01 1.04 1.07 1745 1.00
## ppm_future[258] 1.06 0.00 0.01 1.04 1.07 1895 1.00
## ppm_future[259] 1.06 0.00 0.01 1.04 1.07 1978 1.00
## ppm_future[260] 1.06 0.00 0.01 1.04 1.08 1884 1.00
## ppm_future[261] 1.06 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[262] 1.07 0.00 0.01 1.05 1.08 2000 1.00
## ppm_future[263] 1.07 0.00 0.01 1.06 1.09 1952 1.00
## ppm_future[264] 1.08 0.00 0.01 1.06 1.09 1913 1.00
## ppm_future[265] 1.08 0.00 0.01 1.06 1.10 1899 1.00
## ppm_future[266] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[267] 1.09 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[268] 1.09 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[269] 1.10 0.00 0.01 1.08 1.11 1974 1.00
## ppm_future[270] 1.10 0.00 0.01 1.08 1.12 1768 1.00
## ppm_future[271] 1.10 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[272] 1.11 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[273] 1.11 0.00 0.01 1.09 1.13 2000 1.00
## ppm_future[274] 1.11 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[275] 1.11 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[276] 1.12 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[277] 1.12 0.00 0.01 1.10 1.13 1949 1.00
## ppm_future[278] 1.12 0.00 0.01 1.10 1.14 2000 1.00
## ppm_future[279] 1.12 0.00 0.01 1.10 1.14 2000 1.00
## ppm_future[280] 1.12 0.00 0.01 1.10 1.14 1950 1.00
## ppm_future[281] 1.12 0.00 0.01 1.10 1.14 1983 1.00
## ppm_future[282] 1.12 0.00 0.01 1.10 1.14 1893 1.00
## ppm_future[283] 1.12 0.00 0.01 1.10 1.14 2000 1.00
## ppm_future[284] 1.12 0.00 0.01 1.10 1.13 1803 1.00
## ppm_future[285] 1.12 0.00 0.01 1.10 1.13 1917 1.00
## ppm_future[286] 1.11 0.00 0.01 1.10 1.13 1903 1.00
## ppm_future[287] 1.11 0.00 0.01 1.09 1.13 2000 1.00
## ppm_future[288] 1.11 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[289] 1.11 0.00 0.01 1.09 1.12 1967 1.00
## ppm_future[290] 1.10 0.00 0.01 1.09 1.12 1819 1.00
## ppm_future[291] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[292] 1.10 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[293] 1.09 0.00 0.01 1.08 1.11 2000 1.00
## ppm_future[294] 1.09 0.00 0.01 1.07 1.11 1700 1.00
## ppm_future[295] 1.09 0.00 0.01 1.07 1.10 1967 1.00
## ppm_future[296] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[297] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[298] 1.08 0.00 0.01 1.06 1.10 2000 1.00
## ppm_future[299] 1.08 0.00 0.01 1.06 1.09 1746 1.00
## ppm_future[300] 1.08 0.00 0.01 1.06 1.09 1954 1.00
## ppm_future[301] 1.08 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[302] 1.07 0.00 0.01 1.06 1.09 1707 1.00
## ppm_future[303] 1.07 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[304] 1.07 0.00 0.01 1.06 1.09 1896 1.00
## ppm_future[305] 1.07 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[306] 1.08 0.00 0.01 1.06 1.09 1673 1.00
## ppm_future[307] 1.08 0.00 0.01 1.06 1.09 2000 1.00
## ppm_future[308] 1.08 0.00 0.01 1.06 1.10 2000 1.00
## ppm_future[309] 1.08 0.00 0.01 1.06 1.10 2000 1.00
## ppm_future[310] 1.08 0.00 0.01 1.07 1.10 2000 1.00
## ppm_future[311] 1.09 0.00 0.01 1.07 1.10 1843 1.00
## ppm_future[312] 1.09 0.00 0.01 1.07 1.11 1815 1.00
## ppm_future[313] 1.09 0.00 0.01 1.08 1.11 1871 1.00
## ppm_future[314] 1.10 0.00 0.01 1.08 1.11 1624 1.00
## ppm_future[315] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[316] 1.10 0.00 0.01 1.09 1.12 1868 1.00
## ppm_future[317] 1.11 0.00 0.01 1.09 1.13 1930 1.00
## ppm_future[318] 1.11 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[319] 1.12 0.00 0.01 1.10 1.13 1908 1.00
## ppm_future[320] 1.12 0.00 0.01 1.10 1.14 2000 1.00
## ppm_future[321] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[322] 1.13 0.00 0.01 1.11 1.15 1963 1.00
## ppm_future[323] 1.13 0.00 0.01 1.12 1.15 1843 1.00
## ppm_future[324] 1.13 0.00 0.01 1.12 1.15 1914 1.00
## ppm_future[325] 1.14 0.00 0.01 1.12 1.15 1976 1.00
## ppm_future[326] 1.14 0.00 0.01 1.12 1.16 1870 1.00
## ppm_future[327] 1.14 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[328] 1.14 0.00 0.01 1.13 1.16 1912 1.00
## ppm_future[329] 1.14 0.00 0.01 1.13 1.16 1975 1.00
## ppm_future[330] 1.15 0.00 0.01 1.13 1.16 1912 1.00
## ppm_future[331] 1.15 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[332] 1.15 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[333] 1.14 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[334] 1.14 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[335] 1.14 0.00 0.01 1.13 1.16 1974 1.00
## ppm_future[336] 1.14 0.00 0.01 1.12 1.16 1945 1.00
## ppm_future[337] 1.14 0.00 0.01 1.12 1.16 2000 1.00
## ppm_future[338] 1.14 0.00 0.01 1.12 1.15 2000 1.00
## ppm_future[339] 1.13 0.00 0.01 1.12 1.15 1825 1.00
## ppm_future[340] 1.13 0.00 0.01 1.12 1.15 1871 1.00
## ppm_future[341] 1.13 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[342] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[343] 1.12 0.00 0.01 1.10 1.14 1883 1.00
## ppm_future[344] 1.12 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[345] 1.12 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[346] 1.11 0.00 0.01 1.10 1.13 1876 1.00
## ppm_future[347] 1.11 0.00 0.01 1.09 1.13 2000 1.00
## ppm_future[348] 1.11 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[349] 1.11 0.00 0.01 1.09 1.12 1703 1.00
## ppm_future[350] 1.10 0.00 0.01 1.09 1.12 1484 1.00
## ppm_future[351] 1.10 0.00 0.01 1.09 1.12 1859 1.00
## ppm_future[352] 1.10 0.00 0.01 1.08 1.12 1961 1.00
## ppm_future[353] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[354] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[355] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[356] 1.10 0.00 0.01 1.08 1.12 1813 1.00
## ppm_future[357] 1.10 0.00 0.01 1.08 1.12 2000 1.00
## ppm_future[358] 1.10 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[359] 1.10 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[360] 1.11 0.00 0.01 1.09 1.12 2000 1.00
## ppm_future[361] 1.11 0.00 0.01 1.09 1.13 1845 1.00
## ppm_future[362] 1.11 0.00 0.01 1.09 1.13 1980 1.00
## ppm_future[363] 1.11 0.00 0.01 1.10 1.13 2000 1.00
## ppm_future[364] 1.12 0.00 0.01 1.10 1.13 1767 1.00
## ppm_future[365] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[366] 1.13 0.00 0.01 1.11 1.14 1878 1.00
## ppm_future[367] 1.13 0.00 0.01 1.11 1.15 2000 1.00
## ppm_future[368] 1.13 0.00 0.01 1.12 1.15 1936 1.00
## ppm_future[369] 1.14 0.00 0.01 1.12 1.15 2000 1.00
## ppm_future[370] 1.14 0.00 0.01 1.13 1.16 1974 1.00
## ppm_future[371] 1.15 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[372] 1.15 0.00 0.01 1.13 1.17 1864 1.00
## ppm_future[373] 1.15 0.00 0.01 1.14 1.17 2000 1.00
## ppm_future[374] 1.16 0.00 0.01 1.14 1.17 1708 1.00
## ppm_future[375] 1.16 0.00 0.01 1.14 1.18 2000 1.00
## ppm_future[376] 1.16 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[377] 1.17 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[378] 1.17 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[379] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[380] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[381] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[382] 1.17 0.00 0.01 1.15 1.19 1811 1.00
## ppm_future[383] 1.17 0.00 0.01 1.16 1.19 2000 1.00
## ppm_future[384] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[385] 1.17 0.00 0.01 1.15 1.19 1957 1.00
## ppm_future[386] 1.17 0.00 0.01 1.15 1.18 1880 1.00
## ppm_future[387] 1.17 0.00 0.01 1.15 1.18 1972 1.00
## ppm_future[388] 1.16 0.00 0.01 1.15 1.18 1768 1.00
## ppm_future[389] 1.16 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[390] 1.16 0.00 0.01 1.14 1.18 1996 1.00
## ppm_future[391] 1.16 0.00 0.01 1.14 1.17 2000 1.00
## ppm_future[392] 1.15 0.00 0.01 1.14 1.17 1963 1.00
## ppm_future[393] 1.15 0.00 0.01 1.13 1.17 2000 1.00
## ppm_future[394] 1.15 0.00 0.01 1.13 1.16 1885 1.00
## ppm_future[395] 1.14 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[396] 1.14 0.00 0.01 1.12 1.16 1931 1.00
## ppm_future[397] 1.14 0.00 0.01 1.12 1.15 1912 1.00
## ppm_future[398] 1.14 0.00 0.01 1.12 1.15 1986 1.00
## ppm_future[399] 1.13 0.00 0.01 1.12 1.15 2000 1.00
## ppm_future[400] 1.13 0.00 0.01 1.11 1.15 2000 1.00
## ppm_future[401] 1.13 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[402] 1.13 0.00 0.01 1.11 1.14 1923 1.00
## ppm_future[403] 1.13 0.00 0.01 1.11 1.14 1792 1.00
## ppm_future[404] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[405] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[406] 1.12 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[407] 1.13 0.00 0.01 1.11 1.14 2000 1.00
## ppm_future[408] 1.13 0.00 0.01 1.11 1.14 1944 1.00
## ppm_future[409] 1.13 0.00 0.01 1.11 1.14 1986 1.00
## ppm_future[410] 1.13 0.00 0.01 1.11 1.15 2000 1.00
## ppm_future[411] 1.13 0.00 0.01 1.12 1.15 1852 1.00
## ppm_future[412] 1.13 0.00 0.01 1.12 1.15 1796 1.00
## ppm_future[413] 1.14 0.00 0.01 1.12 1.15 2000 1.00
## ppm_future[414] 1.14 0.00 0.01 1.12 1.16 1897 1.00
## ppm_future[415] 1.14 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[416] 1.15 0.00 0.01 1.13 1.16 2000 1.00
## ppm_future[417] 1.15 0.00 0.01 1.14 1.17 1929 1.00
## ppm_future[418] 1.16 0.00 0.01 1.14 1.17 1970 1.00
## ppm_future[419] 1.16 0.00 0.01 1.14 1.18 2000 1.00
## ppm_future[420] 1.16 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[421] 1.17 0.00 0.01 1.15 1.18 1861 1.00
## ppm_future[422] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[423] 1.18 0.00 0.01 1.16 1.19 1859 1.00
## ppm_future[424] 1.18 0.00 0.01 1.16 1.20 1922 1.00
## ppm_future[425] 1.18 0.00 0.01 1.17 1.20 1933 1.00
## ppm_future[426] 1.19 0.00 0.01 1.17 1.20 1984 1.00
## ppm_future[427] 1.19 0.00 0.01 1.17 1.21 1819 1.00
## ppm_future[428] 1.19 0.00 0.01 1.17 1.21 2000 1.00
## ppm_future[429] 1.19 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[430] 1.20 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[431] 1.20 0.00 0.01 1.18 1.21 1902 1.00
## ppm_future[432] 1.20 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[433] 1.20 0.00 0.01 1.18 1.21 1932 1.00
## ppm_future[434] 1.20 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[435] 1.20 0.00 0.01 1.18 1.21 1891 1.00
## ppm_future[436] 1.20 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[437] 1.19 0.00 0.01 1.18 1.21 1965 1.00
## ppm_future[438] 1.19 0.00 0.01 1.18 1.21 1979 1.00
## ppm_future[439] 1.19 0.00 0.01 1.17 1.21 2000 1.00
## ppm_future[440] 1.19 0.00 0.01 1.17 1.20 2000 1.00
## ppm_future[441] 1.18 0.00 0.01 1.17 1.20 1843 1.00
## ppm_future[442] 1.18 0.00 0.01 1.16 1.20 2000 1.00
## ppm_future[443] 1.18 0.00 0.01 1.16 1.20 1955 1.00
## ppm_future[444] 1.18 0.00 0.01 1.16 1.19 1819 1.00
## ppm_future[445] 1.17 0.00 0.01 1.16 1.19 2000 1.00
## ppm_future[446] 1.17 0.00 0.01 1.15 1.19 2000 1.00
## ppm_future[447] 1.17 0.00 0.01 1.15 1.18 1971 1.00
## ppm_future[448] 1.16 0.00 0.01 1.15 1.18 1990 1.00
## ppm_future[449] 1.16 0.00 0.01 1.15 1.18 1948 1.00
## ppm_future[450] 1.16 0.00 0.01 1.14 1.18 2000 1.00
## ppm_future[451] 1.16 0.00 0.01 1.14 1.17 1970 1.00
## ppm_future[452] 1.15 0.00 0.01 1.14 1.17 2000 1.00
## ppm_future[453] 1.15 0.00 0.01 1.14 1.17 1847 1.00
## ppm_future[454] 1.15 0.00 0.01 1.14 1.17 1906 1.00
## ppm_future[455] 1.15 0.00 0.01 1.13 1.17 1914 1.00
## ppm_future[456] 1.15 0.00 0.01 1.13 1.17 1822 1.00
## ppm_future[457] 1.15 0.00 0.01 1.13 1.17 2000 1.00
## ppm_future[458] 1.15 0.00 0.01 1.13 1.17 1802 1.00
## ppm_future[459] 1.15 0.00 0.01 1.14 1.17 2000 1.00
## ppm_future[460] 1.15 0.00 0.01 1.14 1.17 2000 1.00
## ppm_future[461] 1.16 0.00 0.01 1.14 1.17 1956 1.00
## ppm_future[462] 1.16 0.00 0.01 1.14 1.17 1936 1.00
## ppm_future[463] 1.16 0.00 0.01 1.14 1.18 1868 1.00
## ppm_future[464] 1.16 0.00 0.01 1.15 1.18 2000 1.00
## ppm_future[465] 1.17 0.00 0.01 1.15 1.18 1708 1.00
## ppm_future[466] 1.17 0.00 0.01 1.15 1.19 1932 1.00
## ppm_future[467] 1.17 0.00 0.01 1.16 1.19 1918 1.00
## ppm_future[468] 1.18 0.00 0.01 1.16 1.19 1797 1.00
## ppm_future[469] 1.18 0.00 0.01 1.16 1.20 1989 1.00
## ppm_future[470] 1.19 0.00 0.01 1.17 1.20 1754 1.00
## ppm_future[471] 1.19 0.00 0.01 1.17 1.21 1979 1.00
## ppm_future[472] 1.19 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[473] 1.20 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[474] 1.20 0.00 0.01 1.18 1.22 2000 1.00
## ppm_future[475] 1.21 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[476] 1.21 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[477] 1.21 0.00 0.01 1.20 1.23 2000 1.00
## ppm_future[478] 1.21 0.00 0.01 1.20 1.23 2000 1.00
## ppm_future[479] 1.22 0.00 0.01 1.20 1.23 2000 1.00
## ppm_future[480] 1.22 0.00 0.01 1.20 1.24 2000 1.00
## ppm_future[481] 1.22 0.00 0.01 1.20 1.24 1798 1.00
## ppm_future[482] 1.22 0.00 0.01 1.20 1.24 1871 1.00
## ppm_future[483] 1.22 0.00 0.01 1.21 1.24 2000 1.00
## ppm_future[484] 1.22 0.00 0.01 1.21 1.24 1868 1.00
## ppm_future[485] 1.22 0.00 0.01 1.21 1.24 1881 1.00
## ppm_future[486] 1.22 0.00 0.01 1.21 1.24 1803 1.00
## ppm_future[487] 1.22 0.00 0.01 1.20 1.24 2000 1.00
## ppm_future[488] 1.22 0.00 0.01 1.20 1.24 1831 1.00
## ppm_future[489] 1.22 0.00 0.01 1.20 1.23 1941 1.00
## ppm_future[490] 1.22 0.00 0.01 1.20 1.23 1977 1.00
## ppm_future[491] 1.21 0.00 0.01 1.20 1.23 1908 1.00
## ppm_future[492] 1.21 0.00 0.01 1.19 1.23 1936 1.00
## ppm_future[493] 1.21 0.00 0.01 1.19 1.23 2000 1.00
## ppm_future[494] 1.21 0.00 0.01 1.19 1.22 1819 1.00
## ppm_future[495] 1.20 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[496] 1.20 0.00 0.01 1.18 1.22 1703 1.00
## ppm_future[497] 1.20 0.00 0.01 1.18 1.21 1917 1.00
## ppm_future[498] 1.19 0.00 0.01 1.18 1.21 1984 1.00
## ppm_future[499] 1.19 0.00 0.01 1.17 1.21 1886 1.00
## ppm_future[500] 1.19 0.00 0.01 1.17 1.20 2000 1.00
## ppm_future[501] 1.18 0.00 0.01 1.17 1.20 1931 1.00
## ppm_future[502] 1.18 0.00 0.01 1.17 1.20 1847 1.00
## ppm_future[503] 1.18 0.00 0.01 1.16 1.20 2000 1.00
## ppm_future[504] 1.18 0.00 0.01 1.16 1.20 1865 1.00
## ppm_future[505] 1.18 0.00 0.01 1.16 1.19 1888 1.00
## ppm_future[506] 1.18 0.00 0.01 1.16 1.19 1720 1.00
## ppm_future[507] 1.18 0.00 0.01 1.16 1.19 1849 1.00
## ppm_future[508] 1.18 0.00 0.01 1.16 1.19 1828 1.00
## ppm_future[509] 1.18 0.00 0.01 1.16 1.19 2000 1.00
## ppm_future[510] 1.18 0.00 0.01 1.16 1.19 2000 1.00
## ppm_future[511] 1.18 0.00 0.01 1.16 1.20 2000 1.00
## ppm_future[512] 1.18 0.00 0.01 1.16 1.20 1624 1.00
## ppm_future[513] 1.18 0.00 0.01 1.17 1.20 1897 1.00
## ppm_future[514] 1.19 0.00 0.01 1.17 1.20 1770 1.00
## ppm_future[515] 1.19 0.00 0.01 1.17 1.21 2000 1.00
## ppm_future[516] 1.19 0.00 0.01 1.18 1.21 2000 1.00
## ppm_future[517] 1.20 0.00 0.01 1.18 1.21 1932 1.00
## ppm_future[518] 1.20 0.00 0.01 1.18 1.22 1740 1.00
## ppm_future[519] 1.20 0.00 0.01 1.19 1.22 1918 1.00
## ppm_future[520] 1.21 0.00 0.01 1.19 1.22 1956 1.00
## ppm_future[521] 1.21 0.00 0.01 1.20 1.23 1886 1.00
## ppm_future[522] 1.22 0.00 0.01 1.20 1.23 1724 1.00
## ppm_future[523] 1.22 0.00 0.01 1.20 1.24 2000 1.00
## ppm_future[524] 1.22 0.00 0.01 1.21 1.24 2000 1.00
## ppm_future[525] 1.23 0.00 0.01 1.21 1.24 1892 1.00
## ppm_future[526] 1.23 0.00 0.01 1.21 1.25 1636 1.00
## ppm_future[527] 1.23 0.00 0.01 1.22 1.25 2000 1.00
## ppm_future[528] 1.24 0.00 0.01 1.22 1.25 1765 1.00
## ppm_future[529] 1.24 0.00 0.01 1.22 1.26 2000 1.00
## ppm_future[530] 1.24 0.00 0.01 1.23 1.26 1433 1.00
## ppm_future[531] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[532] 1.25 0.00 0.01 1.23 1.26 1976 1.00
## ppm_future[533] 1.25 0.00 0.01 1.23 1.26 1881 1.00
## ppm_future[534] 1.25 0.00 0.01 1.23 1.27 1952 1.00
## ppm_future[535] 1.25 0.00 0.01 1.23 1.27 2000 1.00
## ppm_future[536] 1.25 0.00 0.01 1.23 1.27 2000 1.00
## ppm_future[537] 1.25 0.00 0.01 1.23 1.26 1954 1.00
## ppm_future[538] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[539] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[540] 1.24 0.00 0.01 1.23 1.26 1829 1.00
## ppm_future[541] 1.24 0.00 0.01 1.22 1.26 2000 1.00
## ppm_future[542] 1.24 0.00 0.01 1.22 1.26 1969 1.00
## ppm_future[543] 1.24 0.00 0.01 1.22 1.25 1978 1.00
## ppm_future[544] 1.23 0.00 0.01 1.22 1.25 1907 1.00
## ppm_future[545] 1.23 0.00 0.01 1.22 1.25 2000 1.00
## ppm_future[546] 1.23 0.00 0.01 1.21 1.25 2000 1.00
## ppm_future[547] 1.23 0.00 0.01 1.21 1.24 1880 1.00
## ppm_future[548] 1.22 0.00 0.01 1.21 1.24 1993 1.00
## ppm_future[549] 1.22 0.00 0.01 1.20 1.24 1924 1.00
## ppm_future[550] 1.22 0.00 0.01 1.20 1.23 1817 1.00
## ppm_future[551] 1.21 0.00 0.01 1.20 1.23 1949 1.00
## ppm_future[552] 1.21 0.00 0.01 1.19 1.23 2000 1.00
## ppm_future[553] 1.21 0.00 0.01 1.19 1.23 1960 1.00
## ppm_future[554] 1.21 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[555] 1.21 0.00 0.01 1.19 1.22 1958 1.00
## ppm_future[556] 1.20 0.00 0.01 1.19 1.22 1981 1.00
## ppm_future[557] 1.20 0.00 0.01 1.19 1.22 1948 1.00
## ppm_future[558] 1.20 0.00 0.01 1.19 1.22 1939 1.00
## ppm_future[559] 1.20 0.00 0.01 1.19 1.22 1796 1.00
## ppm_future[560] 1.20 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[561] 1.20 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[562] 1.21 0.00 0.01 1.19 1.22 2000 1.00
## ppm_future[563] 1.21 0.00 0.01 1.19 1.22 1935 1.00
## ppm_future[564] 1.21 0.00 0.01 1.19 1.23 2000 1.00
## ppm_future[565] 1.21 0.00 0.01 1.20 1.23 1972 1.00
## ppm_future[566] 1.22 0.00 0.01 1.20 1.23 2000 1.00
## ppm_future[567] 1.22 0.00 0.01 1.20 1.23 2000 1.00
## ppm_future[568] 1.22 0.00 0.01 1.21 1.24 1971 1.00
## ppm_future[569] 1.23 0.00 0.01 1.21 1.24 1989 1.00
## ppm_future[570] 1.23 0.00 0.01 1.21 1.25 2000 1.00
## ppm_future[571] 1.23 0.00 0.01 1.22 1.25 2000 1.00
## ppm_future[572] 1.24 0.00 0.01 1.22 1.25 1763 1.00
## ppm_future[573] 1.24 0.00 0.01 1.23 1.26 1932 1.00
## ppm_future[574] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[575] 1.25 0.00 0.01 1.23 1.27 1935 1.00
## ppm_future[576] 1.25 0.00 0.01 1.24 1.27 1724 1.00
## ppm_future[577] 1.26 0.00 0.01 1.24 1.27 1919 1.00
## ppm_future[578] 1.26 0.00 0.01 1.24 1.28 2000 1.00
## ppm_future[579] 1.26 0.00 0.01 1.25 1.28 1914 1.00
## ppm_future[580] 1.27 0.00 0.01 1.25 1.28 1835 1.00
## ppm_future[581] 1.27 0.00 0.01 1.25 1.29 2000 1.00
## ppm_future[582] 1.27 0.00 0.01 1.25 1.29 2000 1.00
## ppm_future[583] 1.27 0.00 0.01 1.26 1.29 1973 1.00
## ppm_future[584] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[585] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[586] 1.28 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[587] 1.28 0.00 0.01 1.26 1.29 1986 1.00
## ppm_future[588] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[589] 1.27 0.00 0.01 1.26 1.29 1973 1.00
## ppm_future[590] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[591] 1.27 0.00 0.01 1.25 1.29 1882 1.00
## ppm_future[592] 1.27 0.00 0.01 1.25 1.28 2000 1.00
## ppm_future[593] 1.27 0.00 0.01 1.25 1.28 1926 1.00
## ppm_future[594] 1.26 0.00 0.01 1.25 1.28 1937 1.00
## ppm_future[595] 1.26 0.00 0.01 1.24 1.28 1867 1.00
## ppm_future[596] 1.26 0.00 0.01 1.24 1.28 1885 1.00
## ppm_future[597] 1.26 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[598] 1.25 0.00 0.01 1.24 1.27 1714 1.00
## ppm_future[599] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[600] 1.25 0.00 0.01 1.23 1.26 1902 1.00
## ppm_future[601] 1.24 0.00 0.01 1.23 1.26 1805 1.00
## ppm_future[602] 1.24 0.00 0.01 1.22 1.26 1935 1.00
## ppm_future[603] 1.24 0.00 0.01 1.22 1.25 1776 1.00
## ppm_future[604] 1.24 0.00 0.01 1.22 1.25 1850 1.00
## ppm_future[605] 1.23 0.00 0.01 1.22 1.25 1721 1.00
## ppm_future[606] 1.23 0.00 0.01 1.22 1.25 1840 1.00
## ppm_future[607] 1.23 0.00 0.01 1.21 1.25 1936 1.00
## ppm_future[608] 1.23 0.00 0.01 1.21 1.25 1962 1.00
## ppm_future[609] 1.23 0.00 0.01 1.21 1.25 2000 1.00
## ppm_future[610] 1.23 0.00 0.01 1.21 1.25 1829 1.00
## ppm_future[611] 1.23 0.00 0.01 1.21 1.25 2000 1.00
## ppm_future[612] 1.23 0.00 0.01 1.21 1.25 1872 1.00
## ppm_future[613] 1.23 0.00 0.01 1.21 1.25 1613 1.00
## ppm_future[614] 1.23 0.00 0.01 1.22 1.25 1760 1.00
## ppm_future[615] 1.24 0.00 0.01 1.22 1.25 1538 1.00
## ppm_future[616] 1.24 0.00 0.01 1.22 1.25 1938 1.00
## ppm_future[617] 1.24 0.00 0.01 1.23 1.26 1782 1.00
## ppm_future[618] 1.25 0.00 0.01 1.23 1.26 2000 1.00
## ppm_future[619] 1.25 0.00 0.01 1.23 1.27 2000 1.00
## ppm_future[620] 1.25 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[621] 1.26 0.00 0.01 1.24 1.27 1945 1.00
## ppm_future[622] 1.26 0.00 0.01 1.24 1.28 1595 1.00
## ppm_future[623] 1.26 0.00 0.01 1.25 1.28 2000 1.00
## ppm_future[624] 1.27 0.00 0.01 1.25 1.28 2000 1.00
## ppm_future[625] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[626] 1.28 0.00 0.01 1.26 1.29 1773 1.00
## ppm_future[627] 1.28 0.00 0.01 1.26 1.30 1977 1.00
## ppm_future[628] 1.28 0.00 0.01 1.27 1.30 1947 1.00
## ppm_future[629] 1.29 0.00 0.01 1.27 1.30 1868 1.00
## ppm_future[630] 1.29 0.00 0.01 1.27 1.31 2000 1.00
## ppm_future[631] 1.29 0.00 0.01 1.28 1.31 1896 1.00
## ppm_future[632] 1.30 0.00 0.01 1.28 1.31 2000 1.00
## ppm_future[633] 1.30 0.00 0.01 1.28 1.32 2000 1.00
## ppm_future[634] 1.30 0.00 0.01 1.28 1.32 1456 1.00
## ppm_future[635] 1.30 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[636] 1.30 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[637] 1.30 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[638] 1.30 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[639] 1.30 0.00 0.01 1.28 1.32 2000 1.00
## ppm_future[640] 1.30 0.00 0.01 1.28 1.32 1922 1.00
## ppm_future[641] 1.30 0.00 0.01 1.28 1.32 1782 1.00
## ppm_future[642] 1.30 0.00 0.01 1.28 1.31 2000 1.00
## ppm_future[643] 1.30 0.00 0.01 1.28 1.31 1846 1.00
## ppm_future[644] 1.29 0.00 0.01 1.28 1.31 1543 1.00
## ppm_future[645] 1.29 0.00 0.01 1.27 1.31 1939 1.00
## ppm_future[646] 1.29 0.00 0.01 1.27 1.30 1827 1.00
## ppm_future[647] 1.28 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[648] 1.28 0.00 0.01 1.27 1.30 1965 1.00
## ppm_future[649] 1.28 0.00 0.01 1.26 1.29 1893 1.00
## ppm_future[650] 1.28 0.00 0.01 1.26 1.29 1943 1.00
## ppm_future[651] 1.27 0.00 0.01 1.26 1.29 1943 1.00
## ppm_future[652] 1.27 0.00 0.01 1.25 1.29 1695 1.00
## ppm_future[653] 1.27 0.00 0.01 1.25 1.28 2000 1.00
## ppm_future[654] 1.26 0.00 0.01 1.25 1.28 1930 1.00
## ppm_future[655] 1.26 0.00 0.01 1.25 1.28 1954 1.00
## ppm_future[656] 1.26 0.00 0.01 1.24 1.28 1893 1.00
## ppm_future[657] 1.26 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[658] 1.26 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[659] 1.26 0.00 0.01 1.24 1.27 1900 1.00
## ppm_future[660] 1.26 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[661] 1.26 0.00 0.01 1.24 1.27 1853 1.00
## ppm_future[662] 1.26 0.00 0.01 1.24 1.27 2000 1.00
## ppm_future[663] 1.26 0.00 0.01 1.24 1.27 1628 1.00
## ppm_future[664] 1.26 0.00 0.01 1.24 1.28 2000 1.00
## ppm_future[665] 1.26 0.00 0.01 1.24 1.28 1875 1.00
## ppm_future[666] 1.26 0.00 0.01 1.25 1.28 1823 1.00
## ppm_future[667] 1.27 0.00 0.01 1.25 1.28 1967 1.00
## ppm_future[668] 1.27 0.00 0.01 1.25 1.29 1948 1.00
## ppm_future[669] 1.27 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[670] 1.28 0.00 0.01 1.26 1.29 2000 1.00
## ppm_future[671] 1.28 0.00 0.01 1.26 1.30 2000 1.00
## ppm_future[672] 1.28 0.00 0.01 1.27 1.30 1814 1.00
## ppm_future[673] 1.29 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[674] 1.29 0.00 0.01 1.27 1.31 1887 1.00
## ppm_future[675] 1.30 0.00 0.01 1.28 1.31 2000 1.00
## ppm_future[676] 1.30 0.00 0.01 1.28 1.32 1878 1.00
## ppm_future[677] 1.30 0.00 0.01 1.29 1.32 1749 1.00
## ppm_future[678] 1.31 0.00 0.01 1.29 1.32 1829 1.00
## ppm_future[679] 1.31 0.00 0.01 1.30 1.33 1901 1.00
## ppm_future[680] 1.31 0.00 0.01 1.30 1.33 1991 1.00
## ppm_future[681] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[682] 1.32 0.00 0.01 1.30 1.34 2000 1.00
## ppm_future[683] 1.32 0.00 0.01 1.31 1.34 1894 1.00
## ppm_future[684] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[685] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[686] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[687] 1.33 0.00 0.01 1.31 1.35 1985 1.00
## ppm_future[688] 1.33 0.00 0.01 1.31 1.35 1982 1.00
## ppm_future[689] 1.33 0.00 0.01 1.31 1.35 1544 1.00
## ppm_future[690] 1.33 0.00 0.01 1.31 1.34 1946 1.00
## ppm_future[691] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[692] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[693] 1.32 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[694] 1.32 0.00 0.01 1.31 1.34 1895 1.00
## ppm_future[695] 1.32 0.00 0.01 1.30 1.34 1981 1.00
## ppm_future[696] 1.32 0.00 0.01 1.30 1.33 1826 1.00
## ppm_future[697] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[698] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[699] 1.31 0.00 0.01 1.29 1.33 2000 1.00
## ppm_future[700] 1.31 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[701] 1.30 0.00 0.01 1.29 1.32 2000 1.00
## ppm_future[702] 1.30 0.00 0.01 1.28 1.32 1783 1.00
## ppm_future[703] 1.30 0.00 0.01 1.28 1.31 2000 1.00
## ppm_future[704] 1.29 0.00 0.01 1.28 1.31 1705 1.00
## ppm_future[705] 1.29 0.00 0.01 1.28 1.31 1734 1.00
## ppm_future[706] 1.29 0.00 0.01 1.27 1.31 2000 1.00
## ppm_future[707] 1.29 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[708] 1.29 0.00 0.01 1.27 1.30 1963 1.00
## ppm_future[709] 1.28 0.00 0.01 1.27 1.30 1959 1.00
## ppm_future[710] 1.28 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[711] 1.28 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[712] 1.28 0.00 0.01 1.27 1.30 1973 1.00
## ppm_future[713] 1.28 0.00 0.01 1.27 1.30 1942 1.00
## ppm_future[714] 1.28 0.00 0.01 1.27 1.30 1829 1.00
## ppm_future[715] 1.29 0.00 0.01 1.27 1.30 2000 1.00
## ppm_future[716] 1.29 0.00 0.01 1.27 1.30 1884 1.00
## ppm_future[717] 1.29 0.00 0.01 1.27 1.31 1908 1.00
## ppm_future[718] 1.29 0.00 0.01 1.28 1.31 1873 1.00
## ppm_future[719] 1.30 0.00 0.01 1.28 1.31 2000 1.00
## ppm_future[720] 1.30 0.00 0.01 1.28 1.32 1764 1.00
## ppm_future[721] 1.30 0.00 0.01 1.29 1.32 1979 1.00
## ppm_future[722] 1.31 0.00 0.01 1.29 1.32 1796 1.00
## ppm_future[723] 1.31 0.00 0.01 1.29 1.33 2000 1.00
## ppm_future[724] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[725] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[726] 1.32 0.00 0.01 1.31 1.34 1933 1.00
## ppm_future[727] 1.33 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[728] 1.33 0.00 0.01 1.31 1.35 2000 1.00
## ppm_future[729] 1.33 0.00 0.01 1.32 1.35 2000 1.00
## ppm_future[730] 1.34 0.00 0.01 1.32 1.35 2000 1.00
## ppm_future[731] 1.34 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[732] 1.34 0.00 0.01 1.33 1.36 1960 1.00
## ppm_future[733] 1.35 0.00 0.01 1.33 1.36 1984 1.00
## ppm_future[734] 1.35 0.00 0.01 1.33 1.37 2000 1.00
## ppm_future[735] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[736] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[737] 1.36 0.00 0.01 1.34 1.37 1614 1.00
## ppm_future[738] 1.36 0.00 0.01 1.34 1.37 1915 1.00
## ppm_future[739] 1.36 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[740] 1.36 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[741] 1.36 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[742] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[743] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[744] 1.35 0.00 0.01 1.34 1.37 1966 1.00
## ppm_future[745] 1.35 0.00 0.01 1.33 1.37 2000 1.00
## ppm_future[746] 1.35 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[747] 1.34 0.00 0.01 1.33 1.36 1884 1.00
## ppm_future[748] 1.34 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[749] 1.34 0.00 0.01 1.32 1.36 1862 1.00
## ppm_future[750] 1.34 0.00 0.01 1.32 1.35 1584 1.00
## ppm_future[751] 1.33 0.00 0.01 1.32 1.35 2000 1.00
## ppm_future[752] 1.33 0.00 0.01 1.31 1.35 1847 1.00
## ppm_future[753] 1.33 0.00 0.01 1.31 1.34 1883 1.00
## ppm_future[754] 1.32 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[755] 1.32 0.00 0.01 1.30 1.34 2000 1.00
## ppm_future[756] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[757] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[758] 1.31 0.00 0.01 1.30 1.33 1893 1.00
## ppm_future[759] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[760] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[761] 1.31 0.00 0.01 1.29 1.33 1847 1.00
## ppm_future[762] 1.31 0.00 0.01 1.29 1.33 1817 1.00
## ppm_future[763] 1.31 0.00 0.01 1.29 1.33 1525 1.00
## ppm_future[764] 1.31 0.00 0.01 1.29 1.33 1959 1.00
## ppm_future[765] 1.31 0.00 0.01 1.30 1.33 1797 1.00
## ppm_future[766] 1.31 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[767] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[768] 1.32 0.00 0.01 1.30 1.33 2000 1.00
## ppm_future[769] 1.32 0.00 0.01 1.30 1.34 1756 1.00
## ppm_future[770] 1.32 0.00 0.01 1.31 1.34 2000 1.00
## ppm_future[771] 1.33 0.00 0.01 1.31 1.34 1973 1.00
## ppm_future[772] 1.33 0.00 0.01 1.31 1.35 1849 1.00
## ppm_future[773] 1.33 0.00 0.01 1.32 1.35 1979 1.00
## ppm_future[774] 1.34 0.00 0.01 1.32 1.35 1962 1.00
## ppm_future[775] 1.34 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[776] 1.35 0.00 0.01 1.33 1.36 1867 1.00
## ppm_future[777] 1.35 0.00 0.01 1.33 1.37 2000 1.00
## ppm_future[778] 1.35 0.00 0.01 1.34 1.37 1858 1.00
## ppm_future[779] 1.36 0.00 0.01 1.34 1.37 1997 1.00
## ppm_future[780] 1.36 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[781] 1.37 0.00 0.01 1.35 1.38 1971 1.00
## ppm_future[782] 1.37 0.00 0.01 1.35 1.38 1964 1.00
## ppm_future[783] 1.37 0.00 0.01 1.36 1.39 1911 1.00
## ppm_future[784] 1.38 0.00 0.01 1.36 1.39 1740 1.00
## ppm_future[785] 1.38 0.00 0.01 1.36 1.39 1981 1.00
## ppm_future[786] 1.38 0.00 0.01 1.36 1.40 1971 1.00
## ppm_future[787] 1.38 0.00 0.01 1.37 1.40 1889 1.00
## ppm_future[788] 1.38 0.00 0.01 1.37 1.40 2000 1.00
## ppm_future[789] 1.38 0.00 0.01 1.37 1.40 1841 1.00
## ppm_future[790] 1.38 0.00 0.01 1.37 1.40 1982 1.00
## ppm_future[791] 1.38 0.00 0.01 1.37 1.40 2000 1.00
## ppm_future[792] 1.38 0.00 0.01 1.37 1.40 1899 1.00
## ppm_future[793] 1.38 0.00 0.01 1.37 1.40 1962 1.00
## ppm_future[794] 1.38 0.00 0.01 1.36 1.40 1848 1.00
## ppm_future[795] 1.38 0.00 0.01 1.36 1.40 2000 1.00
## ppm_future[796] 1.38 0.00 0.01 1.36 1.39 2000 1.00
## ppm_future[797] 1.37 0.00 0.01 1.36 1.39 2000 1.00
## ppm_future[798] 1.37 0.00 0.01 1.36 1.39 1808 1.00
## ppm_future[799] 1.37 0.00 0.01 1.35 1.39 2000 1.00
## ppm_future[800] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[801] 1.36 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[802] 1.36 0.00 0.01 1.34 1.38 2000 1.00
## ppm_future[803] 1.36 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[804] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[805] 1.35 0.00 0.01 1.34 1.37 2000 1.00
## ppm_future[806] 1.35 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[807] 1.35 0.00 0.01 1.33 1.36 1920 1.00
## ppm_future[808] 1.34 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[809] 1.34 0.00 0.01 1.33 1.36 1945 1.00
## ppm_future[810] 1.34 0.00 0.01 1.32 1.36 2000 1.00
## ppm_future[811] 1.34 0.00 0.01 1.32 1.36 2000 1.00
## ppm_future[812] 1.34 0.00 0.01 1.32 1.36 1868 1.00
## ppm_future[813] 1.34 0.00 0.01 1.32 1.35 1951 1.00
## ppm_future[814] 1.34 0.00 0.01 1.32 1.36 2000 1.00
## ppm_future[815] 1.34 0.00 0.01 1.32 1.36 1888 1.00
## ppm_future[816] 1.34 0.00 0.01 1.32 1.36 1982 1.00
## ppm_future[817] 1.34 0.00 0.01 1.32 1.36 1900 1.00
## ppm_future[818] 1.34 0.00 0.01 1.33 1.36 1965 1.00
## ppm_future[819] 1.35 0.00 0.01 1.33 1.36 2000 1.00
## ppm_future[820] 1.35 0.00 0.01 1.33 1.36 1944 1.00
## ppm_future[821] 1.35 0.00 0.01 1.33 1.37 1933 1.00
## ppm_future[822] 1.35 0.00 0.01 1.34 1.37 1981 1.00
## ppm_future[823] 1.36 0.00 0.01 1.34 1.37 1982 1.00
## ppm_future[824] 1.36 0.00 0.01 1.34 1.38 1839 1.00
## ppm_future[825] 1.37 0.00 0.01 1.35 1.38 1818 1.00
## ppm_future[826] 1.37 0.00 0.01 1.35 1.39 2000 1.00
## ppm_future[827] 1.37 0.00 0.01 1.36 1.39 2000 1.00
## ppm_future[828] 1.38 0.00 0.01 1.36 1.39 2000 1.00
## ppm_future[829] 1.38 0.00 0.01 1.37 1.40 1867 1.00
## ppm_future[830] 1.39 0.00 0.01 1.37 1.40 1822 1.00
## ppm_future[831] 1.39 0.00 0.01 1.37 1.41 1741 1.00
## ppm_future[832] 1.39 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[833] 1.40 0.00 0.01 1.38 1.41 1983 1.00
## ppm_future[834] 1.40 0.00 0.01 1.38 1.42 1775 1.00
## ppm_future[835] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[836] 1.41 0.00 0.01 1.39 1.42 1677 1.00
## ppm_future[837] 1.41 0.00 0.01 1.39 1.42 1927 1.00
## ppm_future[838] 1.41 0.00 0.01 1.39 1.43 1780 1.00
## ppm_future[839] 1.41 0.00 0.01 1.39 1.43 1986 1.00
## ppm_future[840] 1.41 0.00 0.01 1.40 1.43 1975 1.00
## ppm_future[841] 1.41 0.00 0.01 1.40 1.43 1885 1.00
## ppm_future[842] 1.41 0.00 0.01 1.39 1.43 2000 1.00
## ppm_future[843] 1.41 0.00 0.01 1.39 1.43 1957 1.00
## ppm_future[844] 1.41 0.00 0.01 1.39 1.43 1835 1.00
## ppm_future[845] 1.41 0.00 0.01 1.39 1.42 1987 1.00
## ppm_future[846] 1.41 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[847] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[848] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[849] 1.40 0.00 0.01 1.38 1.42 1886 1.00
## ppm_future[850] 1.40 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[851] 1.39 0.00 0.01 1.38 1.41 1753 1.00
## ppm_future[852] 1.39 0.00 0.01 1.37 1.41 1651 1.00
## ppm_future[853] 1.39 0.00 0.01 1.37 1.40 1877 1.00
## ppm_future[854] 1.39 0.00 0.01 1.37 1.40 1836 1.00
## ppm_future[855] 1.38 0.00 0.01 1.37 1.40 1887 1.00
## ppm_future[856] 1.38 0.00 0.01 1.36 1.40 2000 1.00
## ppm_future[857] 1.38 0.00 0.01 1.36 1.39 1840 1.00
## ppm_future[858] 1.37 0.00 0.01 1.36 1.39 2000 1.00
## ppm_future[859] 1.37 0.00 0.01 1.36 1.39 1824 1.00
## ppm_future[860] 1.37 0.00 0.01 1.35 1.39 1830 1.00
## ppm_future[861] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[862] 1.37 0.00 0.01 1.35 1.38 1992 1.00
## ppm_future[863] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[864] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[865] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[866] 1.37 0.00 0.01 1.35 1.38 2000 1.00
## ppm_future[867] 1.37 0.00 0.01 1.35 1.38 1871 1.00
## ppm_future[868] 1.37 0.00 0.01 1.35 1.39 2000 1.00
## ppm_future[869] 1.37 0.00 0.01 1.35 1.39 1891 1.00
## ppm_future[870] 1.37 0.00 0.01 1.36 1.39 1931 1.00
## ppm_future[871] 1.38 0.00 0.01 1.36 1.39 1631 1.00
## ppm_future[872] 1.38 0.00 0.01 1.36 1.40 1866 1.00
## ppm_future[873] 1.38 0.00 0.01 1.37 1.40 2000 1.00
## ppm_future[874] 1.39 0.00 0.01 1.37 1.40 2000 1.00
## ppm_future[875] 1.39 0.00 0.01 1.37 1.41 2000 1.00
## ppm_future[876] 1.39 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[877] 1.40 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[878] 1.40 0.00 0.01 1.38 1.42 2000 1.00
## ppm_future[879] 1.41 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[880] 1.41 0.00 0.01 1.39 1.43 2000 1.00
## ppm_future[881] 1.41 0.00 0.01 1.40 1.43 1987 1.00
## ppm_future[882] 1.42 0.00 0.01 1.40 1.44 1744 1.00
## ppm_future[883] 1.42 0.00 0.01 1.40 1.44 1704 1.00
## ppm_future[884] 1.42 0.00 0.01 1.41 1.44 1832 1.00
## ppm_future[885] 1.43 0.00 0.01 1.41 1.44 1923 1.00
## ppm_future[886] 1.43 0.00 0.01 1.41 1.45 1989 1.00
## ppm_future[887] 1.43 0.00 0.01 1.42 1.45 1908 1.00
## ppm_future[888] 1.44 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[889] 1.44 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[890] 1.44 0.00 0.01 1.42 1.46 1963 1.00
## ppm_future[891] 1.44 0.00 0.01 1.42 1.46 1834 1.00
## ppm_future[892] 1.44 0.00 0.01 1.42 1.46 1656 1.00
## ppm_future[893] 1.44 0.00 0.01 1.42 1.46 1878 1.00
## ppm_future[894] 1.44 0.00 0.01 1.42 1.46 1805 1.00
## ppm_future[895] 1.44 0.00 0.01 1.42 1.45 1811 1.00
## ppm_future[896] 1.44 0.00 0.01 1.42 1.45 1872 1.00
## ppm_future[897] 1.43 0.00 0.01 1.42 1.45 1829 1.00
## ppm_future[898] 1.43 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[899] 1.43 0.00 0.01 1.41 1.45 1959 1.00
## ppm_future[900] 1.43 0.00 0.01 1.41 1.44 1996 1.00
## ppm_future[901] 1.43 0.00 0.01 1.41 1.44 1819 1.00
## ppm_future[902] 1.42 0.00 0.01 1.41 1.44 2000 1.00
## ppm_future[903] 1.42 0.00 0.01 1.40 1.44 1921 1.00
## ppm_future[904] 1.42 0.00 0.01 1.40 1.43 1555 1.00
## ppm_future[905] 1.41 0.00 0.01 1.40 1.43 1836 1.00
## ppm_future[906] 1.41 0.00 0.01 1.39 1.43 1805 1.00
## ppm_future[907] 1.41 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[908] 1.41 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[909] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[910] 1.40 0.00 0.01 1.38 1.42 2000 1.00
## ppm_future[911] 1.40 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[912] 1.40 0.00 0.01 1.38 1.41 1669 1.00
## ppm_future[913] 1.40 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[914] 1.40 0.00 0.01 1.38 1.41 1872 1.00
## ppm_future[915] 1.39 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[916] 1.39 0.00 0.01 1.38 1.41 1906 1.00
## ppm_future[917] 1.39 0.00 0.01 1.38 1.41 1966 1.00
## ppm_future[918] 1.40 0.00 0.01 1.38 1.41 2000 1.00
## ppm_future[919] 1.40 0.00 0.01 1.38 1.41 1865 1.00
## ppm_future[920] 1.40 0.00 0.01 1.38 1.41 1950 1.00
## ppm_future[921] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[922] 1.40 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[923] 1.41 0.00 0.01 1.39 1.42 2000 1.00
## ppm_future[924] 1.41 0.00 0.01 1.39 1.43 1749 1.00
## ppm_future[925] 1.41 0.00 0.01 1.40 1.43 2000 1.00
## ppm_future[926] 1.42 0.00 0.01 1.40 1.43 2000 1.00
## ppm_future[927] 1.42 0.00 0.01 1.41 1.44 2000 1.00
## ppm_future[928] 1.43 0.00 0.01 1.41 1.44 1886 1.00
## ppm_future[929] 1.43 0.00 0.01 1.41 1.45 1952 1.00
## ppm_future[930] 1.43 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[931] 1.44 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[932] 1.44 0.00 0.01 1.43 1.46 2000 1.00
## ppm_future[933] 1.45 0.00 0.01 1.43 1.46 1721 1.00
## ppm_future[934] 1.45 0.00 0.01 1.43 1.47 1945 1.00
## ppm_future[935] 1.45 0.00 0.01 1.44 1.47 2000 1.00
## ppm_future[936] 1.46 0.00 0.01 1.44 1.47 1877 1.00
## ppm_future[937] 1.46 0.00 0.01 1.44 1.48 1922 1.00
## ppm_future[938] 1.46 0.00 0.01 1.45 1.48 1885 1.00
## ppm_future[939] 1.46 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[940] 1.47 0.00 0.01 1.45 1.48 1886 1.00
## ppm_future[941] 1.47 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[942] 1.47 0.00 0.01 1.45 1.48 1867 1.00
## ppm_future[943] 1.47 0.00 0.01 1.45 1.48 1926 1.00
## ppm_future[944] 1.47 0.00 0.01 1.45 1.48 1935 1.00
## ppm_future[945] 1.47 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[946] 1.47 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[947] 1.47 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[948] 1.46 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[949] 1.46 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[950] 1.46 0.00 0.01 1.44 1.48 1902 1.00
## ppm_future[951] 1.46 0.00 0.01 1.44 1.47 2000 1.00
## ppm_future[952] 1.45 0.00 0.01 1.44 1.47 1830 1.00
## ppm_future[953] 1.45 0.00 0.01 1.43 1.47 2000 1.00
## ppm_future[954] 1.45 0.00 0.01 1.43 1.46 2000 1.00
## ppm_future[955] 1.45 0.00 0.01 1.43 1.46 2000 1.00
## ppm_future[956] 1.44 0.00 0.01 1.43 1.46 1889 1.00
## ppm_future[957] 1.44 0.00 0.01 1.42 1.46 1579 1.00
## ppm_future[958] 1.44 0.00 0.01 1.42 1.45 1639 1.00
## ppm_future[959] 1.43 0.00 0.01 1.42 1.45 1967 1.00
## ppm_future[960] 1.43 0.00 0.01 1.41 1.45 1563 1.00
## ppm_future[961] 1.43 0.00 0.01 1.41 1.45 2000 1.00
## ppm_future[962] 1.43 0.00 0.01 1.41 1.44 1929 1.00
## ppm_future[963] 1.43 0.00 0.01 1.41 1.44 1940 1.00
## ppm_future[964] 1.42 0.00 0.01 1.41 1.44 1966 1.00
## ppm_future[965] 1.42 0.00 0.01 1.41 1.44 1898 1.00
## ppm_future[966] 1.42 0.00 0.01 1.41 1.44 2000 1.00
## ppm_future[967] 1.42 0.00 0.01 1.41 1.44 2000 1.00
## ppm_future[968] 1.42 0.00 0.01 1.41 1.44 2000 1.00
## ppm_future[969] 1.42 0.00 0.01 1.41 1.44 1738 1.00
## ppm_future[970] 1.43 0.00 0.01 1.41 1.44 1949 1.00
## ppm_future[971] 1.43 0.00 0.01 1.41 1.44 1914 1.00
## ppm_future[972] 1.43 0.00 0.01 1.41 1.45 1790 1.00
## ppm_future[973] 1.43 0.00 0.01 1.42 1.45 2000 1.00
## ppm_future[974] 1.44 0.00 0.01 1.42 1.45 1734 1.00
## ppm_future[975] 1.44 0.00 0.01 1.42 1.45 1910 1.00
## ppm_future[976] 1.44 0.00 0.01 1.43 1.46 2000 1.00
## ppm_future[977] 1.45 0.00 0.01 1.43 1.46 2000 1.00
## ppm_future[978] 1.45 0.00 0.01 1.43 1.47 1867 1.00
## ppm_future[979] 1.45 0.00 0.01 1.44 1.47 1986 1.00
## ppm_future[980] 1.46 0.00 0.01 1.44 1.47 1764 1.00
## ppm_future[981] 1.46 0.00 0.01 1.45 1.48 2000 1.00
## ppm_future[982] 1.47 0.00 0.01 1.45 1.48 1795 1.00
## ppm_future[983] 1.47 0.00 0.01 1.45 1.49 2000 1.00
## ppm_future[984] 1.47 0.00 0.01 1.46 1.49 2000 1.00
## ppm_future[985] 1.48 0.00 0.01 1.46 1.49 2000 1.00
## ppm_future[986] 1.48 0.00 0.01 1.47 1.50 1841 1.00
## ppm_future[987] 1.48 0.00 0.01 1.47 1.50 1881 1.00
## ppm_future[988] 1.49 0.00 0.01 1.47 1.50 1705 1.00
## ppm_future[989] 1.49 0.00 0.01 1.47 1.51 1887 1.00
## ppm_future[990] 1.49 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[991] 1.49 0.00 0.01 1.48 1.51 1804 1.00
## ppm_future[992] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[993] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[994] 1.50 0.00 0.01 1.48 1.51 1785 1.00
## ppm_future[995] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[996] 1.50 0.00 0.01 1.48 1.51 1569 1.00
## ppm_future[997] 1.50 0.00 0.01 1.48 1.51 1898 1.00
## ppm_future[998] 1.49 0.00 0.01 1.48 1.51 1965 1.00
## ppm_future[999] 1.49 0.00 0.01 1.48 1.51 1904 1.00
## ppm_future[1000] 1.49 0.00 0.01 1.47 1.51 1746 1.00
## ppm_future[1001] 1.49 0.00 0.01 1.47 1.50 2000 1.00
## ppm_future[1002] 1.49 0.00 0.01 1.47 1.50 2000 1.00
## ppm_future[1003] 1.48 0.00 0.01 1.47 1.50 2000 1.00
## ppm_future[1004] 1.48 0.00 0.01 1.46 1.50 1883 1.00
## ppm_future[1005] 1.48 0.00 0.01 1.46 1.49 1751 1.00
## ppm_future[1006] 1.47 0.00 0.01 1.46 1.49 1934 1.00
## ppm_future[1007] 1.47 0.00 0.01 1.45 1.49 2000 1.00
## ppm_future[1008] 1.47 0.00 0.01 1.45 1.48 1525 1.00
## ppm_future[1009] 1.46 0.00 0.01 1.45 1.48 1816 1.00
## ppm_future[1010] 1.46 0.00 0.01 1.45 1.48 1973 1.00
## ppm_future[1011] 1.46 0.00 0.01 1.44 1.48 1822 1.00
## ppm_future[1012] 1.46 0.00 0.01 1.44 1.47 1987 1.00
## ppm_future[1013] 1.46 0.00 0.01 1.44 1.47 1955 1.00
## ppm_future[1014] 1.45 0.00 0.01 1.44 1.47 2000 1.00
## ppm_future[1015] 1.45 0.00 0.01 1.44 1.47 1837 1.00
## ppm_future[1016] 1.45 0.00 0.01 1.43 1.47 2000 1.00
## ppm_future[1017] 1.45 0.00 0.01 1.43 1.47 1987 1.00
## ppm_future[1018] 1.45 0.00 0.01 1.43 1.47 1889 1.00
## ppm_future[1019] 1.45 0.00 0.01 1.44 1.47 1949 1.00
## ppm_future[1020] 1.45 0.00 0.01 1.44 1.47 1879 1.00
## ppm_future[1021] 1.45 0.00 0.01 1.44 1.47 2000 1.00
## ppm_future[1022] 1.46 0.00 0.01 1.44 1.47 2000 1.00
## ppm_future[1023] 1.46 0.00 0.01 1.44 1.47 1834 1.00
## ppm_future[1024] 1.46 0.00 0.01 1.44 1.48 1986 1.00
## ppm_future[1025] 1.46 0.00 0.01 1.45 1.48 1839 1.00
## ppm_future[1026] 1.47 0.00 0.01 1.45 1.48 1632 1.00
## ppm_future[1027] 1.47 0.00 0.01 1.45 1.49 2000 1.00
## ppm_future[1028] 1.47 0.00 0.01 1.46 1.49 1892 1.00
## ppm_future[1029] 1.48 0.00 0.01 1.46 1.49 2000 1.00
## ppm_future[1030] 1.48 0.00 0.01 1.47 1.50 1979 1.00
## ppm_future[1031] 1.49 0.00 0.01 1.47 1.50 1874 1.00
## ppm_future[1032] 1.49 0.00 0.01 1.47 1.51 1428 1.00
## ppm_future[1033] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[1034] 1.50 0.00 0.01 1.48 1.52 1984 1.00
## ppm_future[1035] 1.50 0.00 0.01 1.49 1.52 2000 1.00
## ppm_future[1036] 1.51 0.00 0.01 1.49 1.52 2000 1.00
## ppm_future[1037] 1.51 0.00 0.01 1.49 1.53 1956 1.00
## ppm_future[1038] 1.51 0.00 0.01 1.50 1.53 2000 1.00
## ppm_future[1039] 1.52 0.00 0.01 1.50 1.53 1810 1.00
## ppm_future[1040] 1.52 0.00 0.01 1.50 1.54 1913 1.00
## ppm_future[1041] 1.52 0.00 0.01 1.50 1.54 1777 1.00
## ppm_future[1042] 1.52 0.00 0.01 1.51 1.54 1804 1.00
## ppm_future[1043] 1.52 0.00 0.01 1.51 1.54 1950 1.00
## ppm_future[1044] 1.53 0.00 0.01 1.51 1.54 1950 1.00
## ppm_future[1045] 1.53 0.00 0.01 1.51 1.54 1616 1.00
## ppm_future[1046] 1.53 0.00 0.01 1.51 1.54 1831 1.00
## ppm_future[1047] 1.53 0.00 0.01 1.51 1.54 2000 1.00
## ppm_future[1048] 1.52 0.00 0.01 1.51 1.54 1967 1.00
## ppm_future[1049] 1.52 0.00 0.01 1.51 1.54 1840 1.00
## ppm_future[1050] 1.52 0.00 0.01 1.50 1.54 1996 1.00
## ppm_future[1051] 1.52 0.00 0.01 1.50 1.54 1935 1.00
## ppm_future[1052] 1.52 0.00 0.01 1.50 1.53 1865 1.00
## ppm_future[1053] 1.51 0.00 0.01 1.50 1.53 1891 1.00
## ppm_future[1054] 1.51 0.00 0.01 1.50 1.53 2000 1.00
## ppm_future[1055] 1.51 0.00 0.01 1.49 1.53 2000 1.00
## ppm_future[1056] 1.51 0.00 0.01 1.49 1.52 2000 1.00
## ppm_future[1057] 1.50 0.00 0.01 1.49 1.52 1765 1.00
## ppm_future[1058] 1.50 0.00 0.01 1.48 1.52 2000 1.00
## ppm_future[1059] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[1060] 1.49 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[1061] 1.49 0.00 0.01 1.47 1.51 1786 1.00
## ppm_future[1062] 1.49 0.00 0.01 1.47 1.51 1891 1.00
## ppm_future[1063] 1.49 0.00 0.01 1.47 1.50 1746 1.00
## ppm_future[1064] 1.48 0.00 0.01 1.47 1.50 1851 1.00
## ppm_future[1065] 1.48 0.00 0.01 1.47 1.50 1846 1.00
## ppm_future[1066] 1.48 0.00 0.01 1.47 1.50 1875 1.00
## ppm_future[1067] 1.48 0.00 0.01 1.46 1.50 1929 1.00
## ppm_future[1068] 1.48 0.00 0.01 1.46 1.50 1904 1.00
## ppm_future[1069] 1.48 0.00 0.01 1.46 1.50 1739 1.00
## ppm_future[1070] 1.48 0.00 0.01 1.46 1.50 2000 1.00
## ppm_future[1071] 1.48 0.00 0.01 1.47 1.50 1751 1.00
## ppm_future[1072] 1.48 0.00 0.01 1.47 1.50 1849 1.00
## ppm_future[1073] 1.49 0.00 0.01 1.47 1.50 1884 1.00
## ppm_future[1074] 1.49 0.00 0.01 1.47 1.50 2000 1.00
## ppm_future[1075] 1.49 0.00 0.01 1.47 1.51 2000 1.00
## ppm_future[1076] 1.49 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[1077] 1.50 0.00 0.01 1.48 1.51 2000 1.00
## ppm_future[1078] 1.50 0.00 0.01 1.48 1.52 1868 1.00
## ppm_future[1079] 1.50 0.00 0.01 1.49 1.52 1801 1.00
## ppm_future[1080] 1.51 0.00 0.01 1.49 1.52 1778 1.00
## ppm_future[1081] 1.51 0.00 0.01 1.49 1.53 1930 1.00
## ppm_future[1082] 1.52 0.00 0.01 1.50 1.53 2000 1.00
## ppm_future[1083] 1.52 0.00 0.01 1.50 1.54 1944 1.00
## ppm_future[1084] 1.52 0.00 0.01 1.51 1.54 1471 1.00
## ppm_future[1085] 1.53 0.00 0.01 1.51 1.55 1941 1.00
## ppm_future[1086] 1.53 0.00 0.01 1.52 1.55 2000 1.00
## ppm_future[1087] 1.54 0.00 0.01 1.52 1.55 1860 1.00
## ppm_future[1088] 1.54 0.00 0.01 1.52 1.56 1894 1.00
## ppm_future[1089] 1.54 0.00 0.01 1.53 1.56 1910 1.00
## ppm_future[1090] 1.55 0.00 0.01 1.53 1.56 1814 1.00
## ppm_future[1091] 1.55 0.00 0.01 1.53 1.56 1954 1.00
## ppm_future[1092] 1.55 0.00 0.01 1.53 1.57 2000 1.00
## ppm_future[1093] 1.55 0.00 0.01 1.54 1.57 2000 1.00
## ppm_future[1094] 1.55 0.00 0.01 1.54 1.57 1915 1.00
## ppm_future[1095] 1.55 0.00 0.01 1.54 1.57 2000 1.00
## ppm_future[1096] 1.55 0.00 0.01 1.54 1.57 1894 1.00
## ppm_future[1097] 1.55 0.00 0.01 1.54 1.57 2000 1.00
## ppm_future[1098] 1.55 0.00 0.01 1.54 1.57 1937 1.00
## ppm_future[1099] 1.55 0.00 0.01 1.54 1.57 1995 1.00
## ppm_future[1100] 1.55 0.00 0.01 1.54 1.57 1881 1.00
## ppm_future[1101] 1.55 0.00 0.01 1.53 1.57 2000 1.00
## ppm_future[1102] 1.55 0.00 0.01 1.53 1.56 1841 1.00
## ppm_future[1103] 1.55 0.00 0.01 1.53 1.56 2000 1.00
## ppm_future[1104] 1.54 0.00 0.01 1.53 1.56 1662 1.00
## ppm_future[1105] 1.54 0.00 0.01 1.52 1.56 1923 1.00
## ppm_future[1106] 1.54 0.00 0.01 1.52 1.55 1747 1.00
## ppm_future[1107] 1.53 0.00 0.01 1.52 1.55 2000 1.00
## ppm_future[1108] 1.53 0.00 0.01 1.51 1.55 2000 1.00
## ppm_future[1109] 1.53 0.00 0.01 1.51 1.54 1943 1.00
## ppm_future[1110] 1.53 0.00 0.01 1.51 1.54 2000 1.00
## ppm_future[1111] 1.52 0.00 0.01 1.51 1.54 2000 1.00
## ppm_future[1112] 1.52 0.00 0.01 1.50 1.54 1799 1.00
## ppm_future[1113] 1.52 0.00 0.01 1.50 1.53 1768 1.00
## ppm_future[1114] 1.52 0.00 0.01 1.50 1.53 1905 1.00
## ppm_future[1115] 1.51 0.00 0.01 1.50 1.53 1704 1.00
## ppm_future[1116] 1.51 0.00 0.01 1.49 1.53 1895 1.00
## ppm_future[1117] 1.51 0.00 0.01 1.49 1.53 2000 1.00
## ppm_future[1118] 1.51 0.00 0.01 1.49 1.53 2000 1.00
## ppm_future[1119] 1.51 0.00 0.01 1.49 1.53 2000 1.00
## ppm_future[1120] 1.51 0.00 0.01 1.49 1.53 2000 1.00
## ppm_future[1121] 1.51 0.00 0.01 1.49 1.53 1778 1.00
## ppm_future[1122] 1.51 0.00 0.01 1.49 1.53 1928 1.00
## ppm_future[1123] 1.51 0.00 0.01 1.50 1.53 1711 1.00
## ppm_future[1124] 1.51 0.00 0.01 1.50 1.53 2000 1.00
## ppm_future[1125] 1.52 0.00 0.01 1.50 1.53 1885 1.00
## ppm_future[1126] 1.52 0.00 0.01 1.50 1.54 1960 1.00
## ppm_future[1127] 1.52 0.00 0.01 1.50 1.54 1966 1.00
## ppm_future[1128] 1.53 0.00 0.01 1.51 1.54 1773 1.00
## ppm_future[1129] 1.53 0.00 0.01 1.51 1.55 1912 1.00
## ppm_future[1130] 1.53 0.00 0.01 1.51 1.55 1934 1.00
## ppm_future[1131] 1.54 0.00 0.01 1.52 1.55 2000 1.00
## ppm_future[1132] 1.54 0.00 0.01 1.52 1.56 2000 1.00
## ppm_future[1133] 1.55 0.00 0.01 1.53 1.56 1878 1.00
## ppm_future[1134] 1.55 0.00 0.01 1.53 1.57 1866 1.00
## ppm_future[1135] 1.55 0.00 0.01 1.54 1.57 1827 1.00
## ppm_future[1136] 1.56 0.00 0.01 1.54 1.57 1771 1.00
## ppm_future[1137] 1.56 0.00 0.01 1.54 1.58 2000 1.00
## ppm_future[1138] 1.57 0.00 0.01 1.55 1.58 1937 1.00
## ppm_future[1139] 1.57 0.00 0.01 1.55 1.59 1860 1.00
## ppm_future[1140] 1.57 0.00 0.01 1.55 1.59 1940 1.00
## ppm_future[1141] 1.57 0.00 0.01 1.56 1.59 2000 1.00
## ppm_future[1142] 1.58 0.00 0.01 1.56 1.59 2000 1.00
## ppm_future[1143] 1.58 0.00 0.01 1.56 1.60 1840 1.00
## ppm_future[1144] 1.58 0.00 0.01 1.56 1.60 1914 1.00
## ppm_future[1145] 1.58 0.00 0.01 1.57 1.60 1894 1.00
## ppm_future[1146] 1.58 0.00 0.01 1.57 1.60 2000 1.00
## ppm_future[1147] 1.58 0.00 0.01 1.57 1.60 1964 1.00
## ppm_future[1148] 1.58 0.00 0.01 1.57 1.60 1882 1.00
## ppm_future[1149] 1.58 0.00 0.01 1.57 1.60 1934 1.00
## ppm_future[1150] 1.58 0.00 0.01 1.57 1.60 2000 1.00
## ppm_future[1151] 1.58 0.00 0.01 1.56 1.60 2000 1.00
## ppm_future[1152] 1.58 0.00 0.01 1.56 1.60 2000 1.00
## ppm_future[1153] 1.58 0.00 0.01 1.56 1.59 2000 1.00
## ppm_future[1154] 1.57 0.00 0.01 1.56 1.59 1951 1.00
## ppm_future[1155] 1.57 0.00 0.01 1.56 1.59 2000 1.00
## ppm_future[1156] 1.57 0.00 0.01 1.55 1.59 2000 1.00
## ppm_future[1157] 1.57 0.00 0.01 1.55 1.58 1801 1.00
## ppm_future[1158] 1.56 0.00 0.01 1.55 1.58 1897 1.00
## ppm_future[1159] 1.56 0.00 0.01 1.54 1.58 1885 1.00
## ppm_future[1160] 1.56 0.00 0.01 1.54 1.58 2000 1.00
## ppm_future[1161] 1.55 0.00 0.01 1.54 1.57 1730 1.00
## ppm_future[1162] 1.55 0.00 0.01 1.54 1.57 1909 1.00
## ppm_future[1163] 1.55 0.00 0.01 1.53 1.57 2000 1.00
## ppm_future[1164] 1.55 0.00 0.01 1.53 1.56 1841 1.00
## ppm_future[1165] 1.54 0.00 0.01 1.53 1.56 2000 1.00
## ppm_future[1166] 1.54 0.00 0.01 1.53 1.56 1758 1.00
## ppm_future[1167] 1.54 0.00 0.01 1.53 1.56 2000 1.00
## ppm_future[1168] 1.54 0.00 0.01 1.52 1.56 1730 1.00
## ppm_future[1169] 1.54 0.00 0.01 1.52 1.56 1558 1.01
## ppm_future[1170] 1.54 0.00 0.01 1.52 1.56 2000 1.00
## ppm_future[1171] 1.54 0.00 0.01 1.52 1.56 1961 1.00
## ppm_future[1172] 1.54 0.00 0.01 1.52 1.56 1973 1.00
## ppm_future[1173] 1.54 0.00 0.01 1.52 1.56 2000 1.00
## ppm_future[1174] 1.54 0.00 0.01 1.53 1.56 1916 1.00
## ppm_future[1175] 1.54 0.00 0.01 1.53 1.56 2000 1.00
## ppm_future[1176] 1.55 0.00 0.01 1.53 1.56 1959 1.00
## ppm_future[1177] 1.55 0.00 0.01 1.53 1.57 1828 1.00
## ppm_future[1178] 1.55 0.00 0.01 1.53 1.57 1991 1.00
## ppm_future[1179] 1.55 0.00 0.01 1.54 1.57 2000 1.00
## ppm_future[1180] 1.56 0.00 0.01 1.54 1.57 2000 1.00
## ppm_future[1181] 1.56 0.00 0.01 1.55 1.58 2000 1.00
## ppm_future[1182] 1.57 0.00 0.01 1.55 1.58 2000 1.00
## ppm_future[1183] 1.57 0.00 0.01 1.55 1.59 1791 1.00
## ppm_future[1184] 1.57 0.00 0.01 1.56 1.59 1915 1.00
## ppm_future[1185] 1.58 0.00 0.01 1.56 1.60 2000 1.00
## ppm_future[1186] 1.58 0.00 0.01 1.57 1.60 1827 1.00
## ppm_future[1187] 1.59 0.00 0.01 1.57 1.60 1823 1.00
## ppm_future[1188] 1.59 0.00 0.01 1.57 1.61 1821 1.00
## ppm_future[1189] 1.59 0.00 0.01 1.58 1.61 1802 1.00
## ppm_future[1190] 1.60 0.00 0.01 1.58 1.61 1866 1.00
## ppm_future[1191] 1.60 0.00 0.01 1.58 1.62 1813 1.00
## ppm_future[1192] 1.60 0.00 0.01 1.59 1.62 2000 1.00
## ppm_future[1193] 1.61 0.00 0.01 1.59 1.62 1745 1.00
## ppm_future[1194] 1.61 0.00 0.01 1.59 1.63 1697 1.00
## ppm_future[1195] 1.61 0.00 0.01 1.59 1.63 1662 1.00
## ppm_future[1196] 1.61 0.00 0.01 1.60 1.63 1896 1.00
## ppm_future[1197] 1.61 0.00 0.01 1.60 1.63 1778 1.00
## ppm_future[1198] 1.61 0.00 0.01 1.60 1.63 1806 1.00
## ppm_future[1199] 1.61 0.00 0.01 1.60 1.63 2000 1.00
## ppm_future[1200] 1.61 0.00 0.01 1.60 1.63 1956 1.00
## ppm_future[1201] 1.61 0.00 0.01 1.60 1.63 2000 1.00
## ppm_future[1202] 1.61 0.00 0.01 1.59 1.63 1815 1.00
## ppm_future[1203] 1.61 0.00 0.01 1.59 1.63 1891 1.00
## ppm_future[1204] 1.61 0.00 0.01 1.59 1.62 1962 1.00
## ppm_future[1205] 1.60 0.00 0.01 1.59 1.62 2000 1.00
## ppm_future[1206] 1.60 0.00 0.01 1.59 1.62 1931 1.00
## ppm_future[1207] 1.60 0.00 0.01 1.58 1.62 1894 1.00
## ppm_future[1208] 1.60 0.00 0.01 1.58 1.61 1853 1.00
## ppm_future[1209] 1.59 0.00 0.01 1.58 1.61 2000 1.00
## ppm_future[1210] 1.59 0.00 0.01 1.57 1.61 2000 1.00
## ppm_future[1211] 1.59 0.00 0.01 1.57 1.61 2000 1.00
## ppm_future[1212] 1.58 0.00 0.01 1.57 1.60 1666 1.00
## ppm_future[1213] 1.58 0.00 0.01 1.56 1.60 1807 1.00
## ppm_future[1214] 1.58 0.00 0.01 1.56 1.60 1802 1.00
## ppm_future[1215] 1.58 0.00 0.01 1.56 1.59 1926 1.00
## ppm_future[1216] 1.57 0.00 0.01 1.56 1.59 1741 1.00
## ppm_future[1217] 1.57 0.00 0.01 1.56 1.59 1658 1.00
## ppm_future[1218] 1.57 0.00 0.01 1.55 1.59 1902 1.00
## ppm_future[1219] 1.57 0.00 0.01 1.55 1.59 1940 1.00
## ppm_future[1220] 1.57 0.00 0.01 1.55 1.59 1709 1.00
## ppm_future[1221] 1.57 0.00 0.01 1.55 1.59 2000 1.00
## ppm_future[1222] 1.57 0.00 0.01 1.55 1.58 1975 1.00
## ppm_future[1223] 1.57 0.00 0.01 1.55 1.59 1916 1.00
## ppm_future[1224] 1.57 0.00 0.01 1.55 1.59 1929 1.00
## ppm_future[1225] 1.57 0.00 0.01 1.56 1.59 2000 1.00
## ppm_future[1226] 1.57 0.00 0.01 1.56 1.59 1755 1.00
## ppm_future[1227] 1.58 0.00 0.01 1.56 1.59 1547 1.00
## ppm_future[1228] 1.58 0.00 0.01 1.56 1.60 1678 1.00
## ppm_future[1229] 1.58 0.00 0.01 1.56 1.60 2000 1.00
## ppm_future[1230] 1.58 0.00 0.01 1.57 1.60 1943 1.00
## ppm_future[1231] 1.59 0.00 0.01 1.57 1.60 1865 1.00
## ppm_future[1232] 1.59 0.00 0.01 1.58 1.61 1758 1.00
## ppm_future[1233] 1.60 0.00 0.01 1.58 1.61 1810 1.00
## ppm_future[1234] 1.60 0.00 0.01 1.58 1.62 1653 1.00
## ppm_future[1235] 1.60 0.00 0.01 1.59 1.62 2000 1.00
## ppm_future[1236] 1.61 0.00 0.01 1.59 1.63 1836 1.00
## ppm_future[1237] 1.61 0.00 0.01 1.60 1.63 2000 1.00
## ppm_future[1238] 1.62 0.00 0.01 1.60 1.63 1958 1.00
## ppm_future[1239] 1.62 0.00 0.01 1.60 1.64 1883 1.00
## ppm_future[1240] 1.62 0.00 0.01 1.61 1.64 1979 1.00
## ppm_future[1241] 1.63 0.00 0.01 1.61 1.64 2000 1.00
## ppm_future[1242] 1.63 0.00 0.01 1.61 1.65 1730 1.01
## ppm_future[1243] 1.63 0.00 0.01 1.62 1.65 1668 1.00
## ppm_future[1244] 1.64 0.00 0.01 1.62 1.65 1778 1.00
## ppm_future[1245] 1.64 0.00 0.01 1.62 1.66 2000 1.00
## ppm_future[1246] 1.64 0.00 0.01 1.62 1.66 2000 1.00
## ppm_future[1247] 1.64 0.00 0.01 1.63 1.66 2000 1.00
## ppm_future[1248] 1.64 0.00 0.01 1.63 1.66 2000 1.00
## ppm_future[1249] 1.64 0.00 0.01 1.63 1.66 1944 1.00
## ppm_future[1250] 1.64 0.00 0.01 1.63 1.66 1837 1.00
## ppm_future[1251] 1.64 0.00 0.01 1.63 1.66 1863 1.00
## ppm_future[1252] 1.64 0.00 0.01 1.63 1.66 1989 1.00
## ppm_future[1253] 1.64 0.00 0.01 1.62 1.66 1935 1.00
## ppm_future[1254] 1.64 0.00 0.01 1.62 1.66 1787 1.00
## ppm_future[1255] 1.64 0.00 0.01 1.62 1.65 1956 1.00
## ppm_future[1256] 1.63 0.00 0.01 1.62 1.65 1943 1.00
## ppm_future[1257] 1.63 0.00 0.01 1.62 1.65 2000 1.00
## ppm_future[1258] 1.63 0.00 0.01 1.61 1.65 1977 1.00
## ppm_future[1259] 1.63 0.00 0.01 1.61 1.64 1828 1.00
## ppm_future[1260] 1.62 0.00 0.01 1.61 1.64 1772 1.00
## ppm_future[1261] 1.62 0.00 0.01 1.60 1.64 2000 1.00
## ppm_future[1262] 1.62 0.00 0.01 1.60 1.63 1835 1.00
## ppm_future[1263] 1.61 0.00 0.01 1.60 1.63 2000 1.00
## ppm_future[1264] 1.61 0.00 0.01 1.59 1.63 1849 1.00
## ppm_future[1265] 1.61 0.00 0.01 1.59 1.63 1913 1.00
## ppm_future[1266] 1.61 0.00 0.01 1.59 1.62 1912 1.00
## ppm_future[1267] 1.60 0.00 0.01 1.59 1.62 1681 1.00
## ppm_future[1268] 1.60 0.00 0.01 1.59 1.62 1660 1.00
## ppm_future[1269] 1.60 0.00 0.01 1.58 1.62 2000 1.00
## ppm_future[1270] 1.60 0.00 0.01 1.58 1.62 1803 1.00
## ppm_future[1271] 1.60 0.00 0.01 1.58 1.62 1633 1.00
## ppm_future[1272] 1.60 0.00 0.01 1.58 1.62 2000 1.00
## ppm_future[1273] 1.60 0.00 0.01 1.58 1.61 1906 1.00
## ppm_future[1274] 1.60 0.00 0.01 1.58 1.62 2000 1.00
## ppm_future[1275] 1.60 0.00 0.01 1.58 1.62 1874 1.00
## ppm_future[1276] 1.60 0.00 0.01 1.59 1.62 1805 1.00
## ppm_future[1277] 1.60 0.00 0.01 1.59 1.62 1699 1.00
## ppm_future[1278] 1.61 0.00 0.01 1.59 1.62 1935 1.00
## ppm_future[1279] 1.61 0.00 0.01 1.59 1.63 1912 1.00
## ppm_future[1280] 1.61 0.00 0.01 1.59 1.63 2000 1.00
## ppm_future[1281] 1.61 0.00 0.01 1.60 1.63 1987 1.00
## ppm_future[1282] 1.62 0.00 0.01 1.60 1.63 1406 1.00
## ppm_future[1283] 1.62 0.00 0.01 1.61 1.64 2000 1.00
## ppm_future[1284] 1.63 0.00 0.01 1.61 1.64 1776 1.00
## ppm_future[1285] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1286] 1.63 0.00 0.01 1.62 1.65 1921 1.00
## ppm_future[1287] 1.64 0.00 0.01 1.62 1.65 1764 1.00
## ppm_future[1288] 1.64 0.00 0.01 1.63 1.66 2000 1.00
## ppm_future[1289] 1.65 0.00 0.01 1.63 1.66 1866 1.00
## ppm_future[1290] 1.65 0.00 0.01 1.63 1.67 1700 1.00
## ppm_future[1291] 1.65 0.00 0.01 1.64 1.67 2000 1.00
## ppm_future[1292] 1.66 0.00 0.01 1.64 1.67 2000 1.00
## ppm_future[1293] 1.66 0.00 0.01 1.64 1.68 1591 1.00
## ppm_future[1294] 1.66 0.00 0.01 1.65 1.68 1900 1.00
## ppm_future[1295] 1.67 0.00 0.01 1.65 1.68 1694 1.00
## ppm_future[1296] 1.67 0.00 0.01 1.65 1.69 2000 1.00
## ppm_future[1297] 1.67 0.00 0.01 1.65 1.69 1928 1.00
## ppm_future[1298] 1.67 0.00 0.01 1.66 1.69 1749 1.00
## ppm_future[1299] 1.67 0.00 0.01 1.66 1.69 1831 1.00
## ppm_future[1300] 1.67 0.00 0.01 1.66 1.69 2000 1.00
## ppm_future[1301] 1.67 0.00 0.01 1.66 1.69 1900 1.00
## ppm_future[1302] 1.67 0.00 0.01 1.66 1.69 1735 1.00
## ppm_future[1303] 1.67 0.00 0.01 1.66 1.69 1988 1.00
## ppm_future[1304] 1.67 0.00 0.01 1.65 1.69 2000 1.00
## ppm_future[1305] 1.67 0.00 0.01 1.65 1.69 1466 1.00
## ppm_future[1306] 1.67 0.00 0.01 1.65 1.68 1957 1.00
## ppm_future[1307] 1.66 0.00 0.01 1.65 1.68 1977 1.00
## ppm_future[1308] 1.66 0.00 0.01 1.65 1.68 1956 1.00
## ppm_future[1309] 1.66 0.00 0.01 1.64 1.68 1884 1.00
## ppm_future[1310] 1.66 0.00 0.01 1.64 1.67 1408 1.00
## ppm_future[1311] 1.65 0.00 0.01 1.64 1.67 2000 1.00
## ppm_future[1312] 1.65 0.00 0.01 1.63 1.67 2000 1.00
## ppm_future[1313] 1.65 0.00 0.01 1.63 1.67 1951 1.00
## ppm_future[1314] 1.65 0.00 0.01 1.63 1.66 2000 1.00
## ppm_future[1315] 1.64 0.00 0.01 1.63 1.66 1849 1.00
## ppm_future[1316] 1.64 0.00 0.01 1.62 1.66 1928 1.00
## ppm_future[1317] 1.64 0.00 0.01 1.62 1.65 1592 1.00
## ppm_future[1318] 1.63 0.00 0.01 1.62 1.65 2000 1.00
## ppm_future[1319] 1.63 0.00 0.01 1.62 1.65 1926 1.00
## ppm_future[1320] 1.63 0.00 0.01 1.61 1.65 1806 1.00
## ppm_future[1321] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1322] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1323] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1324] 1.63 0.00 0.01 1.61 1.65 1855 1.00
## ppm_future[1325] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1326] 1.63 0.00 0.01 1.61 1.65 2000 1.00
## ppm_future[1327] 1.63 0.00 0.01 1.62 1.65 1872 1.00
## ppm_future[1328] 1.63 0.00 0.01 1.62 1.65 1982 1.00
## ppm_future[1329] 1.64 0.00 0.01 1.62 1.65 2000 1.00
## ppm_future[1330] 1.64 0.00 0.01 1.62 1.66 1911 1.00
## ppm_future[1331] 1.64 0.00 0.01 1.63 1.66 1617 1.00
## ppm_future[1332] 1.65 0.00 0.01 1.63 1.66 1753 1.00
## ppm_future[1333] 1.65 0.00 0.01 1.63 1.67 1885 1.00
## ppm_future[1334] 1.65 0.00 0.01 1.64 1.67 1580 1.00
## ppm_future[1335] 1.66 0.00 0.01 1.64 1.67 1914 1.00
## ppm_future[1336] 1.66 0.00 0.01 1.64 1.68 1954 1.00
## ppm_future[1337] 1.66 0.00 0.01 1.65 1.68 1964 1.00
## ppm_future[1338] 1.67 0.00 0.01 1.65 1.69 2000 1.00
## ppm_future[1339] 1.67 0.00 0.01 1.66 1.69 1673 1.00
## ppm_future[1340] 1.68 0.00 0.01 1.66 1.69 1878 1.00
## ppm_future[1341] 1.68 0.00 0.01 1.66 1.70 1764 1.00
## ppm_future[1342] 1.68 0.00 0.01 1.67 1.70 1952 1.00
## ppm_future[1343] 1.69 0.00 0.01 1.67 1.70 2000 1.00
## ppm_future[1344] 1.69 0.00 0.01 1.68 1.71 1944 1.00
## ppm_future[1345] 1.69 0.00 0.01 1.68 1.71 1875 1.00
## ppm_future[1346] 1.70 0.00 0.01 1.68 1.71 1866 1.00
## ppm_future[1347] 1.70 0.00 0.01 1.68 1.72 1830 1.00
## ppm_future[1348] 1.70 0.00 0.01 1.68 1.72 2000 1.00
## ppm_future[1349] 1.70 0.00 0.01 1.69 1.72 2000 1.00
## ppm_future[1350] 1.70 0.00 0.01 1.69 1.72 1907 1.00
## ppm_future[1351] 1.70 0.00 0.01 1.69 1.72 1924 1.00
## ppm_future[1352] 1.70 0.00 0.01 1.69 1.72 2000 1.00
## ppm_future[1353] 1.70 0.00 0.01 1.69 1.72 2000 1.00
## ppm_future[1354] 1.70 0.00 0.01 1.69 1.72 1966 1.00
## ppm_future[1355] 1.70 0.00 0.01 1.68 1.72 1868 1.00
## ppm_future[1356] 1.70 0.00 0.01 1.68 1.72 1989 1.00
## ppm_future[1357] 1.70 0.00 0.01 1.68 1.71 1852 1.00
## ppm_future[1358] 1.70 0.00 0.01 1.68 1.71 1856 1.00
## ppm_future[1359] 1.69 0.00 0.01 1.68 1.71 1768 1.00
## ppm_future[1360] 1.69 0.00 0.01 1.67 1.71 1795 1.00
## ppm_future[1361] 1.69 0.00 0.01 1.67 1.70 1934 1.00
## ppm_future[1362] 1.68 0.00 0.01 1.67 1.70 1939 1.00
## ppm_future[1363] 1.68 0.00 0.01 1.66 1.70 1981 1.00
## ppm_future[1364] 1.68 0.00 0.01 1.66 1.69 1755 1.00
## ppm_future[1365] 1.68 0.00 0.01 1.66 1.69 1869 1.00
## ppm_future[1366] 1.67 0.00 0.01 1.66 1.69 1761 1.00
## ppm_future[1367] 1.67 0.00 0.01 1.65 1.69 1774 1.00
## ppm_future[1368] 1.67 0.00 0.01 1.65 1.68 1856 1.00
## ppm_future[1369] 1.66 0.00 0.01 1.65 1.68 1721 1.00
## ppm_future[1370] 1.66 0.00 0.01 1.65 1.68 2000 1.00
## ppm_future[1371] 1.66 0.00 0.01 1.64 1.68 1817 1.00
## ppm_future[1372] 1.66 0.00 0.01 1.64 1.68 1917 1.00
## ppm_future[1373] 1.66 0.00 0.01 1.64 1.68 1675 1.00
## ppm_future[1374] 1.66 0.00 0.01 1.64 1.68 1748 1.00
## ppm_future[1375] 1.66 0.00 0.01 1.64 1.68 1586 1.00
## ppm_future[1376] 1.66 0.00 0.01 1.64 1.68 1626 1.00
## ppm_future[1377] 1.66 0.00 0.01 1.64 1.68 2000 1.00
## ppm_future[1378] 1.66 0.00 0.01 1.64 1.68 2000 1.00
## ppm_future[1379] 1.66 0.00 0.01 1.65 1.68 1883 1.00
## ppm_future[1380] 1.67 0.00 0.01 1.65 1.68 1814 1.00
## ppm_future[1381] 1.67 0.00 0.01 1.65 1.69 1875 1.00
## ppm_future[1382] 1.67 0.00 0.01 1.66 1.69 2000 1.00
## ppm_future[1383] 1.68 0.00 0.01 1.66 1.69 1935 1.00
## ppm_future[1384] 1.68 0.00 0.01 1.66 1.70 1923 1.00
## ppm_future[1385] 1.68 0.00 0.01 1.67 1.70 2000 1.00
## ppm_future[1386] 1.69 0.00 0.01 1.67 1.70 1667 1.00
## ppm_future[1387] 1.69 0.00 0.01 1.67 1.71 1957 1.00
## ppm_future[1388] 1.70 0.00 0.01 1.68 1.71 2000 1.00
## ppm_future[1389] 1.70 0.00 0.01 1.68 1.72 2000 1.00
## ppm_future[1390] 1.70 0.00 0.01 1.69 1.72 1554 1.00
## ppm_future[1391] 1.71 0.00 0.01 1.69 1.73 2000 1.00
## ppm_future[1392] 1.71 0.00 0.01 1.70 1.73 1903 1.00
## ppm_future[1393] 1.72 0.00 0.01 1.70 1.73 1946 1.00
## ppm_future[1394] 1.72 0.00 0.01 1.70 1.74 2000 1.00
## ppm_future[1395] 1.72 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1396] 1.72 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1397] 1.73 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1398] 1.73 0.00 0.01 1.71 1.75 1977 1.00
## ppm_future[1399] 1.73 0.00 0.01 1.71 1.75 1976 1.00
## ppm_future[1400] 1.73 0.00 0.01 1.72 1.75 2000 1.00
## ppm_future[1401] 1.73 0.00 0.01 1.72 1.75 2000 1.00
## ppm_future[1402] 1.73 0.00 0.01 1.72 1.75 1898 1.00
## ppm_future[1403] 1.73 0.00 0.01 1.72 1.75 2000 1.00
## ppm_future[1404] 1.73 0.00 0.01 1.72 1.75 1826 1.00
## ppm_future[1405] 1.73 0.00 0.01 1.72 1.75 1762 1.00
## ppm_future[1406] 1.73 0.00 0.01 1.72 1.75 1864 1.00
## ppm_future[1407] 1.73 0.00 0.01 1.71 1.75 1931 1.00
## ppm_future[1408] 1.73 0.00 0.01 1.71 1.74 1762 1.00
## ppm_future[1409] 1.73 0.00 0.01 1.71 1.74 1613 1.00
## ppm_future[1410] 1.72 0.00 0.01 1.71 1.74 1992 1.00
## ppm_future[1411] 1.72 0.00 0.01 1.70 1.74 1796 1.00
## ppm_future[1412] 1.72 0.00 0.01 1.70 1.73 2000 1.00
## ppm_future[1413] 1.71 0.00 0.01 1.70 1.73 2000 1.00
## ppm_future[1414] 1.71 0.00 0.01 1.69 1.73 1756 1.00
## ppm_future[1415] 1.71 0.00 0.01 1.69 1.73 1893 1.00
## ppm_future[1416] 1.71 0.00 0.01 1.69 1.72 1860 1.00
## ppm_future[1417] 1.70 0.00 0.01 1.69 1.72 2000 1.00
## ppm_future[1418] 1.70 0.00 0.01 1.68 1.72 1901 1.00
## ppm_future[1419] 1.70 0.00 0.01 1.68 1.71 1690 1.00
## ppm_future[1420] 1.70 0.00 0.01 1.68 1.71 2000 1.00
## ppm_future[1421] 1.69 0.00 0.01 1.68 1.71 1880 1.00
## ppm_future[1422] 1.69 0.00 0.01 1.68 1.71 1709 1.00
## ppm_future[1423] 1.69 0.00 0.01 1.68 1.71 1864 1.00
## ppm_future[1424] 1.69 0.00 0.01 1.67 1.71 1823 1.00
## ppm_future[1425] 1.69 0.00 0.01 1.67 1.71 1878 1.00
## ppm_future[1426] 1.69 0.00 0.01 1.67 1.71 2000 1.00
## ppm_future[1427] 1.69 0.00 0.01 1.67 1.71 1885 1.00
## ppm_future[1428] 1.69 0.00 0.01 1.68 1.71 1902 1.00
## ppm_future[1429] 1.69 0.00 0.01 1.68 1.71 1911 1.00
## ppm_future[1430] 1.69 0.00 0.01 1.68 1.71 2000 1.00
## ppm_future[1431] 1.70 0.00 0.01 1.68 1.71 2000 1.00
## ppm_future[1432] 1.70 0.00 0.01 1.68 1.72 2000 1.00
## ppm_future[1433] 1.70 0.00 0.01 1.69 1.72 1628 1.00
## ppm_future[1434] 1.71 0.00 0.01 1.69 1.72 2000 1.00
## ppm_future[1435] 1.71 0.00 0.01 1.69 1.73 1814 1.00
## ppm_future[1436] 1.71 0.00 0.01 1.70 1.73 2000 1.00
## ppm_future[1437] 1.72 0.00 0.01 1.70 1.73 1769 1.00
## ppm_future[1438] 1.72 0.00 0.01 1.70 1.74 1815 1.00
## ppm_future[1439] 1.73 0.00 0.01 1.71 1.74 1785 1.00
## ppm_future[1440] 1.73 0.00 0.01 1.71 1.75 1895 1.00
## ppm_future[1441] 1.73 0.00 0.01 1.72 1.75 1771 1.00
## ppm_future[1442] 1.74 0.00 0.01 1.72 1.76 1961 1.00
## ppm_future[1443] 1.74 0.00 0.01 1.73 1.76 2000 1.00
## ppm_future[1444] 1.75 0.00 0.01 1.73 1.76 1650 1.00
## ppm_future[1445] 1.75 0.00 0.01 1.73 1.77 1601 1.00
## ppm_future[1446] 1.75 0.00 0.01 1.74 1.77 2000 1.00
## ppm_future[1447] 1.76 0.00 0.01 1.74 1.77 2000 1.00
## ppm_future[1448] 1.76 0.00 0.01 1.74 1.77 1732 1.00
## ppm_future[1449] 1.76 0.00 0.01 1.74 1.78 1735 1.00
## ppm_future[1450] 1.76 0.00 0.01 1.75 1.78 2000 1.00
## ppm_future[1451] 1.76 0.00 0.01 1.75 1.78 1951 1.00
## ppm_future[1452] 1.76 0.00 0.01 1.75 1.78 1800 1.00
## ppm_future[1453] 1.77 0.00 0.01 1.75 1.78 2000 1.00
## ppm_future[1454] 1.77 0.00 0.01 1.75 1.78 2000 1.00
## ppm_future[1455] 1.76 0.00 0.01 1.75 1.78 2000 1.00
## ppm_future[1456] 1.76 0.00 0.01 1.75 1.78 1953 1.00
## ppm_future[1457] 1.76 0.00 0.01 1.75 1.78 1884 1.00
## ppm_future[1458] 1.76 0.00 0.01 1.74 1.78 1706 1.00
## ppm_future[1459] 1.76 0.00 0.01 1.74 1.78 1803 1.00
## ppm_future[1460] 1.76 0.00 0.01 1.74 1.77 1798 1.00
## ppm_future[1461] 1.75 0.00 0.01 1.74 1.77 1850 1.00
## ppm_future[1462] 1.75 0.00 0.01 1.74 1.77 1884 1.00
## ppm_future[1463] 1.75 0.00 0.01 1.73 1.77 2000 1.00
## ppm_future[1464] 1.75 0.00 0.01 1.73 1.76 1903 1.00
## ppm_future[1465] 1.74 0.00 0.01 1.73 1.76 1956 1.00
## ppm_future[1466] 1.74 0.00 0.01 1.72 1.76 1831 1.00
## ppm_future[1467] 1.74 0.00 0.01 1.72 1.75 1953 1.00
## ppm_future[1468] 1.73 0.00 0.01 1.72 1.75 2000 1.00
## ppm_future[1469] 1.73 0.00 0.01 1.71 1.75 1890 1.00
## ppm_future[1470] 1.73 0.00 0.01 1.71 1.75 2000 1.00
## ppm_future[1471] 1.73 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1472] 1.72 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1473] 1.72 0.00 0.01 1.71 1.74 1881 1.00
## ppm_future[1474] 1.72 0.00 0.01 1.70 1.74 1892 1.00
## ppm_future[1475] 1.72 0.00 0.01 1.71 1.74 1796 1.00
## ppm_future[1476] 1.72 0.00 0.01 1.70 1.74 1906 1.00
## ppm_future[1477] 1.72 0.00 0.01 1.70 1.74 1684 1.00
## ppm_future[1478] 1.72 0.00 0.01 1.71 1.74 2000 1.00
## ppm_future[1479] 1.72 0.00 0.01 1.71 1.74 1898 1.00
## ppm_future[1480] 1.72 0.00 0.01 1.71 1.74 1934 1.00
## ppm_future[1481] 1.73 0.00 0.01 1.71 1.74 1669 1.00
## ppm_future[1482] 1.73 0.00 0.01 1.71 1.75 1904 1.00
## ppm_future[1483] 1.73 0.00 0.01 1.71 1.75 1924 1.00
## ppm_future[1484] 1.73 0.00 0.01 1.72 1.75 1915 1.00
## ppm_future[1485] 1.74 0.00 0.01 1.72 1.75 1929 1.00
## ppm_future[1486] 1.74 0.00 0.01 1.72 1.76 1806 1.00
## ppm_future[1487] 1.74 0.00 0.01 1.73 1.76 1913 1.00
## ppm_future[1488] 1.75 0.00 0.01 1.73 1.77 1949 1.00
## ppm_future[1489] 1.75 0.00 0.01 1.74 1.77 1946 1.00
## ppm_future[1490] 1.76 0.00 0.01 1.74 1.77 1947 1.00
## ppm_future[1491] 1.76 0.00 0.01 1.74 1.78 2000 1.00
## ppm_future[1492] 1.77 0.00 0.01 1.75 1.78 1929 1.00
## ppm_future[1493] 1.77 0.00 0.01 1.75 1.79 2000 1.00
## ppm_future[1494] 1.77 0.00 0.01 1.76 1.79 1958 1.00
## ppm_future[1495] 1.78 0.00 0.01 1.76 1.79 1909 1.00
## ppm_future[1496] 1.78 0.00 0.01 1.76 1.80 2000 1.00
## ppm_future[1497] 1.78 0.00 0.01 1.77 1.80 1594 1.00
## ppm_future[1498] 1.79 0.00 0.01 1.77 1.80 2000 1.00
## ppm_future[1499] 1.79 0.00 0.01 1.77 1.81 1889 1.00
## ppm_future[1500] 1.79 0.00 0.01 1.78 1.81 1648 1.00
## ppm_future[1501] 1.79 0.00 0.01 1.78 1.81 1685 1.00
## ppm_future[1502] 1.80 0.00 0.01 1.78 1.81 1881 1.00
## ppm_future[1503] 1.80 0.00 0.01 1.78 1.81 1733 1.00
## ppm_future[1504] 1.80 0.00 0.01 1.78 1.81 1983 1.00
## ppm_future[1505] 1.80 0.00 0.01 1.78 1.81 1617 1.00
## ppm_future[1506] 1.80 0.00 0.01 1.78 1.81 1524 1.00
## ppm_future[1507] 1.80 0.00 0.01 1.78 1.81 1981 1.00
## ppm_future[1508] 1.79 0.00 0.01 1.78 1.81 2000 1.00
## ppm_future[1509] 1.79 0.00 0.01 1.78 1.81 2000 1.00
## ppm_future[1510] 1.79 0.00 0.01 1.77 1.81 1862 1.00
## ppm_future[1511] 1.79 0.00 0.01 1.77 1.81 2000 1.00
## ppm_future[1512] 1.79 0.00 0.01 1.77 1.80 2000 1.00
## ppm_future[1513] 1.78 0.00 0.01 1.77 1.80 1655 1.00
## ppm_future[1514] 1.78 0.00 0.01 1.76 1.80 2000 1.00
## ppm_future[1515] 1.78 0.00 0.01 1.76 1.79 1862 1.00
## ppm_future[1516] 1.77 0.00 0.01 1.76 1.79 1800 1.00
## ppm_future[1517] 1.77 0.00 0.01 1.75 1.79 2000 1.00
## ppm_future[1518] 1.77 0.00 0.01 1.75 1.78 1862 1.00
## ppm_future[1519] 1.77 0.00 0.01 1.75 1.78 1854 1.00
## ppm_future[1520] 1.76 0.00 0.01 1.75 1.78 1990 1.00
## ppm_future[1521] 1.76 0.00 0.01 1.74 1.78 1937 1.00
## ppm_future[1522] 1.76 0.00 0.01 1.74 1.77 2000 1.00
## ppm_future[1523] 1.76 0.00 0.01 1.74 1.77 1727 1.00
## ppm_future[1524] 1.75 0.00 0.01 1.74 1.77 2000 1.00
## ppm_future[1525] 1.75 0.00 0.01 1.74 1.77 1911 1.00
## ppm_future[1526] 1.75 0.00 0.01 1.74 1.77 1857 1.00
## ppm_future[1527] 1.75 0.00 0.01 1.73 1.77 1873 1.00
## ppm_future[1528] 1.75 0.00 0.01 1.74 1.77 1655 1.00
## ppm_future[1529] 1.75 0.00 0.01 1.74 1.77 2000 1.00
## ppm_future[1530] 1.75 0.00 0.01 1.74 1.77 1736 1.00
## ppm_future[1531] 1.76 0.00 0.01 1.74 1.77 1886 1.00
## ppm_future[1532] 1.76 0.00 0.01 1.74 1.77 1817 1.00
## ppm_future[1533] 1.76 0.00 0.01 1.74 1.78 1750 1.00
## ppm_future[1534] 1.76 0.00 0.01 1.75 1.78 1875 1.00
## ppm_future[1535] 1.77 0.00 0.01 1.75 1.78 1765 1.00
## ppm_future[1536] 1.77 0.00 0.01 1.75 1.78 1912 1.00
## ppm_future[1537] 1.77 0.00 0.01 1.76 1.79 1896 1.00
## ppm_future[1538] 1.78 0.00 0.01 1.76 1.79 1831 1.00
## ppm_future[1539] 1.78 0.00 0.01 1.76 1.80 1740 1.00
## ppm_future[1540] 1.78 0.00 0.01 1.77 1.80 1977 1.00
## ppm_future[1541] 1.79 0.00 0.01 1.77 1.81 1838 1.00
## ppm_future[1542] 1.79 0.00 0.01 1.78 1.81 1597 1.00
## ppm_future[1543] 1.80 0.00 0.01 1.78 1.81 1853 1.00
## ppm_future[1544] 1.80 0.00 0.01 1.78 1.82 1838 1.00
## ppm_future[1545] 1.80 0.00 0.01 1.79 1.82 1422 1.00
## ppm_future[1546] 1.81 0.00 0.01 1.79 1.82 1710 1.00
## ppm_future[1547] 1.81 0.00 0.01 1.79 1.83 2000 1.00
## ppm_future[1548] 1.82 0.00 0.01 1.80 1.83 2000 1.00
## ppm_future[1549] 1.82 0.00 0.01 1.80 1.84 1935 1.00
## ppm_future[1550] 1.82 0.00 0.01 1.80 1.84 1672 1.00
## ppm_future[1551] 1.82 0.00 0.01 1.81 1.84 1849 1.00
## ppm_future[1552] 1.82 0.00 0.01 1.81 1.84 2000 1.00
## ppm_future[1553] 1.83 0.00 0.01 1.81 1.84 1549 1.00
## ppm_future[1554] 1.83 0.00 0.01 1.81 1.84 1867 1.00
## ppm_future[1555] 1.83 0.00 0.01 1.81 1.84 1935 1.00
## ppm_future[1556] 1.83 0.00 0.01 1.81 1.84 2000 1.00
## ppm_future[1557] 1.83 0.00 0.01 1.81 1.84 1815 1.00
## ppm_future[1558] 1.83 0.00 0.01 1.81 1.84 1945 1.00
## ppm_future[1559] 1.83 0.00 0.01 1.81 1.84 1600 1.00
## ppm_future[1560] 1.82 0.00 0.01 1.81 1.84 1892 1.00
## ppm_future[1561] 1.82 0.00 0.01 1.81 1.84 1957 1.00
## ppm_future[1562] 1.82 0.00 0.01 1.80 1.84 1673 1.00
## ppm_future[1563] 1.82 0.00 0.01 1.80 1.83 2000 1.00
## ppm_future[1564] 1.81 0.00 0.01 1.80 1.83 1845 1.00
## ppm_future[1565] 1.81 0.00 0.01 1.80 1.83 1958 1.00
## ppm_future[1566] 1.81 0.00 0.01 1.79 1.83 1953 1.00
## ppm_future[1567] 1.81 0.00 0.01 1.79 1.82 2000 1.00
## ppm_future[1568] 1.80 0.00 0.01 1.79 1.82 2000 1.00
## ppm_future[1569] 1.80 0.00 0.01 1.78 1.82 2000 1.00
## ppm_future[1570] 1.80 0.00 0.01 1.78 1.81 1678 1.00
## ppm_future[1571] 1.79 0.00 0.01 1.78 1.81 1483 1.00
## ppm_future[1572] 1.79 0.00 0.01 1.77 1.81 2000 1.00
## ppm_future[1573] 1.79 0.00 0.01 1.77 1.81 2000 1.00
## ppm_future[1574] 1.79 0.00 0.01 1.77 1.80 1837 1.00
## ppm_future[1575] 1.79 0.00 0.01 1.77 1.80 1795 1.00
## ppm_future[1576] 1.78 0.00 0.01 1.77 1.80 1702 1.00
## ppm_future[1577] 1.78 0.00 0.01 1.77 1.80 2000 1.00
## ppm_future[1578] 1.78 0.00 0.01 1.77 1.80 1886 1.00
## ppm_future[1579] 1.78 0.00 0.01 1.77 1.80 1901 1.00
## ppm_future[1580] 1.78 0.00 0.01 1.77 1.80 2000 1.00
## ppm_future[1581] 1.79 0.00 0.01 1.77 1.80 1800 1.00
## ppm_future[1582] 1.79 0.00 0.01 1.77 1.80 1868 1.00
## ppm_future[1583] 1.79 0.00 0.01 1.77 1.81 1972 1.00
## ppm_future[1584] 1.79 0.00 0.01 1.77 1.81 1780 1.00
## ppm_future[1585] 1.79 0.00 0.01 1.78 1.81 1844 1.00
## ppm_future[1586] 1.80 0.00 0.01 1.78 1.81 2000 1.00
## ppm_future[1587] 1.80 0.00 0.01 1.78 1.82 1863 1.00
## ppm_future[1588] 1.80 0.00 0.01 1.79 1.82 1590 1.00
## ppm_future[1589] 1.81 0.00 0.01 1.79 1.82 1885 1.00
## ppm_future[1590] 1.81 0.00 0.01 1.79 1.83 1704 1.00
## ppm_future[1591] 1.82 0.00 0.01 1.80 1.83 1991 1.00
## ppm_future[1592] 1.82 0.00 0.01 1.80 1.84 1938 1.00
## ppm_future[1593] 1.82 0.00 0.01 1.81 1.84 1853 1.00
## ppm_future[1594] 1.83 0.00 0.01 1.81 1.85 1734 1.00
## ppm_future[1595] 1.83 0.00 0.01 1.82 1.85 1820 1.00
## ppm_future[1596] 1.84 0.00 0.01 1.82 1.85 1888 1.00
## ppm_future[1597] 1.84 0.00 0.01 1.82 1.86 1937 1.00
## ppm_future[1598] 1.84 0.00 0.01 1.83 1.86 1741 1.00
## ppm_future[1599] 1.85 0.00 0.01 1.83 1.86 1727 1.00
## ppm_future[1600] 1.85 0.00 0.01 1.83 1.87 1857 1.00
## ppm_future[1601] 1.85 0.00 0.01 1.84 1.87 1817 1.00
## ppm_future[1602] 1.85 0.00 0.01 1.84 1.87 1903 1.00
## ppm_future[1603] 1.86 0.00 0.01 1.84 1.87 1861 1.00
## ppm_future[1604] 1.86 0.00 0.01 1.84 1.87 1967 1.00
## ppm_future[1605] 1.86 0.00 0.01 1.84 1.88 1855 1.00
## ppm_future[1606] 1.86 0.00 0.01 1.84 1.88 1840 1.00
## ppm_future[1607] 1.86 0.00 0.01 1.84 1.88 1666 1.00
## ppm_future[1608] 1.86 0.00 0.01 1.84 1.88 1882 1.00
## ppm_future[1609] 1.86 0.00 0.01 1.84 1.87 1913 1.00
## ppm_future[1610] 1.86 0.00 0.01 1.84 1.87 1870 1.00
## ppm_future[1611] 1.86 0.00 0.01 1.84 1.87 2000 1.00
## ppm_future[1612] 1.85 0.00 0.01 1.84 1.87 1904 1.00
## ppm_future[1613] 1.85 0.00 0.01 1.83 1.87 2000 1.00
## ppm_future[1614] 1.85 0.00 0.01 1.83 1.87 1863 1.00
## ppm_future[1615] 1.85 0.00 0.01 1.83 1.86 1838 1.00
## ppm_future[1616] 1.84 0.00 0.01 1.83 1.86 1726 1.00
## ppm_future[1617] 1.84 0.00 0.01 1.82 1.86 1880 1.00
## ppm_future[1618] 1.84 0.00 0.01 1.82 1.86 2000 1.00
## ppm_future[1619] 1.83 0.00 0.01 1.82 1.85 1774 1.00
## ppm_future[1620] 1.83 0.00 0.01 1.81 1.85 1819 1.00
## ppm_future[1621] 1.83 0.00 0.01 1.81 1.85 1868 1.00
## ppm_future[1622] 1.83 0.00 0.01 1.81 1.84 1965 1.00
## ppm_future[1623] 1.82 0.00 0.01 1.81 1.84 1609 1.00
## ppm_future[1624] 1.82 0.00 0.01 1.80 1.84 1962 1.00
## ppm_future[1625] 1.82 0.00 0.01 1.80 1.84 1803 1.00
## ppm_future[1626] 1.82 0.00 0.01 1.80 1.83 1914 1.00
## ppm_future[1627] 1.82 0.00 0.01 1.80 1.83 1877 1.00
## ppm_future[1628] 1.82 0.00 0.01 1.80 1.83 1879 1.00
## ppm_future[1629] 1.82 0.00 0.01 1.80 1.83 1750 1.00
## ppm_future[1630] 1.82 0.00 0.01 1.80 1.83 1995 1.00
## ppm_future[1631] 1.82 0.00 0.01 1.80 1.83 2000 1.00
## ppm_future[1632] 1.82 0.00 0.01 1.80 1.83 1726 1.00
## ppm_future[1633] 1.82 0.00 0.01 1.80 1.84 1521 1.00
## ppm_future[1634] 1.82 0.00 0.01 1.80 1.84 1740 1.00
## ppm_future[1635] 1.82 0.00 0.01 1.81 1.84 2000 1.00
## ppm_future[1636] 1.82 0.00 0.01 1.81 1.84 1869 1.00
## ppm_future[1637] 1.83 0.00 0.01 1.81 1.85 1858 1.00
## ppm_future[1638] 1.83 0.00 0.01 1.82 1.85 1790 1.00
## ppm_future[1639] 1.84 0.00 0.01 1.82 1.85 1973 1.00
## ppm_future[1640] 1.84 0.00 0.01 1.82 1.86 2000 1.00
## ppm_future[1641] 1.84 0.00 0.01 1.83 1.86 1808 1.00
## ppm_future[1642] 1.85 0.00 0.01 1.83 1.86 1911 1.00
## ppm_future[1643] 1.85 0.00 0.01 1.84 1.87 1942 1.00
## ppm_future[1644] 1.86 0.00 0.01 1.84 1.87 1729 1.00
## ppm_future[1645] 1.86 0.00 0.01 1.84 1.88 1854 1.00
## ppm_future[1646] 1.86 0.00 0.01 1.85 1.88 1871 1.00
## ppm_future[1647] 1.87 0.00 0.01 1.85 1.89 1735 1.00
## ppm_future[1648] 1.87 0.00 0.01 1.86 1.89 2000 1.00
## ppm_future[1649] 1.88 0.00 0.01 1.86 1.89 1943 1.00
## ppm_future[1650] 1.88 0.00 0.01 1.86 1.90 2000 1.00
## ppm_future[1651] 1.88 0.00 0.01 1.87 1.90 1921 1.00
## ppm_future[1652] 1.88 0.00 0.01 1.87 1.90 2000 1.00
## ppm_future[1653] 1.89 0.00 0.01 1.87 1.90 1700 1.00
## ppm_future[1654] 1.89 0.00 0.01 1.87 1.91 1650 1.00
## ppm_future[1655] 1.89 0.00 0.01 1.87 1.91 1795 1.00
## ppm_future[1656] 1.89 0.00 0.01 1.87 1.91 1785 1.00
## ppm_future[1657] 1.89 0.00 0.01 1.87 1.91 1896 1.00
## ppm_future[1658] 1.89 0.00 0.01 1.87 1.91 1894 1.00
## ppm_future[1659] 1.89 0.00 0.01 1.87 1.91 1856 1.00
## ppm_future[1660] 1.89 0.00 0.01 1.87 1.91 2000 1.00
## ppm_future[1661] 1.89 0.00 0.01 1.87 1.91 1946 1.00
## ppm_future[1662] 1.89 0.00 0.01 1.87 1.90 1466 1.00
## ppm_future[1663] 1.89 0.00 0.01 1.87 1.90 1632 1.00
## ppm_future[1664] 1.88 0.00 0.01 1.87 1.90 2000 1.00
## ppm_future[1665] 1.88 0.00 0.01 1.86 1.90 1952 1.00
## ppm_future[1666] 1.88 0.00 0.01 1.86 1.89 1925 1.00
## ppm_future[1667] 1.88 0.00 0.01 1.86 1.89 1875 1.00
## ppm_future[1668] 1.87 0.00 0.01 1.86 1.89 1877 1.00
## ppm_future[1669] 1.87 0.00 0.01 1.85 1.89 1914 1.00
## ppm_future[1670] 1.87 0.00 0.01 1.85 1.88 1828 1.00
## ppm_future[1671] 1.86 0.00 0.01 1.85 1.88 1928 1.00
## ppm_future[1672] 1.86 0.00 0.01 1.84 1.88 1742 1.00
## ppm_future[1673] 1.86 0.00 0.01 1.84 1.88 2000 1.00
## ppm_future[1674] 1.86 0.00 0.01 1.84 1.87 1948 1.00
## ppm_future[1675] 1.85 0.00 0.01 1.84 1.87 1728 1.00
## ppm_future[1676] 1.85 0.00 0.01 1.84 1.87 1904 1.00
## ppm_future[1677] 1.85 0.00 0.01 1.83 1.87 2000 1.00
## ppm_future[1678] 1.85 0.00 0.01 1.83 1.87 1846 1.00
## ppm_future[1679] 1.85 0.00 0.01 1.83 1.86 1908 1.00
## ppm_future[1680] 1.85 0.00 0.01 1.83 1.86 1703 1.00
## ppm_future[1681] 1.85 0.00 0.01 1.83 1.86 2000 1.00
## ppm_future[1682] 1.85 0.00 0.01 1.83 1.87 1713 1.00
## ppm_future[1683] 1.85 0.00 0.01 1.83 1.87 1865 1.00
## ppm_future[1684] 1.85 0.00 0.01 1.83 1.87 1488 1.00
## ppm_future[1685] 1.85 0.00 0.01 1.84 1.87 1780 1.00
## ppm_future[1686] 1.85 0.00 0.01 1.84 1.87 1821 1.00
## ppm_future[1687] 1.86 0.00 0.01 1.84 1.87 1882 1.00
## ppm_future[1688] 1.86 0.00 0.01 1.84 1.88 1779 1.00
## ppm_future[1689] 1.86 0.00 0.01 1.85 1.88 1984 1.00
## ppm_future[1690] 1.87 0.00 0.01 1.85 1.88 1634 1.00
## ppm_future[1691] 1.87 0.00 0.01 1.85 1.89 1981 1.00
## ppm_future[1692] 1.88 0.00 0.01 1.86 1.89 1847 1.00
## ppm_future[1693] 1.88 0.00 0.01 1.86 1.90 1707 1.00
## ppm_future[1694] 1.88 0.00 0.01 1.87 1.90 2000 1.00
## ppm_future[1695] 1.89 0.00 0.01 1.87 1.91 1612 1.00
## ppm_future[1696] 1.89 0.00 0.01 1.87 1.91 1937 1.00
## ppm_future[1697] 1.90 0.00 0.01 1.88 1.91 1899 1.00
## ppm_future[1698] 1.90 0.00 0.01 1.88 1.92 1771 1.00
## ppm_future[1699] 1.90 0.00 0.01 1.89 1.92 1722 1.00
## ppm_future[1700] 1.91 0.00 0.01 1.89 1.92 1820 1.00
## ppm_future[1701] 1.91 0.00 0.01 1.89 1.93 1976 1.00
## ppm_future[1702] 1.91 0.00 0.01 1.90 1.93 1833 1.00
## ppm_future[1703] 1.92 0.00 0.01 1.90 1.93 1555 1.00
## ppm_future[1704] 1.92 0.00 0.01 1.90 1.94 2000 1.00
## ppm_future[1705] 1.92 0.00 0.01 1.90 1.94 1918 1.00
## ppm_future[1706] 1.92 0.00 0.01 1.91 1.94 1831 1.00
## ppm_future[1707] 1.92 0.00 0.01 1.91 1.94 1682 1.00
## ppm_future[1708] 1.92 0.00 0.01 1.91 1.94 1800 1.00
## ppm_future[1709] 1.92 0.00 0.01 1.91 1.94 1597 1.00
## ppm_future[1710] 1.92 0.00 0.01 1.91 1.94 1881 1.00
## ppm_future[1711] 1.92 0.00 0.01 1.91 1.94 1715 1.00
## ppm_future[1712] 1.92 0.00 0.01 1.91 1.94 1797 1.00
## ppm_future[1713] 1.92 0.00 0.01 1.90 1.94 1938 1.00
## ppm_future[1714] 1.92 0.00 0.01 1.90 1.93 2000 1.00
## ppm_future[1715] 1.92 0.00 0.01 1.90 1.93 1788 1.00
## ppm_future[1716] 1.91 0.00 0.01 1.90 1.93 2000 1.00
## ppm_future[1717] 1.91 0.00 0.01 1.89 1.93 1783 1.00
## ppm_future[1718] 1.91 0.00 0.01 1.89 1.92 1831 1.00
## ppm_future[1719] 1.90 0.00 0.01 1.89 1.92 1927 1.00
## ppm_future[1720] 1.90 0.00 0.01 1.88 1.92 1890 1.00
## ppm_future[1721] 1.90 0.00 0.01 1.88 1.92 1737 1.00
## ppm_future[1722] 1.90 0.00 0.01 1.88 1.91 1729 1.00
## ppm_future[1723] 1.89 0.00 0.01 1.88 1.91 1733 1.00
## ppm_future[1724] 1.89 0.00 0.01 1.87 1.91 1858 1.00
## ppm_future[1725] 1.89 0.00 0.01 1.87 1.90 1835 1.00
## ppm_future[1726] 1.89 0.00 0.01 1.87 1.90 1893 1.00
## ppm_future[1727] 1.88 0.00 0.01 1.87 1.90 1769 1.00
## ppm_future[1728] 1.88 0.00 0.01 1.87 1.90 1951 1.00
## ppm_future[1729] 1.88 0.00 0.01 1.86 1.90 1739 1.00
## ppm_future[1730] 1.88 0.00 0.01 1.86 1.90 1984 1.00
## ppm_future[1731] 1.88 0.00 0.01 1.86 1.90 1899 1.00
## ppm_future[1732] 1.88 0.00 0.01 1.86 1.90 1837 1.00
## ppm_future[1733] 1.88 0.00 0.01 1.86 1.90 1576 1.00
## ppm_future[1734] 1.88 0.00 0.01 1.87 1.90 1932 1.00
## ppm_future[1735] 1.88 0.00 0.01 1.87 1.90 1665 1.00
## ppm_future[1736] 1.88 0.00 0.01 1.87 1.90 1921 1.00
## ppm_future[1737] 1.89 0.00 0.01 1.87 1.90 1818 1.00
## ppm_future[1738] 1.89 0.00 0.01 1.87 1.91 1880 1.00
## ppm_future[1739] 1.89 0.00 0.01 1.88 1.91 1935 1.00
## ppm_future[1740] 1.90 0.00 0.01 1.88 1.91 2000 1.00
## ppm_future[1741] 1.90 0.00 0.01 1.88 1.92 1855 1.00
## ppm_future[1742] 1.90 0.00 0.01 1.89 1.92 1857 1.00
## ppm_future[1743] 1.91 0.00 0.01 1.89 1.92 1904 1.00
## ppm_future[1744] 1.91 0.00 0.01 1.89 1.93 1916 1.00
## ppm_future[1745] 1.92 0.00 0.01 1.90 1.93 1759 1.00
## ppm_future[1746] 1.92 0.00 0.01 1.90 1.94 1827 1.00
## ppm_future[1747] 1.92 0.00 0.01 1.91 1.94 1406 1.00
## ppm_future[1748] 1.93 0.00 0.01 1.91 1.95 1918 1.00
## ppm_future[1749] 1.93 0.00 0.01 1.91 1.95 2000 1.00
## ppm_future[1750] 1.94 0.00 0.01 1.92 1.95 1595 1.00
## ppm_future[1751] 1.94 0.00 0.01 1.92 1.96 2000 1.00
## ppm_future[1752] 1.94 0.00 0.01 1.93 1.96 2000 1.00
## ppm_future[1753] 1.95 0.00 0.01 1.93 1.96 2000 1.00
## ppm_future[1754] 1.95 0.00 0.01 1.93 1.97 1752 1.00
## ppm_future[1755] 1.95 0.00 0.01 1.93 1.97 1708 1.00
## ppm_future[1756] 1.95 0.00 0.01 1.94 1.97 1831 1.00
## ppm_future[1757] 1.95 0.00 0.01 1.94 1.97 1553 1.00
## ppm_future[1758] 1.96 0.00 0.01 1.94 1.97 1638 1.00
## ppm_future[1759] 1.96 0.00 0.01 1.94 1.97 1912 1.00
## ppm_future[1760] 1.96 0.00 0.01 1.94 1.97 1939 1.00
## ppm_future[1761] 1.96 0.00 0.01 1.94 1.97 1973 1.00
## ppm_future[1762] 1.96 0.00 0.01 1.94 1.97 1706 1.00
## ppm_future[1763] 1.95 0.00 0.01 1.94 1.97 1950 1.00
## ppm_future[1764] 1.95 0.00 0.01 1.94 1.97 1608 1.00
## ppm_future[1765] 1.95 0.00 0.01 1.93 1.97 1767 1.00
## ppm_future[1766] 1.95 0.00 0.01 1.93 1.96 1897 1.00
## ppm_future[1767] 1.95 0.00 0.01 1.93 1.96 1801 1.00
## ppm_future[1768] 1.94 0.00 0.01 1.93 1.96 1624 1.00
## ppm_future[1769] 1.94 0.00 0.01 1.92 1.96 2000 1.00
## ppm_future[1770] 1.94 0.00 0.01 1.92 1.95 2000 1.00
## ppm_future[1771] 1.93 0.00 0.01 1.92 1.95 1924 1.00
## ppm_future[1772] 1.93 0.00 0.01 1.91 1.95 1833 1.00
## ppm_future[1773] 1.93 0.00 0.01 1.91 1.95 1930 1.00
## ppm_future[1774] 1.93 0.00 0.01 1.91 1.94 2000 1.00
## ppm_future[1775] 1.92 0.00 0.01 1.91 1.94 2000 1.00
## ppm_future[1776] 1.92 0.00 0.01 1.90 1.94 1894 1.00
## ppm_future[1777] 1.92 0.00 0.01 1.90 1.94 2000 1.00
## ppm_future[1778] 1.92 0.00 0.01 1.90 1.93 1708 1.00
## ppm_future[1779] 1.91 0.00 0.01 1.90 1.93 1764 1.00
## ppm_future[1780] 1.91 0.00 0.01 1.90 1.93 1909 1.00
## ppm_future[1781] 1.91 0.00 0.01 1.90 1.93 1804 1.00
## ppm_future[1782] 1.91 0.00 0.01 1.90 1.93 1941 1.00
## ppm_future[1783] 1.91 0.00 0.01 1.90 1.93 1756 1.00
## ppm_future[1784] 1.91 0.00 0.01 1.90 1.93 1950 1.00
## ppm_future[1785] 1.91 0.00 0.01 1.90 1.93 1845 1.00
## ppm_future[1786] 1.92 0.00 0.01 1.90 1.93 1609 1.00
## ppm_future[1787] 1.92 0.00 0.01 1.90 1.94 1904 1.00
## ppm_future[1788] 1.92 0.00 0.01 1.90 1.94 1888 1.00
## ppm_future[1789] 1.92 0.00 0.01 1.91 1.94 1792 1.00
## ppm_future[1790] 1.93 0.00 0.01 1.91 1.94 1703 1.00
## ppm_future[1791] 1.93 0.00 0.01 1.91 1.95 1401 1.00
## ppm_future[1792] 1.93 0.00 0.01 1.92 1.95 1733 1.00
## ppm_future[1793] 1.94 0.00 0.01 1.92 1.95 1796 1.00
## ppm_future[1794] 1.94 0.00 0.01 1.92 1.96 2000 1.00
## ppm_future[1795] 1.94 0.00 0.01 1.93 1.96 1769 1.00
## ppm_future[1796] 1.95 0.00 0.01 1.93 1.97 1772 1.00
## ppm_future[1797] 1.95 0.00 0.01 1.94 1.97 1874 1.00
## ppm_future[1798] 1.96 0.00 0.01 1.94 1.97 1690 1.00
## ppm_future[1799] 1.96 0.00 0.01 1.94 1.98 1856 1.00
## ppm_future[1800] 1.97 0.00 0.01 1.95 1.98 1760 1.00
## ppm_future[1801] 1.97 0.00 0.01 1.95 1.99 1898 1.00
## ppm_future[1802] 1.97 0.00 0.01 1.95 1.99 2000 1.00
## ppm_future[1803] 1.98 0.00 0.01 1.96 1.99 1897 1.00
## ppm_future[1804] 1.98 0.00 0.01 1.96 2.00 2000 1.00
## ppm_future[1805] 1.98 0.00 0.01 1.96 2.00 1893 1.00
## ppm_future[1806] 1.98 0.00 0.01 1.97 2.00 1742 1.00
## ppm_future[1807] 1.99 0.00 0.01 1.97 2.00 1854 1.00
## ppm_future[1808] 1.99 0.00 0.01 1.97 2.00 1751 1.00
## ppm_future[1809] 1.99 0.00 0.01 1.97 2.00 2000 1.00
## ppm_future[1810] 1.99 0.00 0.01 1.97 2.01 1689 1.00
## ppm_future[1811] 1.99 0.00 0.01 1.97 2.01 1910 1.00
## ppm_future[1812] 1.99 0.00 0.01 1.97 2.01 2000 1.00
## ppm_future[1813] 1.99 0.00 0.01 1.97 2.00 1939 1.00
## ppm_future[1814] 1.99 0.00 0.01 1.97 2.00 1883 1.00
## ppm_future[1815] 1.98 0.00 0.01 1.97 2.00 2000 1.00
## ppm_future[1816] 1.98 0.00 0.01 1.97 2.00 2000 1.00
## ppm_future[1817] 1.98 0.00 0.01 1.96 2.00 1673 1.00
## ppm_future[1818] 1.98 0.00 0.01 1.96 2.00 1843 1.00
## ppm_future[1819] 1.98 0.00 0.01 1.96 1.99 1824 1.00
## ppm_future[1820] 1.97 0.00 0.01 1.96 1.99 1894 1.00
## ppm_future[1821] 1.97 0.00 0.01 1.95 1.99 1757 1.00
## ppm_future[1822] 1.97 0.00 0.01 1.95 1.98 2000 1.00
## ppm_future[1823] 1.96 0.00 0.01 1.95 1.98 1813 1.00
## ppm_future[1824] 1.96 0.00 0.01 1.94 1.98 2000 1.00
## ppm_future[1825] 1.96 0.00 0.01 1.94 1.98 1903 1.00
## ppm_future[1826] 1.96 0.00 0.01 1.94 1.97 2000 1.00
## ppm_future[1827] 1.95 0.00 0.01 1.94 1.97 2000 1.00
## ppm_future[1828] 1.95 0.00 0.01 1.93 1.97 1762 1.00
## ppm_future[1829] 1.95 0.00 0.01 1.93 1.97 1968 1.00
## ppm_future[1830] 1.95 0.00 0.01 1.93 1.96 1903 1.00
## ppm_future[1831] 1.95 0.00 0.01 1.93 1.96 1758 1.00
## ppm_future[1832] 1.95 0.00 0.01 1.93 1.96 1727 1.00
## ppm_future[1833] 1.95 0.00 0.01 1.93 1.96 1877 1.00
## ppm_future[1834] 1.95 0.00 0.01 1.93 1.96 1515 1.00
## ppm_future[1835] 1.95 0.00 0.01 1.93 1.96 1975 1.00
## ppm_future[1836] 1.95 0.00 0.01 1.93 1.96 2000 1.00
## ppm_future[1837] 1.95 0.00 0.01 1.93 1.97 1757 1.00
## ppm_future[1838] 1.95 0.00 0.01 1.93 1.97 1691 1.00
## ppm_future[1839] 1.95 0.00 0.01 1.94 1.97 1986 1.00
## ppm_future[1840] 1.96 0.00 0.01 1.94 1.97 1599 1.00
## ppm_future[1841] 1.96 0.00 0.01 1.94 1.98 1596 1.00
## ppm_future[1842] 1.96 0.00 0.01 1.94 1.98 1652 1.00
## ppm_future[1843] 1.97 0.00 0.01 1.95 1.98 1912 1.00
## ppm_future[1844] 1.97 0.00 0.01 1.95 1.99 1951 1.00
## ppm_future[1845] 1.97 0.00 0.01 1.96 1.99 2000 1.00
## ppm_future[1846] 1.98 0.00 0.01 1.96 1.99 1818 1.00
## ppm_future[1847] 1.98 0.00 0.01 1.96 2.00 1932 1.00
## ppm_future[1848] 1.99 0.00 0.01 1.97 2.00 1798 1.00
## ppm_future[1849] 1.99 0.00 0.01 1.97 2.01 2000 1.00
## ppm_future[1850] 1.99 0.00 0.01 1.98 2.01 1790 1.00
## ppm_future[1851] 2.00 0.00 0.01 1.98 2.02 1821 1.00
## ppm_future[1852] 2.00 0.00 0.01 1.98 2.02 1651 1.00
## ppm_future[1853] 2.01 0.00 0.01 1.99 2.02 1647 1.00
## ppm_future[1854] 2.01 0.00 0.01 1.99 2.03 1938 1.00
## ppm_future[1855] 2.01 0.00 0.01 1.99 2.03 1702 1.00
## ppm_future[1856] 2.01 0.00 0.01 2.00 2.03 1705 1.00
## ppm_future[1857] 2.02 0.00 0.01 2.00 2.03 1874 1.00
## ppm_future[1858] 2.02 0.00 0.01 2.00 2.04 1388 1.00
## ppm_future[1859] 2.02 0.00 0.01 2.00 2.04 2000 1.00
## ppm_future[1860] 2.02 0.00 0.01 2.00 2.04 1745 1.00
## ppm_future[1861] 2.02 0.00 0.01 2.00 2.04 1597 1.00
## ppm_future[1862] 2.02 0.00 0.01 2.00 2.04 1894 1.00
## ppm_future[1863] 2.02 0.00 0.01 2.00 2.04 1652 1.00
## ppm_future[1864] 2.02 0.00 0.01 2.00 2.04 1731 1.00
## ppm_future[1865] 2.02 0.00 0.01 2.00 2.04 1811 1.00
## ppm_future[1866] 2.02 0.00 0.01 2.00 2.03 1730 1.00
## ppm_future[1867] 2.02 0.00 0.01 2.00 2.03 1815 1.00
## ppm_future[1868] 2.01 0.00 0.01 2.00 2.03 1773 1.00
## ppm_future[1869] 2.01 0.00 0.01 1.99 2.03 1728 1.00
## ppm_future[1870] 2.01 0.00 0.01 1.99 2.03 2000 1.00
## ppm_future[1871] 2.01 0.00 0.01 1.99 2.02 1906 1.00
## ppm_future[1872] 2.00 0.00 0.01 1.99 2.02 2000 1.00
## ppm_future[1873] 2.00 0.00 0.01 1.98 2.02 1502 1.00
## ppm_future[1874] 2.00 0.00 0.01 1.98 2.01 1732 1.00
## ppm_future[1875] 1.99 0.00 0.01 1.98 2.01 1343 1.00
## ppm_future[1876] 1.99 0.00 0.01 1.97 2.01 1736 1.00
## ppm_future[1877] 1.99 0.00 0.01 1.97 2.01 1574 1.00
## ppm_future[1878] 1.99 0.00 0.01 1.97 2.00 1803 1.00
## ppm_future[1879] 1.98 0.00 0.01 1.97 2.00 1861 1.00
## ppm_future[1880] 1.98 0.00 0.01 1.97 2.00 1893 1.00
## ppm_future[1881] 1.98 0.00 0.01 1.96 2.00 2000 1.00
## ppm_future[1882] 1.98 0.00 0.01 1.96 2.00 1865 1.00
## ppm_future[1883] 1.98 0.00 0.01 1.96 2.00 1907 1.00
## ppm_future[1884] 1.98 0.00 0.01 1.96 2.00 1510 1.00
## ppm_future[1885] 1.98 0.00 0.01 1.96 2.00 1860 1.00
## ppm_future[1886] 1.98 0.00 0.01 1.96 2.00 1753 1.00
## ppm_future[1887] 1.98 0.00 0.01 1.96 2.00 1646 1.00
## ppm_future[1888] 1.98 0.00 0.01 1.96 2.00 1825 1.00
## ppm_future[1889] 1.98 0.00 0.01 1.97 2.00 1564 1.00
## ppm_future[1890] 1.99 0.00 0.01 1.97 2.00 1503 1.00
## ppm_future[1891] 1.99 0.00 0.01 1.97 2.00 1740 1.00
## ppm_future[1892] 1.99 0.00 0.01 1.97 2.01 1760 1.00
## ppm_future[1893] 2.00 0.00 0.01 1.98 2.01 1886 1.00
## ppm_future[1894] 2.00 0.00 0.01 1.98 2.02 1945 1.00
## ppm_future[1895] 2.00 0.00 0.01 1.98 2.02 2000 1.00
## ppm_future[1896] 2.01 0.00 0.01 1.99 2.02 1681 1.00
## ppm_future[1897] 2.01 0.00 0.01 1.99 2.03 1541 1.00
## ppm_future[1898] 2.01 0.00 0.01 2.00 2.03 1827 1.00
## ppm_future[1899] 2.02 0.00 0.01 2.00 2.04 1990 1.00
## ppm_future[1900] 2.02 0.00 0.01 2.01 2.04 1878 1.00
## ppm_future[1901] 2.03 0.00 0.01 2.01 2.04 1669 1.00
## ppm_future[1902] 2.03 0.00 0.01 2.01 2.05 1738 1.00
## ppm_future[1903] 2.04 0.00 0.01 2.02 2.05 1938 1.00
## ppm_future[1904] 2.04 0.00 0.01 2.02 2.06 1826 1.00
## ppm_future[1905] 2.04 0.00 0.01 2.03 2.06 1769 1.00
## ppm_future[1906] 2.05 0.00 0.01 2.03 2.06 1865 1.00
## ppm_future[1907] 2.05 0.00 0.01 2.03 2.07 1813 1.00
## ppm_future[1908] 2.05 0.00 0.01 2.03 2.07 1569 1.00
## ppm_future[1909] 2.05 0.00 0.01 2.04 2.07 1709 1.00
## ppm_future[1910] 2.05 0.00 0.01 2.04 2.07 1693 1.00
## ppm_future[1911] 2.06 0.00 0.01 2.04 2.07 1602 1.00
## ppm_future[1912] 2.05 0.00 0.01 2.04 2.07 1984 1.00
## ppm_future[1913] 2.06 0.00 0.01 2.04 2.07 1738 1.00
## ppm_future[1914] 2.05 0.00 0.01 2.04 2.07 1753 1.00
## ppm_future[1915] 2.05 0.00 0.01 2.04 2.07 1835 1.00
## ppm_future[1916] 2.05 0.00 0.01 2.04 2.07 1522 1.00
## ppm_future[1917] 2.05 0.00 0.01 2.03 2.07 1795 1.00
## ppm_future[1918] 2.05 0.00 0.01 2.03 2.07 1776 1.00
## ppm_future[1919] 2.05 0.00 0.01 2.03 2.06 1780 1.00
## ppm_future[1920] 2.04 0.00 0.01 2.03 2.06 1959 1.00
## ppm_future[1921] 2.04 0.00 0.01 2.02 2.06 1628 1.00
## ppm_future[1922] 2.04 0.00 0.01 2.02 2.06 1656 1.00
## ppm_future[1923] 2.04 0.00 0.01 2.02 2.05 1739 1.00
## ppm_future[1924] 2.03 0.00 0.01 2.02 2.05 1843 1.00
## ppm_future[1925] 2.03 0.00 0.01 2.01 2.05 1907 1.00
## ppm_future[1926] 2.03 0.00 0.01 2.01 2.04 1705 1.00
## ppm_future[1927] 2.02 0.00 0.01 2.01 2.04 1747 1.00
## ppm_future[1928] 2.02 0.00 0.01 2.00 2.04 2000 1.00
## ppm_future[1929] 2.02 0.00 0.01 2.00 2.04 1682 1.00
## ppm_future[1930] 2.02 0.00 0.01 2.00 2.04 1726 1.00
## ppm_future[1931] 2.02 0.00 0.01 2.00 2.03 1653 1.00
## ppm_future[1932] 2.01 0.00 0.01 2.00 2.03 1721 1.00
## ppm_future[1933] 2.01 0.00 0.01 2.00 2.03 1828 1.00
## ppm_future[1934] 2.01 0.00 0.01 2.00 2.03 1984 1.00
## ppm_future[1935] 2.01 0.00 0.01 2.00 2.03 1869 1.00
## ppm_future[1936] 2.01 0.00 0.01 2.00 2.03 1871 1.00
## ppm_future[1937] 2.01 0.00 0.01 2.00 2.03 2000 1.00
## ppm_future[1938] 2.01 0.00 0.01 2.00 2.03 1844 1.00
## ppm_future[1939] 2.02 0.00 0.01 2.00 2.03 1747 1.00
## ppm_future[1940] 2.02 0.00 0.01 2.00 2.03 1924 1.00
## ppm_future[1941] 2.02 0.00 0.01 2.00 2.04 1790 1.00
## ppm_future[1942] 2.02 0.00 0.01 2.00 2.04 2000 1.00
## ppm_future[1943] 2.02 0.00 0.01 2.01 2.04 1770 1.00
## ppm_future[1944] 2.03 0.00 0.01 2.01 2.04 2000 1.00
## ppm_future[1945] 2.03 0.00 0.01 2.02 2.05 1693 1.00
## ppm_future[1946] 2.04 0.00 0.01 2.02 2.05 1845 1.00
## ppm_future[1947] 2.04 0.00 0.01 2.02 2.06 1710 1.00
## ppm_future[1948] 2.04 0.00 0.01 2.03 2.06 1854 1.00
## ppm_future[1949] 2.05 0.00 0.01 2.03 2.07 1831 1.00
## ppm_future[1950] 2.05 0.00 0.01 2.04 2.07 1728 1.00
## ppm_future[1951] 2.06 0.00 0.01 2.04 2.07 1685 1.00
## ppm_future[1952] 2.06 0.00 0.01 2.04 2.08 1734 1.00
## ppm_future[1953] 2.06 0.00 0.01 2.05 2.08 1639 1.00
## ppm_future[1954] 2.07 0.00 0.01 2.05 2.09 1459 1.00
## ppm_future[1955] 2.07 0.00 0.01 2.06 2.09 2000 1.00
## ppm_future[1956] 2.08 0.00 0.01 2.06 2.09 1667 1.00
## ppm_future[1957] 2.08 0.00 0.01 2.06 2.10 1718 1.00
## ppm_future[1958] 2.08 0.00 0.01 2.06 2.10 1573 1.00
## ppm_future[1959] 2.08 0.00 0.01 2.07 2.10 2000 1.00
## ppm_future[1960] 2.09 0.00 0.01 2.07 2.10 1864 1.00
## ppm_future[1961] 2.09 0.00 0.01 2.07 2.10 1744 1.00
## ppm_future[1962] 2.09 0.00 0.01 2.07 2.10 1662 1.00
## ppm_future[1963] 2.09 0.00 0.01 2.07 2.11 1935 1.00
## ppm_future[1964] 2.09 0.00 0.01 2.07 2.11 1732 1.00
## ppm_future[1965] 2.09 0.00 0.01 2.07 2.10 1746 1.00
## ppm_future[1966] 2.09 0.00 0.01 2.07 2.10 1856 1.00
## ppm_future[1967] 2.09 0.00 0.01 2.07 2.10 2000 1.00
## ppm_future[1968] 2.08 0.00 0.01 2.07 2.10 1738 1.00
## ppm_future[1969] 2.08 0.00 0.01 2.06 2.10 1747 1.00
## ppm_future[1970] 2.08 0.00 0.01 2.06 2.10 1890 1.00
## ppm_future[1971] 2.08 0.00 0.01 2.06 2.10 1695 1.00
## ppm_future[1972] 2.08 0.00 0.01 2.06 2.09 1859 1.00
## ppm_future[1973] 2.07 0.00 0.01 2.06 2.09 1750 1.00
## ppm_future[1974] 2.07 0.00 0.01 2.05 2.09 1742 1.00
## ppm_future[1975] 2.07 0.00 0.01 2.05 2.08 1900 1.00
## ppm_future[1976] 2.06 0.00 0.01 2.05 2.08 1602 1.00
## ppm_future[1977] 2.06 0.00 0.01 2.04 2.08 2000 1.00
## ppm_future[1978] 2.06 0.00 0.01 2.04 2.08 1745 1.00
## ppm_future[1979] 2.06 0.00 0.01 2.04 2.07 1869 1.00
## ppm_future[1980] 2.05 0.00 0.01 2.04 2.07 1465 1.00
## ppm_future[1981] 2.05 0.00 0.01 2.03 2.07 1993 1.00
## ppm_future[1982] 2.05 0.00 0.01 2.03 2.07 1853 1.00
## ppm_future[1983] 2.05 0.00 0.01 2.03 2.07 2000 1.00
## ppm_future[1984] 2.05 0.00 0.01 2.03 2.06 2000 1.00
## ppm_future[1985] 2.05 0.00 0.01 2.03 2.06 1926 1.00
## ppm_future[1986] 2.05 0.00 0.01 2.03 2.06 1886 1.00
## ppm_future[1987] 2.05 0.00 0.01 2.03 2.06 1836 1.00
## ppm_future[1988] 2.05 0.00 0.01 2.03 2.06 1818 1.00
## ppm_future[1989] 2.05 0.00 0.01 2.03 2.06 1634 1.00
## ppm_future[1990] 2.05 0.00 0.01 2.03 2.07 1781 1.00
## ppm_future[1991] 2.05 0.00 0.01 2.03 2.07 1866 1.00
## ppm_future[1992] 2.05 0.00 0.01 2.04 2.07 1605 1.00
## ppm_future[1993] 2.06 0.00 0.01 2.04 2.07 1823 1.00
## ppm_future[1994] 2.06 0.00 0.01 2.04 2.07 2000 1.00
## ppm_future[1995] 2.06 0.00 0.01 2.04 2.08 1651 1.00
## ppm_future[1996] 2.07 0.00 0.01 2.05 2.08 1583 1.00
## ppm_future[1997] 2.07 0.00 0.01 2.05 2.09 1672 1.00
## ppm_future[1998] 2.07 0.00 0.01 2.06 2.09 1744 1.00
## ppm_future[1999] 2.08 0.00 0.01 2.06 2.09 1674 1.00
## ppm_future[2000] 2.08 0.00 0.01 2.07 2.10 1758 1.00
## ppm_future[2001] 2.09 0.00 0.01 2.07 2.10 1765 1.00
## ppm_future[2002] 2.09 0.00 0.01 2.07 2.11 1868 1.00
## ppm_future[2003] 2.09 0.00 0.01 2.08 2.11 1733 1.00
## ppm_future[2004] 2.10 0.00 0.01 2.08 2.12 1686 1.00
## ppm_future[2005] 2.10 0.00 0.01 2.08 2.12 1691 1.00
## ppm_future[2006] 2.11 0.00 0.01 2.09 2.12 1640 1.00
## ppm_future[2007] 2.11 0.00 0.01 2.09 2.13 1952 1.00
## ppm_future[2008] 2.11 0.00 0.01 2.10 2.13 1725 1.00
## ppm_future[2009] 2.12 0.00 0.01 2.10 2.13 1827 1.00
## ppm_future[2010] 2.12 0.00 0.01 2.10 2.13 1888 1.00
## ppm_future[2011] 2.12 0.00 0.01 2.10 2.14 1865 1.00
## ppm_future[2012] 2.12 0.00 0.01 2.10 2.14 1814 1.00
## ppm_future[2013] 2.12 0.00 0.01 2.10 2.14 1958 1.00
## ppm_future[2014] 2.12 0.00 0.01 2.11 2.14 1721 1.00
## ppm_future[2015] 2.12 0.00 0.01 2.10 2.14 1673 1.00
## ppm_future[2016] 2.12 0.00 0.01 2.11 2.14 1900 1.00
## ppm_future[2017] 2.12 0.00 0.01 2.10 2.14 1743 1.00
## ppm_future[2018] 2.12 0.00 0.01 2.10 2.14 1760 1.00
## ppm_future[2019] 2.12 0.00 0.01 2.10 2.14 1771 1.00
## ppm_future[2020] 2.12 0.00 0.01 2.10 2.13 1825 1.00
## ppm_future[2021] 2.11 0.00 0.01 2.10 2.13 1711 1.00
## ppm_future[2022] 2.11 0.00 0.01 2.10 2.13 1540 1.00
## ppm_future[2023] 2.11 0.00 0.01 2.09 2.13 1704 1.00
## ppm_future[2024] 2.11 0.00 0.01 2.09 2.12 1822 1.00
## ppm_future[2025] 2.10 0.00 0.01 2.09 2.12 1598 1.00
## ppm_future[2026] 2.10 0.00 0.01 2.08 2.12 1943 1.00
## ppm_future[2027] 2.10 0.00 0.01 2.08 2.12 2000 1.00
## ppm_future[2028] 2.09 0.00 0.01 2.08 2.11 1596 1.00
## ppm_future[2029] 2.09 0.00 0.01 2.08 2.11 1652 1.00
## ppm_future[2030] 2.09 0.00 0.01 2.07 2.11 1501 1.00
## ppm_future[2031] 2.09 0.00 0.01 2.07 2.10 1716 1.00
## ppm_future[2032] 2.09 0.00 0.01 2.07 2.10 1846 1.00
## ppm_future[2033] 2.08 0.00 0.01 2.07 2.10 1816 1.00
## ppm_future[2034] 2.08 0.00 0.01 2.06 2.10 1740 1.00
## ppm_future[2035] 2.08 0.00 0.01 2.06 2.10 1891 1.00
## ppm_future[2036] 2.08 0.00 0.01 2.06 2.10 1808 1.00
## ppm_future[2037] 2.08 0.00 0.01 2.06 2.10 1640 1.00
## ppm_future[2038] 2.08 0.00 0.01 2.06 2.10 1616 1.00
## ppm_future[2039] 2.08 0.00 0.01 2.06 2.10 1681 1.00
## ppm_future[2040] 2.08 0.00 0.01 2.07 2.10 1607 1.00
## ppm_future[2041] 2.08 0.00 0.01 2.07 2.10 1790 1.00
## ppm_future[2042] 2.08 0.00 0.01 2.07 2.10 1810 1.00
## ppm_future[2043] 2.09 0.00 0.01 2.07 2.10 1785 1.00
## ppm_future[2044] 2.09 0.00 0.01 2.07 2.11 1658 1.00
## ppm_future[2045] 2.09 0.00 0.01 2.07 2.11 1909 1.00
## ppm_future[2046] 2.10 0.00 0.01 2.08 2.11 1657 1.00
## ppm_future[2047] 2.10 0.00 0.01 2.08 2.12 1736 1.00
## ppm_future[2048] 2.10 0.00 0.01 2.09 2.12 1489 1.00
## ppm_future[2049] 2.11 0.00 0.01 2.09 2.12 1834 1.00
## ppm_future[2050] 2.11 0.00 0.01 2.09 2.13 1907 1.00
## ppm_future[2051] 2.12 0.00 0.01 2.10 2.13 2000 1.00
## ppm_future[2052] 2.12 0.00 0.01 2.10 2.14 1790 1.00
## ppm_future[2053] 2.12 0.00 0.01 2.11 2.14 2000 1.00
## ppm_future[2054] 2.13 0.00 0.01 2.11 2.15 1750 1.00
## ppm_future[2055] 2.13 0.00 0.01 2.12 2.15 1944 1.00
## ppm_future[2056] 2.14 0.00 0.01 2.12 2.15 1740 1.00
## ppm_future[2057] 2.14 0.00 0.01 2.12 2.16 1886 1.00
## ppm_future[2058] 2.14 0.00 0.01 2.13 2.16 1832 1.00
## ppm_future[2059] 2.15 0.00 0.01 2.13 2.16 1654 1.00
## ppm_future[2060] 2.15 0.00 0.01 2.13 2.17 1795 1.00
## ppm_future[2061] 2.15 0.00 0.01 2.13 2.17 1713 1.00
## ppm_future[2062] 2.15 0.00 0.01 2.14 2.17 1639 1.00
## ppm_future[2063] 2.15 0.00 0.01 2.14 2.17 1847 1.00
## ppm_future[2064] 2.16 0.00 0.01 2.14 2.17 1868 1.00
## ppm_future[2065] 2.16 0.00 0.01 2.14 2.17 1811 1.00
## ppm_future[2066] 2.16 0.00 0.01 2.14 2.17 1176 1.00
## ppm_future[2067] 2.16 0.00 0.01 2.14 2.17 1904 1.00
## ppm_future[2068] 2.16 0.00 0.01 2.14 2.17 1775 1.00
## ppm_future[2069] 2.15 0.00 0.01 2.14 2.17 1637 1.00
## ppm_future[2070] 2.15 0.00 0.01 2.13 2.17 1528 1.00
## ppm_future[2071] 2.15 0.00 0.01 2.13 2.17 1669 1.00
## ppm_future[2072] 2.15 0.00 0.01 2.13 2.17 1809 1.00
## ppm_future[2073] 2.15 0.00 0.01 2.13 2.16 1914 1.00
## ppm_future[2074] 2.14 0.00 0.01 2.13 2.16 1893 1.00
## ppm_future[2075] 2.14 0.00 0.01 2.12 2.16 1924 1.00
## ppm_future[2076] 2.14 0.00 0.01 2.12 2.15 1478 1.00
## ppm_future[2077] 2.13 0.00 0.01 2.12 2.15 1816 1.00
## ppm_future[2078] 2.13 0.00 0.01 2.11 2.15 1679 1.00
## ppm_future[2079] 2.13 0.00 0.01 2.11 2.15 1863 1.00
## ppm_future[2080] 2.13 0.00 0.01 2.11 2.14 1705 1.00
## ppm_future[2081] 2.12 0.00 0.01 2.11 2.14 1489 1.00
## ppm_future[2082] 2.12 0.00 0.01 2.10 2.14 1720 1.00
## ppm_future[2083] 2.12 0.00 0.01 2.10 2.14 1987 1.00
## ppm_future[2084] 2.12 0.00 0.01 2.10 2.13 1784 1.00
## ppm_future[2085] 2.12 0.00 0.01 2.10 2.13 1565 1.00
## ppm_future[2086] 2.11 0.00 0.01 2.10 2.13 1545 1.00
## lp__ 12492.17 0.07 1.74 12488.80 12494.34 641 1.01
##
## Samples were drawn using NUTS(diag_e) at Sun Jan 7 02:36:52 2018.
## For each parameter, n_eff is a crude measure of effective sample size,
## and Rhat is the potential scale reduction factor on split chains (at
## convergence, Rhat=1).
samples <- extract(fit)
results <- apply(samples$ppm_future, 2, quantile, probs = c(0.025, 0.5, 0.975))
pred <- samples$ppm_future
n <- length(results)
lower <- results[seq(1, n, 3)]
median <- results[seq(2, n, 3)]
upper <- results[seq(3, n, 3)]
intervals <- cbind(lower,median,upper)
intervalsdf <- data.frame(intervals)
# Prediction of CO2 level 40 years from now
ppmpred <- unscaleppm(results[,2086])
# Intervals | 2.5% 50% 97.5%
# ppm lvls | 516.6028 518.6575 520.6636
# Generates Scaled Graph of Data and Predictions
plot(sgendates,lower,xlim=c(0,1.7),ylim=c(0,2),type="l", main="Scalled Predictions",ylab="Scalled CO2/PPM",xlab="Scalled Time")
lines(sgendates,lower)
lines(sgendates,upper)
lines(sgendates,median)
lines(sDate,sCO2)
# Generates Graph of Data and Predictions until 2058
plot(sgendates*21791,unscaleppm(lower),xlim=c(0,36500),ylim=c(313,520),type="l",main="Unscalled Prediction",ylab="CO2/PPM",xlab="Time")
lines(sgendates*21791,unscaleppm(upper))
lines(sgendates*21791,unscaleppm(median))
lines(df$day_int,df$co2)
abline(v=21791)
# Generates Close-Up at the Cutoff
plot(sgendates*21791,unscaleppm(lower),xlim=c(20100,23500),ylim=c(380,430),type="l",main="Zoom in on cutoff",ylab="CO2/PPM",xlab="Time")
lines(sgendates*21791,unscaleppm(upper))
lines(sgendates*21791,unscaleppm(median))
lines(df$day_int,df$co2)
abline(v=21791)
# Takes a close-up look at where the median passes 450 ppm for the first time
plot(sgendates*21791,unscaleppm(median),xlim=c(27500,28000),ylim=c(430,452), main="Zoom in on Unscalled Prediction",ylab="CO2/PPM",xlab="Time")
abline(v=27781)
# Takes a close-up look at where there is over 95% prediction that
# CO2 levels will be above 450 ppm
plot(sgendates*21791,unscaleppm(lower),xlim=c(28000,32000),ylim=c(450,453))
abline(v=28150)
### By day 28150 after March 29, 1958, or Tuesday, April 24, 2035, there ### is a 97.5% prediction that CO2 levels will be at or above 450 ppm
This assignment is influenced by professor’s comments in office hours, and collaboration with other students.
C. D. Keeling, S. C. Piper, R. B. Bacastow, M. Wahlen, T. P. Whorf, M. Heimann, and
H. A. Meijer, Exchanges of atmospheric CO2 and 13CO2 with the terrestrial biosphere and
oceans from 1978 to 2000. I. Global aspects, SIO Reference Series, No. 01-06, Scripps
Institution of Oceanography, San Diego, 88 pages, 2001.