Consider a population that has a normal distribution with mean \(\mu = 36\), standard deviation \(\sigma = 8\)
The sampling distribution of \(\bar{X}\) for samples of size 200 will have what distribution, mean, and standard error?
Use R to draw a random sample of size \(200\) from this population. Conduct EDA on your sample.
Compute the bootstrap distribution for your sample mean, and note the bootstrap mean and standard error.
Compare the bootstrap distribution to the theoretical sampling distribution by creating a table like Table 5.2.
Repeat parts a-d for sample sizes of \(n = 50\) and \(n = 10\). Carefully describe your observations about the effects of sample size on the bootstrap distribution.
\(X \sim N(36, 8)\)
\(\bar{X} \sim N(36, \frac{8}{\sqrt{200}})\)
# Set the seed for our calculations
set.seed(13)
# Generate random samples of size 200 from the normal distribution given
Sample <- rnorm(200, 36, 8)
# Plot it to see the distribution
data.frame(X = Sample) %>%
ggplot(aes(x = X)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw()
# Run our EDA
xbar <- mean(Sample)
xbar
[1] 35.87853
xsd <- sd(Sample)
xsd
[1] 8.17609
As you can see, the data will have a unimodal distribution that follows a normal distribution. The sample is not exactly normal but it follows a normal distribution pattern. We will have a mean of 35.8785255 and a standard error of 8.1760899
# Generate bootstrap samples from the sampling distribution generated before
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(Sample, 200, replace=TRUE))
}
# Plot the data
data.frame(X = bsmean) %>%
ggplot(aes(x = X)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
labs(title = "Bootstrap", x = "bsmean")
# Do some analysis
bsxbar <- mean(bsmean)
bsxbar
[1] 35.87956
bsse <- sd(bsmean)
bsse
[1] 0.5815149
The bootstrap distribution is, as expected, a normal distribution. The mean of our bootstrap is 35.8795634 and the standard error of our bootstrap is 0.5815149.
df <- data.frame(Mean = c(36, 36, xbar, bsxbar), SD = c(8, 8/sqrt(200), xsd, bsse))
row.names(df) <- c("Pop", "Sampling", "Sample", "Bootstrap")
knitr::kable(df)
| Mean | SD | |
|---|---|---|
| Pop | 36.00000 | 8.0000000 |
| Sampling | 36.00000 | 0.5656854 |
| Sample | 35.87853 | 8.1760899 |
| Bootstrap | 35.87956 | 0.5815149 |
# Generate our bootstrap wtih a sampling size of 50
n <- 50
B <- 10^4
bsmean50 <- numeric(B)
for (i in 1:B) {
bsmean50[i] <- mean(sample(Sample, n, replace=TRUE))
}
# Plot the data
data.frame(X = bsmean50) %>%
ggplot(aes(x = X)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
labs(title = "Bootstrap with Sample Size of 50", x = "bsmean50")
bsxbar50 <- mean(bsmean50)
bsxbar50
[1] 35.88728
bsse50 <- sd(bsmean50)
bsse50
[1] 1.146373
# Generate our bootstrap with a sampling size of 10
n <- 10
B <- 10^4
bsmean10 <- numeric(B)
for (i in 1:B) {
bsmean10[i] <- mean(sample(Sample, n, replace=TRUE))
}
# Plot the data
data.frame(X = bsmean10) %>%
ggplot(aes(x = X)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
labs(title = "Bootstrap with Sample Size of 10", x = "bsmean10")
bsxbar10 <- mean(bsmean10)
bsxbar10
[1] 35.87354
bsse10 <- sd(bsmean10)
bsse10
[1] 2.618694
With a sample size of 50, we should expect \(\bar{X}_{50} \sim N(36, \frac{8}{\sqrt{50}})\). Our actual bootstrap had a mean of 35.8872792 and a standard deviation of 1.146373. For reference in comparison, \(\frac{8}{\sqrt{50}}\) is 1.1313708.
With a sample size of 10, we should expect \(\bar{X}_{50} \sim N(36, \frac{8}{\sqrt{10}})\). Our actual bootstrap had a mean of 35.8735357 and a standard deviation of 2.618694. For reference in comparison, \(\frac{8}{\sqrt{10}}\) is 2.5298221 0)`.
We can notice that as the sample size decreases, the standard deviation increases. The standard deviation is inversely proportionate to the sample size.
set.seed(31)
ne <- 14 # n even
no <- 15 # n odd
wwe <- rnorm(ne) # draw random sample of size ne
wwo <- rnorm(no) # draw random sample of size no
N <- 10^4
even.boot <- numeric(N) # save space
odd.boot <- numeric(N)
for (i in 1:N)
{
x.even <- sample(wwe, ne, replace = TRUE)
x.odd <- sample(wwo, no, replace = TRUE)
even.boot[i] <- median(x.even)
odd.boot[i] <- median(x.odd)
}
Median <- c(even.boot, odd.boot)
Parity <- rep(c("n = 14", "n = 15"), each = N)
DF <- data.frame(Median = Median, Parity = Parity)
ggplot(data = DF, aes(x = Median)) +
geom_histogram(fill = "lightblue", color = "black") +
theme_bw() +
facet_grid(Parity ~.)
Figure 2.1: Histograms of bootstrapped median values
set.seed(31)
ne <- 36 # n even
no <- 37 # n odd
wwe <- rnorm(ne) # draw random sample of size ne
wwo <- rnorm(no) # draw random sample of size no
N <- 10^4
even.boot <- numeric(N) # save space
odd.boot <- numeric(N)
for (i in 1:N)
{
x.even <- sample(wwe, ne, replace = TRUE)
x.odd <- sample(wwo, no, replace = TRUE)
even.boot[i] <- median(x.even)
odd.boot[i] <- median(x.odd)
}
Median <- c(even.boot, odd.boot)
Parity <- rep(c("n = 36", "n = 37"), each = N)
DF <- data.frame(Median = Median, Parity = Parity)
ggplot(data = DF, aes(x = Median)) +
geom_histogram(fill = "lightblue", color = "black") +
theme_bw() +
facet_grid(Parity ~.)
Figure 2.2: Histograms of bootstrapped median values
set.seed(31)
ne <- 200 # n even
no <- 201 # n odd
wwe <- rnorm(ne) # draw random sample of size ne
wwo <- rnorm(no) # draw random sample of size no
N <- 10^4
even.boot <- numeric(N) # save space
odd.boot <- numeric(N)
for (i in 1:N)
{
x.even <- sample(wwe, ne, replace = TRUE)
x.odd <- sample(wwo, no, replace = TRUE)
even.boot[i] <- median(x.even)
odd.boot[i] <- median(x.odd)
}
Median <- c(even.boot, odd.boot)
Parity <- rep(c("n = 200", "n = 201"), each = N)
DF <- data.frame(Median = Median, Parity = Parity)
ggplot(data = DF, aes(x = Median)) +
geom_histogram(fill = "lightblue", color = "black") +
theme_bw() +
facet_grid(Parity ~.)
Figure 2.3: Histograms of bootstrapped median values
set.seed(31)
ne <- 10000 # n even
no <- 10001 # n odd
wwe <- rnorm(ne) # draw random sample of size ne
wwo <- rnorm(no) # draw random sample of size no
N <- 10^4
even.boot <- numeric(N) # save space
odd.boot <- numeric(N)
for (i in 1:N)
{
x.even <- sample(wwe, ne, replace = TRUE)
x.odd <- sample(wwo, no, replace = TRUE)
even.boot[i] <- median(x.even)
odd.boot[i] <- median(x.odd)
}
Median <- c(even.boot, odd.boot)
Parity <- rep(c("n = 10000", "n = 10001"), each = N)
DF <- data.frame(Median = Median, Parity = Parity)
ggplot(data = DF, aes(x = Median)) +
geom_histogram(fill = "lightblue", color = "black") +
theme_bw() +
facet_grid(Parity ~.)
Figure 2.4: Histograms of bootstrapped median values
As the size of n increases, the variance/sd of the distribution decreases. Note how the distribution’s axes change and narrow between the graphs. The odd and even numbers change where the median falls and how the median is distributed. Odd values seem to yield far my varied results.
Import the data from data set Bangladesh. In addition to arsenic concentrations for 271 wells, the data set contains cobalt and chlorine concentrations.
Conduct EDA on the chlorine concentrations and describe the salient features.
Bootstrap the mean.
Find and interpret the 95% bootstrap percentile confidence interval.
What is the bootstrap estimate of the bias? What fraction of the bootstrap standard error does it represent?
Bangladesh <- read.csv("http://www1.appstate.edu/~arnholta/Data/Bangladesh.csv")
head(Bangladesh)
Arsenic Chlorine Cobalt
1 2400 6.2 0.42
2 6 116.0 0.45
3 904 14.8 0.63
4 321 35.9 0.68
5 1280 18.9 0.58
6 151 7.8 0.35
The Chlorine variable has some missing values. The following code will remove these entries:
chlorine <- subset(Bangladesh, select = Chlorine, subset = !is.na(Chlorine), drop = TRUE)
data.frame(Chlorine = chlorine) %>%
ggplot(aes(x = Chlorine)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Chlorine Levels in Bangladesh Water")
mean_chlorine <- mean(chlorine)
sd_chlorine <- sd(chlorine)
As we can see, the distribution of Chlorine levels is logarithmic. The mean of this sample is 78.0840149 and the standard deviation is 210.019193.
# Generate bootstrap samples from the sample
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(chlorine, 269, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
From our bootstrap we found a mean of 77.9658447 and a bootstrap standard error of 12.7135146.
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
# Visualizing the quantiles
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
The 95% bootstrap percentile confidence interval means that we can state with 95% confidence that the mean of the sample falls between 54.9736059 and 104.8250743. A more literal interpretation is visualized above: 95% of the bootstrapped samples fall between 54.9736059 and 104.8250743.
\(Bias_{Boot} =\) -0.1181701. This makes up 0.9294845% of the bootstrap standard error.
# Generate bootstrap samples from the sample with a trimmed mean (trimmed by 25%)
B <- 10^4
bsmean_trimmed <- numeric(B)
for (i in 1:B) {
bsmean_trimmed[i] <- mean(sample(chlorine, 269, replace=TRUE), trim = 0.25)
}
bsxbar_trimmed <- mean(bsmean_trimmed)
bsse_trimmed <- sd(bsmean_trimmed)
low_quantile_trimmed <- quantile(bsmean_trimmed, 0.025)
high_quantile_trimmed <- quantile(bsmean_trimmed, 0.975)
# Visualizing the quantiles
data.frame(Bootstrap = bsmean_trimmed) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile_trimmed, color = "red") +
geom_vline(xintercept = high_quantile_trimmed, color = "red")
Originally from our bootstrap we found a mean of 77.9658447 and a bootstrap standard error of 12.7135146. With our trimmed mean we found a mean of 17.8350718 and a bootstrap standard error of 2.4919194. We found a 95% confidence interval of 13.6006296 to 23.2363148 as opposed to 54.9736059 to 104.8250743.
As you can see, the mean, standard error, and 95% confidence interval for the mean have all decreased. Looking at the original data set, we can see that these measure have adjusted downward as trimming the mean cut out a number of high and low outliers that were effecting the original mean measurement.
The data set FishMercury contains mercury levels (parts per million) for 30 fish caught in lakes in Minnesota.
Create a histogram or boxplot of the data. What do you observe?
Bootstrap the mean and record the bootstrap standard error and the 95% bootstrap percentile interval.
Remove the outlier and bootstrap the mean of the remaining data. Record the bootstrap standard error and the 95% bootstrap percentile interval.
What effect did removing the outlier have on the bootstrap distribution, in particular, the standard error?
FishMercury <- read.csv("http://www1.appstate.edu/~arnholta/Data/FishMercury.csv")
head(FishMercury)
Mercury
1 1.870
2 0.160
3 0.088
4 0.160
5 0.145
6 0.099
FishMercury %>%
ggplot(aes(x = Mercury)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Mercury Levels in Fish", xlab = "Mercury Level")
Note that there is one value (1.87) very far removed from the rest of the values.
We observe what could be a fairly normal distribution with a single extreme outlier.
# Generate bootstrap samples from the sample
mercury <- FishMercury$Mercury
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(mercury, 30, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
As you can see, we found a mean of 0.1818524, a standard error of 0.0576116 and a 95% confidence interval of 0.1122667 to 0.30727.
# Remove the outlier
FishMercury_fixed <- filter(FishMercury, Mercury != max(Mercury))
FishMercury_fixed %>%
ggplot(aes(x = Mercury)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Mercury Levels in Fish", xlab = "Mercury Level")
#Re-Bootstrap
mercury <- FishMercury_fixed$Mercury
B <- 10^4
bsmean_fixed <- numeric(B)
for (i in 1:B) {
bsmean_fixed[i] <- mean(sample(mercury, 30, replace=TRUE))
}
bsxbar_fixed <- mean(bsmean_fixed)
bsse_fixed <- sd(bsmean_fixed)
low_quantile_fixed <- quantile(bsmean_fixed, 0.025)
high_quantile_fixed <- quantile(bsmean_fixed, 0.975)
data.frame(Bootstrap = bsmean_fixed) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile_fixed, color = "red") +
geom_vline(xintercept = high_quantile_fixed, color = "red")
As you can see, we found a mean of 0.1235631, a standard error of 0.0076424 and a 95% confidence interval of 0.1085667 to 0.1385342 after removing the outlier.
Removing the outlier dramatically changed our results. Without trimming the outlier we found an irregular distribution, whereas after removing the outlier we found a normal distribution (as should be expected). We found a change in bootstrap standard error of 0.0499692. We also noted a significant change in the 95% confidence interval and mean.
In section 3.3, we performed a permutation test to determine if men and women consumed, on average, different amounts of hot wings.
Bootstrap the difference in means and describe the bootstrap distribution.
Find a 95% bootstrap percentile confidence interval for the difference of means and give a sentence interpreting this interval.
How do the bootstrap and permutation distribution differ?
BeerWings <- read.csv("http://www1.appstate.edu/~arnholta/Data/Beerwings.csv")
head(BeerWings)
ID Hotwings Beer Gender
1 1 4 24 F
2 2 5 0 F
3 3 5 12 F
4 4 6 12 F
5 5 7 12 F
6 6 7 12 F
# Generate bootstrap samples from the sample
wings <- BeerWings$Hotwings
beer <- BeerWings$Beer
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(wings, 30, replace=TRUE)) - mean(sample(beer, 30, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw()
\(Dist_{boot} \sim N(-14.28925, 2.2948473)\)
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
This bootstrap will be centered at the mean of the statistic you are trying to compute. The permutation will be centered at 0.
In our case, the bootstrap is centered at -12.0333333, -12.4, -12.7333333, -14.6, -18.5, -16.2666667, -15.2666667, -15.1333333, -16.8, -13.5, -8.1, -15.3666667, -13.9, -14.2333333, -13.5, -16.6, -10.7333333, -11.1333333, -11.6666667, -12.8, -13.5333333, -13.3, -15.8666667, -13.1, -11.9333333, -11.4, -16.3, -11.5666667, -15.6333333, -13.8333333, -18.7333333, -10.9666667, -14, -18.8666667, -15.1, -11.4, -20.3333333, -17.5333333, -14.9, -14.1666667, -11.9666667, -11.4666667, -15.9666667, -16.5, -8.2333333, -13.2333333, -13, -15.5666667, -15.3333333, -16.7666667, -14.1666667, -12.4333333, -15.7333333, -13.1333333, -17.1333333, -9.9333333, -12.4666667, -19.9, -12.8, -10.2333333, -16.4, -18.7333333, -14.4666667, -10.8666667, -10.1, -18.7666667, -11.3333333, -14.9666667, -14, -11.4666667, -13.8666667, -14.8, -10.6333333, -13.8, -17.2666667, -15.7666667, -13.9, -13.6666667, -12.3, -14.8, -11.5333333, -15.1666667, -12.0333333, -15.9, -14.0666667, -12.9, -14.6666667, -17.5, -19.6666667, -11.2666667, -10.8, -15.0333333, -12.2, -14.1333333, -14.5666667, -18.1, -15.7333333, -16.1, -13.3666667, -12.1, -10.6, -12.0333333, -10.9666667, -12.9, -13.6, -15.4, -15.6, -16.2333333, -13, -16.6666667, -9.2666667, -11.9, -12.6, -15.6333333, -12.2, -12.3, -13.2, -15.3, -15.3666667, -14.6333333, -15.0666667, -18, -8.7666667, -17.7666667, -14.1333333, -16.9666667, -14.5333333, -15.7666667, -16.6333333, -12, -11, -13.1333333, -14.1333333, -14, -12.4666667, -15.2666667, -15.0666667, -10.4333333, -16.1333333, -13.8, -14.6, -14.0666667, -13.1, -17.0333333, -12.1666667, -17.4666667, -15.8, -13.7666667, -15.5, -16.5333333, -17.5333333, -15.5, -13.5, -12.6, -14.1666667, -12.8333333, -12, -14.8666667, -11.2333333, -10.8666667, -13.9333333, -10.0666667, -15.2666667, -16.3666667, -13.6333333, -12.8, -12.1666667, -15.7, -12.8, -13.5333333, -13.4, -16.1333333, -17.3, -13, -13.8333333, -16.5666667, -16.2, -8.4, -15.1333333, -19.6, -18.4333333, -10.8666667, -14.4666667, -16.8, -12.9666667, -18.8666667, -15.0666667, -17, -15.9666667, -15.1333333, -8.9666667, -17.0666667, -11.7333333, -15.8666667, -9.9666667, -16.8, -11.9, -13.6333333, -13.7666667, -16.9, -15.7666667, -10.4666667, -15.4, -14.5666667, -18.2, -12.7, -13.4333333, -13.4666667, -12.3666667, -14.5, -11.1, -15.4333333, -13.0333333, -12.4666667, -14.5, -12.6, -13.6, -14.7333333, -13.0333333, -17.4, -13.2333333, -16.4666667, -19.9, -12.0333333, -15, -15.5666667, -16.8666667, -14.1, -13.7666667, -10.9333333, -15.1, -13.3333333, -15.1, -16.8, -11.4666667, -14.7333333, -14.2666667, -13.2, -14.2666667, -20.7333333, -16.6, -15.8333333, -15, -10.7, -16.9, -10.8333333, -15.7666667, -15.0666667, -15.1333333, -15, -17.6, -9.4666667, -12.5333333, -13.1333333, -17.1666667, -15.7333333, -10.3, -14.8, -12.1, -16.7333333, -14.8666667, -10.1, -17.2333333, -12.1333333, -15.8, -15.6666667, -13.0333333, -12.8333333, -16.6666667, -15.5666667, -15.1666667, -11.4, -10.1, -10.9666667, -13.4, -14.9, -12.8333333, -16.8333333, -10.6666667, -14.7333333, -13.9, -13.1666667, -13.7, -8.7, -14.4, -14.2666667, -19.5, -15.4666667, -12.4, -13.9, -14.3666667, -14.4333333, -14.3, -12.0666667, -13.9, -13.4, -19.4, -11.6, -13.2333333, -16.5, -12.1333333, -11.1, -11.3333333, -13.8333333, -13.4333333, -12.0333333, -15.2333333, -15.1, -14.7666667, -16.5, -14.4333333, -15.9, -10.6666667, -18.3333333, -14.8, -9.3333333, -9.9666667, -13.7, -13.1666667, -16.8666667, -17.4333333, -20.3333333, -13.7, -17.3666667, -14.4666667, -6.6, -13.7333333, -7.9, -15.2333333, -14.9, -16.4333333, -13.8333333, -12.9, -16.4666667, -12.7333333, -14.6333333, -17.3, -11.2666667, -14.5333333, -15.4, -8.5, -16.7, -16.3333333, -13.9333333, -15.9333333, -15.2, -13.9333333, -13.6, -12.3333333, -12.6, -11.3333333, -13.4333333, -12.5333333, -15.2666667, -15.4, -18.4, -15.9666667, -12.1333333, -15.8333333, -18.9, -11.8666667, -8.8, -18.9666667, -20.8, -17.3333333, -12.4333333, -14.7666667, -12.8, -13.7, -15.2666667, -15.7333333, -12.7666667, -15.2666667, -15.0666667, -16.8333333, -13.6, -13.9333333, -17.5333333, -17.8666667, -15.1333333, -15.2666667, -14.6333333, -16.7666667, -13.5666667, -10.1666667, -15.2666667, -17.2333333, -13.0333333, -13.0666667, -17.5666667, -12.1333333, -17.5333333, -17.2666667, -9.9333333, -13.9333333, -12.5333333, -11.3, -17.6, -15, -15.1666667, -13, -18.3, -13.6666667, -9.5666667, -14.7666667, -14.6, -17.5333333, -14.7666667, -16.7, -12.9666667, -15.6333333, -14.2, -13.7666667, -20.8666667, -14.6666667, -11.9666667, -16.8333333, -11.5333333, -12.0666667, -13.7, -15.4666667, -15.6333333, -13.7, -16.4333333, -16.4666667, -16.6666667, -14.3666667, -15.4, -19.2333333, -13.2, -16.3333333, -15.8, -12.3, -14.6333333, -13.3666667, -13.9333333, -15.0666667, -16.2333333, -13.3333333, -18.7333333, -14.1, -18.4, -18.8666667, -14.6333333, -16.3, -17.9333333, -13.4666667, -16.9333333, -11.3666667, -14.1333333, -16.1666667, -17.5333333, -11.4333333, -11.0666667, -10.5666667, -18.0333333, -11.4333333, -14.4666667, -11, -13.5333333, -13.2, -12.6333333, -14.5666667, -14.4666667, -12.2333333, -14.9, -13.3333333, -13.1666667, -10.2, -14.6, -10.8333333, -18.3333333, -18.1333333, -15.6, -14.6333333, -14.6333333, -14.4333333, -15.6, -17.7666667, -16.5, -15.6666667, -13.7, -16.5666667, -16.5666667, -16.0333333, -14.1666667, -11.6333333, -16.6, -14.5, -14.4666667, -13.1666667, -12.6, -17.6333333, -17.9666667, -15.7333333, -12.0333333, -15.0666667, -16.2333333, -15.1666667, -11.9333333, -17.4333333, -11.9666667, -13.0333333, -11.5, -13.0333333, -18.4666667, -12.7333333, -14.3666667, -16.8333333, -10.1666667, -14.4, -19.1, -18.2666667, -12.9333333, -17.0666667, -16.9333333, -13.9333333, -14.6333333, -15.3333333, -15.2666667, -15.4, -14.4, -15.5666667, -13.2666667, -12.0333333, -11.9, -10.8666667, -11.6, -15.5333333, -12.9, -15.6666667, -16.6333333, -15.5666667, -15.1333333, -12.1666667, -12.9333333, -14.5666667, -17.0333333, -15.5666667, -15.2666667, -14.9333333, -10.7, -13.1666667, -15.3, -15.1333333, -15.0333333, -9.9333333, -14.7, -16.0333333, -15.9, -12.2333333, -18.3666667, -13.3333333, -10.6, -10.4666667, -12.2333333, -12.6666667, -12.0666667, -13.6666667, -16, -12.2666667, -16.2, -19.1333333, -14.9666667, -13.1, -17.9, -15.8, -18.2666667, -13.4333333, -18, -12.2333333, -13.5, -16.4333333, -14.9, -14.5333333, -17, -11.9, -15.7666667, -18.3, -12.4666667, -11.7, -15.1333333, -15.4, -15.5666667, -13.8666667, -15.8666667, -15.4333333, -12.7666667, -11.3666667, -13.8666667, -12.0333333, -16.3333333, -11.8333333, -12.2, -17.7666667, -16.2666667, -16.9, -15.5333333, -11.8, -16.3, -14, -12.2, -9.7666667, -13.0666667, -13.6, -15.4666667, -10.4333333, -15.7333333, -15.7666667, -13.8, -13.3333333, -15.7, -13.3333333, -13.8666667, -14.9666667, -14.3333333, -11.2333333, -11.8666667, -11.3, -16.6666667, -12.7, -12.3333333, -14.4, -15.5, -11.3333333, -12.8, -16.0333333, -17.6333333, -16.4, -13.0666667, -14.6, -12.9333333, -16.8666667, -16.6333333, -11.9333333, -15.3666667, -16.1, -11.6333333, -15.1666667, -13.8333333, -15.4, -13.1666667, -12.5333333, -9.9666667, -14.5333333, -10.2333333, -13.3333333, -13.9666667, -13.1333333, -8.4, -15.7666667, -12.1, -10.3666667, -16.9333333, -12.5333333, -17.1, -13.9333333, -15.3333333, -13.9666667, -17.2333333, -14.4, -12.1, -15.1666667, -16.2666667, -13.5333333, -17.7666667, -13.8666667, -13.6666667, -13.5333333, -11.6333333, -12.8, -14.4, -18.1333333, -13.7666667, -14.7, -15.4666667, -15.3333333, -10.8666667, -20.0666667, -16.3333333, -16.1333333, -13.0666667, -16.9, -15.9333333, -13.9666667, -14.8, -14.2666667, -13.8333333, -18.3666667, -18.8, -12.5333333, -13.3666667, -11.5666667, -9.9333333, -13.3, -13, -15.4, -11.9, -10.2666667, -14.6666667, -13.6333333, -8.3, -15.6333333, -13.6333333, -14.2666667, -14, -13.7666667, -15.6666667, -14.3, -13.1333333, -17.8333333, -14.6666667, -16.4333333, -17.2333333, -16.1, -13.3, -15.9, -15.1333333, -15.0666667, -17.9, -13.8333333, -9.5333333, -13.6666667, -16.3666667, -14.0666667, -16.4, -16.1333333, -14.1333333, -11.9333333, -18.8666667, -16.1, -14.1333333, -12.9333333, -12.6, -13.7666667, -14.0666667, -18.0666667, -16.3333333, -12.6666667, -16.0333333, -10.1666667, -14.8333333, -17.5666667, -12.6, -18.1666667, -11, -11.1, -13.7333333, -12.9, -13.8, -16.3, -13.5333333, -12.9, -9.7666667, -16.7, -14.3, -16.1, -14.9333333, -13.6666667, -15.5, -12.4666667, -12.3666667, -13.9666667, -13.1666667, -10.4666667, -12.6333333, -13.1, -18.5333333, -14.6, -16.0666667, -9, -12.2333333, -12.9666667, -10.8666667, -14.7, -14.6, -15.6333333, -14.1333333, -16.2666667, -14.9333333, -16.7666667, -11.2333333, -11.7666667, -16.5, -11, -15.4666667, -17.3, -14.0333333, -14.8333333, -16.1666667, -18.3, -13.9666667, -13.5, -12.0333333, -15.2666667, -13.5666667, -15.4333333, -12.7, -15.5666667, -12.9, -16.5333333, -17.4666667, -15.7333333, -18.8, -15.8666667, -17.0666667, -16.3666667, -13.2, -16.1333333, -17.4333333, -17.7666667, -12.9, -13.9333333, -13.9666667, -15.4333333, -14.4666667, -15.2666667, -12.8, -14.9, -12.6, -14.1333333, -15.5333333, -12.9333333, -15.6, -10.1333333, -14.4, -13.7333333, -13.1333333, -14.5333333, -17.7333333, -14.7666667, -14.0666667, -11.7666667, -17.4666667, -17.2333333, -14.2333333, -13.1, -12.4666667, -14.9666667, -12.2666667, -16.1333333, -12.9, -11.6, -12.6, -12.9, -11.5, -15.9, -11.6666667, -12.9666667, -14.7666667, -15.9333333, -16.1666667, -9.9, -13.7, -13.9, -8.5666667, -13.5, -12.9666667, -17.4333333, -17, -13.5, -15.1, -13.6666667, -17.2666667, -15.9, -16.2, -14.3333333, -15.6666667, -17.0666667, -16.3, -14.6, -14.6333333, -19.7666667, -15.5666667, -13.2, -18.5666667, -17.7666667, -15.3333333, -14.8, -18.4333333, -10.1666667, -11, -14.3333333, -17.6666667, -13.1333333, -16.1666667, -14.1, -17.6333333, -10.9333333, -19.1, -17.4333333, -14.1, -15, -13.4666667, -18.1666667, -15.5333333, -12.2666667, -15.6333333, -17.1, -15.0333333, -17.0666667, -19.4666667, -18.4333333, -15.0333333, -13.1333333, -17.8666667, -13.7333333, -17.4, -9.5333333, -13.1333333, -18.8333333, -12.1666667, -17.6666667, -16.6, -17.0333333, -14.2666667, -16.2, -16.0333333, -14.2666667, -11.8666667, -10.8, -10.6, -16.1666667, -13.8666667, -14.5333333, -14.5, -16.6333333, -15.8, -11.5, -15.6, -11.2, -17.6333333, -15.2666667, -15.5, -11.9, -17.9666667, -11.2333333, -15.4333333, -15.9666667, -12.0666667, -15.1, -12.4, -15.6666667, -16.3333333, -12.3666667, -12.7, -11.7333333, -17.5333333, -15.8666667, -13.3333333, -16.1666667, -17.4666667, -18.0666667, -10.2, -15.1, -13.8, -11.8666667, -19.7666667, -16.5666667, -15.5, -13.8333333, -9.7, -13.1333333, -14.8333333, -15.9666667, -14.3333333, -14.7333333, -16.2333333, -11.0666667, -13.2, -14.9333333, -15.8666667, -15.0666667, -13.5666667, -14, -13.1666667, -11.2666667, -17.3333333, -13.1333333, -13.2, -17.4666667, -15.5333333, -14.7666667, -11.2666667, -8.6666667, -18.7, -17.1333333, -11.8, -10.5666667, -14.8333333, -12.7666667, -12.7666667, -13.7666667, -16.4666667, -15.1666667, -11.4666667, -14.6, -10.5, -15.5666667, -16.6333333, -16.2, -8.2333333, -17.3, -11.7333333, -11.4333333, -11.6666667, -15.4, -14.4666667, -13.8, -13.5333333, -14.3, -16, -11.5, -15.6333333, -13.6666667, -10.2, -17.2333333, -11.1333333, -13.4333333, -16.1, -14.6666667, -14.1333333, -11.5333333, -14.3333333, -12.3, -11.9333333, -18.1333333, -10.0666667, -15.9666667, -14.6, -14.5, -13.3666667, -15.4333333, -15.3333333, -12.7666667, -12.7, -14.9666667, -13.9333333, -14, -16.1, -18.9333333, -18.7, -14.5, -15.6333333, -14.8666667, -14.9333333, -10.5666667, -12.8666667, -11.3333333, -11.9666667, -17.1666667, -18.2333333, -15.4666667, -12.1333333, -14.8666667, -15.7, -14.1, -17.6, -16.7333333, -14.6333333, -9.4, -14.2666667, -16.1, -14.5, -16.4333333, -15.9, -15.1333333, -10.3666667, -17.3333333, -19.2333333, -14.8, -10.7666667, -14.6333333, -16.1333333, -12.6333333, -15.6666667, -12.9333333, -13.6, -11.8, -11.4333333, -16.9666667, -14.3, -15.4, -16.9333333, -16.4333333, -17.1, -17.7, -13.2666667, -11.3333333, -12, -12, -11.1666667, -14.0666667, -14.8666667, -12.1666667, -16.3, -14.5, -12.5, -16.8666667, -13.9333333, -15.7666667, -12.3, -12.9333333, -15.3333333, -15.3333333, -12.0333333, -11.2, -12.1666667, -14.6333333, -10.6333333, -14.3, -17.6333333, -16.4, -10.9, -12.4333333, -15.3333333, -15, -13.9333333, -14.9, -16.0666667, -11.7333333, -14.3, -16.7, -17.6666667, -17.9, -13.9666667, -15.3666667, -12.3, -17.3, -13.3, -13.4666667, -14.9333333, -14.6, -13.5, -15.3, -12.4666667, -15.6, -13.9, -15.6, -11.7666667, -16.3333333, -18.8333333, -10, -12.5, -15.7333333, -12.3333333, -13.6333333, -18, -11.3666667, -10.6333333, -15.2333333, -15.0666667, -15.5, -13.3666667, -13.3666667, -14.2666667, -17.2333333, -15.2333333, -14.2333333, -14.1, -11.5666667, -15.4666667, -17.1333333, -14, -14.6666667, -13.6, -17.3333333, -14, -12.6666667, -13.1666667, -15, -8.8333333, -14.4666667, -14, -13.2666667, -16.8, -15.9666667, -12.9333333, -17.8, -12.4333333, -13.4333333, -14.9333333, -12.1333333, -14.3666667, -15.6, -8, -13.8666667, -18.7, -12.5666667, -15.1333333, -14.8333333, -12.1, -13.9333333, -16.1, -14.1333333, -17.1, -12.3666667, -17.3666667, -13.8, -18.1666667, -12.4666667, -10.6666667, -15.2, -16.7, -15.1, -9.4666667, -12.4, -14.6333333, -16.9, -15.8333333, -14.1666667, -10.6333333, -14.6666667, -10.7, -14.5, -12.9, -16.7666667, -16.8666667, -17.7666667, -9.8666667, -15.2, -17.4666667, -17.3666667, -14.5666667, -11.4666667, -12.8333333, -14.5, -12.9333333, -14.3333333, -14.4, -13.2666667, -15.5, -15.1666667, -15.7666667, -15.4, -12.2, -12.7666667, -14.2, -15.2666667, -9.7, -11.6666667, -14.3666667, -17.0666667, -10.8666667, -8.9, -11.8333333, -13.1, -13.7, -14.3333333, -14.7, -16.8666667, -17.9333333, -11.4333333, -11.8333333, -14.5666667, -13.9, -16.4, -14.7666667, -13.3333333, -16.5333333, -12.1666667, -12.2666667, -12.1, -13.4333333, -15.2, -11.9666667, -14.5, -15.0333333, -18.3666667, -17.8333333, -16.4666667, -14.5333333, -11.4333333, -14.1666667, -12.3, -14.9666667, -13.7333333, -13, -13.5666667, -8.0666667, -12.9666667, -10.0333333, -14.6666667, -13.5, -17.8666667, -13.9, -12.6333333, -15.9, -16.0333333, -9.5, -16.9, -9.9, -13.5, -10.2333333, -15.5, -16.8, -13.9666667, -13.5, -8, -18.1666667, -11.4, -13.8666667, -13.5, -18, -10, -15.2666667, -12, -10.5333333, -16.2, -11, -10.2, -8.7333333, -15.2, -14.9, -14.7, -14.8666667, -14.8333333, -11, -9.6333333, -13.1, -15.9333333, -15.3333333, -14.2, -15.2, -13.4, -14.1, -15.7666667, -16.2333333, -13.5, -13.6666667, -15.7333333, -11.8333333, -12.9, -10.3333333, -13.1, -15.8333333, -18.2333333, -15.2333333, -14.2666667, -11.4333333, -14.6666667, -16.1666667, -15.0666667, -17.5666667, -10.2333333, -15.8666667, -16.2333333, -16.7, -15.4333333, -19.2333333, -10.9, -12.9, -17.5666667, -9.4666667, -12.7666667, -13.3333333, -12.7666667, -11.4, -15.7333333, -16.5333333, -14.5666667, -12.3, -15.9, -10.9666667, -13.0666667, -12.6333333, -14.7666667, -14.8666667, -12.1333333, -14.6, -10.1666667, -13.3, -14.8, -10.2, -11.4333333, -11.0666667, -11.9666667, -13.1333333, -12.4666667, -18.5666667, -13.1333333, -15.4333333, -14.2333333, -15.4666667, -13.3, -11.6, -14.6666667, -13.9, -17.7, -13.9666667, -13, -16.8, -14.3666667, -15.8666667, -12.8333333, -9, -13.3, -14.9666667, -14.5333333, -13.3, -16, -16.8, -15.7333333, -11.5666667, -12.9, -14.9, -14.4333333, -14.3333333, -18.2333333, -14.9333333, -15.4333333, -15.5333333, -13.1333333, -13.7, -12, -16.0666667, -14.6333333, -13.6666667, -9.2, -11.7333333, -12.4333333, -13.9666667, -17.6, -12.5666667, -12.6333333, -16.1333333, -14.5666667, -15.4666667, -12.4333333, -13.9333333, -12.2666667, -17.1666667, -13.6333333, -14.0666667, -19.6333333, -15.8333333, -9.8, -14.0333333, -13.8666667, -13.2, -13.3666667, -13.4333333, -12.8333333, -11.7333333, -17.2, -8, -13.0333333, -11.9, -14.0666667, -15.7333333, -17.7333333, -17.9666667, -20.7333333, -12.6, -15.9666667, -15.6666667, -11.4666667, -11.9, -12.4, -10.6333333, -18.2333333, -18.5666667, -11.7333333, -14.5666667, -13.9333333, -13.9, -17.4333333, -12.1, -14.0666667, -14.9333333, -10.9333333, -16.9666667, -11.0333333, -17.3666667, -12.3666667, -14.4666667, -14.7333333, -13.8333333, -18.5, -11.0666667, -13.1666667, -12.7, -13.7666667, -17.5333333, -10.7333333, -12.1333333, -13.6333333, -16.6333333, -12.4333333, -16.7, -13.5, -14.4333333, -12.4, -9.9666667, -14.5, -11.2333333, -15.1, -17.3666667, -13.1, -12.4666667, -14.4, -13.7666667, -14.4, -12.7666667, -9.8333333, -16.2333333, -11.6666667, -15.8666667, -17.7, -9.1, -14.7666667, -15.2333333, -13.9666667, -15.3333333, -16.7333333, -13.9666667, -13.9666667, -15.2, -11.4666667, -13.4333333, -10.7666667, -14.2333333, -14.4666667, -10.6, -11.0333333, -11.2333333, -16, -15.4666667, -15.6333333, -19.9333333, -16.8666667, -14.3666667, -13.4333333, -12.8333333, -13.6333333, -11.3, -15.8666667, -13.2, -13.8333333, -11.2666667, -15.3, -11.5, -13.4333333, -10.2666667, -13.6666667, -13.6333333, -17.1666667, -12.7666667, -11.3, -14.1, -15.1333333, -16.9333333, -17.0666667, -13.9666667, -12.3, -12.1, -17, -17.5, -15.8666667, -12.6333333, -10.2666667, -16.9333333, -10.0333333, -15.0333333, -13.3666667, -14.9666667, -16.8666667, -17.8, -13.0333333, -14.9333333, -10.7333333, -16.4333333, -10.4666667, -13.5, -13.3666667, -13.2333333, -17.0333333, -12.6666667, -14.4666667, -13.1, -15.0666667, -16.2, -12.5666667, -15.9333333, -10.7333333, -15.0333333, -11.6333333, -13.7, -14.7, -14.3, -15.1333333, -13.2333333, -9.1666667, -16.9333333, -13.6666667, -15.5666667, -15.7666667, -17.6666667, -15.3, -16, -14.6333333, -15.0666667, -17.1666667, -18.2666667, -14.2, -13.2, -14.0333333, -15.9, -13.8, -16.7333333, -14.9333333, -12.8, -15.1333333, -12.8666667, -11.6333333, -12.4333333, -16.2666667, -8.7, -15.7, -12.6333333, -9.8, -16.4333333, -11.8333333, -15.2333333, -17.8333333, -14.1333333, -12.4666667, -16.3333333, -14.1333333, -14.0333333, -14.5333333, -13.5666667, -13.7666667, -13.9333333, -14.9666667, -15.4666667, -10.7, -18.2, -16.3, -13.9666667, -17.0666667, -13.5333333, -12.2666667, -12, -14, -15.7333333, -13.1666667, -13.1666667, -13.0333333, -13.0666667, -11.6666667, -14.4666667, -13.4333333, -14.2333333, -19.4, -12.4666667, -15.9333333, -14.4, -16.8333333, -12.5666667, -16.4333333, -14.6, -14.3666667, -8.9666667, -16.0333333, -17.6, -13.3666667, -13.4666667, -16.1666667, -10.9333333, -12.2, -12.2, -8.5, -14.3333333, -12.1666667, -15.6333333, -14.8666667, -11.2333333, -11.9, -17.4333333, -17.5333333, -16.6, -15.4, -17.4666667, -12.3333333, -15.6, -16.5, -11.8333333, -13.2, -9.7, -17.4333333, -12.7, -15.7333333, -14.0666667, -9.8333333, -15.4333333, -13.2333333, -12.1666667, -13.5333333, -10.8333333, -19.5666667, -18.1, -12.9, -18.5666667, -13.5333333, -11.7, -16.3, -15.7333333, -14.1, -17.6333333, -11.3333333, -13.3, -16.6, -13.1, -15.3, -13.3, -16.5333333, -17.9, -9.9333333, -19.0666667, -12.6, -13.4333333, -16.3, -12.3666667, -15.8, -10.9333333, -12.6, -16.1, -12.3, -12.8666667, -11.4666667, -18.1333333, -10.8333333, -15.7666667, -17.4, -14.2333333, -17.9, -15.6333333, -16.7, -13.1666667, -12.9666667, -16.2666667, -12.7666667, -14.9, -15, -14.2333333, -15.1333333, -12.9666667, -15.8666667, -10.6333333, -13.7, -12.1333333, -17.4333333, -15.7, -19.6333333, -14.0666667, -9.2666667, -13.5333333, -14.1666667, -14.9666667, -14.1333333, -15.3, -14.5666667, -11.4333333, -14.7666667, -14.1, -16.4333333, -16.0666667, -13.8666667, -12.8, -14.1333333, -16.6333333, -15.7666667, -15.4666667, -14.4333333, -15.7, -16.7666667, -10.5, -14.9333333, -15.6333333, -12, -13.7333333, -18.9, -15.0666667, -16.3, -11.0666667, -17.2333333, -17.5333333, -13.7666667, -17.6333333, -10.5, -14.5333333, -13, -17.4, -15.8, -16.4666667, -16.0666667, -13.0666667, -9.9, -7.8, -14.2, -14.7, -13.4666667, -13.3333333, -12.7666667, -12, -18.8, -14.5, -13.2, -10.4333333, -9.8666667, -14.2333333, -19.7333333, -12.1666667, -15.5333333, -13.9, -13.2333333, -13.6, -9.5, -16.2333333, -16.5666667, -11.3333333, -18.3666667, -17.2666667, -13.9333333, -8.8, -12.3666667, -15, -14.5666667, -12.4666667, -10.4333333, -15.0666667, -12.1666667, -10.6333333, -17, -16.5333333, -13.5333333, -12.9333333, -13.6, -17.9, -11.5333333, -13.7333333, -17.2, -16.4, -14.8666667, -13.9, -13.9, -13.8, -14.3, -15.9666667, -15.2666667, -16.3666667, -9.9333333, -8.8666667, -16.1666667, -13.4, -9.6333333, -13.9, -19.4666667, -18.7666667, -16.0333333, -16.4666667, -15.9, -13.2333333, -12.1, -16.8666667, -12.4333333, -12.8666667, -12.5333333, -18.9, -11.7, -16.6, -16.3666667, -15.9333333, -13.0666667, -14.5, -18.5666667, -16.8333333, -14.1333333, -13.5333333, -14.3, -13.2333333, -14.1, -11.2666667, -14.2333333, -14.2, -14, -11.4, -13.8, -13.9666667, -11.1666667, -12.9333333, -14.1333333, -11.6333333, -13.9666667, -15.5, -9.9, -16.6333333, -15.5333333, -14.8, -14.9666667, -11.5666667, -14.2333333, -14.5333333, -12.6, -13.7666667, -13.2666667, -15.2, -14.8666667, -15.7666667, -14.0666667, -16.8666667, -18.2, -16.2, -13.7333333, -14.5333333, -18.5666667, -19.3666667, -17.4, -15.7333333, -17.9, -15.4, -14.9666667, -13.2666667, -13.1, -17.2, -13.9333333, -16.4666667, -14.1666667, -12.5666667, -14.2666667, -16.9333333, -17.9333333, -18.5333333, -17.8666667, -15.6666667, -14.0333333, -17.9666667, -16.9, -12.8666667, -14.1333333, -14.3666667, -11.5, -12.0666667, -15.3, -15.3666667, -20.1333333, -14.9666667, -17.1333333, -13.7, -10.8, -15.2666667, -10.9666667, -18.1, -15.8666667, -12.1333333, -13.6, -11.8, -17.8666667, -14.7666667, -11.1333333, -10.8666667, -19.6666667, -14.0666667, -13.6666667, -15.7, -13.8666667, -13.8666667, -12.8666667, -12.8333333, -15.8666667, -11.5, -11.7, -13.3666667, -15.7, -15.2333333, -13.4666667, -12.4, -15.3333333, -12.5333333, -16.5, -12.9666667, -14.8333333, -15.5666667, -16.2666667, -12.2333333, -21.0333333, -14.6666667, -8.2666667, -19, -14.6, -14.9333333, -13.9, -14.9, -11.2, -15.0666667, -17.7333333, -10.7, -9.7666667, -14.6333333, -14.3, -17.2, -12, -16.6333333, -13.1666667, -12.9333333, -15.1, -13.8, -13.6, -14.0333333, -13.1333333, -18, -15.2666667, -11.1333333, -14.8666667, -15.4, -16.3666667, -14.1333333, -12.7, -17.6333333, -11.6333333, -15.0333333, -16.1666667, -14.9, -12.7333333, -7.7333333, -12.8333333, -11.2666667, -8.3, -13.4333333, -18.2333333, -14.9, -13.7666667, -13.1666667, -11.2, -13.5, -17.6666667, -15.4666667, -13.1, -16.2666667, -15.2333333, -13.0333333, -16.5333333, -13.6, -15.4, -18.4, -16.0333333, -12.6666667, -15.2666667, -16.7666667, -13.3666667, -13.8333333, -17.7333333, -16.2, -13.1666667, -16.5666667, -14.9, -10.3666667, -14.0333333, -15.7666667, -12.2, -14.9333333, -13.9333333, -16.5, -15.2333333, -16.7333333, -13.4, -17.1333333, -15.2333333, -8.6, -14.5, -16.9666667, -14.0333333, -18.1, -16.3, -12.6333333, -16.0666667, -16.5, -10.6, -13.4, -9.8666667, -13.1, -15.0333333, -15.2333333, -19.7666667, -17.2333333, -15.4333333, -13.6333333, -14.8, -16.1, -15.7666667, -15.0333333, -18.8333333, -12.5666667, -12.8, -15.7, -14.8333333, -9.5666667, -14.2666667, -14.2, -16.6333333, -16.4, -14.1666667, -12.2666667, -13, -13.7666667, -13.1666667, -11.5, -19.1666667, -10.9333333, -14.7, -15.8666667, -13.2333333, -14.0666667, -14.3666667, -12.2666667, -12.1, -15.8666667, -16.5, -13.6333333, -16.1333333, -16.2, -12.9, -14.1, -13.6333333, -14.0666667, -15.8666667, -13.7666667, -17.2666667, -14.7666667, -18.2, -12.5666667, -17.2, -14.0666667, -15.7333333, -15.8, -14.7666667, -11.2333333, -13.6333333, -11.4333333, -17.2, -14.9666667, -18.3, -16.4666667, -14.9666667, -18.0666667, -17.2666667, -16, -15.9, -16.8, -15.5666667, -12.9333333, -15.0666667, -18.1333333, -14.7666667, -13.1333333, -14, -13.5666667, -15.8, -14.6, -12.0333333, -13.5, -16.5333333, -15, -14.4333333, -12.0333333, -13.5333333, -13.5666667, -16.3666667, -13.9666667, -10.9666667, -14.8, -15.3666667, -16.2, -13.8, -14.4, -16.6333333, -11.8666667, -15.4, -17.8, -12.9666667, -13.2666667, -13.4666667, -11.7333333, -12.2333333, -14.4333333, -10.4666667, -13.4333333, -16.6333333, -16.4, -9.5333333, -11.7666667, -12.7333333, -15.5, -14.7666667, -15.5, -12.8333333, -14.2, -16.2333333, -16.1666667, -16.1, -17.2666667, -16.4666667, -14.4333333, -14.6333333, -13.8333333, -13.5, -11.1666667, -12.9333333, -12.7, -15.9, -17.9, -12.3333333, -13.5333333, -15.3666667, -14.2333333, -15.2, -16.7333333, -12.2666667, -14.8666667, -13.0666667, -16.2, -13.6333333, -14.4, -13.1666667, -13.4666667, -18.6, -15.1666667, -9.9, -16.9666667, -16.8666667, -18.0666667, -14.2666667, -15.2, -16.2, -17.9, -15.4, -9.9, -11.5333333, -15.6666667, -12.3, -12.4, -14.3, -14.2, -14.3, -12.1333333, -13.1666667, -12.6666667, -17.2, -14.1333333, -15.5666667, -9.6666667, -11.5, -13, -12.8333333, -14.3333333, -16.3, -15.2, -13.6333333, -14.1333333, -12.4666667, -14.3, -17.8333333, -17.7, -11.3666667, -10.4666667, -12.4333333, -13.5666667, -14.7, -16.9666667, -15.3333333, -15.7, -14.5333333, -13.6666667, -18.1666667, -12.2, -14.3, -15.5333333, -18.7, -14.0666667, -14.8, -13.3333333, -13, -15.3666667, -12.2333333, -13.8, -17.8666667, -11.5666667, -17.3, -12.9333333, -11.1666667, -14, -15.3666667, -15.0666667, -16.2333333, -16.2, -11.7333333, -13.4, -10.3666667, -16.4666667, -18.3, -15.3333333, -15.7, -9.3, -12.8333333, -12, -14.5, -10.9333333, -13.2, -15.7666667, -12, -14.0333333, -15.2333333, -13.3666667, -13.3666667, -10.6666667, -13.6333333, -18.5, -13.0333333, -14.4, -14.6666667, -13.1666667, -15.6, -14.5, -16.6, -14.4666667, -11.9333333, -10.7333333, -14.5333333, -13.2333333, -11.7, -14.8, -10.4, -12.3333333, -13.5, -14.8, -17.5, -14.1666667, -10.9666667, -14.0666667, -14.6666667, -14, -11.1333333, -12.8333333, -14.7, -17.1, -14.1666667, -14.1333333, -15.2666667, -19.8666667, -16.4666667, -18.1, -14.3, -14.2, -16.3, -13.1666667, -12.6333333, -13.5333333, -14.8, -9.4, -13.9, -15.6333333, -13.0666667, -14.9, -12.3, -14.9333333, -7.2666667, -13.9333333, -16.7, -15.9666667, -13.8666667, -16.7333333, -14.7, -13.4333333, -13.3333333, -14.6, -13.4, -13.9666667, -16.3, -14.8666667, -14.2666667, -16.7666667, -13.3333333, -16.8, -13.1333333, -13.3, -15.7666667, -15.0666667, -16.1, -15.1666667, -12.4666667, -11.0333333, -15.8333333, -15.1666667, -10.7666667, -19.7, -13.4666667, -15.4, -14.3666667, -9.7666667, -17.1333333, -14.3666667, -12.8333333, -15.0333333, -13.6666667, -15.9333333, -13.8333333, -19.0666667, -10.3333333, -14.3333333, -16.4666667, -16.8666667, -17.5333333, -16.0333333, -17.9, -15.1, -12.2333333, -15.6666667, -13.5, -17.2, -11.8666667, -9.1, -16.3666667, -14.1, -15.0333333, -11.4666667, -14.7333333, -9.9, -18.4666667, -20.9, -10.8333333, -11.5666667, -13.9333333, -14.2, -14.9, -18.2333333, -16.3666667, -17.1333333, -17.0666667, -14.0333333, -14.5, -13.4333333, -9.5, -17.0333333, -12.2333333, -18.5, -14.4666667, -9.9333333, -8.9, -11.4666667, -14.8333333, -13.9, -10.3666667, -16.3, -14.8, -17.6333333, -14.7333333, -11.8666667, -19.6, -19.4666667, -14.0666667, -17.8666667, -14.0333333, -13.8333333, -18.3333333, -14.3666667, -11.5, -16.6333333, -12.9, -15.1333333, -10.0333333, -11.2333333, -14.4666667, -14.3, -14.3, -9.8, -14.5333333, -13.7333333, -17.9666667, -16.7, -20.7, -17.3, -14.9, -9.8333333, -15.8, -14.6, -16.6333333, -14.3333333, -13.8333333, -17.1333333, -11.1333333, -15.4333333, -15.0666667, -9.7666667, -12.7666667, -16.4333333, -16.3, -13.8, -15.2, -15.9333333, -11.5333333, -10.6333333, -16.1, -14.1333333, -15.5666667, -12.3, -16.1666667, -14.3666667, -15.7333333, -13.6666667, -12.0666667, -10.8333333, -14.3, -11.8, -15.9666667, -20.2666667, -11.1333333, -20.7666667, -11.9, -14.1666667, -16.2666667, -12.8666667, -14.0666667, -15.3, -12.1333333, -13.3333333, -15.9, -17.7666667, -14.3666667, -14.7, -13.5666667, -12.8333333, -15.4333333, -12.3333333, -14.4, -11.6, -18.0333333, -17.9, -15.5333333, -9.3666667, -11.6, -12.6, -15.9666667, -14.9, -16.9666667, -18.8333333, -17.2333333, -14.4333333, -14.3, -11.5666667, -15.1666667, -11.5333333, -13.3, -9.6666667, -14.3333333, -14.8333333, -15.6666667, -16.0333333, -13.1333333, -14.4, -12.5333333, -13.2333333, -15.3333333, -15.3333333, -12.6, -15.4, -12.1, -17.6, -19.4666667, -16.7333333, -16, -15.8666667, -15, -14.8, -13.7, -14.6333333, -16.0666667, -15.2, -14.5, -13.5666667, -17.1333333, -11.3, -14.7666667, -13.2666667, -15.3666667, -15.0666667, -18.3, -12.6, -14.8666667, -13.3666667, -11.4, -14.8666667, -15.5666667, -12.4333333, -12.9333333, -17.1333333, -9.6666667, -14.0666667, -15.2, -17.3666667, -14.9, -14.5666667, -11.2666667, -15.3, -14.8666667, -15.7, -16.6666667, -13.8666667, -12.6333333, -15.5, -15.8666667, -15.2333333, -14.0666667, -12.4333333, -15.4666667, -12.8333333, -14.2333333, -12.7666667, -15.6333333, -7.9, -13, -15.3333333, -13.9333333, -17.3333333, -14.1666667, -16.8666667, -17.2666667, -16.4, -11.3666667, -16.4, -12.2333333, -15.9, -15, -13.0666667, -11.6666667, -9.6, -13.1666667, -10.0666667, -14.6, -14.3333333, -14.8666667, -15.7666667, -12.3333333, -10.0666667, -13.1333333, -12.9, -13.7666667, -13.5, -14.1, -14.2333333, -14.1, -12.8333333, -12.9, -10.6333333, -19.9333333, -15.4666667, -12.7, -12.4, -15.8, -15.3666667, -13.8, -12.8666667, -9.5666667, -13.6, -14.9666667, -14.5, -14.7333333, -13.6, -12.6333333, -14.3, -11.5333333, -15.5, -12.8, -19.4666667, -10.5666667, -14.8333333, -15.2333333, -12.8666667, -13.8666667, -16.1666667, -10.9333333, -13.4666667, -13.5333333, -15.4666667, -13.6666667, -14.4, -19.2, -14.0333333, -15.4333333, -16.7666667, -18, -17.6, -13.0333333, -13.2666667, -12.0333333, -17.9333333, -14.8333333, -15.8333333, -13.2666667, -15.9, -17.9, -13.1666667, -15.0333333, -12.0666667, -12.3333333, -15.2666667, -13.3, -12.7333333, -15.0666667, -13.4666667, -13.5666667, -13.5333333, -11.1, -13.5, -14.6666667, -10.6, -12.9666667, -11.9666667, -11.0666667, -19.6333333, -10.9, -16.1333333, -13.2, -17.3666667, -18.2333333, -14.2, -13.0666667, -16.2666667, -17.6666667, -12.8, -11.8666667, -12.7, -12.8, -11.5, -13.5333333, -12.8333333, -13.4, -13.2333333, -15.4666667, -14.8, -15.4666667, -12.0666667, -14.2333333, -11.6, -17.6, -17.0333333, -14.5666667, -12.7, -15.5, -10.0666667, -14.7666667, -18.4333333, -15.2666667, -11.4666667, -16.2333333, -9.5, -17, -15.2666667, -13.4, -14.2, -17.2333333, -11.3, -15.5666667, -15.1666667, -11.4, -14.6, -14.4666667, -12.6666667, -15.3666667, -14.4333333, -16.3333333, -18, -16.1666667, -13, -16.0666667, -12.2666667, -14.6333333, -14.2666667, -11.3333333, -7.9333333, -16.7333333, -16.6, -18.1, -14.5, -14.6666667, -10.7, -13.1, -14.4, -13.5666667, -12.6, -11.5666667, -12.7333333, -11.1, -16.3666667, -12.7333333, -11.3, -18.9333333, -13.7333333, -15.8333333, -13.4, -12.6666667, -17.8666667, -13.8, -11.0333333, -11.6, -17, -14.4666667, -18.4333333, -9.7333333, -12.9333333, -9.0666667, -12.2, -17.0333333, -12.7333333, -15.5, -14.7333333, -14.2333333, -17.2666667, -17.4666667, -14.1333333, -10.4666667, -15.6333333, -14.3333333, -17.7666667, -17.0666667, -16.7333333, -12.6, -18, -12.5666667, -13.1, -15.4, -16.5, -13.4333333, -15.6, -15.4, -14.0333333, -15.7, -15.1, -15.5333333, -13.7, -10.4333333, -17.6, -15.0333333, -13.1333333, -13.7666667, -15.2, -15.3, -13.6333333, -12.6, -15.3666667, -11.8333333, -14.7666667, -11.1666667, -14.3666667, -12.4, -16.0333333, -14.4, -16.6, -11, -16.4333333, -15.2, -15.6333333, -15.5666667, -14.5333333, -12.0666667, -14.7666667, -16.4333333, -15.0333333, -19.7333333, -15.8, -15, -14.8, -15.9333333, -14.2333333, -9.8666667, -16.6, -14.0666667, -15.2, -14.3, -16.4, -17.6666667, -15.6, -13.4666667, -14.8666667, -16.1666667, -12.0333333, -17.5333333, -16.4666667, -13.9, -13.1333333, -14.7, -13.3, -14.5666667, -13.5666667, -13.9, -11.3333333, -14.5666667, -14.4666667, -15.0333333, -14.6333333, -14.9, -17.5333333, -10.1666667, -13.2, -13.4333333, -14.7666667, -15.5666667, -14, -12.6666667, -16.1, -11.0333333, -17.9666667, -13.7333333, -12.5666667, -13.9, -14.3, -15.3666667, -15.6666667, -12.7666667, -13.2, -15.1, -14.2666667, -11.7666667, -16.3, -18.5666667, -15.0666667, -10.2333333, -12.3, -13.7333333, -17.2, -13.7333333, -15.3333333, -18.8, -13.5666667, -12.9, -13.3, -15.6, -18.1333333, -16.0666667, -14.9333333, -13.9333333, -12.1333333, -17.2666667, -17.8333333, -16.0666667, -9.4666667, -14.0666667, -13.9666667, -15.0666667, -12.9, -8.8666667, -15.2333333, -14.9, -17.8, -15.7333333, -11.8666667, -10.7, -10.2666667, -15.0333333, -16.4, -13.9, -19.1333333, -13.4, -16, -19.0333333, -6.4333333, -11.8666667, -11.2, -12.1666667, -12.3333333, -18.3333333, -14.4666667, -10.6666667, -11.6666667, -13.1666667, -13, -17.7666667, -12.1333333, -14.4666667, -12.9666667, -16.0333333, -13.2666667, -17.6666667, -16.1666667, -13.8, -14.6666667, -15.6333333, -12.6, -19.4, -16.0666667, -12.9666667, -12.6, -13.3, -17.3333333, -15.6333333, -14.4666667, -15.4666667, -17.5, -16.0333333, -15.1, -12.9, -12.2, -17.7666667, -14.5, -13.4333333, -12.9333333, -15.7, -13.1, -15.7, -16.7333333, -9.4, -11.4333333, -15.3, -15.8333333, -15.5666667, -8.8, -13.3, -14.4333333, -17.2666667, -12.7, -16.0333333, -14.3, -10.7333333, -17.7, -15, -15.1666667, -13.9333333, -15.9333333, -15.6666667, -11.4666667, -12.0333333, -15.4, -9.9, -12.9, -13.7666667, -14.1333333, -15.9, -12.7333333, -17.4, -16.4666667, -11.1, -15.7666667, -12.7, -15.5333333, -17.4, -14.3, -15.7666667, -11.6, -15, -15.2, -16.2, -16.7, -12.9333333, -16.5666667, -10.3333333, -17.7666667, -13.6, -12.1, -12.4666667, -15.0333333, -13.4333333, -13.5, -17, -15.7, -16.0666667, -15.5333333, -14.1666667, -14, -12.6666667, -12.9666667, -17.2333333, -17.5666667, -13.3, -16.2, -12.4333333, -17.2333333, -14.0666667, -11.0666667, -14.5333333, -16.3666667, -16.3666667, -14.1666667, -13.2666667, -11.5333333, -21.4, -16.9, -15.0666667, -14.3, -11.6666667, -9.0333333, -14.8, -11.9, -16.5666667, -16.3333333, -19.2, -12, -12.1666667, -15.8666667, -17.7333333, -9.0666667, -19.5666667, -15.1333333, -15.4666667, -11.7333333, -14.9, -13.6, -11.6666667, -13.8, -16.8333333, -11.1333333, -12.8333333, -14.2666667, -8.4666667, -13.5666667, -15.0333333, -12.4666667, -16.3666667, -15.8333333, -11.6, -10.9, -13.3333333, -13.9333333, -17.6333333, -14.8, -14.4333333, -12.3333333, -11.1, -13.2666667, -16.5333333, -11.7666667, -15.1333333, -14.1666667, -10.0333333, -16, -12.8666667, -13.3666667, -13.7333333, -17.0333333, -16.0666667, -15.7, -12.3, -16.3, -14.2333333, -16.4333333, -13.1333333, -13.7333333, -17.4666667, -13.7666667, -10.7, -12, -17.8333333, -14, -14.3666667, -14.3666667, -14.2666667, -9.9333333, -16.2666667, -13.7, -14.3, -11.6333333, -18.2, -16.2666667, -19.0666667, -15.3666667, -15.2, -16.4666667, -12.4666667, -11.6333333, -7.6666667, -11.5333333, -15.5333333, -13, -14.9666667, -16.8666667, -15.7333333, -8.4, -19.7333333, -14.6, -15.3, -13.1666667, -15.6, -13.9333333, -12.4333333, -15.3, -15.4, -18.7333333, -17.2333333, -11.2, -14.3, -12.8333333, -13.2666667, -12.6666667, -12.2333333, -14.6666667, -15.7, -15.4666667, -16.5333333, -16.6, -12.9333333, -11.4666667, -17.2333333, -9.1, -15.2333333, -8.3666667, -13.0333333, -11.3333333, -18.6, -14.2333333, -12.8333333, -15.0666667, -16.4333333, -12.2666667, -14.2, -14.2, -9.4666667, -14.9666667, -16.7, -11.4, -13.3666667, -15.6, -16.8, -14.5, -14.6, -14, -14.2, -14.8333333, -13.7333333, -16.4, -15.8, -11.3333333, -10.3333333, -14, -13.8333333, -10.4, -14.2333333, -12.6666667, -11.3333333, -15.1333333, -13.0666667, -11.6333333, -18.6, -10.5, -13.7, -16.2, -17.2666667, -17.1, -14.6, -16.8666667, -15.3333333, -12.7666667, -17.5, -13.7333333, -15.4666667, -16, -14.7333333, -12.9333333, -16.0333333, -18.2666667, -10.7, -11.9333333, -10.8666667, -13.5666667, -10.8, -15.4333333, -15.9666667, -14.3666667, -12.1666667, -13.5666667, -10.7, -13.4333333, -13.1, -14.0333333, -12.8666667, -10.3333333, -13.4666667, -13.5333333, -15.6333333, -9.9, -10.8333333, -13.2333333, -8.5, -17.2666667, -12.0333333, -15.0333333, -12.4, -14.9333333, -19.5666667, -12.4, -13.2, -10.6666667, -16.5333333, -13.4, -15.1666667, -16.7333333, -13.4, -15.2, -10.3666667, -13.8666667, -12.5333333, -13.7666667, -15.2666667, -13.1333333, -13.4, -14.3, -10.5333333, -14.1, -14.8, -12.2, -12.0333333, -16.9666667, -14.9333333, -15.4, -12.0333333, -16.3, -16.2666667, -13.7, -14.8666667, -11.2, -12.6333333, -19, -14.7666667, -16.1333333, -16.6666667, -11.2, -17.8333333, -15.5, -14.2, -17.2666667, -15.3666667, -15.7333333, -17.2, -11.4666667, -11.6, -11.7, -17.3, -13.8, -13.8333333, -15.0666667, -8.9333333, -13.8, -13.2, -11.7333333, -16.2333333, -17.1, -12.8333333, -12.7, -10.7, -19.3666667, -13.0666667, -15.4333333, -13.2, -18.0666667, -13.5, -14.4333333, -12.8333333, -10.5, -10.4333333, -15.4, -15.2666667, -16.4333333, -11.9, -12.2, -13.1, -9.1, -11, -10.2666667, -13.7333333, -17.6, -13.5666667, -16.9333333, -15.7666667, -14.8666667, -8.8333333, -12.7, -9.2, -12.9, -13.3666667, -14.5, -18.1333333, -10.2666667, -9.8666667, -16.4666667, -12.6333333, -15.5, -16.2666667, -15, -15.5666667, -11.0333333, -16.7333333, -13.3333333, -13.2666667, -15.2666667, -15.7666667, -13.9333333, -15.9333333, -14.5333333, -15.1, -11.2, -14.1333333, -16.4333333, -13.9, -12.7333333, -13.2333333, -15.7, -11.9333333, -13.4666667, -16.2, -15.0666667, -9.7666667, -16.0666667, -13.3666667, -16.5, -12.8333333, -14.6, -15.2333333, -18.4333333, -13.8333333, -11.7333333, -18.4333333, -14.9, -10.5, -15.4, -11.8, -14.5, -13.3666667, -14.5, -13.8666667, -13.3, -14.9333333, -13.9, -12.3, -14.5666667, -14.4666667, -13.5, -17.6, -18.3666667, -12.9, -13.5333333, -11.4, -16.9666667, -12.9666667, -11.9333333, -12.7333333, -13.9, -12.4666667, -15.9, -11.5, -15.4, -16.1, -17.2666667, -13.5333333, -12.1, -15.6333333, -14.7, -10.2333333, -15.8, -16.3333333, -11.6666667, -17.5, -15.6666667, -13.6666667, -17.0333333, -9.5, -17.3333333, -11.3333333, -12.5, -17.4, -13.2333333, -15.1666667, -16.1, -11.5, -17.3, -16.9333333, -15.9333333, -15.1, -13.4, -18.3333333, -14.4666667, -9.5666667, -14.1333333, -17.1333333, -18.8666667, -17.4666667, -15.3666667, -14.3333333, -14.3333333, -14.7333333, -12.4333333, -11.3666667, -13.8666667, -17.1, -13.7333333, -12.6333333, -14.6, -16.7666667, -10.8333333, -12.7, -12.3333333, -18.6333333, -13.9333333, -15.6666667, -14.3, -12.1333333, -16.6, -12.5, -15.3666667, -13.4, -14.1333333, -13.6, -13.2333333, -13.2333333, -11.7333333, -15.1333333, -12.8666667, -13.5, -16.7333333, -13.6, -19.2, -13.1, -13.6333333, -11.7, -17, -15.4, -15.4, -14.2666667, -10.1, -13.6, -13.8, -12.5666667, -14.9666667, -15.7333333, -13.1333333, -14, -10.4333333, -15.1, -11.3666667, -13.8, -14.5666667, -14.7333333, -18, -11.7666667, -12.6666667, -16.1, -14.8333333, -10.9666667, -14.4666667, -11.0666667, -16.6333333, -14.9333333, -18.1666667, -15.2333333, -14.2666667, -15.7333333, -16.1333333, -16.7333333, -15.7, -11.4, -13.3, -16.0666667, -12.2333333, -10.6333333, -14.0666667, -14.0666667, -6.9333333, -15.5333333, -12.4, -13.3333333, -12.6, -14.8, -17.3, -12.2666667, -13.1333333, -13.6333333, -16.6, -15.6333333, -13.1, -15.1, -16.7333333, -11.8333333, -15.4333333, -13, -12.1666667, -15.6666667, -18.3666667, -14.4666667, -10.7666667, -12.6, -11.2333333, -14.1, -8.4666667, -16.5333333, -16.9666667, -17, -13.8333333, -13.1666667, -15, -13.5666667, -15.6666667, -15.5, -16.8, -13.9, -13.0666667, -16.5333333, -14.6333333, -17.4666667, -13.8333333, -15.6333333, -12.5666667, -13.4666667, -17.3333333, -15.5333333, -13.4666667, -12.5666667, -14.2333333, -15.2333333, -12.2333333, -13.0666667, -14.8666667, -13.9333333, -16.2, -13.3666667, -11.8666667, -17.7, -12.0666667, -13.4666667, -15.1, -12.8, -14.5, -15.1666667, -13.3666667, -15.4666667, -12.8666667, -13.8333333, -9.4333333, -13.9, -15.6666667, -13.4, -14, -15.6333333, -14.3666667, -12.0333333, -15.2, -14.0666667, -10.7666667, -12.8666667, -9.6666667, -17.6333333, -17.7, -18.0666667, -15.2333333, -14.3, -13.7666667, -14.5666667, -13.1, -11.7666667, -9.8333333, -14.8, -10.4, -16.0666667, -12.8, -11.9333333, -14.0666667, -16.9, -10.1, -14.7666667, -15.3, -12.2666667, -17.4333333, -15.1, -19.8333333, -18, -14.0333333, -13.3, -12.6, -8.6, -13.5666667, -14.2666667, -11.4333333, -14.4333333, -16.2666667, -16.5666667, -14, -14.6333333, -14.4333333, -16.0666667, -15.8, -13.7333333, -9.2666667, -12.9666667, -15.6333333, -13.5666667, -17.7666667, -13.4333333, -18.2, -15, -15.3666667, -16.4666667, -16.2666667, -16.8333333, -14.4666667, -17.0333333, -15.1666667, -12.9333333, -13.5333333, -16.7333333, -15.3666667, -12.2, -16.9333333, -15, -13.4666667, -14.1666667, -17, -18.8333333, -11.4, -13.8666667, -16.3, -12.8666667, -13.8333333, -15.4333333, -14.2666667, -11.1, -13.0666667, -13.8666667, -12.4666667, -15.8333333, -16.2666667, -13.3, -10.3666667, -11.4, -12.8333333, -13.6, -14.4666667, -14.5, -17.5666667, -13.5666667, -19.8666667, -15.8, -15.8, -14.7, -14.4333333, -18.3, -16.6, -14.8666667, -13.7333333, -16.3, -16.7666667, -13.7666667, -11, -14.1333333, -12.2666667, -14.7666667, -10.7666667, -14.2666667, -10.3, -9.2333333, -14.6, -18.0666667, -11.8666667, -13.9333333, -15.1666667, -14.5666667, -12.5666667, -13.0333333, -15.0333333, -12.9333333, -13.6666667, -15.2, -16.0333333, -13.4, -16.5, -16.1666667, -13.5, -10.9, -13.7666667, -16.5, -14.3333333, -18.6666667, -13.0333333, -14.9666667, -15.1333333, -16.2666667, -15.7666667, -11.3333333, -14.6333333, -15.5666667, -15.3, -13.4, -16.4666667, -12.6, -16.6, -15.3333333, -18.3666667, -18.8666667, -10.3333333, -12.8333333, -15.2666667, -15.1, -14.7, -12.9333333, -14.4333333, -16.9666667, -14.3333333, -16.1666667, -15.6, -14.7, -12.6, -9.1333333, -13.3333333, -13.8333333, -11.4333333, -16.3666667, -17.7, -16.8666667, -14.7, -16.8666667, -12.8333333, -14.1666667, -12.3, -14.5333333, -16.8333333, -17.7, -16.9, -14.2333333, -11.7333333, -14.3333333, -12.3666667, -12.7333333, -20.8333333, -13.8333333, -13.8333333, -15.1, -13.4333333, -13.2333333, -13.4, -14.9, -12, -15.6666667, -13.8333333, -13.3, -18.3333333, -15.9666667, -13.2, -14.4333333, -14.1333333, -14.4333333, -16, -12.6666667, -13.9333333, -15.2333333, -17.1, -13.2, -16.2333333, -11.7333333, -15.3333333, -15.2333333, -14.2, -15.0333333, -11.3, -11.2666667, -12.8666667, -16.2666667, -16.7666667, -16.5333333, -12, -14.1, -16.8666667, -14.4666667, -18.6333333, -17.4333333, -14.3333333, -14.6, -15.9, -12.8666667, -11.7666667, -10.9, -17.9333333, -15, -13, -18.6, -14.3666667, -12.7, -16.9333333, -17.0666667, -12.7333333, -13.9333333, -10.7, -17.3666667, -13.6, -16.0666667, -9.6333333, -10.7, -15.3, -14.9666667, -14.7, -11.5666667, -14.3, -15.9333333, -15.9333333, -16.3, -15.7, -11.5333333, -14.4, -8.9666667, -11.7333333, -17.3, -13.6, -12.6666667, -12.2, -13.9333333, -13.6, -14.3666667, -15.2666667, -12.4333333, -13.9333333, -14.8333333, -19.5, -16.4666667, -15.4666667, -14.2, -16.6666667, -12.1, -10.4333333, -13.4666667, -13.2, -14.5333333, -19.6666667, -14.2, -12.2333333, -17.9666667, -13.8, -14.2, -18.7666667, -17.9, -16.7, -11.8333333, -14.2666667, -13.3666667, -15.2, -14.6666667, -13.5333333, -17.0333333, -18.8, -16.4, -16.4, -12.3333333, -12.0666667, -14.4666667, -15.0666667, -13.8, -13.8, -13.5, -15.9666667, -12.6666667, -12.1333333, -15.8333333, -18.3, -11.6666667, -12.0666667, -15.8333333, -10.7666667, -10.1666667, -12.6333333, -14.4, -15.3333333, -16.5666667, -12.5333333, -15.8, -17.6333333, -14.1, -11.5666667, -13.6, -12.8666667, -17.3666667, -13.0333333, -15.9, -17.0666667, -15.7333333, -10.8666667, -12.0333333, -12.4333333, -15.9, -13.8666667, -14.9333333, -15.7, -13.4333333, -15.5666667, -13, -11.5333333, -15.0333333, -16.7333333, -12.4333333, -11.0666667, -14.7, -16.2, -11.5333333, -14.1, -15.9666667, -11.6333333, -12.9666667, -9.9666667, -17.8666667, -13.8666667, -13.7333333, -10.6333333, -12.5333333, -13.6333333, -10.0333333, -13.2666667, -12.8666667, -14.9333333, -18.3666667, -17.3333333, -12.7, -11.5, -15.8333333, -14.3, -15.7, -17.4333333, -12.3333333, -15, -15.4333333, -15.5, -12.1333333, -9.9666667, -13.0666667, -14.8666667, -15.1, -14.2, -15.3666667, -10.3333333, -13.9666667, -13.1, -12.6666667, -17.2, -15.0333333, -18.7666667, -16.5666667, -15.9, -18.4, -12.7666667, -11.6333333, -12, -13.8666667, -16.1, -13.2, -13.8333333, -11.5666667, -16.2666667, -14.8666667, -16.6, -13.6, -13.1666667, -13.3666667, -16, -14.6666667, -9.6, -14.5666667, -13.4, -15.7333333, -9.6333333, -13.8333333, -12.4, -16.3, -13.9333333, -9.9, -13.9666667, -12.3333333, -12.1333333, -17.6333333, -12.9333333, -20.9, -17.0333333, -14.9666667, -13.9, -16.4333333, -16.1666667, -16.2666667, -16.3333333, -11.5, -13.2333333, -16.1333333, -9.7666667, -14.1333333, -14.7333333, -9.5666667, -15.3, -11.8, -15.2666667, -12.5333333, -13.1333333, -16, -13.8666667, -16.2333333, -9.6666667, -16.2, -15.8666667, -16.4666667, -13.7333333, -12.2333333, -11.1, -19.0666667, -15.4666667, -12.5, -12.9, -14.7333333, -16.8666667, -14.9, -14.7666667, -11.0333333, -11.5, -9.5666667, -10.5, -18.4666667, -12.9, -13.1666667, -17.1666667, -10.1, -13.5, -11.9333333, -13.7, -18.4666667, -18.2333333, -14.7333333, -15.6666667, -14.0666667, -16.2333333, -13.2666667, -15.1666667, -17.4666667, -13.8666667, -10.7, -16.8333333, -14.9, -15.0333333, -13.0666667, -18.8, -13.7333333, -17.8, -16.8666667, -9.7, -12.9, -18.3666667, -13.3333333, -15.1333333, -15.6333333, -15.9333333, -13.9666667, -18.8333333, -13.6, -11.1, -15.0333333, -15.6333333, -9.3333333, -13.8666667, -16.4, -12.5, -10.5333333, -14.9, -17.3333333, -16.1333333, -13.8666667, -15.4666667, -15.9333333, -15.5, -11.9, -11.9333333, -13.5333333, -11.8333333, -12.0333333, -15.3666667, -13.2, -13.5, -17.2333333, -16.3, -10.2, -16.9, -16.1333333, -16.3666667, -17.0666667, -14.5, -14.0666667, -15.5333333, -13, -15.1333333, -18.2, -15.7, -14.6, -18.1, -14.4333333, -14.4333333, -14.2, -15, -12.9333333, -11.6333333, -12.8666667, -16.0666667, -13.9, -15.1, -14.6666667, -14.7666667, -16.9333333, -12.2333333, -14.3666667, -16.8666667, -15.3666667, -14.1, -15.2666667, -14.8, -14.1, -16.5666667, -16.4333333, -13.6, -14.3666667, -14.9333333, -13.6333333, -12.2333333, -11.9, -11.8333333, -14.7666667, -16.3, -13.0333333, -13.0666667, -12.9, -14.5333333, -13.3333333, -14.9666667, -16.0666667, -9.2333333, -14.9, -11.7, -11.6666667, -16.5, -14.9333333, -15.8333333, -12.9, -14.1, -15.3, -17.8666667, -11.4666667, -13.9, -10.6333333, -16.5, -10.5666667, -15.1666667, -13.9, -14.2666667, -13.1333333, -11.8, -13.1333333, -13.3333333, -9.9333333, -13.4666667, -13.7, -18.2333333, -16.4, -16.4666667, -13.7333333, -17.6666667, -12.9333333, -16.4, -15.1, -17.5333333, -17.5666667, -15.3333333, -14.3, -14.8, -13.2666667, -13.1333333, -14.6666667, -13.0333333, -19.5333333, -10.9666667, -11.7666667, -16.0333333, -15.3333333, -15.8, -11.9333333, -14.8, -16.1, -15.4, -14.4, -15.2, -15.8333333, -16.9666667, -9.0666667, -16.6333333, -17.2666667, -13.9666667, -13.6666667, -13.1333333, -12.3666667, -7.0333333, -14.4, -15.2, -12.5333333, -16.7333333, -16.2666667, -16.0666667, -13.9666667, -14.6666667, -14.1333333, -15.6333333, -12.9, -16.1333333, -13.6666667, -12.2666667, -17.8333333, -14.2333333, -12.3666667, -14.7333333, -12.7, -19.2333333, -14.3666667, -16.6, -12.5, -12.6, -16.0333333, -13.1, -10.9333333, -12.4666667, -14.1666667, -12.4, -11.2333333, -15.6666667, -11.6333333, -15.7666667, -12.7666667, -11.5333333, -11, -14.4666667, -12.5666667, -14.1, -13.2333333, -15.4666667, -18.3333333, -13.5666667, -13, -15.8333333, -10.4666667, -15.6333333, -13.7333333, -13.4666667, -14.8333333, -17.3, -13.5, -14.4, -15.4333333, -14.7, -12.4666667, -16, -20.3333333, -16.9333333, -12.3666667, -19.3, -11.2666667, -14.7, -15.3666667, -11.2666667, -11.8, -14.7, -16.9333333, -13.8333333, -16.1666667, -11.5333333, -11.8666667, -8.3666667, -14.4666667, -11, -9.6, -15.7333333, -13.7, -16.4333333, -14.5666667, -10, -12.2666667, -13.6, -14.3, -13.3333333, -18.1, -14.3333333, -15.0333333, -16.1333333, -12.8333333, -9.4333333, -16.9, -17.3333333, -17.5666667, -15.6666667, -9.7, -15.2333333, -12.3666667, -14, -15.3666667, -12.5666667, -14.2333333, -15.1666667, -12.4333333, -14.3666667, -16.5666667, -11.3, -17.4, -10.7333333, -12.5, -16.5333333, -12.7333333, -14.1666667, -9.1, -16.1666667, -12.8666667, -11.7, -12.3333333, -12.8333333, -11.4333333, -14.7, -12.3, -15.9333333, -9.4333333, -16.1666667, -14.9666667, -14.3, -10.3333333, -13.2333333, -12.4, -14.4, -14.4666667, -13.4, -16.2, -15.3666667, -15.3, -11.5333333, -15.4666667, -14.6333333, -18.7666667, -11.2333333, -15.5666667, -14.7666667, -18.1666667, -12.8333333, -16.1333333, -9.5, -12.5666667, -15.7333333, -11.6666667, -15.5333333, -16.6, -12.5, -17.6666667, -17.4333333, -13.1333333, -12.2333333, -15.6333333, -12.3333333, -15.4333333, -8.6666667, -15.8333333, -14.9333333, -14.6666667, -14.7, -17.6, -12.0333333, -17.0666667, -14.5, -13.5333333, -15.3666667, -15.2666667, -15.1666667, -13.4666667, -14.1666667, -15.2666667, -13.8, -14.4333333, -14.5333333, -10.7666667, -18.4, -17.2, -15.9666667, -13.3666667, -14.2, -13.5, -13.5333333, -14.1333333, -19.4333333, -15.2333333, -11.5666667, -14.8, -13.4666667, -15.9333333, -14.1333333, -12.7333333, -13.8666667, -15.9666667, -16.7666667, -14.2666667, -15.0666667, -12.2666667, -14.1333333, -14.5333333, -12.3333333, -11.4666667, -14.1, -14, -16.1, -13.6, -18.8, -15.0666667, -15.1, -16.5666667, -11.9333333, -14.9666667, -13.6, -10.9, -9.3666667, -16.4666667, -12.1666667, -10.9666667, -13.7666667, -11.7666667, -11.2666667, -14.5666667, -14.0333333, -16.0666667, -16.6666667, -13.9666667, -14.8333333, -19.1333333, -10.4, -16.4333333, -12.9666667, -15.8, -15.7333333, -16.8666667, -15.7, -16.0333333, -12.6333333, -16.1, -13.8333333, -11.8666667, -14.6, -17.2666667, -15.5, -16.4333333, -13, -19.9, -14.5333333, -15.4, -15.2, -17.0333333, -13.5, -15.8666667, -14.4, -11.3666667, -15.2333333, -14.7333333, -14.6, -12.5, -15.1, -16.4333333, -15.0333333, -15.9, -13.3, -16.6, -12.4, -15.2666667, -11.3666667, -12.7666667, -12.5, -10.7, -13.6666667, -18.8666667, -15.5, -13.6333333, -14.2666667, -14.3333333, -16.2333333, -14.0333333, -8.6, -13.3333333, -11.1666667, -11.8, -13.8, -11.0333333, -10.3666667, -15.9, -14.4333333, -9.1, -13.5, -15.7666667, -12.1666667, -15.4666667, -12.1, -14.1333333, -14.7, -8.8, -9.3333333, -15.3, -16.5666667, -13.9666667, -12.6666667, -15.4333333, -12.0333333, -14.2333333, -16.6666667, -15, -19.2333333, -16.5333333, -17.1, -13.4, -14.9, -13.9, -19.3666667, -14.4666667, -16.1666667, -15.1, -13.8, -18.0666667, -13.5333333, -13.9, -18.1, -15.8, -17.0666667, -16.9666667, -11.7, -13.9666667, -14.6333333, -14.6, -11.5666667, -12.2666667, -15.1333333, -15.9, -12.7, -11.9666667, -14.7333333, -15.2666667, -17.6, -15.3, -14.5, -13.3333333, -12.1333333, -9.9333333, -17.9333333, -15.9666667, -16.6666667, -15.6333333, -12.4, -17.8, -20.1333333, -16.9666667, -11.3, -12.8666667, -14.4, -15.2333333, -15.4, -14.1, -14.9666667, -12.3666667, -14.5333333, -15.2, -15.2, -16.0333333, -7.4333333, -16.6666667, -14.8, -10.3666667, -7.0333333, -19.1666667, -12.0333333, -13, -20.2, -13.8333333, -12.9333333, -13.0666667, -16.2, -13.3, -11.3333333, -15.1666667, -18.5333333, -12.8333333, -11.1666667, -10.7666667, -13.9, -13.9666667, -14.5666667, -13, -9.9, -13.6666667, -16.5666667, -17.9666667, -15.6, -15.7666667, -12.1666667, -15.6333333, -20.0666667, -15.6333333, -13.9, -15.3333333, -13.1333333, -12.5333333, -17.6666667, -18.0333333, -9.9, -16.0333333, -15.6, -10.8666667, -15.5333333, -18.1333333, -15.0333333, -12.4, -11.6666667, -18.5, -15.3333333, -14.8666667, -16.9666667, -12.6666667, -15.2, -14.3333333, -11.9666667, -11.8666667, -14.9333333, -14.6666667, -14.2333333, -16.2666667, -10.1, -17.0333333, -17.6666667, -12.3333333, -18.2, -13.7333333, -11.3, -15.4333333, -14.8333333, -19.9, -13.5333333, -16.3, -17.1333333, -12.9333333, -12.5, -14.8, -12.1, -10.8, -12.5666667, -14.3666667, -13.1333333, -8.7666667, -15.1666667, -13.5666667, -15.5333333, -12.6666667, -7.9666667, -13.1666667, -18.6333333, -11.1, -16.6333333, -15.0333333, -15.1333333, -14.4, -12.8333333, -15.6333333, -15.5, -13.4333333, -14.7666667, -13.7333333, -16.3666667, -17.7, -15.4666667, -14.3, -13.4, -17.6333333, -10.1333333, -15.8666667, -13.7666667, -15.6333333, -12.3333333, -14.1, -17.1666667, -16, -17.1333333, -13.4333333, -18.5, -15, -14.6666667, -17.2, -17.3333333, -8.9666667, -9.3666667, -15.3666667, -16.1, -15.6, -14.8333333, -15.7, -15.0666667, -14.9666667, -13.2, -11, -13, -14.1333333, -16.3, -18.4, -15.1666667, -12.9, -15.9, -13.3666667, -13.4333333, -18.6, -12.4666667, -13.9333333, -15.5, -13.8333333, -13.2333333, -17.0666667, -12, -13.7, -15.4333333, -13.0666667, -13.4666667, -13.0333333, -12.4333333, -15.4333333, -14.1, -13.4, -12.0333333, -11.4, -17.9666667, -9.1333333, -17.5, -11.1333333, -16.1, -12.4333333, -13.5666667, -17.7333333, -9.1666667, -15.9, -13.2333333, -13.3, -12.3666667, -13.1333333, -16.5666667, -14.1, -9.9666667, -12.4333333, -16.8333333, -16.5333333, -13.5, -14.5, -13.0333333, -12.6333333, -12.3666667, -15.5, -11.6333333, -16.6666667, -16.2666667, -11.0333333, -13.1, -12.2666667, -14.5333333, -16.1666667, -11.1666667, -14.2333333, -16.0666667, -13.8333333, -13.1666667, -12.9333333, -14.3333333, -14.7666667, -14.7666667, -14, -16.1, -13.9666667, -15.7333333, -16.9666667, -16.9333333, -19.2666667, -14.2666667, -15.1333333, -18.8, -11.4666667, -13.4, -12.4333333, -16.8666667, -12.0333333, -15.4, -16.1666667, -13.8333333, -14.3, -14.5666667, -15.7666667, -15.6333333, -11.9333333, -10.3333333, -13.8, -16.0666667, -14.5666667, -14.9666667, -12.4, -14.8, -18.3333333, -10.8666667, -16.1666667, -17.4, -16.3, -17.3333333, -14.8333333, -12.4666667, -11.6666667, -10.6666667, -20.5666667, -16.7666667, -15.8333333, -13.8333333, -15.2666667, -14.1333333, -17.6666667, -14.2333333, -14.3666667, -13.9666667, -14.0333333, -14.5, -12.5, -12.0666667, -12.2333333, -13.6333333, -13, -14.3, -15.2666667, -16.0333333, -13.9, -13.4, -11.4666667, -13.0333333, -11.6, -16.5333333, -14.1666667, -13.6333333, -14.0333333, -17.3, -16.9666667, -12.3666667, -14.5, -19.7, -10.5666667, -12.6, -15.7333333, -16.2333333, -14.6666667, -14.5333333, -15.0333333, -12.2333333, -18.2, -14.3666667, -11.6, -14.5, -13, -16.7666667, -16.1333333, -14.1333333, -15.5, -12.7, -12.9333333, -10.7333333, -18.4666667, -15.4333333, -16.3333333, -14.2, -12.7, -15.4, -14.1333333, -8.7, -17.9333333, -11.5, -14.5333333, -18.1, -14.1666667, -12.9, -9.3, -14.4, -19.7333333, -16.5, -11.4, -13.6666667, -16.2666667, -9.7333333, -15.8666667, -16.7333333, -12.5333333, -14.7, -14.2333333, -15.0333333, -19.3, -12.5, -13.4333333, -13.7333333, -14.6666667, -16.3666667, -13.1666667, -10.6, -17.2333333, -16.9666667, -13.7, -13.8, -13.6, -12.7333333, -13.5, -10.7333333, -13.7333333, -11.1666667, -15.7333333, -11.1, -11.3666667, -11.5333333, -12.4333333, -14.3, -12.4666667, -13.5, -13.7666667, -17.1666667, -15.6333333, -13.8, -16.9333333, -12.9666667, -14.4, -14.3, -13.3, -15.7666667, -11.0333333, -12.3, -17.8666667, -11.3, -10.3666667, -15.5666667, -16.9333333, -8.7666667, -13.5, -8.3666667, -13.2, -12.9333333, -13.3, -15.9666667, -13.7333333, -17.7333333, -18.2, -16.5333333, -12.1333333, -16.5, -11.6666667, -16.0333333, -12.2, -15.0666667, -13.8, -10.1, -17.7, -12.3, -12.0666667, -16.0666667, -13.3333333, -11.6, -12.1666667, -18.6333333, -13.1666667, -13.9, -13.3333333, -15.8666667, -12.2, -10.9666667, -16.5666667, -13, -16.3333333, -15.9, -17.0666667, -14.6666667, -15.5333333, -11.1333333, -17.8, -9.7666667, -9.7, -10.4, -10.2333333, -17.6666667, -16.1333333, -16, -10.1333333, -15.4666667, -15.9, -19.7, -16.2666667, -13.7666667, -16.4333333, -9.9, -8.0666667, -12.0666667, -10.3, -12.8666667, -12.3, -14, -16.1333333, -12.6666667, -17, -11.0666667, -17.1333333, -10.7666667, -13.2666667, -12.2333333, -18, -15.3, -9.8666667, -15.5, -16.6333333, -12.9, -12.9333333, -13.6666667, -14.7, -15.1666667, -11.9, -14.8333333, -15.9333333, -16.9666667, -11.7666667, -11, -12.9666667, -15.1666667, -20.8333333, -12.5333333, -11.7666667, -10.2666667, -11.3666667, -14.9, -12.0666667, -16, -11.7333333, -15, -16.9, -15.8, -11.2666667, -10.5666667, -15.5333333, -18.8, -15.5, -17.8333333, -16.4666667, -19.7, -8.5333333, -13.5666667, -11.7666667, -13.5333333, -12.3333333, -10.5, -18.9666667, -15.5333333, -10.3, -16.4333333, -14.7, -16.4666667, -17.9333333, -15.0666667, -14.7333333, -16.7, -13.2333333, -20.5, -13.0666667, -7.5666667, -12.8, -16.1333333, -14.6666667, -15.1, -15.1333333, -10.8, -12.9, -14.4, -12.0333333, -15.1, -11.9, -13.6333333, -13.4333333, -13.8333333, -13.7, -17.7, -19, -15.6333333, -10.9666667, -14.5333333, -17.1666667, -16, -16.8, -14.3666667, -12.5333333, -12.0333333, -10.9, -17.7, -15.0666667, -12.9666667, -13.3, -14.9, -15.1666667, -12.0666667, -14.8333333, -12.4666667, -13.6, -10.9, -12.1333333, -18.3, -13.7333333, -14, -12.2666667, -14.3333333, -16.2, -14, -12.4666667, -11.6666667, -11.4333333, -14.8666667, -11.9, -11.4333333, -13.9666667, -12.8, -15.5333333, -14.3, -14.4, -15.9666667, -12.7, -13.6, -13.0666667, -15.5666667, -16.2666667, -14.7666667, -13.1333333, -13.6666667, -15.1666667, -14.8333333, -12.0666667, -12.9666667, -16.7333333, -14.6666667, -14.1, -12.2333333, -9.8333333, -14.2, -12.4333333, -12.6666667, -14.6333333, -16.1, -19.9666667, -17.5666667, -15.5666667, -13.8, -12.4, -13.5333333, -16.3666667, -13.1333333, -9.6666667, -17.2333333, -14.0666667, -15.8666667, -16.0666667, -14.2666667, -17.2333333, -14.3, -13.9, -9.3, -12.8, -19.4333333, -12.1666667, -10.8666667, -14.8333333, -14.0666667, -12.8, -14.5666667, -12.5333333, -16.3, -12.6666667, -13.4666667, -10.5, -17.8333333, -16.1666667, -9.6666667, -20.2, -12.3, -13.9333333, -12.0666667, -10.4, -15.1666667, -13.4, -12.2333333, -16.5333333, -12.9, -18.2333333, -12.6666667, -13.4, -13.9333333, -17.3, -14.7, -15.8, -13.2333333, -15.5666667, -17.8333333, -12.3333333, -16.2, -13.6333333, -16.9, -16, -14.6333333, -15.4333333, -13.9, -14.1, -16.7666667, -9.4666667, -14.8666667, -16.5333333, -17.1333333, -15.4666667, -15.5666667, -12.2666667, -14.5, -13.2, -13.4333333, -15.8666667, -15.1666667, -14.5333333, -13.5666667, -13.0666667, -12.7, -14.5, -15.8333333, -14.2333333, -16.3666667, -12.6666667, -11.8333333, -16.3666667, -14.4666667, -14.5, -12.2333333, -13.2666667, -15.1, -11.2666667, -13.3, -13.4666667, -13.3, -13.1666667, -15.4666667, -14, -19.7, -16.3, -9.6333333, -14.1, -14.4666667, -10.4, -19.9333333, -15.9333333, -12.0333333, -14.8666667, -13.6, -15.4333333, -12.7, -14.1666667, -12.6333333, -15.3666667, -13.9666667, -14.2, -15.8333333, -13.7, -14.9333333, -7.4333333, -14.7333333, -14.1333333, -14.6, -13.0666667, -12.1333333, -13.1333333, -9.6333333, -18.9666667, -13.5, -15.2, -10.7333333, -10.4666667, -14.5, -17.5666667, -11.4666667, -9.2666667, -15.5, -14.5333333, -16.1666667, -14.7666667, -16.8666667, -12.4333333, -13.2, -14.8, -11.4, -13.2666667, -17.2333333, -11.8, -13.5, -16.6333333, -17.1666667, -10.2, -9.0666667, -16.2, -15.9666667, -15.7666667, -11.2, -14.8, -12.2666667, -14.5333333, -15.7, -12.6666667, -15.0333333, -15.2666667, -15.0666667, -14.0666667, -15.5333333, -17.3333333, -13.3333333, -15.9, -19.6, -12.6666667, -18.0333333, -10.9666667, -13.5, -14.1333333, -10.6333333, -14.7, -16.2666667, -16.5, -15.6, -12.2, -15.6666667, -10.5333333, -15.2666667, -19.6666667, -16.6, -15.6666667, -14.2666667, -16.4666667, -13.5666667, -17.5666667, -16.8333333, -15.5666667, -17.2333333, -16.2, -15.8, -13, -11.8, -14.7333333, -12.9, -12.5333333, -14.6666667, -16.1333333, -15.9333333, -12.1666667, -12.9, -13.6666667, -12.8, -14.3, -13.7, -16.8, -12.9, -15.8333333, -14.4666667, -13.4, -13.2666667, -13.7666667, -12.8, -14.2333333, -11.3333333, -14.1333333, -15.2333333, -15.1333333, -16.5666667, -11.3666667, -13, -14.7, -15.3, -16.4333333, -14.7333333, -14.3333333, -12.3333333, -14.5, -14.1666667, -9.1666667, -15.4666667, -14.1, -11.7, -16.8666667, -16.1666667, -11.8, -12.8666667, -11.8, -11.1333333, -13.7666667, -14.2, -12.9333333, -11.4, -15.5, -13.0333333, -19.3333333, -14.6666667, -12.7, -15.9666667, -14.9333333, -13.2666667, -12.3, -13.7, -14.6666667, -12.8666667, -18.2, -16.1, -14.6666667, -15.5666667, -15.1666667, -13.5666667, -14.4333333, -17.7666667, -16.1, -18.0333333, -17.8, -12.5, -11.1666667, -12.9666667, -12.5333333, -17.0666667, -15.7666667, -16.9333333, -11.7, -13.4333333, -16.2333333, -19, -14.1666667, -14.9666667, -12.9333333, -13.0333333, -15.1, -15, -13.8333333, -12.4, -15.1666667, -17.7, -14.8666667, -12.7666667, -14.8666667, -13.2, -8.8666667, -18.4333333, -12.5666667, -17.0333333, -17.3666667, -14.9333333, -9.3666667, -19.4, -14.3333333, -16.1, -18.3, -14.0666667, -20.8, -15.6666667, -16.0666667, -14.7666667, -13.2, -17.0666667, -15, -11.1333333, -15.6333333, -14, -14, -16.3333333, -15.6333333, -12.2333333, -12.7, -14.7666667, -14.0666667, -19.8666667, -15.4, -9.9, -13.4333333, -13.5, -16.7, -12.9, -14.4666667, -18.8333333, -14.6333333, -12.3333333, -17.1, -13.0333333, -12.0666667, -15.5333333, -14, -15.4333333, -18.6, -14.8, -14.7666667, -15.9, -13.9333333, -18.6666667, -16.2666667, -16.6, -11.3666667, -14.8666667, -14.1, -17.2, -17.8, -14.0333333, -18, -13.0666667, -14.7, -14, -13.4, -14.6333333, -13.3333333, -11.2333333, -15.7, -13.7333333, -13.4, -15.7666667, -13.6666667, -13.1666667, -13.1, -17.8666667, -12.8333333, -17.6, -13.4333333, -14.6333333, -13.3333333, -14.2666667, -13.1666667, -14.9, -12.7666667, -12.7666667, -13.8333333, -14.9, -17.7, -14.9, -14.3, -15.3666667, -19.6333333, -18.2666667, -9.6666667, -12.9666667, -14.4666667, -12.7666667, -14.2333333, -14.6333333, -14.0333333, -13.1333333, -13.1666667, -15.6666667, -13.2333333, -15.4333333, -17.4333333, -16.5666667, -12.9, -15.7, -12.7, -14.6333333, -9.8, -15.0333333, -13.5666667, -8.3666667, -13.9333333, -14.3666667, -16.0333333, -14, -17.6, -12.5666667, -15.4666667, -13.7666667, -17.4, -18.6, -13.6666667, -13.6666667, -11.7666667, -12.0333333, -17.4333333, -10.8666667, -13.6666667, -17.9, -19.3, -13.7666667, -12.0333333, -10.1666667, -14.5333333, -15.1333333, -13.4, -14.2333333, -13.5, -16.0333333, -13.1333333, -12.5666667, -13.6, -13.7666667, -10.8, -12.1333333, -16.1666667, -14.5666667, -14.6333333, -17.2666667, -16.4, -14.8666667, -18.2, -16.0333333, -14.2666667, -11.0666667, -17.1333333, -14.6666667, -13.8666667, -13.3666667, -13.6333333, -20, -13.4, -18.1333333, -15.6666667, -16.8, -12, -14.1333333, -13.7, -15.2333333, -11.5333333, -14.8333333, -14.5666667, -10, -10.5666667, -11.9333333, -13.9666667, -14.8666667, -12.2666667, -12.6666667, -10.1333333, -14.0666667, -16.2, -14.4333333, -16.4333333, -16.8333333, -14.2333333, -12.5, -16.6666667, -14.1, -13.0666667, -16.9, -16.3, -14.8333333, -15.4, -13.4333333, -14.1333333, -18.3, -13.5666667, -16.2, -14.3333333, -18.8666667, -10.0333333, -20.5, -17.5666667, -11.7666667, -15.5666667, -13.0666667, -14.0333333, -11.0666667, -13.9, -11.1666667, -13.7, -16.1666667, -16.4, -13.4666667, -14.5, -11.5, -14.6, -15.7, -14.9666667, -13.4333333, -14.1333333, -13.7333333, -14.1666667, -14.8, -16.9, -9.7666667, -16.1666667, -14.2333333, -12.6, -13.1333333, -14.4333333, -13.1666667, -15.7, -10.2333333, -11.7666667, -13.3, -13.8666667, -12.3, -13.8, -14.9, -13.7, -16.0333333, -15.3666667, -17.4333333, -11.4, -19.7, -13.5, -14.6666667, -15.3333333, -14.8666667, -11, -17, -14.8666667, -11.4, -16.1666667, -15.6, -9.9, -14.0333333, -12.3333333, -15.8333333, -15.5666667, -9.4333333, -15.3333333, -14.3666667, -11.8666667, -12.6333333, -17.4333333, -15.4666667, -16.3333333, -14.3666667, -12.1666667, -12.9333333, -13.8333333, -12.2, -11.7333333, -11.7333333, -13.4, -16.8, -17.2666667, -12.7333333, -16.0666667, -12.6666667, -12.4666667, -13.9333333, -14.2666667, -15.6666667, -15.6333333, -13.6666667, -16.3666667, -16.7666667, -10, -17.3, -16.3333333, -17.7333333, -16.0666667, -14.8333333, -14.5, -11.6333333, -15.3666667, -11.3666667, -9.5333333, -14.2, -11.6333333, -17.6333333, -13.1, -12.6, -16.0666667, -15.5666667, -12.4666667, -11.8333333, -14.2666667, -18.3333333, -15, -10.0666667, -17.3333333, -15.9, -10.7, -17.6333333, -15.2333333, -10.7333333, -12.3666667, -13.7666667, -14.8, -15.1666667, -16.9, -12.1666667, -13.3333333, -16.8333333, -14.9, -12.5333333, -14.0666667, -15.4, -13.5666667, -16.1666667, -15.5333333, -17.8333333, -13.7666667, -10.0666667, -12.7, -10.9333333, -7.8, -16.7, -11.5666667, -15.1666667, -15.5, -13.2333333, -12.0333333, -15.6, -19.4666667, -16.6333333, -6.9333333, -15.0333333, -11.7666667, -12.4, -12.6, -15.2333333, -13.8, -12.2, -17.5333333, -15.5, -13.5, -13.4666667, -12.1666667, -13.8, -16.8666667, -14.2666667, -11.7666667, -16.7, -12.9666667, -14.5, -12.4666667, -12.6, -12, -15.4666667, -13.9, -15.8666667, -10.9, -12.7, -13.1666667, -14.3666667, -13.9666667, -12.6666667, -9.6333333, -13.6333333, -14.6666667, -13.4333333, -13.8, -15, -14.9333333, -16.9333333, -14.4, -16.8, -14.9333333, -11.5666667, -14.4666667, -16.0666667, -17.4, -12.3666667, -11.4333333, -13.2333333, -12.7333333, -14.9333333, -15.7666667, -15.2333333, -10.6333333, -13.6333333, -13.5, -12.4333333, -15.8666667, -15.6, -16.1333333, -10.5, -16.8666667, -13.3, -16.7333333, -16.5666667, -13.4666667, -11.5666667, -12.8333333, -14.5666667, -13.1, -10.3333333, -13.3666667, -13.2333333, -10.0333333, -13.9666667, -16.2333333, -18.2, -12.5, -11.3333333, -13.6666667, -16.1, -15.1333333, -14.9333333, -13.0333333, -16, -13, -17.6333333, -13.4, -16.9333333, -14.9333333, -13.6666667, -15.1, -13.0333333, -19.0666667, -14.2333333, -9.1, -15.5333333, -13.3333333, -6.9333333, -16.6, -12.4666667, -9.3, -12.4, -15.2666667, -15.4, -11.9666667, -15.8, -15.5666667, -14.1666667, -12.4333333, -14.2, -13.3, -15.2666667, -14, -16.7333333, -12, -16.3333333, -12.7, -16.5, -10.1333333, -13.7, -17.0333333, -14.8, -14.2, -17.8, -15.2, -14.6666667, -13.1, -16.6, -14.7, -12.2333333, -13.3, -12.8666667, -11.5666667, -14.5, -11.5333333, -12.0666667, -11.9333333, -15.0666667, -12.9, -17.3, -17.5, -10.7, -13.5, -10.6, -12.7333333, -14.3333333, -13.6333333, -13.8, -14.3666667, -16.6, -11.2, -13.9333333, -14.5333333, -18.4, -15.2666667, -10, -18.1333333, -18.5333333, -10.9, -9.3666667, -18.5666667, -14.3666667, -14.9666667, -13.9, -14.7, -16.5666667, -16.1333333, -15.5, -16.1333333, -12.9333333, -13.9666667, -13.3, -16.8333333, -15.6, -10.5666667, -16.4, -12.5333333, -15.6666667, -15.9333333, -15.7, -9.7333333, -14.9333333, -13.9333333, -16.5666667, -14.1, -15.8, -14.8666667, -14.5333333, -14.6, -15.9666667, -14.7333333, -13.5333333, -16.1, -12.2, -13.6666667, -12.4, -13.5333333, -13.7666667, -18.5666667, -11.7333333, -15.2333333, -18.7666667, -12.5, -10.6333333, -12.1333333, -14.9666667, -13.4, -12.6666667, -13.6, -14.9333333, -15.3, -15.7, -9.8, -15.8333333, -12.3, -15.8333333, -17.2666667, -14.4666667, -15.7333333, -15.3333333, -13.2333333, -12.3, -15.9666667, -14.1666667, -15.9666667, -14.9, -13.0666667, -14.8333333, -14.1666667, -14.0333333, -13.5666667, -14.0333333, -16, -12.5, -8.7666667, -17.9333333, -17.8666667, -11.8666667, -16.4333333, -13.3333333, -14.0333333, -17.7, -13.0333333, -13.3666667, -18, -17.5333333, -10.9, -17.2, -10.7, -11.2, -15.7, -14.8333333, -15.7, -12.7, -12.7666667, -14.3666667, -11.6666667, -16.0333333, -12.8666667, -15.3, -14.5333333, -15.3666667, -16, -14.7333333, -14.6, -17.9, -14.0333333, -18.3333333, -11.8666667, -17.2666667, -14.7666667, -14.4666667, -17.7, -14.9333333, -13.6333333, -10.0333333, -9, -14.5333333, -14.5666667, -15.4, -15.4333333, -11.7333333, -14.3666667, -15.3333333, -14.5666667, -15, -15.1, -14.7, -14.3333333, -13.2, -10.7666667, -15.9333333, -10.4, -13.9666667, -13.5333333, -13.7, -14.5333333, -11.5666667, -11.9333333, -13.8666667, -10.1, -12.2, -12.4, -13.6666667, -10.6666667, -11.6666667, -9.2, -11, -11.8, -16.6, -12.8333333, -10.8, -17.3, -16.7, -14.6666667, -16.5666667, -10.9333333, -13.7333333, -10.0666667, -16.8, -10.8666667, -11.3666667, -15.6333333, -9.6666667, -12.2, -13.8666667, -16.5666667, -11.8, -10.7, -14.9, -15.4, -17.7333333, -16.4666667, -13.5666667, -13.1333333, -18.7666667, -8.9, -16, -15.1666667, -17.5666667, -17.4666667, -13.5, -15.0666667, -13.4333333, -17.9, -12.1666667, -17.6666667, -14.3666667, -12.7, -14.5666667, -13.9333333, -16.5666667, -10.7, -14.6666667, -13.1333333, -13.4666667, -11.3666667, -15.5333333, -15.5666667, -15.2, -12.6666667, -17.5, -13.0333333, -17.1333333, -17.8333333, -16.1333333, -16.6333333, -13.6666667, -16.5, -11.2, -16.1333333, -16.6666667, -18.7333333, -10.8333333, -13.4666667, -14.3333333, -13.2333333, -13.0333333, -15.8, -15, -14.9666667, -14.0333333, -16.1333333, -12.5333333, -13.1666667, -14.5666667, -16.5333333, -19.8666667, -12.3, -13.2333333, -14.1666667, -16.8666667, -10.9666667, -13.2666667, -12.0666667, -17.4666667, -14.1666667, -17.9, -14.8, -11.1333333, -13.9, -16.5, -14.3666667, -10.5666667, -16.2666667, -16.5, -13.5, -10.5333333, -13.9666667, -17.8333333, -13.9, -12.7666667, -12.9, -14.6666667, -13.4333333, -12.9333333, -14.6666667, -13.9, -15.4, -12.4666667, -19.8333333, -12.1333333, -14.6333333, -10.9, -18.1333333, -14.1, -15.9333333, -13.4333333, -14.2333333, -14.0333333, -15.5666667, -17.8, -11.2666667, -15.9666667, -14.2, -14.9333333, -16.5666667, -12.1333333, -11.3333333, -15.9, -14.1, -11.7666667, -16.7, -12.8333333, -14.3666667, -14.8333333, -14.9, -16.1333333, -13.1, -10.2, -15.8, -12.7666667, -11.0333333, -14.8666667, -10.6, -15.5333333, -15.0333333, -15.0666667, -17, -13.3333333, -14.4, -13.6333333, -14.5666667, -12.9, -12.8333333, -14.2666667, -13, -14.6666667, -13, -15.4, -15.1666667, -15.1, -13.2666667, -14.0666667, -17.7666667, -14.4333333, -12.4333333, -12.9333333, -10.3333333, -16.2, -13.6333333, -14.4333333, -16.5333333, -13, -17.8, -11.3666667, -16.0333333, -12.5666667, -11.8666667, -16, -16.4666667, -8.1666667, -19.1666667, -14.3666667, -17.0333333, -12.1666667, -15.5333333, -9.9333333, -12.6666667, -15.1666667, -15.3333333, -14.5666667, -9.0666667, -12.3666667, -13.8666667, -14.4, -14.0666667, -11.9666667, -13.2666667, -16.3333333, -14.5, -12.9, -15.8, -9.5333333, -13.9333333, -14.7666667, -13.2333333, -12.5333333, -15.1666667, -14.8333333, -15.1, -11.8, -15.3, -12.5, -15.4, -13.0666667, -10.8666667, -12.1333333, -13.6666667, -10.9, -14.6666667, -20.9333333, -18.3, -14, -17.4666667, -14.1, -17.4, -13.1666667, -13.7, -14.9, -14.0333333, -14.3, -12.4666667, -17.7333333, -12.2666667, -11.7333333, -16.0666667, -13.3666667, -14.9333333, -14.9666667, -14.5666667, -16.4, -13.7, -17.2, -13.5666667, -18.7333333, -13, -15.9, -17.1666667, -17.5666667, -13.9666667, -14.4, -16.2333333, -15.9666667, -13.5, -12.4, -15.5666667, -13.5333333, -19.1, -16.7666667, -12.3666667, -14.1666667, -14.5333333, -11.4, -11.8666667, -17.3, -12.7333333, -12.8333333, -11.9333333, -17.5333333, -16.2666667, -17.1333333, -15, -16, -11.2, -18.5333333, -12.3333333, -10.7333333, -16.8, -18.2, -13.9666667, -11.2, -16.8666667, -9.6666667, -13, -17.6, -14.9666667, -18.4666667, -12, -15.1, -16.8666667, -10.8666667, -16.3, -15.7666667, -13.9, -13.1333333, -12.9, -12.7, -15.0666667, -13.3, -17.9333333, -15.7, -11.4666667, -16.2333333, -13, -12.3, -12.9666667, -13.9333333, -15.8333333, -12.8333333, -12.8333333, -11.9666667, -15.7333333, -10.3666667, -15.3, -14.0333333, -13.5666667, -18.8, -13.9, -18.4, -14.7333333, -15.8, -17.7333333, -11, -11.6333333, -13.1333333, -14.1666667, -16.6, -13.2, -14.8333333, -14.7666667, -19.1333333, -13, -12.5, -16.2, -15.5666667, -16.3, -11, -10, -15.4, -14.3666667, -12.9333333, -17.1, -13.5, -18.5666667, -14.6666667, -14, -13.4333333, -18.7, -14.3333333, -13.0666667, -11.8, -12.3666667, -19, -19.0666667, -16.0666667, -18.3333333, -11.5, -18.3333333, -16.4, -14.3333333, -13.7666667, -14, -13.9666667, -14.8666667, -14.4666667, -14.9, -14.1, -18.7333333, -15.7, -15.5333333, -9.6666667, -15.0333333, -12.0333333, -13.9333333, -14.8666667, -11.6, -14.5333333, -12.6, -13.2, -13.8666667, -14.9333333, -17.0666667, -19.4666667, -14.8, -14.4, -13.0666667, -10.0666667, -15.1, -20, -16.9, -16.6333333, -13.4333333, -11.4333333, -12.1333333, -11.1, -17.8, -16.7, -13.8666667, -19.7666667, -14.9333333, -18.5, -14.9666667, -11.4, -14.6333333, -11.4666667, -11.8666667, -14.1333333, -14.1, -14.2, -16.9, -16.7, -11.7666667, -11.9, -15.1666667, -18.2666667, -12.5666667, -12.2333333, -15.4, -14.5666667, -11.8333333, -11.4666667, -18.1333333, -12.5333333, -13.9, -13.1, -15.1333333, -15.7666667, -12.7333333, -14.0333333, -13.9333333, -17.0666667, -12.2, -13.2333333, -11.5, -19.6, -12.8333333, -16.5333333, -19, -16.5666667, -13.7666667, -15.5666667, -16.0333333, -16.2333333, -16.0666667, -15.4333333, -13.7, -14.3333333, -16.5666667, -12.8666667, -10.3333333, -16.0666667, -13.5666667, -16.8666667, -16.4, -17.8, -9.9666667, -11.4333333, -11.0333333, -14.5666667, -13.3666667, -15.9666667, -15.8, -15.5, -8.4666667, -17.2333333, -16.2666667, -16.8666667, -10.4, -12.2666667, -13.8666667, -14.5, -11.9, -15.2333333, -16.6, -14.8, -11.9333333, -14.9, -12.9, -13.5666667, -14.9333333, -13.4666667, -15.9333333, -12.5, -11.1333333, -17.6666667, -14, -11.3, -20.0666667, -14.5, -13.9666667, -13.1, -13.0666667, -14.2, -13.1666667, -13.2, -14.8333333, -15.6, -11.2, -11.2, -17.1333333, -12.1, -17.3, -7.3666667, -15.2333333, -17, -14.8, -13.7333333, -12.6666667, -14.3333333, -11.0666667, -16.8, -12.5, -15.4666667, -16.1333333, -15.3333333, -14.6, -17.9666667, -17.8, -15.8666667, -14, -13.9, -17.3666667, -13.1333333, -13.7666667, -10.3333333, -14.0333333, -9.3333333, -11.3666667, -13.6333333, -14.0666667, -12.6333333, -17.1333333, -10.4333333, -13.5, -14.9, -16.6666667, -13.1333333, -11.0333333, -13.6666667, -14.7666667, -13.6, -18.6, -10.4666667, -13.6666667, -12.5, -13.1, -11.8333333, -15.5, -20.0666667, -13.1, -14.2666667, -8.1, -16.2, -15.1, -14.2666667, -17.5666667, -14.4, -9.9333333, -15.1, -18, -15.2333333, -12.0333333, -14.8666667, -14.1333333, -13.4666667, -15.6, -13.1, -12.5, -18.2666667, -12.4666667, -12.9666667, -13.6333333, -17.1, -17.7333333, -16.8333333, -14.9666667, -13.1, -16.9666667, -12.5666667, -10.4333333, -14.2, -18.8333333, -14.5, -13.6333333, -15.8666667, -12, -16.9333333, -14.5666667, -16.6666667, -14.3333333, -12.3, -16.4333333, -14.7666667, -14.7666667, -12.7, -14.7333333, -14.1666667, -17.3666667, -13.2, -19.1, -13.9, -16.5666667, -18.0666667, -11.2, -8.7, -13.5666667, -12.1333333, -13.9666667, -14.9333333, -11.8666667, -12.6333333, -14.2, -15.1, -8.5, -18.2333333, -15.5, -12.7666667, -16.5, -13.1666667, -11.8333333, -16.9333333, -9.6333333, -14.5333333, -11.9, -11, -10.4333333, -15.3333333, -16.7666667, -12.8333333, -13.6, -13.4, -12.2666667, -13.1666667, -16.4, -17.2, -17.7, -13.3333333, -18.5333333, -11.5333333, -12.8666667, -14.6666667, -17.9666667, -12.8666667, -18.1333333, -13.4333333, -16.0666667, -11.7333333, -13.8, -12.7666667, -17.5666667, -15.9, -13.3333333, -15, -15.4, -16.1333333, -14.5666667, -12.4333333, -11.3666667, -12, -19.8, -15.2333333, -14.2666667, -17.3333333, -13.8666667, -14.8333333, -12.5333333, -20.7666667, -10.2333333, -12.9333333, -11.1, -14.4333333, -15.4333333, -14.2, -13.7, -12.4666667, -13.2, -14.5333333, -17.7333333, -9.1, -12.6333333, -16.8666667, -9.7, -8.6333333, -15.3, -11.9333333, -11.7, -13.1333333, -12.9, -12.0666667, -17.0333333, -12.6666667, -12.7333333, -11.3666667, -16.0666667, -14.1666667, -11.3333333, -16.6666667, -13.1666667, -15.1666667, -11.9333333, -15.8333333, -15.3333333, -14.3, -11.4666667, -16.7333333, -13.5666667, -14.9666667, -16.3666667, -14.7666667, -13.2333333, -17.1, -16.1333333, -15.0666667, -13.8333333, -14.4333333, -17.1, -13.2666667, -13.2, -10.4666667, -17.5666667, -14.0333333, -12.0666667, -11.0333333, -11.2, -12.2666667, -15.0666667, -14.8, -12.4, -12.5666667, -16.7333333, -16.3666667, -14.4, -15.0666667, -13.3333333, -14.3, -10.4666667, -11.6, -13.1666667, -13.6666667, -16.4, -15.7666667, -12.8666667, -15.4333333, -16.6666667, -13.6333333, -15.2666667, -13.8, -13.7666667, -14.2333333, -13.8666667, -14.4666667, -15.4666667, -14.3, -13.7666667, -17.4666667, -18.0666667, -17.4333333, -15.2333333, -13.7666667, -9.2666667, -17.5333333, -19.7666667, -9.0666667, -12.4333333, -16.0333333, -13.8333333, -15.4666667, -17.3666667, -12.6666667, -18.7, -17.3666667, -11.8, -14.9333333, -17.1333333, -14.3333333, -15.3, -17.1333333, -10.5333333, -13.4666667, -13.8666667, -9.5333333, -16.0333333, -12.2, -15.6666667, -13.2, -14.8666667, -14.9666667, -12.5666667, -13.5666667, -11.2666667, -15.3666667, -14.8, -16.0333333, -13.0333333, -11.4, -16.7, -17.2, -7.5333333, -15.1333333, -16.0666667, -13.1666667, -7.6, -15.5666667, -12.3333333, -15.9333333, -16.2333333, -11.7, -14.8666667, -11.5, -10.3666667, -11.2333333, -11.4333333, -12.4333333, -10.8666667, -15.6666667, -8.7333333, -9.8333333, -14.5333333, -15.9, -17.7333333, -6.1333333, -15.7666667, -14.4333333, -14.1, -13.3, -14, -17.2666667, -7.8333333, -15.1666667, -13.9666667, -16.0666667, -14.9333333, -16.2666667, -14.1, -15.2333333, -13.0333333, -16.7666667, -11.2, -12.7333333, -14.1333333, -12.5333333, -14.8333333, -10.3, -14.0333333, -13.6666667, -15.6333333, -14.6333333, -17, -15.9, -11.9, -16.2, -15.8666667, -15.9333333, -13.3, -15.8333333, -16.6666667, -14.9666667, -13.3666667, -11.8333333, -17.3666667, -12.3333333, -16.4666667, -12.5333333, -18.3666667, -14.4666667, -19.0333333, -17.4333333, -18.1333333, -12.6333333, -16.2666667, -16.8, -16, -11.2, -14.6, -16.4, -10.1, -12.6333333, -11.7333333, -13.8333333, -15.2333333, -12.8, -12.7, -16.5, -19.5666667, -13.1333333, -10.1333333, -13.7666667, -11.2666667, -13.3666667, -14.6666667, -17.0333333, -12.9333333, -18.9, -14.1, -13.4666667, -15.9333333, -16.2, -12.3, -18.0666667, -15.5333333, -11.9333333, -15.5666667, -13.0333333, -15.0333333, -16.0666667, -14.4, -12.3666667, -16.4, -16.6333333, -14.9333333, -18.5666667, -12.2666667, -12.2666667, -12.5333333, -16.4333333, -14.7333333, -12.2666667, -16.3, -13.0666667, -17.0666667, -15.1, -13.0666667, -12.3, -13.5, -14.5, -14.8, -17.4, -15.5, -14.8666667, -17.9666667, -15.9666667, -14.7, -12.4, -12.4, -14.6333333, -18.8333333, -12.2333333, -13.0666667, -16.2666667, -15.3666667, -16.6666667, -11.7666667, -15.1666667, -15.7, -17.6, -14.8, -12, -17.1, -16.6, -14.6666667, -15.1, -12.0333333, -13.3333333, -15.3666667, -13.6, -14.4666667, -13.3666667, -15.7666667, -11.1333333, -14.3666667, -11.3333333, -16, -15.3666667, -17.6333333, -10.2, -15.7666667, -11.9333333, -11.4333333, -12, -11.2666667, -13.8666667, -14.1333333, -14.1, -17.5666667, -16.4666667, -16.3666667, -17.1, -15.6, -14.9333333, -13.5333333, -16.7333333, -13.1, -12.2333333, -12.4666667, -12.3333333, -9.8, -13.7666667, -13.9333333, -14.9666667, -14.2333333, -11.7666667, -15.0666667, -17.2, -11.4666667, -10.7666667, -16.9666667, -11.1333333, -16.5, -11.9333333, -13.1666667, -12.8666667, -12.7666667, -18.6333333, -16.7333333, -14.5666667, -11.0666667, -13.3333333, -15.7666667, -16.4666667, -15.3666667, -14.8666667, -16.1, -12.6666667, -16.4, -16.4666667, -15.6666667, -17.8666667, -16.0333333, -12.5666667, -13.3666667, -13.9, -13.3, -16.0333333, -17.1333333, -13.6333333, -11.8666667, -12.9666667, -14.2666667, -15.5, -16.2666667, -18.1666667, -9.9333333, -11.4, -13.6333333, -12.4666667, -13.2, -13.7666667, -13.7, -13.3666667, -21.4666667, -14.8333333, -12.1666667, -13.3, -17.2666667, -12.1333333, -11.1666667, -12.3666667, -16.1333333, -15.4, -16.1666667, -17.0666667, -13.8, -18.1666667, -13.6666667, -12.7, -16.9666667, -11.9666667, -8.5666667, -15.3, -13.6, -13.0666667, -12.8, -12.3, -17.5333333, -15.9, -13.1333333, -10.2666667, -15.6666667, -13.6666667, -12.8666667, -12.8333333, -12.0333333, -17.5333333, -13.8666667, -13.3, -14.8, -13.1333333, -12.5666667, -17.8666667, -11.3333333, -13.5, -9.5333333, -17.3333333, -12.8666667, -11.3, -16.1333333, -15.7666667, -12.6333333, -14.2333333, -11.4, -15.4333333, -13.8, -16.6333333, -11.0666667, -13.7666667, -14.2666667, -13.6, -17.0333333, -12.6666667, -11.4, -15.2333333, -14.9333333, -9.5333333, -16.2, -17.8, -12.2666667, -16.6666667, -15.3333333, -17.2, -10.5, -17.1333333, -14.5333333, -11.0333333, -13.7333333, -18.7, -14.2666667, -17.3, -12.7333333, -14.7666667, -9.2333333, -13.2333333, -14.3, -14.3666667, -18.2, -15.3, -11.6, -13.6333333, -12, -11.2, -16.0666667, -15, -12.2, -13.8333333, -15.2666667, -17.4, -15.3666667, -13.4, -13.2, -15.0666667, -14.2333333, -10.3, -13.0666667, -13.0666667, -17.4, -13.2333333, -10.8666667, -13.4333333, -12.0333333, -13.8333333, -15.0333333, -15.6333333, -11.5, -15.6333333, -12.7333333, -14.4, -16.0333333, -16.5333333, -14.2, -13.2666667, -14.7666667, -17.1333333, -10.3666667, -16.2666667, -10.2333333, -14.8666667, -13.0333333, -12.5666667, -14.6333333, -11.4333333, -15.4, -14.4666667, -12.7666667, -12.3666667, -13.7, -9.8333333, -16.0666667, -17.7666667, -15.4, -17.5333333, -13.2666667, -12.4, -16.4666667, -14, -15.7, -15.9333333, -15.0666667, -11.4666667, -16.6, -15.8333333, -14.4, -14.0666667, -15.7333333, -14.3, -9.4666667, -15.8333333, -18.6333333, -18.2, -13.5666667, -17, -12.0333333, -12.0333333, -9.8333333, -16.0666667, -14.0333333, -13.8666667, -14.8, -17.7, -12.7333333, -11.5, -15.2333333, -18.1333333, -13.9666667, -13.6, -12.4666667, -19.4666667, -17.5666667, -15.3333333, -14.6, -10.7666667, -12.7, -15.3333333, -14.6, -17.1666667, -15.5666667, -13.9666667, -12.0666667, -13.4333333, -12.6666667, -14.3, -15, -13.9666667, -18.2666667, -13.9333333, -14.5666667, -13.2666667, -11.3666667, -16.5666667, -15.5333333, -12.4666667, -16.8, -12.1333333, -12.9333333, -11.9, -9.2, -13.7, -12.9666667, -12.3, -13.5, -14.8, -16.6666667, -11.4, -12.5, -16.3333333, -13.5666667, -13.4333333, -13.8, -14.6666667, -12.2, -10.2666667, -15.1666667, -13.5666667, -13.7666667, -18.2333333, -12.6333333, -7.3333333, -18.2666667, -13.3666667, -12.9333333, -14.8, -14.3333333, -18.1666667, -11.3666667, -16.8666667, -16.8333333, -17.0333333, -15.7, -14.7666667, -15.3, -13.6666667, -14.1, -15.4333333, -18.4, -13.1333333, -14, -13.7333333, -9.3666667, -12.4333333, -13.8333333, -15.4666667, -12.7333333, -17.1, -14.0666667, -13.2, -15, -14.7333333, -13, -15.1333333, -10.3333333, -16.9333333, -15.1, -14.4666667, -14.0666667, -14.1666667, -17.5, -11.4, -18.1333333, -15.2666667, -16.3, -15.2333333, -11.7, -13.7666667, -12, -13.3333333, -15.8666667, -14.8333333, -12.2333333, -15.1333333, -14.5333333, -13.1333333, -14.6666667, -16.4333333, -10.5, -11.7666667, -16.0666667, -14.6666667, -15.0333333, -18.5, -11.5, -14.8, -17.3333333, -11.7666667, -13.8333333, -9.7, -13.4666667, -15.9666667, -15.3, -15.4333333, -14.8666667, -14.8333333, -11.6, -13.0333333, -15.6666667, -12.1, -18.6333333, -11.6, -13.8333333, -13.7333333, -16, -19.6, -8.4, -13.3333333, -13, -14.1, -13.9, -15.9, -13.1333333, -9.3666667, -16.8333333, -16.9666667, -14.4, -17.7333333, -13.6, -13.2333333, -18.5666667, -14.0666667, -17.7, -12.3, -15.2, -17.8666667, -17.8666667, -13.0666667, -15.5333333, -17.3666667, -13.8333333, -11.6, -13.4, -15, -15.5, -19.4666667, -14.5333333, -17.1, -13.9, -14.7, -16.4333333, -15.1666667, -17.1333333, -11.3, -15.3, -17.1, -16.5333333, -16.9, -14.6666667, -13.9333333, -16.3666667, -12.8666667, -15.1333333, -11.2333333, -16.0666667, -13.7, -16.2333333, -13.4666667, -13.3333333, -10.4, -17.3666667, -11.4666667, -13.6, -11.9, -17.3333333, -11.8333333, -19.7333333, -10.9333333, -12.9666667, -12.6, -15.2666667, -12.1, -14.2666667, -14.4333333, -14.7666667, -12.8, -16.8, -13.8333333, -12.3666667, -12.9, -12.3333333, -10.4666667, -14.1, -14.0666667, -16.5, -11.6, -10.9666667, -15.5333333, -14.5333333, -12.6666667, -12.6333333, -8.1, -13.6, -12.5666667, -14.5333333, -13.4333333, -11.3, -17.5, -8.5666667, -15.9, -11.6333333, -15.2666667, -13.0333333, -13.5333333, -12.4666667, -13.1666667, -15.7333333, -12.8333333, -10.7, -16.2333333, -12.2333333, -17.6666667, -12.6333333, -14.1333333, -17.0333333, -13.4, -14.7666667, -12.6333333, -11.7333333, -14.8666667, -15.1, -14.5, -11.1, -11.4666667, -10.5333333, -13.2666667, -14.8, -14.2, -14.3333333, -13.4333333, -11.5, -15.2333333, -18.1333333, -14.4, -15.8666667, -13.8333333, -12.3, -15.3, -15.0333333, -11.9333333, -12.0333333, -13.1, -17.4, -13.9666667, -10.5, -15.1666667, -13.8333333, -14.4333333, -10.1333333, -14.3, -13.1333333, -9.4, -9.2333333, -14.2, -11.3, -16.3, -11.7333333, -11.3333333, -8.9, -14.6, -13.9333333, -14.6666667, -14.2333333, -11, -13.6666667, -17.1333333, -9.4, -14.2333333, -16.4, -14.6333333, -11.0666667, -15.8666667, -14.9, -13.0666667, -11.8, -13.3, -14.2333333, -16, -10.8666667, -17.1333333, -13.2666667, -16.3666667, -15.6333333, -12.3333333, -16.6, -19.7, -12.6, -15.9666667, -10.4, -15.3666667, -13.7666667, -11.7333333, -14.2333333, -15.8333333, -14.4666667, -14.8, -13.9666667, -12.8666667, -15.3, -16.8, -15.9, -12.8, -16.5333333, -11.8666667, -14.6666667, -14.0333333, -14.1666667, -11.9, -18.9333333, -11.3333333, -16.5666667, -9.8666667, -13.5, -13.7333333, -15.8333333, -10.5, -11.2, -14.9333333, -14.0666667, -13.4333333, -12.9333333, -14.5333333, -12.1333333, -17.5, -13.7333333, -13.2333333, -9.5333333, -15.0666667, -13.3, -16.6, -14.2666667, -14.6333333, -14.0666667, -16.5333333, -8.8, -13.1, -13.8333333, -14.8, -12.7333333, -15.1, -10.1333333, -13.4333333, -13.6666667, -13.4666667, -18.0333333, -14.4333333, -12.5, -19.3666667, -15.5666667, -14.3, -13.9, -12.7666667, -13.1666667, -15.0666667, -14.9333333, -15.9333333, -11.7333333, -13.2666667, -13.4, -12.2, -12.5, -13.3666667, -13, -14.1333333, -14.8, -15.7, -14.4666667, -13.8333333, -15.8666667, -11.4333333, -14.5, -11.8666667, -13.9666667, -14.1, -16.6333333, -12.9, -14.4333333, -12.8, -19.2, -15.9, -12.7, -12.4, -14.4333333, -14.7333333, -10.8333333, -14.4666667, -9.9666667, -13, -14.5666667, -18.1666667, -12.8666667, -17.1333333, -15.2333333, -9.5, -13.9333333, -12.9333333, -13.9666667, -12.6333333, -15.1333333, -14.6333333, -16.9, -17.7333333, -15.7, -15.9666667, -13.5666667, -13.1333333, -14.4, -13.8, -11.9333333, -10.9333333, -9.1, -11.5, -13.0666667, -15.2333333, -11.1, -15.6333333, -15.5666667, -18.9666667, -16.1666667, -14.7333333, -14.9666667, -12.0333333, -17.8, -12.7, -14.0666667, -17.3333333, -14, -15.8, -18.4333333, -17.8333333, -16.6333333, -13.2666667, -9.4666667, -18.5, -12.5, -13.7333333, -14.5, -13.3, -14.8333333, -15.5333333, -13.0333333, -13.1333333, -16.5666667, -13.7666667, -12.6666667, -15.6666667, -16.1, -18.8666667, -15.2333333, -13.8666667, -15.6333333, -16.0666667, -10.6333333, -11.4333333, -15.4, -11.8333333, -19.9, -16.5333333, -14.4333333, -11.3333333, -14.1333333, -15.1666667, -8.6333333, -11.5333333, -12.2, -16.1, -14.2333333, -17.6, -13.7666667, -13.5, -13.7, -15.4, -15.6, -14.3666667, -14.1666667, -15.1, -11.1666667, -10.5, -15.5333333, -13.2333333, -11.8, -16.2666667, -19.3666667, -16.3, -11.6333333, -14.5333333, -18.8, -14.9666667, -16.6, -15.9333333, -16.0666667, -15.7, -17.4333333, -15.6666667, -13.2333333, -18.4, -13.8, -14.4333333, -14, -14.6333333, -15.6, -16.1333333, -11.7666667, -18, -13.5, -14.2333333, -16.5333333, -13.9333333, -11.8, -9.2, -13.1666667, -14.6, -13.9333333, -16.7333333, -13.6333333, -16.2333333, -14.6333333, -16.4666667, -16.8333333, -15.1666667, -14.4333333, -14.8, -13.2666667, -14.3666667, -17.1333333, -15.5, -11.1333333, -15.0333333, -16.6333333, -14.3, -15.9333333, -14.8333333, -15, -15.1333333, -13.0666667, -15.9, -16.1333333, -13.7, -12.5333333, -10.0333333, -16.7666667, -17.4333333, -10.4333333, -11.2, -14, -13.1, -16.5666667, -13.5333333, -18.2333333, -14.2, -13.6333333, -13.8666667, -12.6, -13.1666667, -16.2333333, -11.6333333, -13.4666667, -14.2, -12.5, -12.8333333, -11.4666667, -9.3, -13.3333333, -12.6666667, -13.5666667, -12.1333333, -12.4333333, -15.1, -17.7333333, -13.8, -14.9333333, -12.3, -16.7, -14.4, -8.9, -13.6, -13.6, -13.1, -14.6666667, -12.2333333, -13.8, -16.5333333, -13.9333333, -17.7333333, -12.8, -11.3, -17.6, -16.6333333, -14.2333333, -9.8333333, -14.2, -18.1333333, -18.7333333, -17.3666667, -12.3333333, -17.8333333, -13.4, -13.3333333, -14.9, -18.3, -11.4333333, -12.7666667, -16.8333333, -10.4333333, -14.5333333, -16.0666667, -19.4, -13.3666667, -14.6, -15.8, -16.0666667, -14.2666667, -15.4, -14.6666667, -12.9, -13, -15, -13.6, -15.5333333, -13.8, -17.8333333, -17.5666667, -11.3, -13.5, -12.6333333, -12.7, -16.5, -14.7, -13.2, -10.9333333, -15.1, -12.4666667, -12.5333333, -8.1333333, -16.4666667, -17.0333333, -14.1666667, -15.6333333, -20.5, -14.1333333, -15.2333333, -14.0666667, -18.4666667, -14.1, -15.3666667, -12.3666667, -11.7, -16.8, -13.2333333, -15.2666667, -14.9, -16.4333333, -16.4, -16.5333333, -13.6666667, -14, -13.9333333, -16.0333333, -17.8333333, -16.3333333, -17.4333333, -12.8666667, -15.8333333, -14.3666667, -9.9666667, -16, -12.8, -15.0333333, -17.9333333, -14.6333333, -17.3333333, -13.9333333, -16.5666667, -11.1333333, -18.3, -19.5, -17.5666667, -15.9, -12.6333333, -14.0333333, -12.8666667, -15.3333333, -12.6, -13.2666667, -13.8333333, -13.3, -14.7333333, -10.8333333, -12.0666667, -12.8, -10.6, -15.9, -16.7666667, -15.6666667, -15.7666667, -16.7, -13.8666667, -12.7333333, -15.2666667, -15.5666667, -6.2, -15.0666667, -12.8666667, -11.2666667, -16.1333333, -17.9, -18, -8.8, -14.4333333, -13.5333333, -13.8, -11.6666667, -12.2333333, -15.7, -14.6333333, -13.7666667, -15.3666667, -14.4, -18.8666667, -12.9666667, -17.3, -13.0666667, -10.2666667, -13.8666667, -10, -9.8666667, -10.8666667, -11.6333333, -13.5666667, -13.8, -16.3666667, -14.7333333, -11.0333333, -17.0666667, -13.3666667, -12.2666667, -12.8666667, -16.6, -15.8333333, -12.9, -14, -12.9666667, -13.7333333, -17.9, -14.9333333, -12.9333333, -13.8666667, -13.8666667, -18.4, -8.9333333, -14.8, -10.1, -10.2666667, -14.0333333, -13.7666667, -16.4333333, -13.6333333, -11.3666667, -9.8, -14.1666667, -15.0333333, -14.6, -13.2, -14.9333333, -14.8666667, -12.7666667, -14.2, -16.8, -16.6, -16.6333333, -11.1666667, -13.8, -12.1333333, -12.8333333, -17, -12.1666667, -15.7, -13, -14.9, -19.6333333, -15.0333333, -13.5333333, -14.2333333, -15.1666667, -13.8, -17.6, -10.2666667, -13.0333333, -15.9, -15.5, -13.2666667, -13.7, -12.5333333, -12.0666667, -17.5666667, -13.0666667, -13.2333333, -18.5, -16.4666667, -15.5666667, -16.9666667, -11.3333333, -14.3, -15.5333333, -14.8333333, -12.2, -13.7, -17.4666667, -16, -15.2333333, -13.9666667, -17.4, -19.1, -14.4666667, -14.7, -16.4333333, -16.3, -14.5, -13.1666667, -14.4, -16.7666667, -10.4666667, -17.4, -14.9333333, -9.6, -17.9, -13.2, -11.9333333, -11.5666667, -11.8, -10.9, -13.6, -17.6666667, -13.1, -16.5, -11.7666667, -19.4, -12.0666667, -14.0333333, -16, -15.0333333, -11.9666667, -11.3333333, -12.6, -17.3, -12.9, -16.2666667, -18.0333333, -13.3666667, -18.8333333, -13.5666667, -18.5, -13.8666667, -19.0666667, -14.8333333, -16.4, -14.9, -10.8333333, -13.9333333, -16.1, -13.5333333, -12.0333333, -13.0666667, -18.2666667, -13.3, -13.9333333, -17.9333333, -12.9, -19.2666667, -14.4, -11.7, -15.5666667, -13.4333333, -15.3, -13.5, -16.9666667, -11.9333333, -13.2666667, -15.1333333, -13.3, -11.8666667, -14.7, -13.6333333, -13.2666667, -15.5666667, -15.5, -15.5, -15.2333333, -13.8333333, -15.6666667, -17.1, -15.3, -11.3, -10.1, -16.2, -16.7666667, -13.7, -15.3333333, -16.3666667, -16.2333333, -13.1333333, -13.4333333, -14.4333333, -13.7666667, -9.9333333, -10.8666667, -16.5666667, -14.3666667, -15.0666667, -11.5666667, -11.9333333, -17.8, -12.5333333, -13.8, -15.0333333, -18.1666667, -9.7, -12.6666667, -12.5666667, -16.2333333, -16.8666667, -12.3666667, -19.8666667, -16.5, -12.2333333, -15.5666667, -16.4, -16.4666667, -13.4333333, -15.7666667, -13.6666667, -11, -15.9333333, -16.5333333, -12.8666667, -11.8333333, -14.6, -11.9333333, -15.3333333, -12.0666667, -13.4, -16.0666667, -13.4333333, -13.0666667, -15, -11.5333333, -11.5666667, -14.1666667, -14.6, -13.0333333, -10.7, -13.3333333, -16.1333333, -18.3, -13.9666667, -17.7333333, -16.5, -9.3, -14.5333333, -15.0333333, -14.9333333, -18.6333333, -15, -12.8666667, -14.2, -13.4, -11.8, -16.7, -13.6, -16.2666667, -14.5333333, -13.5333333, -11.9333333, -11.2666667, -15.7333333, -15.2, -11.6, -10.7666667, -16.7, -13.6, -16.8333333, -18.3333333, -13.3666667, -13.7, -14.2, -12.4333333, -14.3, -14.4666667, -10.1, -13.3333333, -14.3666667, -15.2666667, -14.5, -10.7333333, -17.2, -14.6666667, -9.1666667, -19.3, -11.4, -12.7666667, -12, -16.7666667, -14.8333333, -16.4, -16.6666667, -13.6, -13.0666667, -13.3, -12.3333333, -12.4666667, -8.7333333, -12.3666667, -12.8, -13.9666667, -15.8666667, -14.8666667, -16.6, -12.8333333, -15.4333333, -13.4, -13.0333333, -13.2333333, -13.7666667, -14.7333333, -12.4333333, -12.6666667, -14.8, -13.2, -13.2666667, -13.2, -14.9333333, -10.6333333, -17.3333333, -15.0333333, -12.7333333, -14.1666667, -12.9333333, -13.9666667, -12.8, -16.2666667, -15.4666667, -8.1333333, -18.4333333, -14.7, -10.5, -14.2, -13.3666667, -13.1666667, -13.3, -17.3, -13.4, -14.1, -15.5666667, -14.8666667, -20.4333333, -16.8666667, -13.8666667, -13.1, -11.4333333, -18.5333333, -14.2, -12.6666667, -12.5666667, -13.9333333, -13.0666667, -13.1, -13.3333333, -12.7, -10.5666667, -13.7, -16.8333333, -13.7333333, -14.5, -11.5, -17.6666667, -14.2666667, -13.9, -13.3, -14.3, -13.5333333, -16.4, -14.4333333, -17.9333333, -14.3, -13.1333333, -18, -11.4666667, -13.2666667, -14.7666667, -16.7333333, -11.7666667, -15.3, -13.4666667, -10.1, -14.8, -18.9666667, -12.4, -11.8333333, -16.3666667, -17.2, -14.3, -12.3, -12.9666667, -12.7666667, -12.3666667, -14.4666667, -16.2666667, -12.1666667, -10.6333333, -13.8333333, -15.0333333, -17.5333333, -17.9333333, -11, -13.8, -17.9666667, -10.7666667, -16.6, -13.3666667, -16.1, -14.3, -11.6, -17.6333333, -10.9333333, -12.1333333, -16.6, -17.9666667, -14.3, -12.5666667, -12.9, -14.2666667, -11.3666667, -15.3, -15, -15.4333333, -21.2, -13.6333333, -13, -16.8333333, -10.6, -16.0666667, -14.1666667, -14.4333333, -13.5, -15.2666667, -14.1, -15, -13.1333333, -14.1, -11, -14.6666667, -13.4333333, -15.1, -17.5, -15.2666667, -17.6, -17.5333333, -16.3666667, -15.4666667, -14.0333333, -13.0333333, -13.5666667, -13.7333333, -14.6, -10, -15.1, -13.9, -7.9333333, -14.1, -14.4333333, -15.7, -14.4666667, -16.6333333, -14.6666667, -12.9666667, -13.7, -15.4333333, -14.0666667, -12.7666667, -17.4, -14.7666667, -13.2333333, -12.7666667, -15.1333333, -20.2, -14, -15.5666667, -14.2333333, -14.8666667, -9.2, -12.3333333, -15.3333333, -14.5666667, -14, -19.2666667, -14.9333333, -11.5333333, -13.6, -15.9333333, -16.4666667, -13, -11.3666667, -11, -14.6666667, -12.8333333, -15.8, -12.8333333, -16.5333333, -17.3, -11.1333333, -11.7, -13.6666667, -11.1333333, -16.9666667, -16.8, -13.2, -14.8333333, -10.0666667, -15.5666667, -15.3, -9.9, -11.8333333, -12.6, -16.4666667, -13.0666667, -11.7666667, -13.7333333, -15.7, -13.5333333, -19.5, -14.3666667, -12.7666667, -12.9333333, -17, -17.5, -20.4, -16.1, -12.9666667, -16.6, -14.9333333, -17, -11.9666667, -15.5, -12.7333333, -12.4, -15.3333333, -15.3666667, -15.8, -15.8, -16.2666667, -13.6333333, -15.4333333, -16.1333333, -11.2, -13.1333333, -18.2, -12.7666667, -16.2666667, -11.1333333, -13.5333333, -11.1666667, -13.4, -14.2666667, -14.0666667, -13.8666667, -19.3333333, -18.5333333, -14.5666667, -14.3333333, -16.8, -12.7, -14.1, -16.6333333, -13.9333333, -10.6666667, -15.4, -14.9, -14.3666667, -11.7, -16.7333333, -11.7, -11.8333333, -12.5666667, -16.5666667, -13.0333333, -10.3666667, -12.4333333, -16.4666667, -14.8666667, -14.6666667, -12.5666667, -16.2, -13.5666667, -17.1, -12.0333333, -16.5333333, -13.2, -17.4666667, -14.7, -17.6, -10.3666667, -16.2333333, -15.2333333, -13.6333333, -14.3, -13.5, -10.1666667, -13.9, -14.3333333, -14.7333333, -10.1333333, -15.3666667, -18.5, -15.8333333, -16.0333333, -13.4333333, -13.5, -12.6, -9.1666667, -14.6333333, -17.5, -12.6, -13.6333333, -13.5666667, -14.6333333, -12.5, -16.4, -15.2, -14.2, -15.4666667, -15.8, -15.2666667, -15.6, -13.7666667, -15.3666667, -16.3666667, -14, -13.6, -19.2, -15.0333333, -18.2333333, -18.9333333, -14.1333333, -18.3, -14.4333333, -13.5666667, -8.9666667, -12.5333333, -18.7333333, -16.4333333, -10, -12.7, -15.7, -14.7333333, -15.3333333, -12.2333333, -16.5333333, -14.4, -14.0666667, -13.9, -14.0666667, -15.3666667, -15, -10.1666667, -10.0333333, -15.7333333, -13.3333333, -13.1, -14.6666667, -15.2, -17.7666667, -15.4, -12.0666667, -14.5666667, -10.5666667, -11.5666667, -16.2, -16.7, -13.3, -13.7333333, -15.7666667, -13.6666667, -16.0333333, -17.6666667, -11.9333333, -14.9, -17.9333333, -15.2333333, -14.6666667, -7.7666667, -15.2, -14, -16.3333333, -14.6666667, -17.9666667, -14.0666667, -14.3666667, -10.9333333, -14.2, -17.3333333, -14.2333333, -11.0666667, -18.3, -15.8333333, -10.1, -15.6, -12.4333333, -12.8, -15.1, -14.9, -13.2666667, -11.9, -16, -12.2, -12.9333333, -11.9333333, -12.7666667, -10.6, -11.3666667, -13.1, -16.1333333, -14.4, -15.6, -13.9333333, -12.5333333, -14.5, -15.8333333, -12.2666667, -15.4333333, -15.2666667, -15.3666667, -14.5666667, -14.3666667, -17.1666667, -12.6666667, -17.3, -16, -12.2666667, -17.6333333, -15, -12.5333333, -11.4, -10.7666667, -17.5333333, -13.5, -13.4666667, -13.7333333, -13.6333333, -17.5, -17.7, -14.7333333, -15.5666667, -11.9666667, -13.1, -15.2666667, -10.4, -11.5, -12.7333333, -17.4666667, -14.6333333, -13.5666667, -14, -13.7333333, -11.7333333, -16.1333333, -15.1333333, -13.3666667, -13.5333333, -17.1666667, -13.1, -17, -16.2333333, -13.5, -14.9333333, -17.3, -15.3666667, -14.4666667, -13.4333333, -11.8, -15.9, -16.8333333, -13.6666667, -16.1666667, -10.1666667, -15.4333333, -13.6333333, -14.0333333, -13.5333333, -16.1, -8.9666667, -14.0666667, -15.0333333, -13.1333333, -12.9333333, -17.3333333, -17.1, -11.6333333, -17, -8.6333333, -14.6666667, -12.2, -15.8333333, -12.2333333, -16.6666667, -15.8666667, -12.3666667, -14.9333333, -16.2, -14.7333333, -14.4333333, -15.8, -13.2666667, -19.3, -17.2, -11.4333333, -15.4333333, -15.2666667, -9.7333333, -13.8333333, -12.1, -12.1333333, -13.5666667, -15.2666667, -16.7666667, -16.0666667, -18.1333333, -17.6, -11.3, -15.7333333, -14.8, -16.6333333, -10.7, -12.9666667, -11.9666667, -13.9666667, -10.9, -11.6333333, -14.4666667, -10.8666667, -15.9, -14.8, -16.4, -11.4333333, -11.7666667, -15.5, -17.1, -15.4666667, -19.8333333, -15.8666667, -17.5333333, -14.3666667, -13.5, -14.7666667, -18.7, -11.1666667, -16.3666667, -16.9, -8.5666667, -15.5333333, -15.6, -17.6666667, -17.1333333, -17.0666667, -18.9666667, -16.9333333, -11.5666667, -13.2666667, -13.4333333, -10.9, -15.8333333, -12.5333333, -14.1333333, -11.8333333, -11.6666667, -16.1333333, -11.4, -13.9333333, -16.0333333, -16.1, -11.8666667, -12.4333333, -12.6333333, -15.0333333, -14.9333333, -14.7, -16, -14.4666667, -12.8, -11.1666667, -18.5333333, -10.6666667, -14.0666667, -12.2333333, -13.4, -13, -13.1666667, -16.9, -11.6333333, -19.3666667, -15.9666667, -15.0666667, -16.2333333, -13.5666667, -16.2, -13.7, -17.7333333, -15.4, -17.9333333, -15.8333333, -17.2666667, -12.7666667, -20.1333333, -13.1, -12.8, -15, -15.9333333, -18.8333333, -18.2666667, -11.9666667, -15.1666667, -13.8, -17.8333333, -14.1666667, -10.8333333, -17.4333333, -17.0666667, -16.6, -15.5333333, -11.7, -18.2333333, -9.3, -18.4333333, -11.4333333, -14.8333333, -13.9333333, -12.8666667, -12.7, -12.6666667, -15.0666667, -18.8666667, -16.3, -16.7, -9.3333333, -18.6666667, -13.5333333, -10.6666667, -16.6666667, -16.3333333, -12.4333333, -11.6, -14.7333333, -14.6, -10.4666667, -13.2333333, -9.6666667, -11.6, -14.6666667, -13.1333333, -12.4666667, -12.9333333, -14.9666667, -14.5666667, -16.6666667, -10.4, -11.1333333, -12.3666667, -14.7333333, -12.7333333, -11.0333333, -19.0666667, -15.7333333, -14.6, -16.4666667, -12.2, -11.5, -17.4, -11.4333333, -15.3666667, -17.0666667, -10.7333333, -16.7666667, -14.2333333, -13.7333333, -16.5666667, -13.5, -12.5333333, -12.1666667, -16.8666667, -13.4, -18.5, -13.4666667, -16.2333333, -12.7, -16.5333333, -13.1333333, -15.0333333, -17.4, -11.3666667, -11.8, -13.6333333, -13.8666667, -17.4333333, -15.9, -14.1666667, -15.7, -15.9333333, -17.0666667, -14.5, -16.0666667, -15.6666667, -11.7, -15.4666667, -15.5666667, -13.9666667, -16.0666667, -12.2, -16.3333333, -15.3333333, -11.3666667, -17.0666667, -15.1666667, -17.8, -12.6333333, -15.4333333, -12.6666667, -14.3333333, -11.5333333, -15.8666667, -16.2666667, -12.7, -13.9333333, -13.3666667, -19.7, -13.0333333, -15.3, -14.5333333, -12.3333333, -12.0333333, -15.7, -18.1666667, -15.8666667, -11.0333333, -13.1333333, -17.3666667, -12.5, -15.2666667, -15.1666667, -13.3, -14.7, -15.8333333, -13.3333333, -16.6, -14, -12.5666667, -16, -15.2, -13.8, -17, -16.8666667, -15.6666667, -13.5, -13.9, -18.3333333, -12.5666667, -14.4333333, -10.9666667, -11.1333333, -12.4333333, -14.7, -17.8, -15.2, -15.1666667, -13.9666667, -16.1666667, -12.3333333, -11.2666667, -10.2666667, -12.9666667, -17.8666667, -12.7, -11.3666667, -11.9, -14.9666667, -15.2, -14.8, -14.2666667, -12.4333333, -13.1333333, -14.4, -13, -12.9, -16.5, -18.5333333, -15.4, -17.4666667, -14.1, -14.7333333, -19.0666667, -13.1333333, -11.7333333, -12.6333333, -12.9, -19.2333333, -17.3, -14, -14.4333333, -14.1333333, -17.0666667, -15.7333333, -12.4, -15.4666667, -14.9666667, -11.2333333, -16.0666667, -15.7666667, -14.5666667, -13.8333333, -15.2, -11.7666667, -15.4333333, -15.1666667, -11.2333333, -9.6333333, -13.4, -15.2333333, -17.3333333, -12.4333333, -12.7, -17.8666667, -19.4, -17.8333333, -10.3333333, -13.6333333, -13.3333333, -11.9333333, -12.5666667, -13.8666667, -11.2666667, -17.6, -14.5666667, -15.9333333, -14.6333333, -14.5333333, -12.6, -15.4666667, -15.3666667, -16.5666667, -15.2333333, -14.7, -15.4333333, -13.7333333, -16.3666667, -13.3333333, -11.5666667, -18.4666667, -11.1333333, -13.0666667, -12.3, -12.9, -11.5, -14.4333333, -9.8, -15.5, -17.4, -13.9333333, -14.3333333, -16.5333333, -13.1333333, -13.8, -14.4333333, -15.9666667, -15, -13.2333333, -15, -12.8666667, -13.6, -10.9666667, -13.2666667, -11.6, -13.6, -11.0666667, -15.6333333, -13.5666667, -15.6, -16.1, -11.5666667, -15.4333333, -8.6333333, -13.9, -13.7666667, -14.5333333, -11.1666667, -9.5666667, -13.7666667, -13.3333333, -14.2333333, -10.7, -10.0666667, -16.2333333, -14.6666667, -11.5, -13.0666667, -14.5666667, -14.1666667, -12.2, -12.9333333, -17.1333333, -13.6, -13.3333333, -10.9666667, -13.5666667, -13.9333333, -16.8333333, -15.7, -17.9, -11.1, -16.8666667, -14.1333333, -6.9, -14.4333333, -13.8333333, -14.2333333, -14.5, -19, -14.3, -19.2333333, -14.9666667, -9.8666667, -12.1, -13.1666667, -10.2, -18.0666667, -16.5, -12.3, -19.6333333, -11.3333333, -15.8, -12.8, -15.0666667, -12.9, -13.4666667, -17.1666667, -13.7333333, -15.1666667, -10.2666667, -11.7333333, -11.3, -14.3333333, -12.5, -13.5333333, -17.8666667, -16.5333333, -15.4, -15.5, -13.9, -17.7, -12.9333333, -16.9333333, -14.2666667, -14.1333333, -14, -15.2, -12.7, -13.5333333, -16.2333333, -13.4, -14.7666667, -14.3333333, -11.8666667, -13.5333333, -10.2333333, -9.4333333, -14.3, -17.3333333, -14.8, -13.1333333, -13.1666667, -16.2, -12.8333333, -14.9, -10.9666667, -15.4333333, -14.4666667, -16.2, -10.6, -14.3666667, -14.3666667, -14.9, -19.3, -11.5666667, -13.9, -13.4, -15.8, -16.8, -13.5666667, -16.8333333, -15.1, -15.0666667, -13.6333333, -15.5, -13.0666667, -14.6333333, -13.8333333, -14.0666667, -13.6333333, -15.3, -14.4666667, -17.2, -15.8666667, -13.4666667, -14.1666667, -10.5666667, -13.4333333, -15.8666667, -13.5333333, -13.9666667, -16.6666667, -15.1333333, -16.6666667, -17.1666667, -12.8333333, -14.4666667, -16.8333333, -14.4, -14.8666667, -14.1666667, -10.4, -13.7666667, -11.5666667, -16.1, -15.1666667, -15.0666667, -11.7, -16.1333333, -12.8666667, -14.1, -16.3666667, -14.9666667, -17.8333333, -18.2, -15.7666667, -15.6666667, -14.6666667, -19.3, -12.6, -9.6, -11.0333333, -12.9666667, -14.6666667, -14.9333333, -19.3, -15.1333333, -12.6333333, -16, -12.3333333, -14.6666667, -12.8, -16.1666667, -11.3333333, -10.8333333, -18.3333333, -13.9, -11.5666667, -18.3, -14.4333333, -16.5, -15.5333333, -17.4333333, -15.0666667, -17.9666667, -13.1, -12.7666667, -8.1333333, -13.9, -15.5, -13.3333333, -17.6333333, -13.6666667, -18.1333333, -17.2666667, -15.9666667, -15.7333333, -15.7666667, -16.4333333, -20.0333333, -14.9, -13.5333333, -18.8666667, -12.0333333, -17.7333333, -15.4333333, -13, -15.8666667, -14.0666667, -17.8666667, -17.2, -10.4, -15.2666667, -15.9666667, -16.5666667, -16.6666667, -13.3, -11.3666667, -12.1333333, -15.9666667, -18.5666667, -14.8666667, -12.9, -11.6, -10.3, -10.0333333, -11.5666667, -10.6333333, -13.8333333, -13.3333333, -13.3666667, -13.2666667, -18.1333333, -16.8333333, -14.1333333, -9.7, -10.7333333, -14.1666667, -13.9333333, -13.9666667, -12.9333333, -15.6, -16.2333333, -17.0666667, -18.4333333, -17.5666667, -16.1333333, -13.2, -14.7, -13.0666667, -10.9333333, -12.9666667, -14.5666667, -16.9333333, -15.2, -15.4333333, -11.7666667, -14.6666667, -15.9666667, -16.8, -12.9333333, -12.3666667, -13.8, -13.7, -16.3333333, -10.5333333, -16.3666667, -11.2, -12.4666667, -13.4666667, -14.0333333, -17.5, -13.6666667, -15.6, -14.9666667, -14.0333333, -15.2, -15.8666667, -12.4, -17.3, -14.5, -11.4333333, -16.1666667, -16.3333333, -10.9666667, -10.5333333, -13.4666667, -15.1666667, -15.5333333, -14.7333333, -13, -12.4666667, -16.4666667, -11.8333333, -15.1, -11.6333333, -16.2666667, -14.9666667, -18.8333333, -10.5, -12.5666667, -16.5333333, -13.0666667, -12.4, -13.3333333, -17.3333333, -10.2, -12.1666667, -15.5333333, -15.7666667, -18.9333333, -16.9333333, -18.6333333, -10.8, -15.1666667, -15.7666667, -13.2666667, -14.4333333, -11.9333333, -14.7666667, -12.5666667, -15.7666667, -17.7, -16.2333333, -10.8, -13.4666667, -16.6, -12.8333333, -11.8666667, -20.2333333, -13.0333333, -14.7666667, -11.6666667, -14.3666667, -16.1666667, -11.7666667, -19.1, -12.0333333, -12.5333333, -15.4, -16.1666667, -9.8, -14.3333333, -14.1333333, -15.4666667, -15.8666667, -12.3666667, -14.5, -14.9333333, -11, -15.2666667, -15.3666667, -14.1666667, -12.3666667, -17.8333333, -13.4, -15.5666667, -15.4, -17.1666667, -12.7666667, -15.8666667, -13.5, -16.0333333, -17.2333333, -13.1, -15.1666667, -15.9, -14.7, -16.3666667, -18.4, -15.7, -12.3666667, -13.2333333, -11.2666667, -17.9, -12.3666667, -15.2666667, -11.8, -15.8, -13.2, -14.2333333, -13.3666667, -17.6, -15.4666667, -18.6333333, -15.2333333, -16.9333333, -13.9666667, -13.1, -16.0333333, -16.3666667, -14.9666667, -14.1, -18.3666667, -13.2666667, -16.2666667, -11.8333333, -15.7333333, -13.7, -15.4333333, -15.5, -10.0333333, -13.3, -17.2, -16, -13.2, -13.3, -11.2, -17.2, -16.4666667, -17.4, -12.8333333, -13.7333333, -17.5, -15.9333333, -16.4666667, -15.6666667, -14.5, -15.7333333, -8.6333333, -12.4666667, -18.1666667, -18.8666667, -12.4, -15.5666667, -12.7333333, -13.6333333, -9.3666667, -9.9333333, -17.0333333, -14.0666667, -10.5666667, -18.8, -16.1666667, -17.7333333, -14.3666667, -11.2, -12.7666667, -16.6, -12.8333333, -17.9666667, -13.4, -8.4333333, -18.4333333, -13.2, -17.5666667, -16.9666667, -11.1333333, -17.7333333, -13.7, -12.8, -13.8, -14.6, -12.9, -14.1666667, -17.4333333, -14.0666667, -17.1666667, -21.3333333, -19.1, -12.8333333, -11.7, -10.7333333, -16.5666667, -14.3, -14.3333333, -9.9, -12.9666667, -14.4333333, -16.7333333, -14.5666667, -9.6666667, -16.8, -13.7, -14.5, -13.2666667, -15.5666667, -11.1, -11.8, -13.6, -13.2333333, -13.9333333, -13.4333333, -15.3333333, -20, -17.2333333, -13.9666667, -12.0333333, -14.6666667, -19.4666667, -16.7, -14.9333333, -16.9666667, -13.7666667, -16.8666667, -16.9, -15.8333333, -10.0333333, -16.6, -16.8333333, -13.1333333, -8.9666667, -17.8666667, -19.3, -15.7666667, -11.9666667, -15.9333333, -11.3666667, -15.4, -10.8, -14.1333333, -17.9, -12.7, -14.7333333, -13.4666667, -15.7333333, -13.4, -16.3666667, -15.9666667, -11.3666667, -13.2666667, -13.4333333, -13.3666667, -16, -11.6666667, -10.1, -14.5, -15.0666667, -15.1333333, -12.6333333, -15.7333333, -14, -9.7, -16.1666667, -13.7, -16.8, -14.1333333, -12.5333333, -17.1, -11.5, -15.5666667, -18.2, -16.2333333, -16.5666667, -15.7666667, -15.5666667, -13.5666667, -11, -10.8666667, -13.8666667, -10.8666667, -13.6333333, -15.5333333, -14.6666667, -18.1666667, -11.2, -8.7, -14.8333333, -14.8, -14.3, -12.5666667, -17.3666667, -16.2333333, -13.3333333, -15.7333333, -18.1333333, -18.4666667, -16.1666667, -12.2666667, -12.9, -10.7, -15.7666667, -12.5666667, -10.5333333, -16.5666667, -12.2, -9.2666667, -15.3666667, -12.1333333, -11.6333333, -17.1, -15.6666667, -17.2333333, -13.0666667, -16.5333333, -12.7, -13, -10.6, -14.1333333, -11.7333333, -15.5333333, -14.7666667, -13, -13.7, -13.7666667, -18.2, -17.5, -17.7333333, -12.9333333, -11.2666667, -14.4333333, -16.2666667, -14.2666667, -13.2333333, -14.8666667, -7.9, -12, -12.9333333, -12.5, -15.0333333, -11.9, -14.6666667, -13.3, -12.9333333, -15.6666667, -17.3333333, -14.3, -12.3333333, -14.8, -15.0666667, -14, -14.5333333, -11.3666667, -13.7333333, -17.6333333, -13.3333333, -15.6666667, -14.2666667, -10.7666667, -13.2333333, -15.7666667, -14.7666667, -12.6333333, -11.3666667, -14.6333333, -16.2666667, -15.7333333, -14, -14.2666667, -13.6666667, -12.4333333, -13.9, -14.2333333, -14.2666667, -18.7, -13.2, -11.7, -13.8333333, -14.5666667, -15.2666667, -14.6333333, -16.5333333, -14.8, -14.6333333, -13.3333333, -14.3, -16.0666667, -15.3333333, -14.1333333, -12.4333333, -15.4, -13.6666667, -10.1333333, -15.3, -14.3, -11.3666667, -15.9666667 and the permutation should be centered, assuming the null hypothesis, at 0.
Import the data from Girls2004 (see Section 1.2).
Perform some exploratory data analysis and obtain summary statistics on the weight of baby girls born in Wyoming and Arkansas (do seperate analyses for each state).
Bootstrap the difference in means, plot the distribution, and give the summary statistics. Obtain a 95% bootstrap percentile confidence interval and interpret this interval.
What is the bootstrap estimate of the bias? What fraction of the bootstrap standard error does it represent?
Conduct a permutation test to calculate the difference in mean weights and state your conclusion?
For what population(s), if any does this calculation hold? Explain?
Girls2004 <- read.csv("http://www1.appstate.edu/~arnholta/Data/Girls2004.csv")
head(Girls2004)
ID State MothersAge Smoker Weight Gestation
1 1 WY 15-19 No 3085 40
2 2 WY 35-39 No 3515 39
3 3 WY 25-29 No 3775 40
4 4 WY 20-24 No 3265 39
5 5 WY 25-29 No 2970 40
6 6 WY 20-24 No 2850 38
Girls2004AK <- filter(Girls2004, State == "AK")
Girls2004WY <- filter(Girls2004, State == "WY")
meanAK <- mean(Girls2004AK$Weight)
meanWY <- mean(Girls2004WY$Weight)
sdAK <- sd(Girls2004AK$Weight)
sdWY <- sd(Girls2004WY$Weight)
Girls2004AK %>%
ggplot(aes(x = Weight)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Birth Weights in Arkansas")
Girls2004WY %>%
ggplot(aes(x = Weight)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Birth Weights in Wyoming")
We found a mean of 3516.35 and a standard deviation of 578.8336438 for Arkansas. We found a mean of 3207.9 and a standard deviation of 418.3184163 for Wyoming.
See the histograms above to see the distribution visually, but we found both to have a fairly irregular distribution.
# Generate bootstrap samples from the sample
arkansas <- Girls2004AK$Weight
wyoming <- Girls2004WY$Weight
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(arkansas, 40, replace=TRUE)) - mean(sample(wyoming, 40, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
The bootstrap is \(\sim N(305.9203875, 110.9775618)\). We can say with 95% confidence that the difference of mean birth weights for Arkansas and Wyoming is between 88.24875 and 521.500625 grams.
bias <- bsxbar - (meanAK - meanWY)
\(Bias_{Boot} = -2.5296125\)
The bias accounts for 2.279391% of the standard error.
# Generate a permutation test
arkansas <- Girls2004AK$Weight
wyoming <- Girls2004WY$Weight
obs_prop_diff <- mean(arkansas) - mean(wyoming)
# Run a Simulation
sims <- 10^4 - 1
perm_prop_diff <- numeric(sims)
for(i in 1:sims) {
index <- sample(length(Girls2004$Weight), length(arkansas), replace = FALSE)
perm_prop_diff[i] <- mean(Girls2004$Weight[index]) - mean(Girls2004$Weight[-index])
}
# Get and display p-value
p_value <- 2 * ((sum(perm_prop_diff >= obs_prop_diff)) + 1)/(sims + 1)
p_value
[1] 0.0082
\(H_0 : \mu_{AK} - \mu_{WY} = 0\) \(H_0 : \mu_{AK} - \mu_{WY} != 0\)
Given our p-value of 0.0082 we can reject the null hypothesis.
We have sufficient evidence to suggest that the difference in means birth weights is not 0.
This calculation could potentially be generalized to the audience that was tested, namely newborn girls in Wyoming and Arkansas in the year 2004. Even then, the given sample is quite small and, as a result, it cannot generalize with much confidence. Outside of the two tested states and the year tested these results definitely cannot be generalized. Many outside factors such as the avaliability of food and medical care in the country or state will vary. Other outside factors can affect results and thus these results cannot be generalized to other larger populations.
IceCream contains calorie information for a sample of brands of chocolate and vanilla ice cream. Use the bootstrap to determine whether or not there is a difference in the mean number of calories.IceCream <- read.csv("http://www1.appstate.edu/~arnholta/Data/IceCream.csv")
head(IceCream)
Brand VanillaCalories VanillaFat VanillaSugar ChocolateCalories
1 Baskin Robbins 260 16.0 26.0 260
2 Ben & Jerry's 240 16.0 19.0 260
3 Blue Bunny 140 7.0 12.0 130
4 Breyers 140 7.0 13.0 140
5 Brigham's 190 12.0 17.0 200
6 Bulla 234 13.5 21.8 266
ChocolateFat ChocolateSugar
1 14 31.0
2 16 22.0
3 7 14.0
4 8 16.0
5 12 18.0
6 15 22.6
# Generate bootstrap samples from the sample
chocolate <- IceCream$ChocolateCalories
vanilla <- IceCream$VanillaCalories
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(chocolate, 39, replace=TRUE)) - mean(sample(vanilla, 39, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
We can say with 95% confidence that the difference between calories in chocolate and vanilla ice cream is between -19.2051282 and 33.6166667. The mean is 7.2050487 with a standard error of 13.595824. With this knowledge, we cannnot make a definitive determination whether chocolate or vanilla ice cream have more calories.
Import the data from Flight Delays Case Study in Section 1.1 data into R. Although the data are on all UA and AA flights flown in May and June of 2009, we will assume these represent a sample from a larger population of UA and AA flights flown under similar circumstances. We will consider the ratio of the means of the flight delay lengths, \(\mu_{\text{UA}} / \mu_{\text{AA}}\).
Perform some exploratory data analysis on flight delay lengths for each of UA and AA flights.
Bootstrap the mean of flight delay lengths for each airline seperately and describe the distribution.
Bootstrap the ratio of means. Provide plots of the bootstrap distribution and describe the distribution.
Find the 95% bootstrap percentile interval for the ratio of means. Interpret this interval.
What is the bootstrap estimate of the bias? What fraction of the bootstrap standard error does it represent?
For inference in this text, we assume that the observations are independent. Is that condition met here? Explain.
FlightDelays <- read.csv("http://www1.appstate.edu/~arnholta/Data/FlightDelays.csv")
ua <- filter(FlightDelays, Carrier == "UA")
aa <- filter(FlightDelays, Carrier == "AA")
meanaa <- mean(aa$Delay)
meanua <- mean(ua$Delay)
sdaa <- sd(aa$Delay)
sdua <- sd(ua$Delay)
ua %>%
ggplot(aes(x = Delay)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Delay Times for United Airlines")
aa %>%
ggplot(aes(x = Delay)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Delay times for American Airlines")
We found a mean delay time for United airlines of 15.983081 and a mean delay time for American Airlines of 10.0973847. We found a standard deviation of 45.1389485 for United Airlines and 40.0806306 for the American Airlines. We can see that these have a generally logarithmic distribution.
# Generate bootstrap samples from the sample
uavals <- ua$Delay
aavals <- aa$Delay
B <- 10^4
bsmeanua <- numeric(B)
bsmeanaa <- numeric(B)
for (i in 1:B) {
bsmeanua[i] <- mean(sample(uavals, 1123, replace=TRUE), na.rm = TRUE)
bsmeanaa[i] <- mean(sample(aavals, 2906, replace=TRUE), na.rm = TRUE)
}
bsxbaraa <- mean(bsmeanaa)
bsxbarua <- mean(bsmeanua)
bsseaa <- sd(bsmeanaa)
bsseua <- sd(bsmeanua)
low_quantileaa <- quantile(bsmeanaa, 0.025)
high_quantileaa <- quantile(bsmeanaa, 0.975)
low_quantileua <- quantile(bsmeanua, 0.025)
high_quantileua <- quantile(bsmeanua, 0.975)
data.frame(Bootstrap = bsmeanaa) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantileaa, color = "red") +
geom_vline(xintercept = high_quantileaa, color = "red") +
labs(title = "American Airlines Bootstrapped Delay Times")
data.frame(Bootstrap = bsmeanua) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantileua, color = "red") +
geom_vline(xintercept = high_quantileua, color = "red") +
labs(title = "United Airlines Bootstrapped Delay Times")
\(\mu_{UA} \sim N(15.9970399, 1.3535806)\)
\(\mu_{AA} \sim N(10.090999, 0.7485698)\)
# Generate bootstrap samples from the sample
uavals <- ua$Delay
aavals <- aa$Delay
B <- 10^4
bsmean <- numeric(B)
for (i in 1:B) {
bsmean[i] <- mean(sample(uavals, 1123, replace=TRUE)) / mean(sample(aavals, 2906, replace=TRUE))
}
bsxbar <- mean(bsmean)
bsse <- sd(bsmean)
low_quantile <- quantile(bsmean, 0.025)
high_quantile <- quantile(bsmean, 0.975)
data.frame(Bootstrap = bsmean) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile, color = "red") +
geom_vline(xintercept = high_quantile, color = "red")
\(\mu_{UA}/\mu_{AA} \sim N(1.5924804, 0.180681)\)
We can say with 95% confidence that the ratio of the means of United Airlines and American Airlines is between 1.2669885 and 1.9681017.
bias <- bsxbar - (meanua / meanaa)
\(Bias_{Boot} = 0.0095872\)
The bias accounts for 5.3061601% of the standard error.
results <- data.frame(UA = c(bsxbarua, bsxbar), AA = c(bsxbar, bsxbaraa))
dimnames(results) <- list(c("UA", "AA"), c("UA", "AA"))
p_value <- chisq.test(results)$p.value
p_value
[1] 0.0001459755
From our p-value of 0.0001459755, we can reject the null hypothesis that these two data sets are independent. Thus we have sufficient evidence to support the hypothesis that these two data sets are dependent.
The two data seem to be dependent.
Two college students collected data on the price of hardcover textbooks from two disciplinary areas: Mathematics and the Natural Sciences, and the Social Sciences (Hien and Baker (2010)). The data are in the file BookPrices.
Perform some exploratory data analysis on book prices for each of the two disciplinary areas.
Bootstrap the mean of the book price for each area separately and describe the distributions.
Bootstrap the ratio of means. Provide plots of the bootstrap distribution and comment.
Find the 95% bootstrap percentile interval for the ratio of means. Interpret this interval.
What is the bootstrap estimate of the bias? What fraction of the bootstrap standard error does it represent?
BookPrices <- read.csv("http://www1.appstate.edu/~arnholta/Data/BookPrices.csv")
mat <- filter(BookPrices, Area == "Math & Science")
social <- filter(BookPrices, Area == "Social Sciences")
meanmat <- mean(mat$Price)
meansocial <- mean(social$Price)
sdmat <- sd(mat$Price)
sdsocial <- sd(social$Price)
mat %>%
ggplot(aes(x = Price)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Prices for Math & Science Books")
social %>%
ggplot(aes(x = Price)) +
geom_histogram(color = "black", fill = "cyan") +
theme_bw() +
labs(title = "Prices for Social Science Books")
# Generate bootstrap samples from the sample
matvals <- mat$Price
socialvals <- social$Price
B <- 10^4
bsmeanmat <- numeric(B)
bsmeansocial <- numeric(B)
for (i in 1:B) {
bsmeanmat[i] <- mean(sample(matvals, 27, replace=TRUE), na.rm = TRUE)
bsmeansocial[i] <- mean(sample(socialvals, 17, replace=TRUE), na.rm = TRUE)
}
bsxbarmat <- mean(bsmeanmat)
bsxbarsocial <- mean(bsmeansocial)
bssemat <- sd(bsmeanmat)
bssesocial <- sd(bsmeansocial)
low_quantilemat <- quantile(bsmeanmat, 0.025)
high_quantilemat <- quantile(bsmeanmat, 0.975)
low_quantilesocial <- quantile(bsmeansocial, 0.025)
high_quantilesocial <- quantile(bsmeansocial, 0.975)
data.frame(Bootstrap = bsmeanmat) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantilemat, color = "red") +
geom_vline(xintercept = high_quantilemat, color = "red") +
labs(title = "Bootstrapped Prices for Math & Science Books")
data.frame(Bootstrap = bsmeansocial) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantilesocial, color = "red") +
geom_vline(xintercept = high_quantilesocial, color = "red") +
labs(title = "Bootstrapped Prices for Social Science Books")
\(MAT/SCIENCE \sim N(156.6498879, 7.4012824)\)
\(SS \sim N(99.0090022, 16.7389003)\)
# Generate bootstrap samples from the sample
matvals <- mat$Price
socialvals <- social$Price
B <- 10^4
bsmeanratio <- numeric(B)
for (i in 1:B) {
bsmeanratio[i] <- mean(sample(matvals, 27, replace=TRUE), na.rm = TRUE) / mean(sample(socialvals, 17, replace=TRUE), na.rm = TRUE)
}
bsxbarratio <- mean(bsmeanratio)
bsseratio <- sd(bsmeanratio)
low_quantile_ratio <- quantile(bsmeanratio, 0.025)
high_quantile_ratio <- quantile(bsmeanratio, 0.975)
data.frame(Bootstrap = bsmeanratio) %>%
ggplot(aes(x = Bootstrap)) +
geom_histogram(fill = "cyan", color = "black") +
theme_bw() +
geom_vline(xintercept = low_quantile_ratio, color = "red") +
geom_vline(xintercept = high_quantile_ratio, color = "red") +
labs(title = "Bootstrapped Ratio between Mathematics and Social Sciences Book Prices")
We can say with 95% confidence that the ratio of the mean of Mathematic and Natural Science book prices and Social Science book prices is between 1.1724261 and 2.4260919.
bias <- bsxbarratio - (meanmat/meansocial)
\(Bias_{Boot} = 0.0572538\)
The bias accounts for 31.6877878% of the standard error.