Marten (Martes americana), U.P. Michigan
Read county boundaries shapefile.
Counties = readOGR(dsn = "./Counties",
layer = "Counties_v17a",
stringsAsFactors = FALSE)
## OGR data source with driver: ESRI Shapefile
## Source: "E:\HarvMod\HarvestModeling\Counties", layer: "Counties_v17a"
## with 83 features
## It has 15 fields
## Integer64 fields read as strings: OBJECTID FIPSNUM
UP = subset(Counties, PENINSULA == "upper")
UP.union = gUnaryUnion(UP)
#Create a rasterized version
Ras = raster(res = 0.01, ext = extent(UP.union),
crs = proj4string(UP.union))
Domain.r = rasterize(UP.union, Ras,
field = 0,
background = NA)
#Creat a point grid version
Grd.pnt = rasterToPoints(Domain.r, spatial = TRUE)
Grd.pnt@data = Grd.pnt@data %>%
mutate(Long = Grd.pnt@coords[,1],
Lat = Grd.pnt@coords[,2]) %>%
dplyr::select(-layer)
Second data set (with age and sex)
#Mart.df = read.csv("C:/Users/Talesha Dokes/Michigan State University/Roloff, Gary - HarvestModeling/MartenDataJun2019/Roloff_marten_registrations.csv",
# header = TRUE, sep=",")
Mart.df = read.csv("./MartenDataJun2019/Roloff_marten_registrations.csv",
header = TRUE, sep=",")
#Table with PLSS abd coordinates for Michigan
#PLSS = read.csv("F://MartenPhDWork//Hecology//MI_PLSS.csv", #FYI - This file wasn't on the OneDrive
# header = TRUE, sep=",")
PLSS = read.csv("./PLSS/MI_PLSS.csv",
header = TRUE, sep=",")
Mart.df$Long = with(PLSS,
Long[match(
Mart.df$CorrectedTRSec,
TWNRNGSEC)])
Mart.df$Lat = with(PLSS,
Lat[match(
Mart.df$CorrectedTRSec,
TWNRNGSEC)])
Mart.df = Mart.df %>%
mutate(Year = Season_Year,
#Month = month(TakeDate),
Age = Lab_Age,
Sex = Lab_Sex,
Spp = "Marten",
OBS = 1,
Source = "MDNR") %>%
filter(is.na(Year) == FALSE,
is.na(Long) == FALSE,
is.na(Lat) == FALSE) %>%
dplyr::select(Year, Age, Sex, Spp, OBS, Year, Long, Lat, Source, CorrectedTRSec)
Mart.dups = Mart.df
#This code creates a new column with a "1" if marten was harvested from that section the year prior and "0" if not.
Uniq.sect = levels(factor(Mart.df$CorrectedTRSec))
for(i in 1:length(Uniq.sect)){
tmp.sect = arrange(Mart.df %>% filter(CorrectedTRSec == Uniq.sect[i]), Year)
Chk.tab = as.data.frame(matrix(nrow=19, ncol=3))
names(Chk.tab) = c("Year", "l.Year", "Harv")
Chk.tab$Year = 2000:2018
Chk.tab$l.Year = 1999:2017
Chk.tab$Harv = with(tmp.sect,
OBS[match(
Chk.tab$Year,
Year)])
Chk.tab$Harv[is.na(Chk.tab$Harv)] = 0
Chk.tab$l.Harv = lag(Chk.tab$Harv, 1)
Chk.tab$l.Harv[is.na(Chk.tab$l.Harv)] = 0
tmp.sect$Harv.Prior.Yr = with(Chk.tab,
l.Harv[match(
tmp.sect$Year,
Year)])
if(i == 1){Lag.harv = tmp.sect
} else{Lag.harv = rbind(Lag.harv, tmp.sect)}
}
Mart.df = Lag.harv %>% select(-CorrectedTRSec)
dim(Mart.df)
## [1] 3479 9
#Count records per year
Mart.df %>%
group_by(Year) %>%
summarise(Count = length(Year))
## # A tibble: 19 x 2
## Year Count
## <int> <int>
## 1 2000 67
## 2 2001 63
## 3 2002 64
## 4 2003 114
## 5 2004 134
## 6 2005 125
## 7 2006 146
## 8 2007 233
## 9 2008 218
## 10 2009 214
## 11 2010 253
## 12 2011 178
## 13 2012 276
## 14 2013 251
## 15 2014 302
## 16 2015 223
## 17 2016 95
## 18 2017 170
## 19 2018 353
Mart.df = Mart.df %>% filter(Year < 2019)
Mart.df %>%
group_by(Year) %>%
summarise(Count = length(Year))
## # A tibble: 19 x 2
## Year Count
## <int> <int>
## 1 2000 67
## 2 2001 63
## 3 2002 64
## 4 2003 114
## 5 2004 134
## 6 2005 125
## 7 2006 146
## 8 2007 233
## 9 2008 218
## 10 2009 214
## 11 2010 253
## 12 2011 178
## 13 2012 276
## 14 2013 251
## 15 2014 302
## 16 2015 223
## 17 2016 95
## 18 2017 170
## 19 2018 353
#Quickplot
Q.plt = as.data.frame(
Mart.df %>%
group_by(Year) %>%
summarise(Count = length(Year)))
ggplot(Q.plt, aes(Year, Count)) +
geom_bar(stat="identity")
dim(Mart.df)
## [1] 3479 9
Count Duplicates
Yrs.lvls = levels(factor(Mart.dups$Year))
dup.df = as.data.frame(matrix(nrow = length(Yrs.lvls), ncol = 5))
names(dup.df) = c("Year", "Total", "Duplicates", "Max", "Unique_locs")
for(i in 1:length(Yrs.lvls)){
tmp.dups = Mart.dups %>% filter(Year == Yrs.lvls[i])
tmp.dups$dups = duplicated(tmp.dups[,c("Long","Lat")])
dup.df[i,"Year"] = Yrs.lvls[i]
dup.df[i,"Total"] = dim(tmp.dups)[1]
dup.df[i,"Duplicates"] = length(which(tmp.dups$dups == TRUE))
max.df = as.data.frame(
tmp.dups %>%
group_by(CorrectedTRSec) %>%
summarise(Count = sum(OBS)))
dup.df[i,"Max"] = max(max.df$Count)
dup.df[i,"Unique_locs"] = dim(unique(tmp.dups[c("Long", "Lat")]))[1]
}
ggplot(dup.df, aes(Year, Duplicates)) +
geom_bar(stat = "identity") +
theme_classic() +
xlab(" ") +
ylab("Redundant Occurrences (Count)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
ggplot(dup.df, aes(Year, Unique_locs)) +
geom_bar(stat = "identity") +
theme_classic() +
xlab(" ") +
ylab("Unique Locations (Count)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#Subtracting 1 because all locations have at least 1 marten.
dup.df$Mart_dup = (dup.df$Total/dup.df$Unique_locs) - 1
ggplot(dup.df, aes(Year, Mart_dup)) +
geom_bar(stat = "identity") +
theme_classic() +
xlab(" ") +
ylab("Avg. Marten per Unique Location \n (number over 1)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
ggplot(dup.df, aes(Year, Max)) +
geom_bar(stat = "identity") +
theme_classic() +
xlab(" ") +
ylab("Maximum Marten from Single Section") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
Convert to Points
Marten.pnt = SpatialPointsDataFrame(Mart.df[,c("Long", "Lat")], Mart.df)
proj4string(Marten.pnt) = proj4string(UP)
#Keep only those in the UP
Marten.pnt$UP = is.na(over(Marten.pnt, UP.union))
Marten.pnt = subset(Marten.pnt, UP == FALSE)
Quick Plot
UP_map = fortify(UP)
## Regions defined for each Polygons
tmp.df = Marten.pnt@data %>%
dplyr::select(Long, Lat, Year)
ggplot(UP_map, aes(long,lat, group=group)) +
geom_polygon(fill = "tan", col="black") +
geom_point(data=tmp.df,
aes(Long, Lat,
group=NULL, fill=NULL),
col = "red", size=1) +
xlab("Longitude") +
ylab("Latitude") +
ggtitle("Marten Harvest") +
guides(color=guide_legend(title = "Year")) +
facet_wrap(~Year, ncol = 3) +
coord_equal() +
theme(panel.grid.minor = element_blank(),
panel.grid.major = element_blank(),
panel.background = element_blank(),
plot.background = element_blank(),
panel.border = element_blank(),
legend.title = element_blank(),
axis.title.x = element_text(size=16, face="bold"),
axis.title.y = element_text(size=16, face="bold"),
plot.title = element_text(size=20, face="bold", hjust = 0.5))
Change Projection
nProj = "+proj=utm +zone=16 +datum=NAD83 +units=km +no_defs +ellps=GRS80 +towgs84=0,0,0"
UP.prj = spTransform(UP, nProj)
UP.union.prj = spTransform(UP.union, nProj)
Marten.pnt.prj = spTransform(Marten.pnt, nProj)
Marten.pnt.prj@data = Marten.pnt.prj@data %>%
mutate(Longp = Marten.pnt.prj@coords[,1],
Latp = Marten.pnt.prj@coords[,2])
max.edge = 2
bound.outer = 30
bdry = inla.sp2segment(UP.union.prj)
mesh = inla.mesh.2d(boundary = bdry,
loc=cbind(Marten.pnt.prj),
max.edge = c(1, 12)*max.edge,
cutoff = 5,
min.angle = 23,
offset = c(max.edge, bound.outer))
plot(mesh, lwd=0.5, main=" ",
rgl=F, draw.vertices = TRUE,
vertex.color = "blue")
mesh$n
## [1] 1994
Get Mesh Nodes
dd = as.data.frame(cbind(mesh$loc[,1],
mesh$loc[,2]))
names(dd) = c("Longp", "Latp")
dd = dd %>%
mutate(OBS = 0,
Source = "Mesh")
##Make a copy for each year
Year.lvls = levels(factor(Marten.pnt.prj$Year))
for(i in 1:length(Year.lvls)){
tmp.dd = dd %>%
mutate(Year = Year.lvls[i])
if(i==1){dd.df = tmp.dd}
else{dd.df = rbind(dd.df, tmp.dd)}}
Month.lvls = levels(factor(Marten.pnt.prj$Month))
Age.lvls = levels(factor(Marten.pnt.prj$Age))
dd.length = dim(dd.df)[1]
#Random values for background points
#dd.df$Month = sample(Month.lvls, dd.length, replace = T)
dd.df$Sex = sample(c("F","M"), dd.length, replace = T)
dd.df$Age = sample(Age.lvls, dd.length, replace = T)
#No prior harvest at these locations
dd.df$Harv.Prior.Yr = 0
levels(factor(dd.df$Year))
## [1] "2000" "2001" "2002" "2003" "2004" "2005" "2006" "2007" "2008" "2009"
## [11] "2010" "2011" "2012" "2013" "2014" "2015" "2016" "2017" "2018"
head(dd.df)
## Longp Latp OBS Source Year Sex Age Harv.Prior.Yr
## 1 522.7310 5050.779 0 Mesh 2000 F 2.5 0
## 2 700.1876 5066.286 0 Mesh 2000 F 9.5 0
## 3 489.1956 5057.737 0 Mesh 2000 F 2.5 0
## 4 677.8654 5151.228 0 Mesh 2000 F 3.5 0
## 5 412.3404 5201.961 0 Mesh 2000 M 3.5 0
## 6 656.7944 5149.811 0 Mesh 2000 F 6.5 0
Combine Marten and Nodes Also converting to points.
Mod.pnts = Marten.pnt.prj@data %>%
dplyr::select(Longp, Latp, OBS, Source, Year, Sex, Age, Harv.Prior.Yr)
Mod.pnts = rbind(Mod.pnts, dd.df)
Mod.pnts = SpatialPointsDataFrame(Mod.pnts[,c("Longp", "Latp")], Mod.pnts)
proj4string(Mod.pnts) = proj4string(Marten.pnt.prj)
This will download PRISM data to specified folder and then convert it to a raster. Matching climate to month of harvest.
Max Temperature (TMAX)
library(prism)
range(Marten.pnt$Year)
## [1] 2000 2018
#range(Marten.pnt$Month)
options(prism.path = "./PRISM/tmax") #Where to save the data; seperate folder for temp
get_prism_monthlys(type = 'tmax', #climate variable wanted, options: "ppt", "tmean", "tmin", "tmax"
years=2000:2018, #Years wanted
mon = 10:12, #Months wanted
keepZip = FALSE) #Don't keep zip file
##
|
| | 0%
|
|= | 2%
|
|== | 4%
|
|=== | 5%
|
|===== | 7%
|
|====== | 9%
|
|======= | 11%
|
|======== | 12%
|
|========= | 14%
|
|========== | 16%
|
|=========== | 18%
|
|============= | 19%
|
|============== | 21%
|
|=============== | 23%
|
|================ | 25%
|
|================= | 26%
|
|================== | 28%
|
|=================== | 30%
|
|===================== | 32%
|
|====================== | 33%
|
|======================= | 35%
|
|======================== | 37%
|
|========================= | 39%
|
|========================== | 40%
|
|=========================== | 42%
|
|============================= | 44%
|
|============================== | 46%
|
|=============================== | 47%
|
|================================ | 49%
|
|================================= | 51%
|
|================================== | 53%
|
|=================================== | 54%
|
|==================================== | 56%
|
|====================================== | 58%
|
|======================================= | 60%
|
|======================================== | 61%
|
|========================================= | 63%
|
|========================================== | 65%
|
|=========================================== | 67%
|
|============================================ | 68%
|
|============================================== | 70%
|
|=============================================== | 72%
|
|================================================ | 74%
|
|================================================= | 75%
|
|================================================== | 77%
|
|=================================================== | 79%
|
|==================================================== | 81%
|
|====================================================== | 82%
|
|======================================================= | 84%
|
|======================================================== | 86%
|
|========================================================= | 88%
|
|========================================================== | 89%
|
|=========================================================== | 91%
|
|============================================================ | 93%
|
|============================================================== | 95%
|
|=============================================================== | 96%
|
|================================================================ | 98%
|
|=================================================================| 100%
GetFiles = ls_prism_data(name=TRUE) #File names
#Count files
dim(GetFiles)
## [1] 57 2
#View (2 columns)
head(GetFiles)
## files
## 1 PRISM_tmax_stable_4kmM3_200010_bil
## 2 PRISM_tmax_stable_4kmM3_200011_bil
## 3 PRISM_tmax_stable_4kmM3_200012_bil
## 4 PRISM_tmax_stable_4kmM3_200110_bil
## 5 PRISM_tmax_stable_4kmM3_200111_bil
## 6 PRISM_tmax_stable_4kmM3_200112_bil
## product_name
## 1 Oct 2000 - 4km resolution - Maximum temperature
## 2 Nov 2000 - 4km resolution - Maximum temperature
## 3 Dec 2000 - 4km resolution - Maximum temperature
## 4 Oct 2001 - 4km resolution - Maximum temperature
## 5 Nov 2001 - 4km resolution - Maximum temperature
## 6 Dec 2001 - 4km resolution - Maximum temperature
MyMonths = substr(GetFiles$product_name, 1, 3) #Pull month abbreviation
unique(MyMonths)
## [1] "Oct" "Nov" "Dec"
MyYear = substr(GetFiles$product_name, 6, 9) #Pull year
unique(MyYear)
## [1] "2000" "2001" "2002" "2003" "2004" "2005" "2006" "2007" "2008" "2009"
## [11] "2010" "2011" "2012" "2013" "2014" "2015" "2016" "2017" "2018"
#stack rasters
TMAX.stk = prism_stack(ls_prism_data())
#Simplified names
names(TMAX.stk) = paste(MyMonths, MyYear, sep="_")
#Plot one
plot(TMAX.stk[[1]])
##Create TMAX Dataframe
TMAX.df = as.data.frame(
extract(TMAX.stk, #Finding values for each location
spTransform(Mod.pnts,
proj4string(TMAX.stk)),
method = "simple"))
#Some points for the mesh were over water and coded as NA, impute by month and year
for(i in 1:dim(TMAX.df)[2]){
TMAX.df[,i][is.na(TMAX.df[,i])] = mean(TMAX.df[,i], na.rm=TRUE)
}
Mod.pnts$RowID = 1:nrow(Mod.pnts@data)
TMAX.df$RowID = 1:nrow(TMAX.df)
dim(TMAX.df)
## [1] 41335 58
head(TMAX.df)
## Oct_2000 Nov_2000 Dec_2000 Oct_2001 Nov_2001 Dec_2001 Oct_2002 Nov_2002
## 1 17.166 5.307 -4.955 14.489 10.476 2.711 11.273 4.595
## 2 17.268 5.442 -4.780 14.576 10.533 2.822 11.327 4.743
## 3 16.232 4.787 -5.703 13.779 9.803 2.129 10.782 3.847
## 4 13.621 5.111 -4.983 11.538 8.784 2.802 10.354 3.843
## 5 15.064 4.888 -5.161 13.080 9.194 2.713 10.568 3.824
## 6 15.594 4.497 -5.819 13.298 9.510 2.027 10.554 3.410
## Dec_2002 Oct_2003 Nov_2003 Dec_2003 Oct_2004 Nov_2004 Dec_2004 Oct_2005
## 1 0.234 14.141 4.749 1.185 14.646 8.059 -1.123 15.819
## 2 0.305 14.186 4.822 1.243 14.675 8.231 -1.062 15.849
## 3 -0.217 13.520 4.482 0.769 14.338 7.232 -1.535 15.627
## 4 -0.209 11.169 4.933 1.077 12.961 6.647 -0.979 13.487
## 5 -0.140 12.694 4.738 1.126 13.895 6.903 -1.079 14.698
## 6 -0.324 13.079 4.321 0.643 14.074 6.797 -1.820 15.285
## Nov_2005 Dec_2005 Oct_2006 Nov_2006 Dec_2006 Oct_2007 Nov_2007 Dec_2007
## 1 6.983 -2.350 12.422 6.836 1.146 17.494 5.442 -1.499
## 2 7.256 -2.250 12.471 6.817 1.184 17.554 5.578 -1.398
## 3 5.562 -2.619 11.837 6.556 0.864 16.742 4.768 -2.151
## 4 5.836 -2.473 10.353 6.209 1.177 15.746 5.591 -1.491
## 5 5.593 -2.501 11.030 6.504 1.064 15.874 4.592 -1.849
## 6 5.308 -2.795 11.395 6.398 0.773 16.231 4.357 -2.382
## Oct_2008 Nov_2008 Dec_2008 Oct_2009 Nov_2009 Dec_2009 Oct_2010 Nov_2010
## 1 13.594 5.169 -3.907 10.509 9.306 -2.521 16.070 6.470
## 2 13.692 5.253 -3.857 10.384 9.349 -2.458 16.101 6.512
## 3 13.463 4.828 -4.221 10.428 9.185 -2.789 15.884 6.293
## 4 11.903 4.844 -3.419 9.411 8.801 -1.942 13.960 6.444
## 5 12.905 4.880 -3.549 9.847 9.343 -2.195 15.259 6.432
## 6 13.266 4.559 -4.214 10.225 9.001 -2.844 15.648 6.218
## Dec_2010 Oct_2011 Nov_2011 Dec_2011 Oct_2012 Nov_2012 Dec_2012 Oct_2013
## 1 -2.432 16.333 6.656 0.709 13.407 5.265 0.730 14.371
## 2 -2.441 16.239 6.722 0.766 13.364 5.337 0.809 14.299
## 3 -2.548 15.804 6.433 0.372 12.940 4.988 0.401 14.324
## 4 -1.911 13.364 6.186 0.742 11.901 5.149 1.077 12.601
## 5 -1.819 14.718 6.371 0.536 12.270 4.997 1.012 13.565
## 6 -2.548 15.050 6.190 0.134 12.435 4.747 0.321 14.199
## Nov_2013 Dec_2013 Oct_2014 Nov_2014 Dec_2014 Oct_2015 Nov_2015 Dec_2015
## 1 4.168 -5.651 12.588 1.243 -0.442 14.724 8.725 3.554
## 2 4.192 -5.611 12.569 1.270 -0.445 14.847 8.797 3.685
## 3 3.897 -5.668 12.300 0.928 -0.582 14.234 8.467 3.217
## 4 3.837 -5.314 11.326 1.256 -0.088 12.817 8.058 3.639
## 5 4.002 -5.251 11.567 1.043 -0.170 13.520 8.263 3.590
## 6 3.575 -5.755 11.753 0.642 -0.706 13.752 8.189 3.015
## Oct_2016 Nov_2016 Dec_2016 Oct_2017 Nov_2017 Dec_2017 Oct_2018 Nov_2018
## 1 15.457 10.293 -1.542 15.928 4.114 -3.513 10.947 1.483
## 2 15.521 10.335 -1.495 16.039 4.231 -3.421 11.001 1.573
## 3 15.106 10.068 -1.680 15.477 3.822 -3.884 10.209 1.134
## 4 14.434 9.254 -1.089 14.391 3.965 -3.539 9.766 1.708
## 5 14.975 9.955 -1.044 14.838 4.012 -3.656 9.551 1.314
## 6 15.141 9.760 -1.730 15.251 3.577 -4.085 9.774 1.034
## Dec_2018 RowID
## 1 0.304 1
## 2 0.362 2
## 3 0.145 3
## 4 0.284 4
## 5 0.416 5
## 6 0.014 6
Find the average of October, November, and December for each year.
Melt.Temp.df = melt(TMAX.df, "RowID")
head(Melt.Temp.df) #Now in long format
## RowID variable value
## 1 1 Oct_2000 17.166
## 2 2 Oct_2000 17.268
## 3 3 Oct_2000 16.232
## 4 4 Oct_2000 13.621
## 5 5 Oct_2000 15.064
## 6 6 Oct_2000 15.594
Melt.Temp.df$Year = substr(Melt.Temp.df$variable, 5, 9)
Melt.Temp.df$Month = substr(Melt.Temp.df$variable, 1, 3)
head(Melt.Temp.df)
## RowID variable value Year Month
## 1 1 Oct_2000 17.166 2000 Oct
## 2 2 Oct_2000 17.268 2000 Oct
## 3 3 Oct_2000 16.232 2000 Oct
## 4 4 Oct_2000 13.621 2000 Oct
## 5 5 Oct_2000 15.064 2000 Oct
## 6 6 Oct_2000 15.594 2000 Oct
range(Melt.Temp.df$Year) #double checking
## [1] "2000" "2018"
#TMAX.df.avg = as.data.frame(
# Melt.Temp.df %>%
# group_by(Year) %>% #only Oct-Dec are in dataset
# summarise(Average = mean(value)))
#head(TMAX.df.avg)
#Match to marten records by Year
#Mod.pnts$TMAX = with(TMAX.df.avg,
# Average[match(
# Mod.pnts$Year,
# Year)])
Oct.TMAX.set = Melt.Temp.df %>% filter(Month == "Oct")
Tmp.data = merge(Mod.pnts@data, Oct.TMAX.set, by=c("Year", "RowID"))
Mod.pnts$Tmp.Oct = Tmp.data$value
Nov.TMAX.set = Melt.Temp.df %>% filter(Month == "Nov")
Tmp.data = merge(Mod.pnts@data, Nov.TMAX.set, by=c("Year", "RowID"), all.x=TRUE, all.y=FALSE)
Mod.pnts$Tmp.Nov = Tmp.data$value
Dec.TMAX.set = Melt.Temp.df %>% filter(Month == "Dec")
Tmp.data = merge(Mod.pnts@data, Dec.TMAX.set, by=c("Year", "RowID"))
Mod.pnts$Tmp.Dec = Tmp.data$value
Total Precipitation (PPT) As with TMAX
options(prism.path = "./PRISM/PPT") #Where to save the data; seperate folder for precip
get_prism_monthlys(type = 'ppt', #climate variable wanted, options: "ppt", "tmean", "tmin", "tmax"
years=2000:2018, #Years wanted
mon = 10:12, #Months wanted
keepZip = FALSE) #Don't keep zip file
##
|
| | 0%
|
|= | 2%
|
|== | 4%
|
|=== | 5%
|
|===== | 7%
|
|====== | 9%
|
|======= | 11%
|
|======== | 12%
|
|========= | 14%
|
|========== | 16%
|
|=========== | 18%
|
|============= | 19%
|
|============== | 21%
|
|=============== | 23%
|
|================ | 25%
|
|================= | 26%
|
|================== | 28%
|
|=================== | 30%
|
|===================== | 32%
|
|====================== | 33%
|
|======================= | 35%
|
|======================== | 37%
|
|========================= | 39%
|
|========================== | 40%
|
|=========================== | 42%
|
|============================= | 44%
|
|============================== | 46%
|
|=============================== | 47%
|
|================================ | 49%
|
|================================= | 51%
|
|================================== | 53%
|
|=================================== | 54%
|
|==================================== | 56%
|
|====================================== | 58%
|
|======================================= | 60%
|
|======================================== | 61%
|
|========================================= | 63%
|
|========================================== | 65%
|
|=========================================== | 67%
|
|============================================ | 68%
|
|============================================== | 70%
|
|=============================================== | 72%
|
|================================================ | 74%
|
|================================================= | 75%
|
|================================================== | 77%
|
|=================================================== | 79%
|
|==================================================== | 81%
|
|====================================================== | 82%
|
|======================================================= | 84%
|
|======================================================== | 86%
|
|========================================================= | 88%
|
|========================================================== | 89%
|
|=========================================================== | 91%
|
|============================================================ | 93%
|
|============================================================== | 95%
|
|=============================================================== | 96%
|
|================================================================ | 98%
|
|=================================================================| 100%
GetFiles = ls_prism_data(name=TRUE) #File names
#Count files
dim(GetFiles)
## [1] 57 2
#View (2 columns)
head(GetFiles)
## files
## 1 PRISM_ppt_stable_4kmM3_200010_bil
## 2 PRISM_ppt_stable_4kmM3_200011_bil
## 3 PRISM_ppt_stable_4kmM3_200012_bil
## 4 PRISM_ppt_stable_4kmM3_200110_bil
## 5 PRISM_ppt_stable_4kmM3_200111_bil
## 6 PRISM_ppt_stable_4kmM3_200112_bil
## product_name
## 1 Oct 2000 - 4km resolution - Precipitation
## 2 Nov 2000 - 4km resolution - Precipitation
## 3 Dec 2000 - 4km resolution - Precipitation
## 4 Oct 2001 - 4km resolution - Precipitation
## 5 Nov 2001 - 4km resolution - Precipitation
## 6 Dec 2001 - 4km resolution - Precipitation
MyMonths = substr(GetFiles$product_name, 1, 3) #Pull month abbreviation
MyYear = substr(GetFiles$product_name, 6, 9) #Pull year
#stack rasters
PPT.stk = prism_stack(ls_prism_data())
#Simplified names
names(PPT.stk) = paste(MyMonths, MyYear, sep="_")
#Plot one
plot(PPT.stk[[1]])
##Create TMAX Dataframe
PPT.df = as.data.frame(
extract(PPT.stk, #Finding values for each location
spTransform(Mod.pnts,
proj4string(PPT.stk)),
method = "simple"))
for(i in 1:dim(PPT.df)[2]){
PPT.df[,i][is.na(PPT.df[,i])] = mean(PPT.df[,i], na.rm=TRUE)
}
PPT.df$RowID = 1:nrow(PPT.df)
dim(PPT.df)
## [1] 41335 58
head(PPT.df)
## Oct_2000 Nov_2000 Dec_2000 Oct_2001 Nov_2001 Dec_2001 Oct_2002 Nov_2002
## 1 17.05 89.45 32.67 52.38 60.55 35.26 113.09 28.07
## 2 17.26 92.76 32.21 51.93 60.35 35.50 115.68 24.12
## 3 26.05 68.57 38.90 67.65 80.00 44.89 107.88 23.78
## 4 35.99 69.04 50.38 105.86 70.41 53.59 160.24 30.57
## 5 27.32 59.19 32.48 68.20 65.75 38.99 134.87 29.49
## 6 26.05 62.45 33.90 67.53 70.59 41.87 156.89 23.55
## Dec_2002 Oct_2003 Nov_2003 Dec_2003 Oct_2004 Nov_2004 Dec_2004 Oct_2005
## 1 21.55 23.55 74.78 46.28 104.70 47.06 39.15 114.84
## 2 22.24 24.19 78.52 45.67 104.00 47.29 37.31 107.72
## 3 18.98 26.49 64.94 51.84 105.69 57.88 62.65 120.91
## 4 17.25 50.95 93.34 51.33 103.37 68.46 76.00 73.55
## 5 17.97 45.85 79.82 46.82 121.32 66.41 58.76 107.19
## 6 16.06 32.90 64.17 47.35 110.48 53.45 64.76 117.07
## Nov_2005 Dec_2005 Oct_2006 Nov_2006 Dec_2006 Oct_2007 Nov_2007 Dec_2007
## 1 69.79 35.19 49.81 40.37 41.96 140.33 9.38 61.62
## 2 68.94 34.55 53.59 39.55 42.16 135.51 8.47 62.34
## 3 70.40 35.73 46.62 47.45 39.45 124.40 15.16 60.85
## 4 112.70 38.26 79.17 50.50 57.43 131.07 39.81 57.63
## 5 91.87 32.35 59.19 42.32 50.44 145.70 26.63 66.74
## 6 74.10 34.65 49.25 50.39 40.69 130.71 20.18 67.68
## Oct_2008 Nov_2008 Dec_2008 Oct_2009 Nov_2009 Dec_2009 Oct_2010 Nov_2010
## 1 39.45 30.77 69.69 176.73 16.50 43.57 68.65 66.89
## 2 39.23 34.35 70.33 179.58 16.16 44.76 66.65 68.85
## 3 33.58 29.73 71.00 115.55 15.08 56.41 66.52 60.25
## 4 48.11 37.51 76.14 154.14 18.97 62.03 54.44 69.05
## 5 42.94 37.01 84.97 133.76 20.56 58.57 47.16 89.41
## 6 37.68 29.59 72.60 127.02 18.30 58.02 47.92 63.11
## Dec_2010 Oct_2011 Nov_2011 Dec_2011 Oct_2012 Nov_2012 Dec_2012 Oct_2013
## 1 38.86 49.98 48.47 34.09 106.91 32.20 41.54 74.38
## 2 40.20 54.42 49.05 34.57 107.19 33.97 44.07 72.15
## 3 26.69 50.83 41.18 38.36 96.54 23.73 31.44 71.65
## 4 41.13 69.03 60.58 42.87 111.82 43.49 55.65 102.73
## 5 42.19 63.51 48.37 48.84 110.66 33.41 47.81 75.40
## 6 35.90 48.77 39.60 39.20 97.06 28.13 37.20 70.29
## Nov_2013 Dec_2013 Oct_2014 Nov_2014 Dec_2014 Oct_2015 Nov_2015 Dec_2015
## 1 106.77 36.56 103.19 75.01 55.51 79.18 84.01 124.882
## 2 107.09 37.56 104.13 75.32 55.33 81.09 83.44 125.817
## 3 100.88 33.49 124.23 70.44 60.47 58.00 81.23 116.701
## 4 137.52 46.48 148.52 94.57 61.39 85.11 96.72 138.252
## 5 131.24 49.03 122.08 94.89 62.13 65.01 90.14 135.072
## 6 104.16 37.87 105.08 82.34 58.40 55.08 86.09 118.679
## Oct_2016 Nov_2016 Dec_2016 Oct_2017 Nov_2017 Dec_2017 Oct_2018 Nov_2018
## 1 82.702 57.287 52.985 79.714 41.426 58.040 153.657 56.923
## 2 78.048 57.606 54.137 82.532 42.248 56.731 161.501 55.504
## 3 80.779 54.802 50.706 77.349 37.318 50.640 153.383 63.303
## 4 98.947 67.876 65.549 123.323 61.277 67.653 183.982 74.769
## 5 103.432 60.004 65.183 94.755 53.177 62.988 155.638 73.914
## 6 100.467 56.803 52.364 89.234 39.668 46.886 158.796 66.095
## Dec_2018 RowID
## 1 28.798 1
## 2 29.199 2
## 3 26.935 3
## 4 42.737 4
## 5 42.590 5
## 6 30.346 6
Find the average of October, November, and December for each year.
Melt.PPT.df = melt(PPT.df, "RowID")
head(Melt.PPT.df) #Now in long format
## RowID variable value
## 1 1 Oct_2000 17.05
## 2 2 Oct_2000 17.26
## 3 3 Oct_2000 26.05
## 4 4 Oct_2000 35.99
## 5 5 Oct_2000 27.32
## 6 6 Oct_2000 26.05
Melt.PPT.df$Year = substr(Melt.PPT.df$variable, 5, 9)
Melt.PPT.df$Month = substr(Melt.PPT.df$variable, 1, 3)
head(Melt.PPT.df)
## RowID variable value Year Month
## 1 1 Oct_2000 17.05 2000 Oct
## 2 2 Oct_2000 17.26 2000 Oct
## 3 3 Oct_2000 26.05 2000 Oct
## 4 4 Oct_2000 35.99 2000 Oct
## 5 5 Oct_2000 27.32 2000 Oct
## 6 6 Oct_2000 26.05 2000 Oct
range(Melt.PPT.df$Year) #double checking
## [1] "2000" "2018"
#TMAX.df.avg = as.data.frame(
# Melt.Temp.df %>%
# group_by(Year) %>% #only Oct-Dec are in dataset
# summarise(Average = mean(value)))
#head(TMAX.df.avg)
#Match to marten records by Year
#Mod.pnts$PPT = with(PPT.df.avg,
# Average[match(
# Mod.pnts$Year,
# Year)])
Oct.PPT.set = Melt.PPT.df %>% filter(Month == "Oct")
Tmp.data = merge(Mod.pnts@data, Oct.PPT.set, by=c("Year", "RowID"))
Mod.pnts$PPT.Oct = Tmp.data$value
Nov.PPT.set = Melt.PPT.df %>% filter(Month == "Nov")
Tmp.data = merge(Mod.pnts@data, Nov.PPT.set, by=c("Year", "RowID"))
Mod.pnts$PPT.Nov = Tmp.data$value
Dec.PPT.set = Melt.PPT.df %>% filter(Month == "Dec")
Tmp.data = merge(Mod.pnts@data, Dec.PPT.set, by=c("Year", "RowID"))
Mod.pnts$PPT.Dec = Tmp.data$value
Check Mesh Years
Mesh.chk = subset(Mod.pnts, Source == "Mesh")
unique(Mesh.chk$Year)
## [1] "2000" "2001" "2002" "2003" "2004" "2005" "2006" "2007" "2008" "2009"
## [11] "2010" "2011" "2012" "2013" "2014" "2015" "2016" "2017" "2018"
table(Mesh.chk$PPT.Oct)
##
## 20.1100006103516 21.1800003051758 21.9500007629395 22.0300006866455
## 1 1 1 1
## 22.6200008392334 22.6499996185303 22.7800006866455 23.2600002288818
## 1 1 1 1
## 23.5499992370605 23.5799999237061 23.7399997711182 23.75
## 1 1 1 1
## 24.2700004577637 24.3500003814697 24.3799991607666 24.4200000762939
## 1 1 1 1
## 24.5 24.7600002288818 24.8299999237061 25.0599994659424
## 1 1 1 1
## 25.1000003814697 25.1900005340576 25.5100002288818 25.5499992370605
## 1 1 1 1
## 25.6200008392334 25.6499996185303 25.6800003051758 25.75
## 1 1 1 1
## 25.7700004577637 25.8799991607666 25.9099998474121 25.9500007629395
## 1 1 1 1
## 26 26.0200004577637 26.0300006866455 26.1200008392334
## 1 1 2 1
## 26.2700004577637 26.2800006866455 26.2900009155273 26.3199996948242
## 1 1 1 2
## 26.3299999237061 26.4799995422363 26.4899997711182 26.5499992370605
## 1 1 1 1
## 26.6100006103516 26.6800003051758 26.6900005340576 26.7000007629395
## 1 1 1 1
## 26.8899993896484 26.8999996185303 26.9300003051758 26.9599990844727
## 1 1 1 1
## 27.0900001525879 27.1299991607666 27.2000007629395 27.2199993133545
## 1 1 1 1
## 27.2399997711182 27.25 27.2700004577637 27.3199996948242
## 1 1 1 1
## 27.3500003814697 27.3999996185303 27.5300006866455 27.5599994659424
## 1 1 2 1
## 27.7299995422363 27.7399997711182 27.7800006866455 27.8099994659424
## 1 1 1 1
## 27.8999996185303 27.9200000762939 27.9599990844727 27.9799995422363
## 1 1 1 1
## 28.0499992370605 28.1100006103516 28.1900005340576 28.2000007629395
## 1 1 1 1
## 28.2099990844727 28.2299995422363 28.3199996948242 28.3500003814697
## 1 1 1 1
## 28.3899993896484 28.3999996185303 28.4300003051758 28.4799995422363
## 1 1 1 2
## 28.4899997711182 28.5200004577637 28.5900001525879 28.7099990844727
## 1 1 2 2
## 28.7199993133545 28.7700004577637 28.7999992370605 28.8199996948242
## 1 1 1 2
## 28.8500003814697 28.8999996185303 28.9099998474121 28.9200000762939
## 1 1 2 1
## 28.9300003051758 28.9400005340576 28.9699993133545 28.9899997711182
## 1 1 1 1
## 29.0100002288818 29.0300006866455 29.0599994659424 29.1100006103516
## 1 1 3 1
## 29.1200008392334 29.1299991607666 29.2099990844727 29.2299995422363
## 1 1 1 1
## 29.2399997711182 29.25 29.3099994659424 29.3199996948242
## 3 1 1 1
## 29.3299999237061 29.3700008392334 29.4099998474121 29.4200000762939
## 1 1 2 1
## 29.4400005340576 29.4500007629395 29.4699993133545 29.5
## 1 3 1 1
## 29.5300006866455 29.5499992370605 29.6900005340576 29.7099990844727
## 2 1 1 1
## 29.7299995422363 29.7399997711182 29.75 29.7700004577637
## 1 1 1 1
## 29.7999992370605 29.8400001525879 29.8500003814697 29.8700008392334
## 1 1 1 2
## 29.9099998474121 29.9200000762939 29.9599990844727 29.9899997711182
## 1 2 1 1
## 30 30.0599994659424 30.0699996948242 30.0799999237061
## 1 1 1 1
## 30.0900001525879 30.1100006103516 30.1800003051758 30.2000007629395
## 1 2 1 1
## 30.2099990844727 30.2299995422363 30.2399997711182 30.2700004577637
## 1 1 1 1
## 30.2800006866455 30.2999992370605 30.3400001525879 30.3799991607666
## 1 2 2 1
## 30.3899993896484 30.4599990844727 30.4899997711182 30.5
## 1 1 1 1
## 30.5200004577637 30.5400009155273 30.6200008392334 30.6299991607666
## 1 1 1 1
## 30.6399993896484 30.6499996185303 30.6599998474121 30.6900005340576
## 2 1 1 1
## 30.7000007629395 30.7399997711182 30.7999992370605 30.8199996948242
## 1 1 1 1
## 30.8299999237061 30.8400001525879 30.8500003814697 30.8999996185303
## 1 2 2 1
## 30.9300003051758 31 31.0200004577637 31.0300006866455
## 1 1 3 1
## 31.0499992370605 31.0699996948242 31.1100006103516 31.1399993896484
## 2 2 1 1
## 31.1900005340576 31.2399997711182 31.2600002288818 31.2900009155273
## 1 1 1 1
## 31.3400001525879 31.3600006103516 31.4400005340576 31.4500007629395
## 1 1 1 1
## 31.4699993133545 31.5 31.5300006866455 31.5900001525879
## 2 2 1 1
## 31.6200008392334 31.6800003051758 31.7299995422363 31.75
## 2 1 1 1
## 31.7800006866455 31.8099994659424 31.8500003814697 31.8799991607666
## 1 1 1 1
## 31.8999996185303 31.9300003051758 31.9500007629395 31.9699993133545
## 1 3 3 1
## 32.0200004577637 32.1399993896484 32.1500015258789 32.1800003051758
## 1 1 1 1
## 32.2200012207031 32.2299995422363 32.2599983215332 32.2900009155273
## 1 1 1 2
## 32.310001373291 32.3300018310547 32.3499984741211 32.3600006103516
## 1 1 1 1
## 32.3899993896484 32.4500007629395 32.4599990844727 32.4700012207031
## 1 1 2 1
## 32.4900016784668 32.5200004577637 32.5299987792969 32.6100006103516
## 1 1 1 1
## 32.6300010681152 32.7200012207031 32.7299995422363 32.7400016784668
## 1 2 1 1
## 32.75 32.7999992370605 32.8499984741211 32.8899993896484
## 1 4 1 1
## 32.9000015258789 32.9099998474121 32.9500007629395 32.9799995422363
## 2 1 1 1
## 33.0299987792969 33.0400009155273 33.060001373291 33.0800018310547
## 1 2 1 1
## 33.1100006103516 33.1399993896484 33.1699981689453 33.3899993896484
## 1 1 2 1
## 33.4099998474121 33.4199981689453 33.4599990844727 33.5200004577637
## 2 1 1 1
## 33.5400009155273 33.5499992370605 33.5800018310547 33.6199989318848
## 1 2 1 1
## 33.6300010681152 33.7099990844727 33.7299995422363 33.7700004577637
## 1 1 1 1
## 33.7900009155273 33.8199996948242 33.8499984741211 33.8800010681152
## 1 2 1 1
## 33.8899993896484 33.9000015258789 33.9199981689453 33.9300003051758
## 2 1 1 1
## 34 34.0099983215332 34.0200004577637 34.0299987792969
## 1 1 2 1
## 34.0400009155273 34.0800018310547 34.0900001525879 34.1100006103516
## 2 1 1 1
## 34.1399993896484 34.1599998474121 34.1800003051758 34.189998626709
## 1 2 1 3
## 34.2200012207031 34.25 34.2599983215332 34.2700004577637
## 3 1 1 1
## 34.2799987792969 34.2999992370605 34.310001373291 34.3400001525879
## 1 1 1 2
## 34.3699989318848 34.4000015258789 34.4099998474121 34.4199981689453
## 1 1 1 2
## 34.439998626709 34.4700012207031 34.4799995422363 34.4900016784668
## 1 2 1 2
## 34.5 34.5099983215332 34.5200004577637 34.5900001525879
## 2 1 1 1
## 34.5999984741211 34.6500015258789 34.6699981689453 34.6800003051758
## 2 1 2 2
## 34.7000007629395 34.7400016784668 34.7599983215332 34.7700004577637
## 1 3 1 1
## 34.7799987792969 34.7999992370605 34.8300018310547 34.8899993896484
## 1 1 1 1
## 34.9500007629395 34.9700012207031 34.9799995422363 35.0099983215332
## 1 1 1 2
## 35.0200004577637 35.0299987792969 35.0499992370605 35.0800018310547
## 1 1 1 2
## 35.0900001525879 35.1100006103516 35.1199989318848 35.1300010681152
## 2 1 2 2
## 35.1500015258789 35.1599998474121 35.1800003051758 35.2000007629395
## 1 2 1 3
## 35.2299995422363 35.2599983215332 35.2700004577637 35.2799987792969
## 2 2 1 1
## 35.2900009155273 35.2999992370605 35.3199996948242 35.4000015258789
## 3 1 1 1
## 35.4099998474121 35.4199981689453 35.4300003051758 35.439998626709
## 1 2 1 1
## 35.4599990844727 35.4700012207031 35.5200004577637 35.5299987792969
## 2 4 2 1
## 35.5400009155273 35.5499992370605 35.5800018310547 35.5900001525879
## 1 2 1 2
## 35.5999984741211 35.6100006103516 35.6500015258789 35.6599998474121
## 2 4 2 1
## 35.6699981689453 35.7200012207031 35.75 35.7599983215332
## 1 1 1 1
## 35.7900009155273 35.7999992370605 35.810001373291 35.8600006103516
## 3 1 4 1
## 35.8699989318848 35.9000015258789 35.9099998474121 35.9300003051758
## 1 2 1 1
## 35.939998626709 35.9500007629395 35.9599990844727 35.9900016784668
## 2 1 3 2
## 36 36.0099983215332 36.0499992370605 36.0999984741211
## 1 1 1 3
## 36.1199989318848 36.1500015258789 36.1599998474121 36.1699981689453
## 2 1 1 2
## 36.189998626709 36.2200012207031 36.2299995422363 36.2400016784668
## 1 1 2 1
## 36.25 36.2799987792969 36.2900009155273 36.2999992370605
## 2 1 3 1
## 36.310001373291 36.3300018310547 36.3499984741211 36.3600006103516
## 3 1 2 2
## 36.3699989318848 36.4000015258789 36.4199981689453 36.4300003051758
## 2 1 1 2
## 36.439998626709 36.5 36.5200004577637 36.5299987792969
## 1 2 1 1
## 36.5400009155273 36.560001373291 36.5900001525879 36.5999984741211
## 2 3 3 8
## 36.6100006103516 36.6199989318848 36.6300010681152 36.6599998474121
## 1 1 1 1
## 36.6699981689453 36.6800003051758 36.689998626709 36.7200012207031
## 1 3 1 2
## 36.75 36.7599983215332 36.7900009155273 36.810001373291
## 1 1 2 2
## 36.8199996948242 36.8300018310547 36.8400001525879 36.8499984741211
## 1 1 1 1
## 36.8600006103516 36.8899993896484 36.9000015258789 36.9099998474121
## 1 1 3 4
## 36.9300003051758 36.9599990844727 36.9700012207031 36.9799995422363
## 1 2 3 2
## 37 37.0400009155273 37.0699996948242 37.0800018310547
## 1 2 2 1
## 37.0900001525879 37.0999984741211 37.1100006103516 37.1199989318848
## 2 1 2 2
## 37.1300010681152 37.1599998474121 37.1699981689453 37.1800003051758
## 1 2 3 1
## 37.189998626709 37.2000007629395 37.2099990844727 37.2200012207031
## 1 1 3 2
## 37.2299995422363 37.2400016784668 37.25 37.2599983215332
## 1 1 1 1
## 37.2700004577637 37.2799987792969 37.2999992370605 37.310001373291
## 1 2 2 1
## 37.3199996948242 37.3800010681152 37.3899993896484 37.4000015258789
## 3 1 2 1
## 37.4099998474121 37.4199981689453 37.4300003051758 37.4500007629395
## 2 1 1 2
## 37.4599990844727 37.4700012207031 37.4799995422363 37.5099983215332
## 3 1 2 1
## 37.5200004577637 37.5299987792969 37.5400009155273 37.5499992370605
## 1 2 3 1
## 37.560001373291 37.5699996948242 37.5800018310547 37.5900001525879
## 2 1 1 1
## 37.5999984741211 37.6100006103516 37.6199989318848 37.6300010681152
## 1 2 1 1
## 37.6399993896484 37.6699981689453 37.6800003051758 37.689998626709
## 1 1 3 1
## 37.7000007629395 37.7099990844727 37.7200012207031 37.7299995422363
## 1 1 3 1
## 37.75 37.7599983215332 37.7700004577637 37.7799987792969
## 2 4 1 3
## 37.810001373291 37.8300018310547 37.8600006103516 37.8699989318848
## 3 2 1 1
## 37.9199981689453 37.9300003051758 37.9599990844727 37.9700012207031
## 1 1 1 3
## 37.9799995422363 37.9900016784668 38 38.0099983215332
## 1 1 1 1
## 38.0200004577637 38.0299987792969 38.0400009155273 38.0499992370605
## 1 3 2 1
## 38.060001373291 38.0699996948242 38.0800018310547 38.1100006103516
## 1 3 2 1
## 38.1199989318848 38.1300010681152 38.1699981689453 38.1800003051758
## 1 1 2 4
## 38.189998626709 38.2000007629395 38.2099990844727 38.2200012207031
## 1 3 1 2
## 38.2299995422363 38.2599983215332 38.2799987792969 38.2900009155273
## 2 1 1 1
## 38.3400001525879 38.3499984741211 38.3800010681152 38.3899993896484
## 1 2 1 1
## 38.4099998474121 38.4300003051758 38.4500007629395 38.4700012207031
## 2 2 3 2
## 38.4799995422363 38.4900016784668 38.5 38.5099983215332
## 3 2 4 1
## 38.5499992370605 38.560001373291 38.5800018310547 38.5999984741211
## 2 4 2 1
## 38.6199989318848 38.6399993896484 38.689998626709 38.7099990844727
## 1 4 1 4
## 38.7299995422363 38.7400016784668 38.7599983215332 38.7700004577637
## 1 1 2 2
## 38.7799987792969 38.7900009155273 38.810001373291 38.8199996948242
## 1 2 1 4
## 38.8300018310547 38.8499984741211 38.8600006103516 38.8699989318848
## 2 2 2 1
## 38.9099998474121 38.9300003051758 38.9599990844727 38.9700012207031
## 3 1 1 4
## 38.9799995422363 39 39.0099983215332 39.0200004577637
## 1 2 2 1
## 39.0299987792969 39.0400009155273 39.0499992370605 39.060001373291
## 1 3 1 4
## 39.0699996948242 39.0900001525879 39.0999984741211 39.1199989318848
## 1 1 1 3
## 39.1300010681152 39.1399993896484 39.1500015258789 39.1800003051758
## 1 1 2 2
## 39.189998626709 39.2000007629395 39.2299995422363 39.2400016784668
## 3 1 4 1
## 39.25 39.2599983215332 39.2700004577637 39.2799987792969
## 3 3 4 1
## 39.2900009155273 39.2999992370605 39.3199996948242 39.3499984741211
## 1 1 3 2
## 39.3600006103516 39.3699989318848 39.3899993896484 39.4099998474121
## 3 2 4 1
## 39.4300003051758 39.439998626709 39.4500007629395 39.4599990844727
## 1 3 1 3
## 39.4700012207031 39.4799995422363 39.4900016784668 39.5
## 2 2 2 1
## 39.5099983215332 39.5200004577637 39.5299987792969 39.5499992370605
## 2 1 1 1
## 39.560001373291 39.5699996948242 39.5900001525879 39.5999984741211
## 1 4 3 2
## 39.6100006103516 39.6199989318848 39.6300010681152 39.6399993896484
## 3 1 2 1
## 39.6500015258789 39.6599998474121 39.6699981689453 39.6800003051758
## 2 3 2 1
## 39.7000007629395 39.7099990844727 39.7299995422363 39.75
## 4 3 3 1
## 39.7700004577637 39.7900009155273 39.7999992370605 39.810001373291
## 1 1 2 1
## 39.8199996948242 39.8400001525879 39.8499984741211 39.8600006103516
## 2 1 2 1
## 39.8800010681152 39.8899993896484 39.9000015258789 39.9099998474121
## 2 1 2 3
## 39.9199981689453 39.9300003051758 39.939998626709 39.9500007629395
## 1 2 1 1
## 39.9599990844727 39.9700012207031 39.9799995422363 39.9900016784668
## 3 2 2 2
## 40 40.0099983215332 40.0200004577637 40.0299987792969
## 1 2 1 3
## 40.0400009155273 40.0499992370605 40.060001373291 40.0699996948242
## 4 1 1 3
## 40.0800018310547 40.0900001525879 40.0999984741211 40.1100006103516
## 2 2 2 2
## 40.1199989318848 40.1399993896484 40.1500015258789 40.1599998474121
## 4 2 4 1
## 40.1699981689453 40.1800003051758 40.189998626709 40.2000007629395
## 2 3 2 3
## 40.2099990844727 40.2200012207031 40.2299995422363 40.2599983215332
## 3 1 1 3
## 40.2999992370605 40.310001373291 40.3199996948242 40.3300018310547
## 5 3 5 1
## 40.3400001525879 40.3499984741211 40.3600006103516 40.3699989318848
## 2 2 2 6
## 40.3800010681152 40.4000015258789 40.4099998474121 40.4199981689453
## 2 3 2 1
## 40.4300003051758 40.439998626709 40.4500007629395 40.4599990844727
## 1 3 1 2
## 40.4700012207031 40.4799995422363 40.4900016784668 40.5
## 4 1 1 3
## 40.5099983215332 40.5200004577637 40.5299987792969 40.5499992370605
## 2 3 1 2
## 40.560001373291 40.5699996948242 40.5800018310547 40.5900001525879
## 1 2 2 3
## 40.5999984741211 40.6100006103516 40.6199989318848 40.6300010681152
## 1 2 3 4
## 40.6399993896484 40.6500015258789 40.6599998474121 40.6800003051758
## 1 5 5 2
## 40.7000007629395 40.7099990844727 40.7299995422363 40.75
## 2 3 1 4
## 40.7599983215332 40.7700004577637 40.7750015258789 40.7799987792969
## 1 4 1 1
## 40.7900009155273 40.7999992370605 40.810001373291 40.8199996948242
## 2 4 2 3
## 40.8300018310547 40.8400001525879 40.8499984741211 40.8600006103516
## 1 2 3 1
## 40.8699989318848 40.8800010681152 40.8899993896484 40.9000015258789
## 3 2 3 1
## 40.9099998474121 40.9199981689453 40.9300003051758 40.939998626709
## 5 1 2 1
## 40.9500007629395 40.9599990844727 40.9700012207031 40.9900016784668
## 2 1 1 1
## 41 41.0099983215332 41.0299987792969 41.0400009155273
## 3 2 2 1
## 41.060001373291 41.0800018310547 41.0900001525879 41.0999984741211
## 6 4 2 2
## 41.1100006103516 41.1199989318848 41.1300010681152 41.1399993896484
## 1 2 3 1
## 41.1500015258789 41.1599998474121 41.1699981689453 41.1800003051758
## 2 2 1 3
## 41.189998626709 41.2000007629395 41.2099990844727 41.2200012207031
## 6 2 1 2
## 41.2299995422363 41.25 41.2599983215332 41.2700004577637
## 1 4 2 4
## 41.2799987792969 41.2900009155273 41.310001373291 41.3199996948242
## 1 5 1 1
## 41.3300018310547 41.3400001525879 41.3499984741211 41.3800010681152
## 2 2 1 3
## 41.3899993896484 41.4000015258789 41.4099998474121 41.4199981689453
## 2 1 2 3
## 41.4300003051758 41.439998626709 41.4500007629395 41.4700012207031
## 1 5 1 3
## 41.4900016784668 41.5 41.5099983215332 41.5200004577637
## 1 7 1 1
## 41.5400009155273 41.5499992370605 41.560001373291 41.5699996948242
## 1 1 3 1
## 41.5900001525879 41.6100006103516 41.6199989318848 41.6300010681152
## 3 2 1 2
## 41.6399993896484 41.6500015258789 41.6699981689453 41.6800003051758
## 1 1 2 2
## 41.689998626709 41.7000007629395 41.7099990844727 41.7200012207031
## 1 3 5 2
## 41.7299995422363 41.75 41.7599983215332 41.7900009155273
## 2 3 2 2
## 41.7999992370605 41.810001373291 41.8199996948242 41.8300018310547
## 3 2 2 3
## 41.8400001525879 41.8499984741211 41.8600006103516 41.8800010681152
## 1 1 3 1
## 41.8899993896484 41.9099998474121 41.9199981689453 41.9300003051758
## 1 1 1 2
## 41.939998626709 41.9599990844727 41.9700012207031 41.9799995422363
## 1 1 2 1
## 41.9900016784668 42 42.0099983215332 42.0200004577637
## 2 1 2 2
## 42.0299987792969 42.0400009155273 42.060001373291 42.0699996948242
## 4 1 4 3
## 42.0800018310547 42.0900001525879 42.0999984741211 42.1100006103516
## 1 3 1 2
## 42.1199989318848 42.1300010681152 42.1399993896484 42.1599998474121
## 2 3 1 2
## 42.1699981689453 42.1800003051758 42.189998626709 42.2000007629395
## 1 1 1 1
## 42.2099990844727 42.2200012207031 42.2299995422363 42.25
## 2 3 2 5
## 42.2599983215332 42.2700004577637 42.2799987792969 42.2900009155273
## 1 1 2 4
## 42.2999992370605 42.310001373291 42.3199996948242 42.3400001525879
## 2 3 3 1
## 42.3499984741211 42.3600006103516 42.3699989318848 42.3800010681152
## 2 2 1 3
## 42.4000015258789 42.4199981689453 42.4300003051758 42.439998626709
## 2 3 1 1
## 42.4500007629395 42.4599990844727 42.4700012207031 42.4900016784668
## 2 3 3 4
## 42.5 42.5099983215332 42.5200004577637 42.5299987792969
## 1 2 1 1
## 42.5400009155273 42.5499992370605 42.560001373291 42.5699996948242
## 1 1 5 1
## 42.5800018310547 42.5900001525879 42.6100006103516 42.6199989318848
## 1 2 2 3
## 42.6300010681152 42.6399993896484 42.6500015258789 42.6599998474121
## 1 3 2 1
## 42.6800003051758 42.689998626709 42.7000007629395 42.7099990844727
## 3 1 1 1
## 42.7299995422363 42.75 42.7599983215332 42.7700004577637
## 3 7 3 2
## 42.7799987792969 42.7900009155273 42.7999992370605 42.810001373291
## 1 1 3 1
## 42.8199996948242 42.8400001525879 42.8499984741211 42.8800010681152
## 2 1 2 1
## 42.8899993896484 42.9199981689453 42.9300003051758 42.9329986572266
## 3 3 1 1
## 42.939998626709 42.9500007629395 42.9700012207031 42.9900016784668
## 3 1 2 1
## 43.0099983215332 43.0200004577637 43.0400009155273 43.0499992370605
## 2 1 2 2
## 43.060001373291 43.0699996948242 43.0900001525879 43.0999984741211
## 3 2 4 1
## 43.1100006103516 43.1300010681152 43.1399993896484 43.1500015258789
## 2 1 2 2
## 43.1599998474121 43.1699981689453 43.189998626709 43.2000007629395
## 3 2 1 1
## 43.2299995422363 43.2400016784668 43.2599983215332 43.2700004577637
## 2 1 1 3
## 43.2799987792969 43.2900009155273 43.2999992370605 43.310001373291
## 1 3 1 1
## 43.3300018310547 43.3400001525879 43.3499984741211 43.3600006103516
## 3 2 1 3
## 43.3699989318848 43.3800010681152 43.4099998474121 43.4199981689453
## 1 1 1 5
## 43.439998626709 43.4500007629395 43.4599990844727 43.4700012207031
## 2 1 1 2
## 43.4799995422363 43.4900016784668 43.5 43.5099983215332
## 2 1 1 1
## 43.5200004577637 43.5400009155273 43.5499992370605 43.560001373291
## 2 1 2 1
## 43.5999984741211 43.6100006103516 43.6199989318848 43.6300010681152
## 3 2 7 3
## 43.6500015258789 43.6599998474121 43.6699981689453 43.6800003051758
## 1 2 2 3
## 43.689998626709 43.7099990844727 43.7200012207031 43.7299995422363
## 1 1 1 1
## 43.7400016784668 43.75 43.7599983215332 43.7700004577637
## 1 2 4 1
## 43.7900009155273 43.8199996948242 43.8300018310547 43.8400001525879
## 1 3 4 4
## 43.8499984741211 43.8600006103516 43.8800010681152 43.9000015258789
## 1 3 1 1
## 43.9099998474121 43.9199981689453 43.9300003051758 43.939998626709
## 2 4 1 1
## 43.9599990844727 43.9799995422363 43.9900016784668 44
## 2 1 2 1
## 44.0099983215332 44.0200004577637 44.0400009155273 44.0499992370605
## 1 3 1 4
## 44.060001373291 44.0999984741211 44.1100006103516 44.1300010681152
## 2 2 1 1
## 44.1399993896484 44.1500015258789 44.1599998474121 44.1699981689453
## 1 2 4 7
## 44.1800003051758 44.189998626709 44.2099990844727 44.2200012207031
## 3 3 2 2
## 44.2299995422363 44.25 44.2599983215332 44.2700004577637
## 2 2 2 4
## 44.2799987792969 44.2900009155273 44.2999992370605 44.310001373291
## 4 1 3 3
## 44.3199996948242 44.3400001525879 44.3499984741211 44.3699989318848
## 2 2 5 2
## 44.3800010681152 44.3899993896484 44.4099998474121 44.4199981689453
## 2 2 2 5
## 44.439998626709 44.4599990844727 44.4700012207031 44.4799995422363
## 2 3 1 1
## 44.4910011291504 44.5 44.5099983215332 44.5299987792969
## 1 3 3 2
## 44.5499992370605 44.560001373291 44.5800018310547 44.5900001525879
## 7 4 3 1
## 44.5999984741211 44.6100006103516 44.6300010681152 44.6599998474121
## 1 2 1 2
## 44.7000007629395 44.7099990844727 44.7200012207031 44.7299995422363
## 1 2 1 2
## 44.7400016784668 44.75 44.7599983215332 44.7700004577637
## 2 1 1 2
## 44.7799987792969 44.7900009155273 44.7999992370605 44.810001373291
## 2 1 4 1
## 44.8300018310547 44.8800010681152 44.9000015258789 44.9099998474121
## 2 3 1 4
## 44.9199981689453 44.9500007629395 44.9599990844727 44.9700012207031
## 2 1 1 1
## 44.9799995422363 44.9900016784668 45 45.0099983215332
## 2 2 1 4
## 45.0200004577637 45.0299987792969 45.0400009155273 45.0499992370605
## 1 1 1 1
## 45.060001373291 45.0699996948242 45.0800018310547 45.0900001525879
## 1 2 1 2
## 45.0999984741211 45.1399993896484 45.1800003051758 45.189998626709
## 2 1 1 1
## 45.2000007629395 45.2099990844727 45.2200012207031 45.2299995422363
## 3 2 1 1
## 45.2400016784668 45.25 45.2599983215332 45.2700004577637
## 1 2 3 1
## 45.2799987792969 45.2900009155273 45.2999992370605 45.310001373291
## 3 3 1 3
## 45.3199996948242 45.3300018310547 45.3499984741211 45.3600006103516
## 1 1 2 3
## 45.3699989318848 45.3800010681152 45.3899993896484 45.4000015258789
## 3 1 1 1
## 45.4300003051758 45.4500007629395 45.4599990844727 45.4700012207031
## 4 1 3 4
## 45.4799995422363 45.4900016784668 45.5 45.5099983215332
## 2 2 3 1
## 45.5200004577637 45.5299987792969 45.5400009155273 45.5499992370605
## 4 1 4 3
## 45.560001373291 45.5699996948242 45.5800018310547 45.5900001525879
## 2 4 2 2
## 45.5999984741211 45.6100006103516 45.6199989318848 45.6399993896484
## 3 2 3 1
## 45.6599998474121 45.6699981689453 45.6800003051758 45.689998626709
## 3 1 2 2
## 45.7000007629395 45.7099990844727 45.7200012207031 45.7299995422363
## 2 5 1 2
## 45.7400016784668 45.75 45.7700004577637 45.7900009155273
## 1 2 1 2
## 45.7999992370605 45.810001373291 45.8199996948242 45.8300018310547
## 2 1 2 2
## 45.8400001525879 45.8499984741211 45.8600006103516 45.8699989318848
## 3 4 1 3
## 45.8800010681152 45.8899993896484 45.9000015258789 45.9099998474121
## 1 3 2 3
## 45.9199981689453 45.9300003051758 45.939998626709 45.9599990844727
## 1 1 1 2
## 45.9700012207031 45.9900016784668 46 46.0200004577637
## 1 4 1 1
## 46.0299987792969 46.0400009155273 46.0499992370605 46.060001373291
## 1 3 1 1
## 46.0800018310547 46.0900001525879 46.0999984741211 46.1100006103516
## 2 1 2 2
## 46.1199989318848 46.1300010681152 46.1399993896484 46.1500015258789
## 1 1 1 2
## 46.1800003051758 46.189998626709 46.1940002441406 46.2000007629395
## 1 4 1 1
## 46.2099990844727 46.2200012207031 46.2299995422363 46.2400016784668
## 1 2 1 2
## 46.2599983215332 46.2700004577637 46.2799987792969 46.2900009155273
## 2 2 2 1
## 46.310001373291 46.3199996948242 46.3300018310547 46.3499984741211
## 1 1 2 2
## 46.3699989318848 46.3800010681152 46.4000015258789 46.4099998474121
## 3 4 4 5
## 46.4199981689453 46.4300003051758 46.4500007629395 46.4599990844727
## 4 2 2 2
## 46.4700012207031 46.4799995422363 46.4900016784668 46.5
## 3 5 1 3
## 46.5099983215332 46.5200004577637 46.5209999084473 46.5299987792969
## 6 1 1 3
## 46.5499992370605 46.560001373291 46.5699996948242 46.5800018310547
## 2 1 1 3
## 46.5900001525879 46.5999984741211 46.6199989318848 46.6300010681152
## 1 3 3 2
## 46.6399993896484 46.6500015258789 46.6599998474121 46.6699981689453
## 1 1 1 5
## 46.6800003051758 46.689998626709 46.7000007629395 46.7099990844727
## 1 1 2 3
## 46.7200012207031 46.75 46.7599983215332 46.7700004577637
## 1 2 1 1
## 46.7900009155273 46.7999992370605 46.8300018310547 46.8400001525879
## 2 1 2 1
## 46.8499984741211 46.8600006103516 46.8699989318848 46.9000015258789
## 1 2 4 1
## 46.9199981689453 46.9269981384277 46.9300003051758 46.9500007629395
## 1 1 6 4
## 46.9599990844727 46.9700012207031 46.9799995422363 46.9900016784668
## 2 3 4 1
## 47 47.0099983215332 47.0200004577637 47.0299987792969
## 3 6 1 4
## 47.0400009155273 47.0499992370605 47.060001373291 47.0699996948242
## 2 1 6 1
## 47.0800018310547 47.0870018005371 47.0900001525879 47.0999984741211
## 1 1 7 3
## 47.1100006103516 47.1300010681152 47.1399993896484 47.1500015258789
## 3 1 5 1
## 47.1599998474121 47.1699981689453 47.189998626709 47.2000007629395
## 1 4 2 2
## 47.2099990844727 47.2200012207031 47.2350006103516 47.2369995117188
## 1 1 1 1
## 47.2400016784668 47.25 47.2599983215332 47.2700004577637
## 1 1 3 2
## 47.2900009155273 47.2999992370605 47.310001373291 47.3199996948242
## 2 2 1 3
## 47.3300018310547 47.3400001525879 47.3499984741211 47.3600006103516
## 4 2 6 2
## 47.3680000305176 47.3699989318848 47.3899993896484 47.4000015258789
## 1 2 1 1
## 47.4099998474121 47.4199981689453 47.4300003051758 47.439998626709
## 2 1 3 2
## 47.4500007629395 47.4700012207031 47.4900016784668 47.5299987792969
## 2 1 3 2
## 47.5400009155273 47.5419998168945 47.5499992370605 47.560001373291
## 2 1 1 3
## 47.5800018310547 47.5900001525879 47.5999984741211 47.6100006103516
## 2 2 2 2
## 47.6300010681152 47.6399993896484 47.6500015258789 47.6699981689453
## 1 1 2 3
## 47.6800003051758 47.689998626709 47.7000007629395 47.7200012207031
## 1 2 1 2
## 47.7299995422363 47.7400016784668 47.75 47.7599983215332
## 1 4 6 1
## 47.7700004577637 47.7799987792969 47.7900009155273 47.7999992370605
## 3 6 1 3
## 47.810001373291 47.8300018310547 47.8400001525879 47.8499984741211
## 1 4 4 2
## 47.8600006103516 47.8699989318848 47.8800010681152 47.9000015258789
## 1 2 3 3
## 47.9099998474121 47.9199981689453 47.9300003051758 47.939998626709
## 1 3 1 1
## 47.9500007629395 47.9529991149902 47.9599990844727 47.9700012207031
## 4 1 1 3
## 47.9799995422363 47.9900016784668 48 48.0099983215332
## 2 1 4 1
## 48.0279998779297 48.0299987792969 48.0400009155273 48.0499992370605
## 1 1 2 1
## 48.060001373291 48.0699996948242 48.0800018310547 48.0900001525879
## 2 4 1 1
## 48.0999984741211 48.1100006103516 48.1199989318848 48.1300010681152
## 4 5 3 1
## 48.1399993896484 48.1500015258789 48.1599998474121 48.1800003051758
## 2 4 1 3
## 48.189998626709 48.193000793457 48.2000007629395 48.2099990844727
## 5 1 1 1
## 48.2299995422363 48.2400016784668 48.25 48.2599983215332
## 1 2 3 4
## 48.2700004577637 48.2799987792969 48.2900009155273 48.2999992370605
## 2 1 3 3
## 48.310001373291 48.3199996948242 48.3300018310547 48.3400001525879
## 2 1 2 1
## 48.3499984741211 48.3699989318848 48.375 48.3800010681152
## 2 2 1 3
## 48.3899993896484 48.4000015258789 48.4099998474121 48.4199981689453
## 3 3 4 5
## 48.4300003051758 48.4500007629395 48.4599990844727 48.4700012207031
## 4 3 1 4
## 48.4729995727539 48.4799995422363 48.4900016784668 48.5
## 1 1 5 6
## 48.5099983215332 48.5200004577637 48.5299987792969 48.5400009155273
## 4 1 4 2
## 48.5499992370605 48.560001373291 48.5800018310547 48.5999984741211
## 4 1 2 2
## 48.6199989318848 48.6240005493164 48.6300010681152 48.6399993896484
## 4 1 1 3
## 48.6500015258789 48.6599998474121 48.6699981689453 48.6800003051758
## 2 3 3 3
## 48.689998626709 48.7000007629395 48.7099990844727 48.7200012207031
## 6 4 2 3
## 48.7299995422363 48.7400016784668 48.7439994812012 48.75
## 2 3 1 1
## 48.7599983215332 48.7700004577637 48.7799987792969 48.7900009155273
## 3 5 3 3
## 48.7999992370605 48.810001373291 48.8199996948242 48.8300018310547
## 6 1 3 2
## 48.8400001525879 48.8499984741211 48.8600006103516 48.8699989318848
## 5 2 3 5
## 48.8800010681152 48.8899993896484 48.9000015258789 48.9300003051758
## 2 1 1 1
## 48.939998626709 48.9599990844727 48.9669990539551 48.9700012207031
## 2 1 1 2
## 48.9799995422363 48.9900016784668 49 49.0099983215332
## 1 2 1 3
## 49.0200004577637 49.0299987792969 49.0400009155273 49.0480003356934
## 4 1 2 1
## 49.0499992370605 49.0579986572266 49.060001373291 49.0800018310547
## 3 1 2 1
## 49.0900001525879 49.0999984741211 49.1020011901855 49.1100006103516
## 4 3 1 1
## 49.1199989318848 49.125 49.1300010681152 49.1399993896484
## 2 1 2 1
## 49.1500015258789 49.1699981689453 49.1800003051758 49.189998626709
## 1 7 4 5
## 49.2000007629395 49.2099990844727 49.2200012207031 49.2299995422363
## 4 5 4 2
## 49.2400016784668 49.25 49.2599983215332 49.2900009155273
## 6 3 2 3
## 49.2999992370605 49.3019981384277 49.310001373291 49.3110008239746
## 1 1 3 1
## 49.3199996948242 49.3300018310547 49.3400001525879 49.3489990234375
## 3 3 2 1
## 49.3499984741211 49.3600006103516 49.3699989318848 49.3759994506836
## 3 1 2 1
## 49.3899993896484 49.4000015258789 49.4099998474121 49.4199981689453
## 2 2 2 1
## 49.4300003051758 49.439998626709 49.4500007629395 49.4599990844727
## 1 2 4 1
## 49.4700012207031 49.4799995422363 49.5 49.5099983215332
## 2 3 4 1
## 49.5200004577637 49.5299987792969 49.5400009155273 49.560001373291
## 1 4 2 3
## 49.5699996948242 49.5800018310547 49.5900001525879 49.5929985046387
## 2 1 1 1
## 49.5999984741211 49.6199989318848 49.6399993896484 49.6459999084473
## 2 2 1 1
## 49.6479988098145 49.6500015258789 49.6599998474121 49.6699981689453
## 1 2 3 7
## 49.6800003051758 49.689998626709 49.7000007629395 49.7109985351562
## 1 1 3 1
## 49.7200012207031 49.7299995422363 49.75 49.7599983215332
## 2 1 2 2
## 49.7700004577637 49.7799987792969 49.7900009155273 49.7999992370605
## 2 4 2 6
## 49.810001373291 49.8199996948242 49.8300018310547 49.8400001525879
## 3 2 5 2
## 49.8600006103516 49.8699989318848 49.8800010681152 49.8899993896484
## 1 4 3 2
## 49.9000015258789 49.9099998474121 49.9199981689453 49.9300003051758
## 2 2 4 3
## 49.939998626709 49.9500007629395 49.9599990844727 49.9700012207031
## 2 5 6 2
## 49.9799995422363 49.9900016784668 50 50.0099983215332
## 3 2 2 1
## 50.0200004577637 50.0299987792969 50.0499992370605 50.060001373291
## 5 1 1 1
## 50.0699996948242 50.0800018310547 50.0900001525879 50.0999984741211
## 2 1 1 1
## 50.1100006103516 50.1300010681152 50.1399993896484 50.1500015258789
## 4 1 3 6
## 50.1599998474121 50.189998626709 50.2000007629395 50.2099990844727
## 3 3 4 5
## 50.2299995422363 50.2400016784668 50.257999420166 50.2599983215332
## 4 5 1 2
## 50.2700004577637 50.2799987792969 50.2900009155273 50.2999992370605
## 2 2 2 3
## 50.3050003051758 50.310001373291 50.3199996948242 50.3300018310547
## 1 2 1 1
## 50.3400001525879 50.3499984741211 50.3600006103516 50.3699989318848
## 2 3 1 2
## 50.3800010681152 50.3899993896484 50.4000015258789 50.4099998474121
## 4 4 1 1
## 50.4199981689453 50.4290008544922 50.4300003051758 50.439998626709
## 3 1 1 2
## 50.4500007629395 50.4599990844727 50.4700012207031 50.4799995422363
## 3 8 4 3
## 50.4900016784668 50.5 50.5099983215332 50.5200004577637
## 1 3 2 2
## 50.5299987792969 50.5349998474121 50.5400009155273 50.5499992370605
## 3 1 5 1
## 50.560001373291 50.5699996948242 50.5800018310547 50.5900001525879
## 4 5 5 1
## 50.5999984741211 50.6040000915527 50.6100006103516 50.6199989318848
## 1 1 4 4
## 50.6300010681152 50.6399993896484 50.6500015258789 50.6599998474121
## 3 4 1 3
## 50.6699981689453 50.6800003051758 50.689998626709 50.7000007629395
## 1 2 3 3
## 50.7099990844727 50.7200012207031 50.7280006408691 50.7299995422363
## 2 2 1 3
## 50.75 50.7599983215332 50.7700004577637 50.7799987792969
## 2 4 3 1
## 50.7900009155273 50.7910003662109 50.7999992370605 50.8199996948242
## 5 1 3 3
## 50.8300018310547 50.8499984741211 50.8600006103516 50.8699989318848
## 3 7 1 4
## 50.8800010681152 50.8899993896484 50.9000015258789 50.9199981689453
## 2 5 3 2
## 50.9300003051758 50.939998626709 50.9500007629395 50.9599990844727
## 2 1 3 3
## 50.9799995422363 50.9900016784668 51 51.0200004577637
## 7 3 3 2
## 51.0299987792969 51.0400009155273 51.0499992370605 51.060001373291
## 2 4 1 2
## 51.0699996948242 51.0769996643066 51.0900001525879 51.0999984741211
## 1 1 4 2
## 51.1100006103516 51.1199989318848 51.1300010681152 51.1399993896484
## 3 1 4 4
## 51.1500015258789 51.1599998474121 51.1699981689453 51.1800003051758
## 1 2 2 5
## 51.189998626709 51.2000007629395 51.2099990844727 51.2200012207031
## 1 3 4 2
## 51.2299995422363 51.2400016784668 51.25 51.2599983215332
## 3 3 2 3
## 51.2700004577637 51.2799987792969 51.2900009155273 51.310001373291
## 1 2 2 3
## 51.3300018310547 51.3400001525879 51.3499984741211 51.3600006103516
## 5 1 4 2
## 51.3699989318848 51.3800010681152 51.3899993896484 51.4000015258789
## 2 2 1 3
## 51.4280014038086 51.4300003051758 51.439998626709 51.4500007629395
## 1 1 2 2
## 51.4599990844727 51.4700012207031 51.4799995422363 51.4900016784668
## 1 2 2 2
## 51.5 51.5200004577637 51.5299987792969 51.5400009155273
## 3 2 3 3
## 51.5499992370605 51.560001373291 51.5699996948242 51.5800018310547
## 3 8 2 2
## 51.5900001525879 51.5999984741211 51.6100006103516 51.6199989318848
## 2 3 2 2
## 51.6300010681152 51.6500015258789 51.6599998474121 51.6699981689453
## 3 3 1 2
## 51.6800003051758 51.689998626709 51.7000007629395 51.7099990844727
## 1 3 3 1
## 51.7200012207031 51.7299995422363 51.7400016784668 51.75
## 2 3 1 4
## 51.7599983215332 51.7700004577637 51.7799987792969 51.7900009155273
## 2 3 3 2
## 51.7999992370605 51.810001373291 51.8199996948242 51.8300018310547
## 1 3 2 2
## 51.8400001525879 51.8499984741211 51.8600006103516 51.8699989318848
## 1 3 3 2
## 51.8800010681152 51.8899993896484 51.9000015258789 51.9099998474121
## 3 3 2 3
## 51.9150009155273 51.9199981689453 51.9300003051758 51.939998626709
## 1 2 2 1
## 51.9500007629395 51.9529991149902 51.9599990844727 51.9700012207031
## 1 1 4 2
## 51.9799995422363 51.9900016784668 52 52.0099983215332
## 5 1 2 4
## 52.0200004577637 52.0299987792969 52.0359992980957 52.0499992370605
## 2 4 1 1
## 52.060001373291 52.0800018310547 52.0999984741211 52.1100006103516
## 5 4 3 1
## 52.1199989318848 52.1300010681152 52.1399993896484 52.1599998474121
## 1 2 2 3
## 52.1699981689453 52.1800003051758 52.189998626709 52.2000007629395
## 3 2 2 4
## 52.2099990844727 52.2200012207031 52.2299995422363 52.2400016784668
## 2 2 1 2
## 52.25 52.2599983215332 52.2700004577637 52.2799987792969
## 1 5 3 2
## 52.2900009155273 52.2999992370605 52.310001373291 52.3199996948242
## 2 3 2 3
## 52.3300018310547 52.3400001525879 52.3499984741211 52.3600006103516
## 4 1 4 2
## 52.3699989318848 52.3800010681152 52.3899993896484 52.4000015258789
## 5 4 4 1
## 52.4099998474121 52.4199981689453 52.4300003051758 52.439998626709
## 4 2 3 3
## 52.4500007629395 52.4599990844727 52.4700012207031 52.4799995422363
## 1 1 4 2
## 52.4900016784668 52.5 52.5099983215332 52.5200004577637
## 2 4 4 2
## 52.5299987792969 52.5309982299805 52.5400009155273 52.5499992370605
## 1 1 1 1
## 52.560001373291 52.5699996948242 52.5999984741211 52.6100006103516
## 2 3 3 2
## 52.6199989318848 52.6300010681152 52.6399993896484 52.6500015258789
## 1 5 3 1
## 52.6599998474121 52.6699981689453 52.6800003051758 52.689998626709
## 2 1 3 3
## 52.7000007629395 52.7099990844727 52.7200012207031 52.7299995422363
## 6 2 1 5
## 52.7400016784668 52.75 52.7509994506836 52.7599983215332
## 5 2 1 1
## 52.7700004577637 52.7799987792969 52.7900009155273 52.7910003662109
## 4 10 2 1
## 52.7999992370605 52.810001373291 52.8199996948242 52.8300018310547
## 1 5 2 2
## 52.8400001525879 52.8499984741211 52.8600006103516 52.8699989318848
## 3 5 3 3
## 52.8800010681152 52.8899993896484 52.9000015258789 52.9099998474121
## 3 3 2 3
## 52.9199981689453 52.9300003051758 52.939998626709 52.9700012207031
## 6 3 4 4
## 52.976001739502 52.9799995422363 52.9900016784668 53
## 1 1 1 3
## 53.0099983215332 53.0229988098145 53.0400009155273 53.0499992370605
## 5 1 2 4
## 53.060001373291 53.0699996948242 53.0789985656738 53.0800018310547
## 5 5 1 2
## 53.0900001525879 53.0999984741211 53.1100006103516 53.1300010681152
## 2 1 6 7
## 53.1399993896484 53.1500015258789 53.1699981689453 53.1800003051758
## 3 1 2 5
## 53.189998626709 53.2000007629395 53.2099990844727 53.2200012207031
## 2 3 1 2
## 53.2295710087677 53.2299995422363 53.2400016784668 53.25
## 442 2 4 3
## 53.2599983215332 53.2700004577637 53.2799987792969 53.2900009155273
## 3 4 2 1
## 53.2999992370605 53.3199996948242 53.3300018310547 53.3400001525879
## 4 4 4 2
## 53.3499984741211 53.3600006103516 53.3699989318848 53.3800010681152
## 3 2 3 1
## 53.3899993896484 53.4099998474121 53.4199981689453 53.4300003051758
## 4 3 6 4
## 53.4309997558594 53.439998626709 53.4500007629395 53.4599990844727
## 1 2 1 3
## 53.4700012207031 53.4739990234375 53.4799995422363 53.4900016784668
## 4 1 1 1
## 53.5 53.5050010681152 53.5099983215332 53.5110015869141
## 3 1 2 1
## 53.5200004577637 53.5299987792969 53.5400009155273 53.5499992370605
## 3 3 1 5
## 53.560001373291 53.5699996948242 53.5800018310547 53.5900001525879
## 4 3 8 3
## 53.5999984741211 53.6100006103516 53.6199989318848 53.6300010681152
## 3 3 1 2
## 53.6399993896484 53.6500015258789 53.6599998474121 53.6699981689453
## 2 5 3 1
## 53.6800003051758 53.689998626709 53.7000007629395 53.7099990844727
## 4 2 4 2
## 53.7200012207031 53.7299995422363 53.7400016784668 53.75
## 4 4 3 3
## 53.7599983215332 53.7700004577637 53.7799987792969 53.7900009155273
## 3 3 3 1
## 53.7999992370605 53.810001373291 53.8199996948242 53.8499984741211
## 2 4 4 1
## 53.8699989318848 53.8800010681152 53.8899993896484 53.9000015258789
## 2 1 2 2
## 53.9099998474121 53.9199981689453 53.9300003051758 53.939998626709
## 2 4 2 3
## 53.9500007629395 53.9599990844727 53.9700012207031 53.9799995422363
## 5 2 2 3
## 53.9900016784668 54 54.0099983215332 54.0200004577637
## 2 1 2 3
## 54.0299987792969 54.0400009155273 54.0499992370605 54.060001373291
## 5 1 3 3
## 54.0699996948242 54.0800018310547 54.0900001525879 54.0999984741211
## 1 1 5 4
## 54.1199989318848 54.1300010681152 54.1399993896484 54.1500015258789
## 4 4 3 6
## 54.1599998474121 54.1699981689453 54.189998626709 54.2000007629395
## 3 1 1 4
## 54.2099990844727 54.2200012207031 54.2400016784668 54.25
## 2 1 2 1
## 54.2599983215332 54.2700004577637 54.2799987792969 54.2900009155273
## 4 3 3 5
## 54.2999992370605 54.310001373291 54.3199996948242 54.3300018310547
## 1 3 3 3
## 54.3400001525879 54.3499984741211 54.3699989318848 54.3800010681152
## 5 3 4 5
## 54.3899993896484 54.4029505163586 54.4099998474121 54.4199981689453
## 7 442 3 2
## 54.4300003051758 54.439998626709 54.4440002441406 54.4500007629395
## 6 5 1 2
## 54.4599990844727 54.4700012207031 54.4799995422363 54.4900016784668
## 6 2 4 5
## 54.5 54.5099983215332 54.5200004577637 54.5400009155273
## 4 4 3 1
## 54.5499992370605 54.560001373291 54.5699996948242 54.5800018310547
## 2 3 4 1
## 54.5900001525879 54.5999984741211 54.6100006103516 54.6399993896484
## 3 2 2 3
## 54.6500015258789 54.6599998474121 54.6699981689453 54.6800003051758
## 3 2 2 1
## 54.689998626709 54.7099990844727 54.7200012207031 54.7270011901855
## 5 4 1 1
## 54.7299995422363 54.7400016784668 54.75 54.7599983215332
## 4 1 3 4
## 54.7700004577637 54.7799987792969 54.7900009155273 54.7970008850098
## 3 2 4 1
## 54.810001373291 54.818000793457 54.8199996948242 54.8300018310547
## 2 1 2 1
## 54.8400001525879 54.8499984741211 54.8600006103516 54.8699989318848
## 2 3 2 3
## 54.8800010681152 54.8899993896484 54.9000015258789 54.9099998474121
## 7 1 1 5
## 54.9199981689453 54.9280014038086 54.9300003051758 54.939998626709
## 7 1 3 3
## 54.9500007629395 54.9519996643066 54.9599990844727 54.9700012207031
## 2 1 4 5
## 54.9799995422363 54.9900016784668 55 55.0099983215332
## 2 3 2 3
## 55.0200004577637 55.0299987792969 55.0369987487793 55.0400009155273
## 1 3 1 4
## 55.0480003356934 55.0499992370605 55.060001373291 55.0699996948242
## 1 2 1 4
## 55.0779991149902 55.0800018310547 55.0900001525879 55.0999984741211
## 1 3 1 3
## 55.1100006103516 55.1199989318848 55.1300010681152 55.1380004882812
## 2 1 2 1
## 55.1399993896484 55.1500015258789 55.1599998474121 55.1699981689453
## 2 1 1 2
## 55.1800003051758 55.189998626709 55.2000007629395 55.2099990844727
## 5 2 4 6
## 55.2200012207031 55.2299995422363 55.2400016784668 55.25
## 1 2 3 2
## 55.2599983215332 55.2700004577637 55.2799987792969 55.2900009155273
## 3 2 1 3
## 55.2999992370605 55.310001373291 55.3199996948242 55.3300018310547
## 3 4 4 1
## 55.3400001525879 55.3499984741211 55.3600006103516 55.3699989318848
## 2 5 1 6
## 55.3800010681152 55.3860015869141 55.3899993896484 55.4000015258789
## 4 1 1 1
## 55.4099998474121 55.4199981689453 55.4269981384277 55.4300003051758
## 7 3 1 4
## 55.439998626709 55.4480018615723 55.4500007629395 55.4599990844727
## 6 1 4 4
## 55.4700012207031 55.4799995422363 55.4900016784668 55.5
## 2 2 3 2
## 55.5099983215332 55.5299987792969 55.5400009155273 55.560001373291
## 6 4 1 3
## 55.5699996948242 55.5800018310547 55.5870018005371 55.5900001525879
## 11 2 1 1
## 55.5999984741211 55.6030006408691 55.6100006103516 55.6199989318848
## 4 1 2 2
## 55.6300010681152 55.6399993896484 55.6500015258789 55.6539993286133
## 3 4 4 1
## 55.6599998474121 55.6699981689453 55.6800003051758 55.689998626709
## 2 5 6 9
## 55.7000007629395 55.7099990844727 55.7190017700195 55.7200012207031
## 4 2 1 1
## 55.7299995422363 55.7389984130859 55.7400016784668 55.75
## 2 1 2 3
## 55.7599983215332 55.7700004577637 55.7799987792969 55.7900009155273
## 5 2 6 6
## 55.7999992370605 55.810001373291 55.8199996948242 55.8300018310547
## 2 5 6 1
## 55.8400001525879 55.8499984741211 55.8600006103516 55.8699989318848
## 3 2 1 5
## 55.8800010681152 55.8899993896484 55.9000015258789 55.9099998474121
## 2 4 3 4
## 55.9199981689453 55.9300003051758 55.939998626709 55.9420013427734
## 3 3 3 1
## 55.9500007629395 55.9599990844727 55.9700012207031 55.9799995422363
## 1 1 2 2
## 55.9830017089844 56 56.0099983215332 56.0200004577637
## 1 7 3 2
## 56.0299987792969 56.0400009155273 56.0499992370605 56.060001373291
## 4 3 4 2
## 56.0699996948242 56.0800018310547 56.0900001525879 56.0999984741211
## 1 2 5 2
## 56.1100006103516 56.1199989318848 56.1300010681152 56.1399993896484
## 1 1 4 2
## 56.1500015258789 56.1599998474121 56.1699981689453 56.1800003051758
## 3 2 4 3
## 56.189998626709 56.2000007629395 56.2099990844727 56.2299995422363
## 6 4 3 5
## 56.2400016784668 56.25 56.2599983215332 56.2700004577637
## 5 3 2 6
## 56.2799987792969 56.2900009155273 56.2999992370605 56.310001373291
## 3 3 6 5
## 56.3199996948242 56.3300018310547 56.3400001525879 56.3499984741211
## 6 3 4 3
## 56.3600006103516 56.3699989318848 56.3800010681152 56.3899993896484
## 5 1 3 1
## 56.4000015258789 56.4099998474121 56.4199981689453 56.4300003051758
## 3 3 1 2
## 56.4500007629395 56.4599990844727 56.4799995422363 56.4900016784668
## 4 2 3 5
## 56.5 56.515453132467 56.5200004577637 56.5400009155273
## 2 442 1 2
## 56.5499992370605 56.560001373291 56.5699996948242 56.5800018310547
## 2 5 2 4
## 56.5900001525879 56.5999984741211 56.6100006103516 56.6199989318848
## 1 2 6 1
## 56.6300010681152 56.6399993896484 56.6500015258789 56.6599998474121
## 4 2 2 2
## 56.6800003051758 56.689998626709 56.7000007629395 56.7099990844727
## 4 4 4 1
## 56.7200012207031 56.7299995422363 56.7599983215332 56.7799987792969
## 4 1 2 2
## 56.7900009155273 56.7999992370605 56.810001373291 56.8199996948242
## 1 2 3 5
## 56.8300018310547 56.8400001525879 56.8470001220703 56.8499984741211
## 3 2 1 1
## 56.8600006103516 56.8699989318848 56.8800010681152 56.8899993896484
## 5 3 1 1
## 56.9000015258789 56.9099998474121 56.9199981689453 56.9300003051758
## 4 4 2 1
## 56.939998626709 56.9500007629395 56.9599990844727 56.9700012207031
## 4 3 1 4
## 56.9799995422363 56.9900016784668 57 57.0099983215332
## 4 3 1 2
## 57.0299987792969 57.0400009155273 57.0499992370605 57.060001373291
## 1 4 4 3
## 57.0699996948242 57.0800018310547 57.0900001525879 57.0999984741211
## 5 7 4 3
## 57.1100006103516 57.1199989318848 57.1300010681152 57.1399993896484
## 2 3 3 4
## 57.1500015258789 57.1599998474121 57.1699981689453 57.1800003051758
## 9 4 3 2
## 57.1809997558594 57.189998626709 57.2000007629395 57.2060012817383
## 1 7 2 1
## 57.2099990844727 57.2200012207031 57.2299995422363 57.2400016784668
## 4 2 2 2
## 57.2599983215332 57.2700004577637 57.2799987792969 57.2900009155273
## 2 2 2 6
## 57.2999992370605 57.310001373291 57.3199996948242 57.3300018310547
## 2 3 3 1
## 57.3499984741211 57.3600006103516 57.3699989318848 57.3800010681152
## 2 2 2 5
## 57.4000015258789 57.4099998474121 57.4140014648438 57.4199981689453
## 1 6 1 2
## 57.4230003356934 57.4300003051758 57.439998626709 57.4500007629395
## 1 4 4 2
## 57.4599990844727 57.4700012207031 57.4739990234375 57.4799995422363
## 2 2 1 4
## 57.4900016784668 57.5 57.5099983215332 57.5200004577637
## 1 4 6 5
## 57.5299987792969 57.5400009155273 57.5499992370605 57.560001373291
## 5 1 1 4
## 57.5699996948242 57.5800018310547 57.5900001525879 57.5999984741211
## 2 5 4 4
## 57.6100006103516 57.6300010681152 57.6399993896484 57.6500015258789
## 4 1 4 2
## 57.6599998474121 57.6699981689453 57.6800003051758 57.689998626709
## 3 3 5 6
## 57.7000007629395 57.7099990844727 57.7200012207031 57.7299995422363
## 2 3 6 2
## 57.7360000610352 57.7400016784668 57.75 57.7599983215332
## 1 1 7 3
## 57.7700004577637 57.7799987792969 57.7900009155273 57.7999992370605
## 2 5 2 9
## 57.8300018310547 57.8400001525879 57.8499984741211 57.8600006103516
## 3 2 6 3
## 57.8699989318848 57.8800010681152 57.8819999694824 57.8899993896484
## 2 2 1 2
## 57.9000015258789 57.9099998474121 57.9169998168945 57.9199981689453
## 4 1 1 2
## 57.9300003051758 57.939998626709 57.9500007629395 57.9599990844727
## 3 1 3 5
## 57.9700012207031 57.9799995422363 57.9900016784668 58
## 8 4 4 8
## 58.0099983215332 58.0200004577637 58.0299987792969 58.0400009155273
## 7 2 4 9
## 58.0499992370605 58.060001373291 58.0699996948242 58.0800018310547
## 1 2 2 1
## 58.0900001525879 58.0999984741211 58.1199989318848 58.1300010681152
## 4 1 4 2
## 58.1399993896484 58.1500015258789 58.1510009765625 58.1599998474121
## 3 3 1 11
## 58.1699981689453 58.1800003051758 58.2000007629395 58.2099990844727
## 1 1 3 3
## 58.2200012207031 58.2400016784668 58.25 58.2599983215332
## 2 3 4 3
## 58.2700004577637 58.273998260498 58.2799987792969 58.2900009155273
## 6 1 3 1
## 58.2999992370605 58.3050003051758 58.310001373291 58.3199996948242
## 1 1 4 1
## 58.3300018310547 58.3400001525879 58.3429985046387 58.3489990234375
## 2 2 1 1
## 58.3499984741211 58.3600006103516 58.3699989318848 58.3800010681152
## 3 5 1 1
## 58.3899993896484 58.4000015258789 58.4099998474121 58.4199981689453
## 1 2 6 3
## 58.4249992370605 58.4300003051758 58.439998626709 58.4500007629395
## 2 4 1 1
## 58.4599990844727 58.4700012207031 58.4799995422363 58.5
## 1 3 5 2
## 58.5099983215332 58.5299987792969 58.5400009155273 58.5449981689453
## 3 3 4 1
## 58.5499992370605 58.560001373291 58.5699996948242 58.5800018310547
## 2 2 2 2
## 58.5900001525879 58.5999984741211 58.6100006103516 58.6199989318848
## 6 4 2 1
## 58.6300010681152 58.6500015258789 58.6599998474121 58.6699981689453
## 1 4 2 3
## 58.6800003051758 58.689998626709 58.6959991455078 58.7000007629395
## 4 12 1 3
## 58.7099990844727 58.7200012207031 58.7270011901855 58.7299995422363
## 2 1 1 4
## 58.7309989929199 58.7400016784668 58.7410011291504 58.7439994812012
## 1 5 1 1
## 58.75 58.7599983215332 58.7700004577637 58.7799987792969
## 4 3 5 5
## 58.7830009460449 58.7900009155273 58.7999992370605 58.810001373291
## 1 4 7 3
## 58.8199996948242 58.8300018310547 58.8400001525879 58.8499984741211
## 1 4 4 2
## 58.8600006103516 58.8699989318848 58.8800010681152 58.8899993896484
## 3 3 2 4
## 58.9000015258789 58.9099998474121 58.9119987487793 58.9199981689453
## 2 1 1 2
## 58.9210014343262 58.9300003051758 58.939998626709 58.9500007629395
## 1 2 7 2
## 58.9599990844727 58.9659996032715 58.9700012207031 58.9799995422363
## 2 1 1 2
## 58.9900016784668 59 59.0229988098145 59.0299987792969
## 5 2 1 4
## 59.0400009155273 59.0499992370605 59.060001373291 59.064998626709
## 1 2 3 1
## 59.0699996948242 59.0800018310547 59.0989990234375 59.0999984741211
## 1 2 1 2
## 59.1100006103516 59.1199989318848 59.1300010681152 59.1399993896484
## 1 2 2 4
## 59.1500015258789 59.1599998474121 59.1699981689453 59.1800003051758
## 4 2 3 3
## 59.189998626709 59.2000007629395 59.2099990844727 59.2200012207031
## 4 4 1 1
## 59.2299995422363 59.2400016784668 59.25 59.2599983215332
## 1 1 5 2
## 59.2700004577637 59.2799987792969 59.2970008850098 59.2999992370605
## 1 5 1 4
## 59.310001373291 59.3199996948242 59.3300018310547 59.3400001525879
## 6 1 1 1
## 59.3409996032715 59.3600006103516 59.3699989318848 59.3800010681152
## 1 1 3 3
## 59.3899993896484 59.4000015258789 59.4099998474121 59.4199981689453
## 1 4 5 2
## 59.4300003051758 59.439998626709 59.4500007629395 59.4599990844727
## 3 5 4 6
## 59.4799995422363 59.4900016784668 59.5 59.5099983215332
## 2 5 2 6
## 59.5299987792969 59.5400009155273 59.5460014343262 59.5499992370605
## 2 2 1 5
## 59.5699996948242 59.5789985656738 59.5800018310547 59.5900001525879
## 6 1 6 1
## 59.5999984741211 59.6100006103516 59.6199989318848 59.6300010681152
## 2 2 4 1
## 59.6399993896484 59.6500015258789 59.6599998474121 59.6699981689453
## 3 5 2 2
## 59.6710014343262 59.6800003051758 59.689998626709 59.6920013427734
## 1 4 5 1
## 59.7000007629395 59.7200012207031 59.7299995422363 59.7400016784668
## 3 3 2 2
## 59.7439994812012 59.75 59.7700004577637 59.7799987792969
## 2 5 3 1
## 59.7869987487793 59.7879981994629 59.7900009155273 59.7910003662109
## 1 1 1 1
## 59.7999992370605 59.8079986572266 59.810001373291 59.8199996948242
## 4 1 1 2
## 59.8300018310547 59.8400001525879 59.8499984741211 59.8600006103516
## 4 1 4 3
## 59.8699989318848 59.8790016174316 59.8800010681152 59.8899993896484
## 4 1 2 3
## 59.9000015258789 59.9099998474121 59.9199981689453 59.9300003051758
## 3 4 3 8
## 59.939998626709 59.9500007629395 59.9599990844727 59.9700012207031
## 3 3 10 5
## 59.9900016784668 60 60.0099983215332 60.0200004577637
## 2 3 7 5
## 60.0299987792969 60.0400009155273 60.0499992370605 60.0589981079102
## 4 3 2 1
## 60.0699996948242 60.0800018310547 60.0900001525879 60.0999984741211
## 4 3 5 3
## 60.1100006103516 60.1199989318848 60.1300010681152 60.1399993896484
## 3 3 5 2
## 60.1500015258789 60.1599998474121 60.1699981689453 60.1800003051758
## 1 3 3 3
## 60.1870002746582 60.189998626709 60.2000007629395 60.2099990844727
## 1 2 4 1
## 60.2200012207031 60.2229995727539 60.2299995422363 60.2400016784668
## 1 1 3 3
## 60.2490005493164 60.25 60.2700004577637 60.2799987792969
## 1 2 2 3
## 60.2900009155273 60.310001373291 60.3199996948242 60.3349990844727
## 1 1 1 1
## 60.3400001525879 60.3499984741211 60.3600006103516 60.3800010681152
## 6 1 3 1
## 60.3899993896484 60.4000015258789 60.4099998474121 60.4199981689453
## 4 6 3 2
## 60.4300003051758 60.4360008239746 60.439998626709 60.4459991455078
## 2 1 2 1
## 60.4500007629395 60.4599990844727 60.4700012207031 60.4799995422363
## 5 3 3 3
## 60.4900016784668 60.5 60.5099983215332 60.5200004577637
## 4 2 3 3
## 60.5299987792969 60.5400009155273 60.5499992370605 60.560001373291
## 2 2 2 1
## 60.5699996948242 60.5800018310547 60.5999984741211 60.6100006103516
## 2 2 8 3
## 60.6199989318848 60.6300010681152 60.6399993896484 60.6500015258789
## 5 1 3 1
## 60.6599998474121 60.6699981689453 60.6800003051758 60.689998626709
## 3 4 3 1
## 60.7000007629395 60.7099990844727 60.7200012207031 60.726001739502
## 3 3 1 1
## 60.7299995422363 60.7400016784668 60.75 60.7599983215332
## 2 2 1 4
## 60.7700004577637 60.7900009155273 60.7999992370605 60.810001373291
## 3 1 6 2
## 60.8129997253418 60.8199996948242 60.8310012817383 60.8400001525879
## 1 4 1 6
## 60.8499984741211 60.8600006103516 60.8699989318848 60.8800010681152
## 6 4 2 8
## 60.8839988708496 60.8849983215332 60.8899993896484 60.9000015258789
## 1 1 1 3
## 60.9099998474121 60.9199981689453 60.9300003051758 60.939998626709
## 1 4 2 3
## 60.9500007629395 60.9599990844727 60.9700012207031 60.9799995422363
## 3 1 5 1
## 61 61.0099983215332 61.0200004577637 61.0299987792969
## 6 3 6 2
## 61.0400009155273 61.0499992370605 61.060001373291 61.0699996948242
## 4 3 1 3
## 61.0800018310547 61.0900001525879 61.1100006103516 61.1199989318848
## 3 3 2 1
## 61.1220016479492 61.1240005493164 61.1300010681152 61.1399993896484
## 1 1 1 2
## 61.1599998474121 61.1679992675781 61.1699981689453 61.1800003051758
## 1 1 4 2
## 61.1860008239746 61.189998626709 61.2000007629395 61.2029991149902
## 1 1 3 1
## 61.2200012207031 61.25 61.2599983215332 61.2700004577637
## 3 1 2 3
## 61.2799987792969 61.2900009155273 61.2999992370605 61.310001373291
## 4 1 5 1
## 61.3199996948242 61.3300018310547 61.3400001525879 61.3499984741211
## 4 5 2 5
## 61.3699989318848 61.3800010681152 61.3899993896484 61.4000015258789
## 1 3 2 2
## 61.4099998474121 61.4199981689453 61.4300003051758 61.439998626709
## 2 2 1 1
## 61.4449996948242 61.4500007629395 61.4599990844727 61.4700012207031
## 1 6 2 4
## 61.4799995422363 61.4900016784668 61.5 61.5099983215332
## 2 7 5 3
## 61.5299987792969 61.5320014953613 61.5499992370605 61.560001373291
## 8 1 7 2
## 61.5629997253418 61.5699996948242 61.5750007629395 61.5800018310547
## 1 3 1 2
## 61.5900001525879 61.5970001220703 61.6100006103516 61.6150016784668
## 1 1 3 1
## 61.6199989318848 61.6259994506836 61.6339988708496 61.6399993896484
## 5 1 1 5
## 61.6500015258789 61.6599998474121 61.6699981689453 61.6759986877441
## 1 3 3 1
## 61.6800003051758 61.689998626709 61.7000007629395 61.7099990844727
## 2 3 2 2
## 61.7200012207031 61.7400016784668 61.75 61.7599983215332
## 2 4 3 1
## 61.7799987792969 61.7910003662109 61.7999992370605 61.8199996948242
## 5 1 1 4
## 61.8300018310547 61.8400001525879 61.8419990539551 61.8499984741211
## 4 2 1 3
## 61.8600006103516 61.8699989318848 61.9000015258789 61.9099998474121
## 4 3 2 2
## 61.9199981689453 61.9300003051758 61.9339981079102 61.939998626709
## 1 2 1 4
## 61.9490013122559 61.9500007629395 61.9589996337891 61.9599990844727
## 1 2 1 3
## 61.9799995422363 62 62.0099983215332 62.0169982910156
## 2 1 1 1
## 62.0200004577637 62.0299987792969 62.0400009155273 62.0499992370605
## 3 1 3 4
## 62.0559997558594 62.060001373291 62.0699996948242 62.0789985656738
## 1 7 6 1
## 62.0800018310547 62.0870018005371 62.0900001525879 62.0999984741211
## 4 1 1 5
## 62.1100006103516 62.1189994812012 62.1300010681152 62.1399993896484
## 2 1 2 1
## 62.1479988098145 62.1500015258789 62.1599998474121 62.1699981689453
## 1 2 2 5
## 62.1800003051758 62.189998626709 62.1949996948242 62.1990013122559
## 1 2 1 1
## 62.2000007629395 62.2099990844727 62.2200012207031 62.2299995422363
## 4 3 1 1
## 62.2400016784668 62.25 62.2509994506836 62.2599983215332
## 1 5 1 2
## 62.2700004577637 62.2799987792969 62.2900009155273 62.2999992370605
## 2 5 1 1
## 62.310001373291 62.3190002441406 62.3199996948242 62.3300018310547
## 2 1 6 3
## 62.3400001525879 62.3450012207031 62.3499984741211 62.3600006103516
## 3 1 2 6
## 62.3699989318848 62.3800010681152 62.3899993896484 62.4000015258789
## 1 2 3 5
## 62.4099998474121 62.4199981689453 62.4300003051758 62.439998626709
## 1 2 3 4
## 62.4500007629395 62.4599990844727 62.4700012207031 62.4799995422363
## 3 7 6 6
## 62.4900016784668 62.5 62.5089988708496 62.5099983215332
## 1 6 1 1
## 62.5139999389648 62.5200004577637 62.5499992370605 62.560001373291
## 2 1 2 2
## 62.5620002746582 62.5699996948242 62.5900001525879 62.5999984741211
## 1 3 2 1
## 62.6100006103516 62.6199989318848 62.6300010681152 62.6500015258789
## 1 1 6 3
## 62.6529998779297 62.6599998474121 62.6800003051758 62.689998626709
## 2 1 1 3
## 62.7000007629395 62.7050018310547 62.7099990844727 62.7200012207031
## 5 1 2 4
## 62.7299995422363 62.7400016784668 62.75 62.7599983215332
## 1 2 2 4
## 62.7700004577637 62.7900009155273 62.7999992370605 62.810001373291
## 1 2 2 3
## 62.8199996948242 62.8300018310547 62.8400001525879 62.8499984741211
## 3 3 1 5
## 62.8600006103516 62.8699989318848 62.8800010681152 62.8899993896484
## 7 5 3 2
## 62.8969993591309 62.9000015258789 62.9099998474121 62.9199981689453
## 1 2 2 2
## 62.9300003051758 62.939998626709 62.9500007629395 62.9599990844727
## 3 1 1 3
## 62.9700012207031 62.9749984741211 62.9799995422363 62.9900016784668
## 1 1 3 2
## 63 63.0099983215332 63.0229988098145 63.0299987792969
## 4 2 1 4
## 63.0400009155273 63.0499992370605 63.060001373291 63.0699996948242
## 3 1 2 2
## 63.0800018310547 63.0999984741211 63.1100006103516 63.1180000305176
## 3 2 4 1
## 63.1300010681152 63.1399993896484 63.1500015258789 63.1599998474121
## 1 7 3 4
## 63.1699981689453 63.1759986877441 63.1800003051758 63.189998626709
## 1 1 3 1
## 63.2000007629395 63.2099990844727 63.2140007019043 63.2190017700195
## 4 5 1 1
## 63.2200012207031 63.2299995422363 63.2400016784668 63.25
## 2 2 1 2
## 63.2599983215332 63.2700004577637 63.2760009765625 63.2799987792969
## 4 1 1 2
## 63.2900009155273 63.2999992370605 63.310001373291 63.3199996948242
## 2 1 6 3
## 63.3300018310547 63.3400001525879 63.3499984741211 63.3600006103516
## 5 4 5 1
## 63.3699989318848 63.3800010681152 63.3899993896484 63.4000015258789
## 4 2 1 3
## 63.4099998474121 63.4199981689453 63.4300003051758 63.439998626709
## 1 3 1 3
## 63.4500007629395 63.4599990844727 63.4700012207031 63.4799995422363
## 1 1 8 4
## 63.4900016784668 63.5 63.5050010681152 63.5099983215332
## 1 4 1 4
## 63.5299987792969 63.5379981994629 63.5400009155273 63.5499992370605
## 3 1 1 4
## 63.560001373291 63.5699996948242 63.5800018310547 63.5900001525879
## 1 1 2 2
## 63.5929985046387 63.5999984741211 63.6100006103516 63.6199989318848
## 1 2 2 2
## 63.6300010681152 63.6399993896484 63.6500015258789 63.6599998474121
## 2 3 5 2
## 63.6609992980957 63.6699981689453 63.6730003356934 63.6800003051758
## 1 4 1 1
## 63.6829986572266 63.689998626709 63.6920013427734 63.7000007629395
## 1 4 1 2
## 63.7099990844727 63.7200012207031 63.7299995422363 63.7400016784668
## 2 1 1 2
## 63.75 63.7799987792969 63.7999992370605 63.810001373291
## 6 1 2 3
## 63.8199996948242 63.8300018310547 63.8400001525879 63.8499984741211
## 2 1 1 3
## 63.8549995422363 63.8600006103516 63.8650016784668 63.8660011291504
## 1 2 1 1
## 63.8699989318848 63.875 63.8800010681152 63.8899993896484
## 4 1 3 4
## 63.9000015258789 63.9099998474121 63.9109992980957 63.9199981689453
## 3 2 1 2
## 63.9300003051758 63.939998626709 63.9420013427734 63.9500007629395
## 5 2 1 4
## 63.9599990844727 63.9700012207031 63.9799995422363 63.9809989929199
## 3 2 1 1
## 63.9900016784668 63.9939994812012 64.0100021362305 64.0199966430664
## 1 1 1 5
## 64.0240020751953 64.0270004272461 64.0299987792969 64.0500030517578
## 1 1 2 4
## 64.0699996948242 64.0800018310547 64.0899963378906 64.0999984741211
## 4 2 1 6
## 64.1100006103516 64.120002746582 64.129997253418 64.1399993896484
## 1 2 4 4
## 64.1500015258789 64.1600036621094 64.1669998168945 64.1699981689453
## 4 1 1 3
## 64.1719970703125 64.1800003051758 64.1900024414062 64.1910018920898
## 1 4 1 1
## 64.1999969482422 64.2099990844727 64.2180023193359 64.2200012207031
## 2 5 1 2
## 64.2300033569336 64.2399978637695 64.25 64.2600021362305
## 6 4 2 1
## 64.2699966430664 64.2799987792969 64.2900009155273 64.2949981689453
## 6 5 3 1
## 64.2990036010742 64.3000030517578 64.3099975585938 64.3199996948242
## 1 2 2 2
## 64.3219985961914 64.3330001831055 64.3399963378906 64.3600006103516
## 1 1 5 3
## 64.379997253418 64.3899993896484 64.4000015258789 64.4100036621094
## 1 2 2 3
## 64.4199981689453 64.4240036010742 64.4300003051758 64.431999206543
## 1 1 5 1
## 64.4400024414062 64.4499969482422 64.4580001831055 64.4599990844727
## 4 2 1 4
## 64.4800033569336 64.4899978637695 64.5 64.504997253418
## 1 3 2 2
## 64.5100021362305 64.5199966430664 64.5400009155273 64.5500030517578
## 4 2 1 3
## 64.5550003051758 64.5599975585938 64.5699996948242 64.5800018310547
## 2 6 8 2
## 64.5899963378906 64.5999984741211 64.6100006103516 64.620002746582
## 4 3 4 2
## 64.6279983520508 64.629997253418 64.6380004882812 64.6399993896484
## 1 4 1 2
## 64.6490020751953 64.6500015258789 64.6520004272461 64.6600036621094
## 1 2 1 3
## 64.6699981689453 64.677001953125 64.6800003051758 64.6900024414062
## 3 1 6 7
## 64.6920013427734 64.6959991455078 64.697998046875 64.6999969482422
## 1 1 1 2
## 64.7099990844727 64.7200012207031 64.7300033569336 64.7399978637695
## 4 3 4 2
## 64.7480010986328 64.75 64.7559967041016 64.7600021362305
## 1 4 1 1
## 64.7699966430664 64.7799987792969 64.7900009155273 64.8000030517578
## 2 4 5 3
## 64.8190002441406 64.8199996948242 64.8300018310547 64.8349990844727
## 1 3 1 2
## 64.8399963378906 64.8499984741211 64.8600006103516 64.870002746582
## 1 4 2 4
## 64.879997253418 64.8899993896484 64.9000015258789 64.9100036621094
## 2 5 3 4
## 64.9199981689453 64.9300003051758 64.9400024414062 64.9499969482422
## 6 2 2 3
## 64.9599990844727 64.9700012207031 64.9800033569336 64.9899978637695
## 2 1 1 6
## 65 65.0100021362305 65.0199966430664 65.0299987792969
## 1 1 3 2
## 65.0400009155273 65.0410003662109 65.0500030517578 65.0599975585938
## 4 1 1 2
## 65.0609970092773 65.0699996948242 65.0800018310547 65.0899963378906
## 1 4 5 2
## 65.0999984741211 65.1070022583008 65.1100006103516 65.129997253418
## 3 1 2 3
## 65.1399993896484 65.1500015258789 65.1549987792969 65.1600036621094
## 1 2 1 6
## 65.1699981689453 65.1800003051758 65.1900024414062 65.193000793457
## 4 1 3 1
## 65.1999969482422 65.2030029296875 65.2040023803711 65.2099990844727
## 1 1 1 4
## 65.2200012207031 65.2399978637695 65.2600021362305 65.2649993896484
## 1 3 5 1
## 65.2699966430664 65.2900009155273 65.3000030517578 65.3099975585938
## 2 1 4 6
## 65.3199996948242 65.3300018310547 65.3399963378906 65.3479995727539
## 4 3 3 1
## 65.3499984741211 65.3600006103516 65.370002746582 65.379997253418
## 2 5 3 5
## 65.3899993896484 65.4000015258789 65.4100036621094 65.4169998168945
## 7 6 4 1
## 65.4199981689453 65.4300003051758 65.4380035400391 65.4400024414062
## 2 2 3 2
## 65.4459991455078 65.4499969482422 65.4700012207031 65.4800033569336
## 1 5 1 4
## 65.5 65.5080032348633 65.5100021362305 65.5199966430664
## 5 1 6 5
## 65.5270004272461 65.5400009155273 65.5500030517578 65.5599975585938
## 1 1 1 2
## 65.5630035400391 65.5699996948242 65.5800018310547 65.5899963378906
## 1 3 7 4
## 65.5999984741211 65.6100006103516 65.6179962158203 65.620002746582
## 1 3 1 2
## 65.625 65.629997253418 65.6399993896484 65.6500015258789
## 1 3 1 2
## 65.6600036621094 65.6699981689453 65.6760025024414 65.6800003051758
## 2 4 1 1
## 65.6900024414062 65.693000793457 65.6999969482422 65.7099990844727
## 1 1 2 2
## 65.7249984741211 65.7300033569336 65.7399978637695 65.7600021362305
## 1 5 1 2
## 65.7699966430664 65.7799987792969 65.8000030517578 65.8050003051758
## 2 2 4 1
## 65.8089981079102 65.8199996948242 65.8300018310547 65.8499984741211
## 1 8 6 1
## 65.8600006103516 65.870002746582 65.8740005493164 65.879997253418
## 4 2 1 3
## 65.8830032348633 65.8899993896484 65.9000015258789 65.9100036621094
## 1 2 1 5
## 65.9199981689453 65.9300003051758 65.9499969482422 65.9599990844727
## 2 3 2 3
## 65.9700012207031 65.9720001220703 65.9800033569336 65.9899978637695
## 2 1 3 2
## 66 66.0100021362305 66.0110015869141 66.0199966430664
## 2 2 1 2
## 66.0299987792969 66.0400009155273 66.0500030517578 66.0530014038086
## 3 3 7 1
## 66.0579986572266 66.0599975585938 66.0699996948242 66.0800018310547
## 1 1 2 6
## 66.0879974365234 66.0899963378906 66.0999984741211 66.1019973754883
## 1 2 6 2
## 66.1100006103516 66.120002746582 66.129997253418 66.1309967041016
## 5 4 2 1
## 66.1399993896484 66.1500015258789 66.1600036621094 66.1699981689453
## 3 6 1 1
## 66.1949996948242 66.1959991455078 66.1999969482422 66.2099990844727
## 1 1 1 3
## 66.2200012207031 66.2289962768555 66.2300033569336 66.2369995117188
## 3 1 1 1
## 66.2399978637695 66.2440032958984 66.25 66.2600021362305
## 1 1 1 8
## 66.2699966430664 66.2799987792969 66.2900009155273 66.3000030517578
## 3 2 2 2
## 66.3089981079102 66.3099975585938 66.3199996948242 66.3280029296875
## 1 4 6 1
## 66.3300018310547 66.3359985351562 66.3399963378906 66.3440017700195
## 2 1 1 1
## 66.3499984741211 66.3600006103516 66.370002746582 66.3789978027344
## 3 2 1 1
## 66.3899993896484 66.3939971923828 66.4000015258789 66.4039993286133
## 1 1 4 1
## 66.4100036621094 66.4199981689453 66.4300003051758 66.4400024414062
## 3 3 1 1
## 66.4420013427734 66.4469985961914 66.4489974975586 66.4499969482422
## 1 1 1 2
## 66.4570007324219 66.4680023193359 66.4700012207031 66.4800033569336
## 1 1 4 6
## 66.4850006103516 66.4899978637695 66.5 66.5019989013672
## 1 2 3 1
## 66.5100021362305 66.5199966430664 66.5299987792969 66.5400009155273
## 3 1 2 4
## 66.5500030517578 66.5599975585938 66.5699996948242 66.5899963378906
## 4 2 5 1
## 66.5999984741211 66.6100006103516 66.620002746582 66.6380004882812
## 4 1 3 1
## 66.6500015258789 66.6699981689453 66.6800003051758 66.6900024414062
## 1 5 3 2
## 66.6999969482422 66.7099990844727 66.7180023193359 66.7200012207031
## 4 1 1 2
## 66.7300033569336 66.730315111756 66.7399978637695 66.75
## 6 442 5 1
## 66.7570037841797 66.7600021362305 66.7699966430664 66.7799987792969
## 1 5 2 2
## 66.7900009155273 66.7969970703125 66.8000030517578 66.8040008544922
## 5 1 2 1
## 66.8099975585938 66.8199996948242 66.8300018310547 66.8320007324219
## 2 1 5 1
## 66.8399963378906 66.8499984741211 66.8600006103516 66.870002746582
## 1 4 2 1
## 66.879997253418 66.8899993896484 66.8919982910156 66.9000015258789
## 3 1 1 3
## 66.9100036621094 66.9140014648438 66.9199981689453 66.9300003051758
## 2 1 3 2
## 66.9400024414062 66.9499969482422 66.9530029296875 66.9599990844727
## 6 5 1 7
## 66.9700012207031 66.9710006713867 66.9800033569336 66.9830017089844
## 2 1 4 1
## 66.9899978637695 66.995002746582 67 67.0070037841797
## 6 1 7 1
## 67.0100021362305 67.0130004882812 67.0199966430664 67.0299987792969
## 5 3 6 2
## 67.0350036621094 67.0400009155273 67.0419998168945 67.0500030517578
## 1 3 1 5
## 67.0599975585938 67.0619964599609 67.0699996948242 67.0800018310547
## 1 1 5 4
## 67.088996887207 67.0899963378906 67.0950012207031 67.0999984741211
## 1 1 1 3
## 67.1100006103516 67.120002746582 67.129997253418 67.1389999389648
## 2 2 1 1
## 67.1399993896484 67.140998840332 67.1439971923828 67.1500015258789
## 4 1 1 1
## 67.1559982299805 67.1600036621094 67.1699981689453 67.1800003051758
## 1 2 4 2
## 67.1890029907227 67.1900024414062 67.1999969482422 67.2020034790039
## 1 4 1 1
## 67.2099990844727 67.213996887207 67.2200012207031 67.2300033569336
## 6 1 3 4
## 67.234001159668 67.25 67.2600021362305 67.2799987792969
## 1 5 1 1
## 67.2900009155273 67.3000030517578 67.3099975585938 67.3199996948242
## 4 3 6 2
## 67.3300018310547 67.3399963378906 67.3499984741211 67.3600006103516
## 1 4 3 2
## 67.3619995117188 67.3679962158203 67.370002746582 67.379997253418
## 1 1 1 1
## 67.3820037841797 67.3899993896484 67.4000015258789 67.4100036621094
## 1 1 4 1
## 67.4189987182617 67.4199981689453 67.4300003051758 67.4400024414062
## 1 1 1 3
## 67.4499969482422 67.4540023803711 67.4599990844727 67.4700012207031
## 2 1 3 6
## 67.4729995727539 67.4779968261719 67.4800033569336 67.4899978637695
## 1 1 1 1
## 67.4919967651367 67.5100021362305 67.5199966430664 67.5299987792969
## 1 2 5 3
## 67.5400009155273 67.5500030517578 67.5599975585938 67.568000793457
## 1 2 3 1
## 67.5699996948242 67.5800018310547 67.5899963378906 67.5970001220703
## 2 4 1 1
## 67.5999984741211 67.6100006103516 67.620002746582 67.629997253418
## 4 4 1 3
## 67.6389999389648 67.6399993896484 67.6500015258789 67.6699981689453
## 1 5 6 3
## 67.6800003051758 67.6900024414062 67.6999969482422 67.7099990844727
## 3 4 4 5
## 67.7200012207031 67.7249984741211 67.7300033569336 67.7399978637695
## 1 1 2 3
## 67.75 67.7529983520508 67.7600021362305 67.7699966430664
## 6 2 8 4
## 67.7799987792969 67.7890014648438 67.7900009155273 67.8000030517578
## 3 1 3 1
## 67.8099975585938 67.8199996948242 67.8290023803711 67.8300018310547
## 2 5 2 2
## 67.8359985351562 67.8399963378906 67.8499984741211 67.859001159668
## 1 1 6 1
## 67.8600006103516 67.870002746582 67.879997253418 67.8899993896484
## 2 2 3 5
## 67.9000015258789 67.9100036621094 67.9199981689453 67.9229965209961
## 3 5 4 1
## 67.9300003051758 67.9349975585938 67.9400024414062 67.9499969482422
## 4 1 1 3
## 67.9599990844727 67.9670028686523 67.9700012207031 67.9800033569336
## 5 1 3 2
## 67.9810028076172 67.9899978637695 68 68.0100021362305
## 1 3 1 1
## 68.0139999389648 68.0149993896484 68.0299987792969 68.036003112793
## 1 1 3 1
## 68.0400009155273 68.0469970703125 68.0500030517578 68.0599975585938
## 2 1 9 2
## 68.0699996948242 68.0800018310547 68.0899963378906 68.0999984741211
## 5 5 2 1
## 68.1100006103516 68.120002746582 68.129997253418 68.1350021362305
## 6 4 1 1
## 68.1399993896484 68.1480026245117 68.1500015258789 68.1600036621094
## 3 1 1 4
## 68.1699981689453 68.1800003051758 68.1900024414062 68.1999969482422
## 1 4 5 2
## 68.2099990844727 68.2200012207031 68.2300033569336 68.25
## 6 4 1 5
## 68.2600021362305 68.2679977416992 68.2699966430664 68.2710037231445
## 2 1 2 1
## 68.2799987792969 68.2900009155273 68.3000030517578 68.3099975585938
## 3 4 2 1
## 68.3199996948242 68.3259963989258 68.3300018310547 68.338996887207
## 2 1 2 1
## 68.3399963378906 68.3499984741211 68.3600006103516 68.370002746582
## 4 5 3 2
## 68.3740005493164 68.379997253418 68.3880004882812 68.3899993896484
## 1 3 1 6
## 68.3990020751953 68.4000015258789 68.4100036621094 68.4199981689453
## 1 3 4 3
## 68.4290008544922 68.4300003051758 68.4400024414062 68.4499969482422
## 1 5 6 1
## 68.4599990844727 68.4700012207031 68.4800033569336 68.4899978637695
## 3 1 3 3
## 68.5 68.5100021362305 68.5199966430664 68.5299987792969
## 3 5 5 1
## 68.5329971313477 68.5400009155273 68.5500030517578 68.5599975585938
## 1 1 1 3
## 68.5699996948242 68.572998046875 68.5800018310547 68.5899963378906
## 4 1 4 4
## 68.5999984741211 68.6100006103516 68.620002746582 68.629997253418
## 1 2 2 2
## 68.6330032348633 68.6399993896484 68.6490020751953 68.6500015258789
## 1 7 1 5
## 68.6600036621094 68.6699981689453 68.6790008544922 68.6800003051758
## 2 7 1 4
## 68.6900024414062 68.6999969482422 68.7030029296875 68.7099990844727
## 6 1 1 7
## 68.7200012207031 68.7229995727539 68.7259979248047 68.7289962768555
## 9 1 1 1
## 68.7300033569336 68.7369995117188 68.7399978637695 68.75
## 9 1 2 3
## 68.7600021362305 68.765998840332 68.7699966430664 68.7799987792969
## 1 1 2 2
## 68.7900009155273 68.8000030517578 68.8099975585938 68.8199996948242
## 1 4 1 1
## 68.8300018310547 68.8369979858398 68.8399963378906 68.8499984741211
## 1 1 3 1
## 68.8600006103516 68.870002746582 68.879997253418 68.8860015869141
## 5 6 1 1
## 68.8899993896484 68.9000015258789 68.9199981689453 68.9300003051758
## 4 1 6 3
## 68.9339981079102 68.9400024414062 68.9499969482422 68.9599990844727
## 1 4 1 3
## 68.9700012207031 68.9800033569336 68.9899978637695 69
## 4 1 4 3
## 69.0029983520508 69.0100021362305 69.0210037231445 69.0299987792969
## 1 5 1 5
## 69.0400009155273 69.0469970703125 69.0500030517578 69.056999206543
## 4 1 4 2
## 69.0599975585938 69.0699996948242 69.0800018310547 69.088996887207
## 3 3 2 1
## 69.0899963378906 69.0940017700195 69.0999984741211 69.1029968261719
## 9 1 8 1
## 69.1100006103516 69.1110000610352 69.120002746582 69.129997253418
## 4 1 3 3
## 69.1399993896484 69.1419982910156 69.1500015258789 69.1549987792969
## 2 1 1 1
## 69.1600036621094 69.1669998168945 69.1699981689453 69.1800003051758
## 2 1 10 2
## 69.1839981079102 69.1900024414062 69.1999969482422 69.2200012207031
## 1 4 3 4
## 69.2300033569336 69.2399978637695 69.25 69.2699966430664
## 4 2 6 4
## 69.2730026245117 69.2799987792969 69.2900009155273 69.2979965209961
## 1 2 3 1
## 69.3000030517578 69.3099975585938 69.3199996948242 69.3239974975586
## 6 8 7 1
## 69.3320007324219 69.3399963378906 69.3499984741211 69.359001159668
## 1 2 1 1
## 69.3600006103516 69.3610000610352 69.370002746582 69.379997253418
## 3 1 2 2
## 69.3880004882812 69.3899993896484 69.390998840332 69.4000015258789
## 1 6 1 3
## 69.4100036621094 69.4199981689453 69.4300003051758 69.4400024414062
## 2 1 4 2
## 69.4499969482422 69.4599990844727 69.4629974365234 69.4680023193359
## 2 7 1 1
## 69.4700012207031 69.4729995727539 69.4800033569336 69.4899978637695
## 3 1 4 6
## 69.5 69.5100021362305 69.5199966430664 69.5299987792969
## 2 2 3 5
## 69.5428569706374 69.5490036010742 69.5500030517578 69.5550003051758
## 442 1 5 1
## 69.5599975585938 69.5699996948242 69.5709991455078 69.5800018310547
## 3 1 1 3
## 69.5899963378906 69.5999984741211 69.6039962768555 69.6100006103516
## 4 2 1 3
## 69.620002746582 69.6399993896484 69.6500015258789 69.6600036621094
## 4 5 2 3
## 69.6699981689453 69.6800003051758 69.6900024414062 69.6999969482422
## 1 2 2 3
## 69.7099990844727 69.7200012207031 69.7220001220703 69.7300033569336
## 3 3 1 3
## 69.7399978637695 69.75 69.7600021362305 69.7699966430664
## 3 1 3 3
## 69.7789993286133 69.7890014648438 69.7900009155273 69.8000030517578
## 1 1 3 1
## 69.8099975585938 69.8199996948242 69.8300018310547 69.8399963378906
## 2 4 2 3
## 69.8499984741211 69.8600006103516 69.8629989624023 69.8639984130859
## 4 4 1 1
## 69.870002746582 69.879997253418 69.8850021362305 69.8899993896484
## 2 5 1 1
## 69.9000015258789 69.9100036621094 69.9130020141602 69.9160003662109
## 1 1 1 1
## 69.9199981689453 69.9400024414062 69.9499969482422 69.9599990844727
## 6 3 1 5
## 69.9700012207031 69.9800033569336 69.9899978637695 70
## 6 1 3 4
## 70.0100021362305 70.0199966430664 70.0299987792969 70.0400009155273
## 2 2 1 3
## 70.0500030517578 70.0599975585938 70.0699996948242 70.0800018310547
## 3 2 1 1
## 70.0899963378906 70.0960006713867 70.0999984741211 70.1100006103516
## 4 1 1 2
## 70.120002746582 70.1259994506836 70.1279983520508 70.129997253418
## 1 1 1 3
## 70.1399993896484 70.1500015258789 70.1579971313477 70.1600036621094
## 4 5 1 4
## 70.1699981689453 70.1709976196289 70.1729965209961 70.1800003051758
## 1 1 1 3
## 70.1900024414062 70.1940002441406 70.1999969482422 70.2080001831055
## 1 1 3 1
## 70.2099990844727 70.2190017700195 70.2200012207031 70.2300033569336
## 1 1 3 2
## 70.2379989624023 70.2399978637695 70.25 70.2600021362305
## 1 1 9 2
## 70.2699966430664 70.2740020751953 70.2799987792969 70.2870025634766
## 2 1 4 1
## 70.2900009155273 70.3000030517578 70.3199996948242 70.3300018310547
## 5 1 5 1
## 70.3399963378906 70.3499984741211 70.3529968261719 70.3550033569336
## 3 1 1 1
## 70.3570022583008 70.3600006103516 70.370002746582 70.379997253418
## 1 2 2 3
## 70.3899993896484 70.4000015258789 70.4020004272461 70.4100036621094
## 2 3 1 3
## 70.4189987182617 70.4199981689453 70.4300003051758 70.4359970092773
## 1 2 3 1
## 70.4380035400391 70.4400024414062 70.4499969482422 70.4599990844727
## 1 2 6 5
## 70.4700012207031 70.4800033569336 70.4810028076172 70.4879989624023
## 7 3 2 1
## 70.4899978637695 70.5 70.5100021362305 70.5199966430664
## 1 3 2 6
## 70.5240020751953 70.5299987792969 70.5400009155273 70.5500030517578
## 1 3 5 8
## 70.5599975585938 70.5619964599609 70.5699996948242 70.5800018310547
## 2 1 5 2
## 70.5839996337891 70.5899963378906 70.5999984741211 70.6100006103516
## 1 5 1 2
## 70.620002746582 70.629997253418 70.6399993896484 70.6500015258789
## 4 2 3 1
## 70.6600036621094 70.6630020141602 70.6699981689453 70.6800003051758
## 1 1 4 1
## 70.6839981079102 70.6900024414062 70.6999969482422 70.7099990844727
## 1 4 1 2
## 70.7200012207031 70.7300033569336 70.7399978637695 70.7470016479492
## 5 1 2 1
## 70.7539978027344 70.7600021362305 70.7699966430664 70.7789993286133
## 1 2 4 1
## 70.7799987792969 70.7900009155273 70.7949981689453 70.8000030517578
## 5 1 1 6
## 70.806999206543 70.8359985351562 70.8399963378906 70.8499984741211
## 1 1 5 4
## 70.8600006103516 70.8649978637695 70.870002746582 70.879997253418
## 3 1 6 3
## 70.8899993896484 70.9000015258789 70.9100036621094 70.911003112793
## 1 1 2 1
## 70.9130020141602 70.9300003051758 70.9390029907227 70.9400024414062
## 1 2 1 3
## 70.9499969482422 70.9570007324219 70.9599990844727 70.9700012207031
## 2 1 2 1
## 70.9789962768555 70.9800033569336 70.9899978637695 71
## 1 3 6 3
## 71.0039978027344 71.0199966430664 71.0299987792969 71.036003112793
## 1 3 1 1
## 71.0400009155273 71.0500030517578 71.0589981079102 71.0599975585938
## 2 3 1 6
## 71.0699996948242 71.0800018310547 71.0849990844727 71.0899963378906
## 2 3 2 3
## 71.0940017700195 71.0950012207031 71.0999984741211 71.1100006103516
## 1 1 1 1
## 71.120002746582 71.1230010986328 71.1279983520508 71.129997253418
## 3 1 1 4
## 71.1500015258789 71.1600036621094 71.1699981689453 71.1800003051758
## 4 2 8 1
## 71.1900024414062 71.1999969482422 71.2099990844727 71.2160034179688
## 1 5 3 1
## 71.2200012207031 71.2300033569336 71.2330017089844 71.2350006103516
## 1 5 1 1
## 71.2399978637695 71.2419967651367 71.2600021362305 71.2649993896484
## 4 1 1 1
## 71.2699966430664 71.2799987792969 71.2900009155273 71.3000030517578
## 3 5 2 1
## 71.3099975585938 71.3199996948242 71.3300018310547 71.3399963378906
## 1 3 6 4
## 71.3499984741211 71.3560028076172 71.3600006103516 71.370002746582
## 1 1 4 1
## 71.379997253418 71.3899993896484 71.4000015258789 71.4100036621094
## 4 1 3 3
## 71.4199981689453 71.4300003051758 71.4349975585938 71.4390029907227
## 4 4 1 1
## 71.4400024414062 71.4499969482422 71.4599990844727 71.4700012207031
## 2 4 3 2
## 71.4720001220703 71.4800033569336 71.484001159668 71.4889984130859
## 1 2 1 2
## 71.4899978637695 71.4909973144531 71.4990005493164 71.5100021362305
## 2 1 1 4
## 71.5179977416992 71.5199966430664 71.5299987792969 71.5500030517578
## 1 1 1 2
## 71.5599975585938 71.5699996948242 71.5800018310547 71.5899963378906
## 6 1 2 2
## 71.5999984741211 71.6100006103516 71.620002746582 71.629997253418
## 4 3 4 2
## 71.6399993896484 71.6500015258789 71.6699981689453 71.6800003051758
## 6 5 2 2
## 71.6900024414062 71.6999969482422 71.7200012207031 71.7300033569336
## 5 4 3 2
## 71.7399978637695 71.7480010986328 71.75 71.7529983520508
## 2 1 1 1
## 71.7600021362305 71.7699966430664 71.7799987792969 71.7900009155273
## 2 3 1 1
## 71.7929992675781 71.8000030517578 71.8099975585938 71.8199996948242
## 1 2 1 6
## 71.8300018310547 71.8399963378906 71.8499984741211 71.8529968261719
## 3 3 2 1
## 71.8600006103516 71.870002746582 71.879997253418 71.8880004882812
## 3 2 1 1
## 71.8899993896484 71.9000015258789 71.9089965820312 71.9100036621094
## 6 4 1 1
## 71.9199981689453 71.9250030517578 71.9300003051758 71.9400024414062
## 3 1 4 5
## 71.9499969482422 71.9609985351562 71.9690017700195 71.9700012207031
## 1 1 1 4
## 71.9899978637695 72 72.0100021362305 72.015998840332
## 3 5 1 1
## 72.0199966430664 72.0299987792969 72.0400009155273 72.0599975585938
## 5 2 1 7
## 72.0630035400391 72.0699996948242 72.0800018310547 72.0899963378906
## 1 1 2 3
## 72.0999984741211 72.1100006103516 72.1119995117188 72.120002746582
## 2 3 1 1
## 72.129997253418 72.1399993896484 72.1500015258789 72.1510009765625
## 1 3 2 2
## 72.1600036621094 72.1699981689453 72.1790008544922 72.1800003051758
## 3 1 1 8
## 72.1900024414062 72.1989974975586 72.1999969482422 72.2099990844727
## 4 1 5 1
## 72.2200012207031 72.2300033569336 72.2399978637695 72.25
## 4 2 2 2
## 72.2600021362305 72.2699966430664 72.2799987792969 72.2900009155273
## 2 5 1 3
## 72.3000030517578 72.3099975585938 72.3160018920898 72.3199996948242
## 1 3 1 3
## 72.3300018310547 72.3359985351562 72.3399963378906 72.3499984741211
## 3 1 2 2
## 72.3600006103516 72.370002746582 72.379997253418 72.3899993896484
## 4 2 2 1
## 72.4000015258789 72.4100036621094 72.4120025634766 72.4199981689453
## 4 6 1 4
## 72.4300003051758 72.4400024414062 72.4499969482422 72.4599990844727
## 3 2 2 4
## 72.4700012207031 72.4800033569336 72.4899978637695 72.4960021972656
## 4 1 3 1
## 72.5 72.5090026855469 72.5100021362305 72.5199966430664
## 2 1 6 1
## 72.5299987792969 72.5400009155273 72.5490036010742 72.5500030517578
## 3 8 1 2
## 72.5599975585938 72.5699996948242 72.5800018310547 72.5899963378906
## 2 3 2 2
## 72.6050033569336 72.6100006103516 72.6159973144531 72.620002746582
## 1 2 1 4
## 72.629997253418 72.6399993896484 72.6500015258789 72.6520004272461
## 3 4 5 1
## 72.6800003051758 72.6900024414062 72.6999969482422 72.7099990844727
## 2 3 1 3
## 72.7180023193359 72.7200012207031 72.7300033569336 72.7399978637695
## 1 2 1 3
## 72.75 72.7600021362305 72.7699966430664 72.7760009765625
## 3 3 2 1
## 72.7799987792969 72.7990036010742 72.8010025024414 72.8099975585938
## 2 1 1 6
## 72.8150024414062 72.8199996948242 72.8295897542227 72.8300018310547
## 1 7 442 2
## 72.8399963378906 72.8499984741211 72.8600006103516 72.870002746582
## 2 5 2 1
## 72.9000015258789 72.9100036621094 72.9130020141602 72.9199981689453
## 2 1 1 2
## 72.9250030517578 72.9400024414062 72.9499969482422 72.9560012817383
## 1 5 4 1
## 72.9599990844727 72.9700012207031 72.9800033569336 72.9899978637695
## 1 1 2 2
## 73 73.0029983520508 73.0100021362305 73.0199966430664
## 1 1 3 1
## 73.0299987792969 73.0400009155273 73.0500030517578 73.0599975585938
## 2 2 2 3
## 73.0699996948242 73.0800018310547 73.0899963378906 73.0999984741211
## 3 3 1 2
## 73.1039962768555 73.1100006103516 73.120002746582 73.129997253418
## 1 6 2 1
## 73.1380004882812 73.1399993896484 73.1429977416992 73.1600036621094
## 1 6 1 2
## 73.1699981689453 73.1800003051758 73.1809997558594 73.1999969482422
## 2 4 1 3
## 73.2099990844727 73.2200012207031 73.2300033569336 73.2399978637695
## 3 1 1 1
## 73.25 73.2539978027344 73.2570037841797 73.2600021362305
## 2 1 1 5
## 73.2639999389648 73.2699966430664 73.2799987792969 73.2870025634766
## 1 3 3 1
## 73.2900009155273 73.2910003662109 73.3000030517578 73.3199996948242
## 1 1 1 5
## 73.3300018310547 73.3399963378906 73.3499984741211 73.3600006103516
## 4 2 1 2
## 73.370002746582 73.379997253418 73.3899993896484 73.3960037231445
## 3 3 4 1
## 73.4000015258789 73.4079971313477 73.4300003051758 73.4400024414062
## 1 2 5 1
## 73.4499969482422 73.4599990844727 73.4670028686523 73.4700012207031
## 5 3 1 4
## 73.4779968261719 73.4800033569336 73.4899978637695 73.5
## 1 4 5 1
## 73.5059967041016 73.5080032348633 73.5100021362305 73.5199966430664
## 1 1 2 1
## 73.5299987792969 73.5319976806641 73.5329971313477 73.5400009155273
## 3 1 1 4
## 73.5500030517578 73.5599975585938 73.5699996948242 73.5790023803711
## 4 3 1 1
## 73.5800018310547 73.5899963378906 73.5999984741211 73.6100006103516
## 2 2 1 1
## 73.620002746582 73.625 73.629997253418 73.6399993896484
## 1 1 2 1
## 73.6500015258789 73.6559982299805 73.6800003051758 73.6880035400391
## 1 1 1 1
## 73.6900024414062 73.6969985961914 73.6999969482422 73.7099990844727
## 3 1 1 1
## 73.7129974365234 73.7200012207031 73.7239990234375 73.7300033569336
## 1 5 1 1
## 73.75 73.7600021362305 73.7699966430664 73.7900009155273
## 1 2 2 2
## 73.7910003662109 73.8000030517578 73.8059997558594 73.806999206543
## 1 1 1 1
## 73.8099975585938 73.8199996948242 73.8300018310547 73.8349990844727
## 1 3 3 1
## 73.8399963378906 73.8499984741211 73.8600006103516 73.8679962158203
## 3 3 1 1
## 73.8740005493164 73.879997253418 73.8899993896484 73.9000015258789
## 1 3 2 4
## 73.9100036621094 73.9280014038086 73.9300003051758 73.9400024414062
## 4 1 1 1
## 73.9499969482422 73.9599990844727 73.9700012207031 73.9800033569336
## 5 2 1 2
## 73.9860000610352 74 74.0100021362305 74.0110015869141
## 1 1 2 1
## 74.015998840332 74.0199966430664 74.0270004272461 74.0299987792969
## 1 2 1 2
## 74.0400009155273 74.0500030517578 74.0599975585938 74.0619964599609
## 4 2 2 1
## 74.0650024414062 74.0699996948242 74.0899963378906 74.0999984741211
## 1 1 2 2
## 74.1060028076172 74.1100006103516 74.120002746582 74.125
## 1 1 3 1
## 74.1399993896484 74.1419982910156 74.1500015258789 74.1600036621094
## 4 1 3 3
## 74.1620025634766 74.1699981689453 74.177001953125 74.1800003051758
## 1 1 1 4
## 74.1900024414062 74.1999969482422 74.2020034790039 74.2200012207031
## 3 2 1 2
## 74.2300033569336 74.2399978637695 74.2470016479492 74.25
## 5 2 1 2
## 74.2600021362305 74.2699966430664 74.2799987792969 74.2890014648438
## 2 1 3 1
## 74.3000030517578 74.3099975585938 74.3199996948242 74.3300018310547
## 4 1 5 2
## 74.3399963378906 74.3499984741211 74.3600006103516 74.3649978637695
## 2 2 5 1
## 74.370002746582 74.379997253418 74.4100036621094 74.4199981689453
## 2 3 1 3
## 74.4300003051758 74.4349975585938 74.4400024414062 74.4499969482422
## 7 1 5 2
## 74.4700012207031 74.4800033569336 74.484001159668 74.4879989624023
## 6 2 2 1
## 74.4899978637695 74.4990005493164 74.5 74.5100021362305
## 6 2 1 5
## 74.5199966430664 74.5299987792969 74.5400009155273 74.5449981689453
## 4 1 3 1
## 74.5500030517578 74.5599975585938 74.5699996948242 74.5739974975586
## 1 2 1 1
## 74.5800018310547 74.5839996337891 74.5999984741211 74.6019973754883
## 6 1 1 1
## 74.6100006103516 74.620002746582 74.629997253418 74.6399993896484
## 3 1 3 2
## 74.6449966430664 74.6699981689453 74.6800003051758 74.6900024414062
## 1 2 2 2
## 74.6999969482422 74.7099990844727 74.7129974365234 74.7269973754883
## 4 3 1 1
## 74.7399978637695 74.7480010986328 74.75 74.7600021362305
## 5 1 2 5
## 74.7630004882812 74.7699966430664 74.7799987792969 74.7900009155273
## 1 2 4 3
## 74.8000030517578 74.802001953125 74.8099975585938 74.8199996948242
## 1 1 2 1
## 74.8259963989258 74.8300018310547 74.8399963378906 74.8499984741211
## 1 2 2 2
## 74.8610000610352 74.870002746582 74.879997253418 74.8899993896484
## 1 1 2 3
## 74.9000015258789 74.9100036621094 74.9199981689453 74.9339981079102
## 1 1 2 1
## 74.9400024414062 74.947998046875 74.9499969482422 74.9599990844727
## 2 1 1 1
## 74.9700012207031 74.9800033569336 74.9899978637695 74.9980010986328
## 3 2 4 2
## 75 75.0100021362305 75.0199966430664 75.0210037231445
## 2 4 3 1
## 75.0299987792969 75.0380020141602 75.0400009155273 75.0500030517578
## 4 1 2 1
## 75.0599975585938 75.0660018920898 75.0699996948242 75.0899963378906
## 1 1 1 2
## 75.0979995727539 75.0999984741211 75.1050033569336 75.109001159668
## 1 2 1 1
## 75.1100006103516 75.120002746582 75.129997253418 75.1399993896484
## 1 4 3 5
## 75.1439971923828 75.1500015258789 75.1520004272461 75.1600036621094
## 1 2 1 1
## 75.1699981689453 75.1869964599609 75.1900024414062 75.2050018310547
## 2 1 6 1
## 75.2200012207031 75.2300033569336 75.2399978637695 75.2429962158203
## 1 3 3 1
## 75.25 75.2600021362305 75.2699966430664 75.2799987792969
## 3 3 1 1
## 75.3099975585938 75.3199996948242 75.3300018310547 75.3399963378906
## 4 2 1 4
## 75.3499984741211 75.3600006103516 75.370002746582 75.3769989013672
## 4 2 2 1
## 75.379997253418 75.3899993896484 75.4000015258789 75.4100036621094
## 2 7 2 2
## 75.4130020141602 75.4199981689453 75.4300003051758 75.4400024414062
## 1 3 2 3
## 75.4499969482422 75.4540023803711 75.4599990844727 75.4800033569336
## 2 1 5 3
## 75.4899978637695 75.5 75.5100021362305 75.5199966430664
## 3 1 1 1
## 75.5210037231445 75.5299987792969 75.5380020141602 75.5400009155273
## 1 1 1 3
## 75.5500030517578 75.5670013427734 75.5709991455078 75.5800018310547
## 1 1 1 4
## 75.5899963378906 75.5930023193359 75.5999984741211 75.6100006103516
## 3 1 3 4
## 75.620002746582 75.629997253418 75.6309967041016 75.6399993896484
## 9 3 1 3
## 75.6600036621094 75.6660003662109 75.6780014038086 75.6800003051758
## 4 2 1 2
## 75.6900024414062 75.693000793457 75.6999969482422 75.7030029296875
## 1 1 4 1
## 75.7099990844727 75.7300033569336 75.7399978637695 75.75
## 2 1 5 3
## 75.7529983520508 75.7600021362305 75.765998840332 75.7699966430664
## 1 1 1 2
## 75.7799987792969 75.7900009155273 75.8000030517578 75.8099975585938
## 5 1 1 4
## 75.8199996948242 75.8300018310547 75.8399963378906 75.8499984741211
## 1 4 2 1
## 75.8600006103516 75.870002746582 75.879997253418 75.8899993896484
## 1 1 2 1
## 75.9100036621094 75.9179992675781 75.9199981689453 75.9300003051758
## 1 1 2 1
## 75.9400024414062 75.9499969482422 75.9599990844727 75.9800033569336
## 5 4 1 2
## 75.9899978637695 76 76.0009994506836 76.0039978027344
## 1 2 1 2
## 76.0080032348633 76.0100021362305 76.0380020141602 76.0400009155273
## 1 2 1 3
## 76.0500030517578 76.0599975585938 76.0699996948242 76.0800018310547
## 2 3 2 1
## 76.0899963378906 76.0940017700195 76.0999984741211 76.1080017089844
## 1 1 1 1
## 76.1100006103516 76.120002746582 76.129997253418 76.1320037841797
## 5 2 5 1
## 76.1500015258789 76.1520004272461 76.1529998779297 76.1600036621094
## 3 1 1 2
## 76.1620025634766 76.1800003051758 76.1900024414062 76.1999969482422
## 1 2 1 1
## 76.2099990844727 76.2200012207031 76.2220001220703 76.2289962768555
## 3 3 1 1
## 76.2300033569336 76.2330017089844 76.2399978637695 76.2440032958984
## 1 1 2 1
## 76.25 76.2600021362305 76.2799987792969 76.3000030517578
## 2 1 1 4
## 76.3099975585938 76.3199996948242 76.3300018310547 76.3320007324219
## 2 2 2 1
## 76.3399963378906 76.3499984741211 76.3509979248047 76.3759994506836
## 5 3 1 1
## 76.379997253418 76.3899993896484 76.4000015258789 76.4100036621094
## 2 5 2 5
## 76.4219970703125 76.4300003051758 76.4400024414062 76.4499969482422
## 1 2 3 1
## 76.4599990844727 76.4660034179688 76.4700012207031 76.4800033569336
## 1 1 1 2
## 76.4899978637695 76.5 76.5029983520508 76.5100021362305
## 4 3 1 1
## 76.5199966430664 76.5299987792969 76.5400009155273 76.5459976196289
## 1 2 1 1
## 76.5500030517578 76.5599975585938 76.5699996948242 76.5800018310547
## 5 4 1 1
## 76.5899963378906 76.5999984741211 76.6080017089844 76.6100006103516
## 2 1 1 1
## 76.620002746582 76.625 76.629997253418 76.6399993896484
## 7 1 2 6
## 76.6449966430664 76.6500015258789 76.6559982299805 76.6589965820312
## 1 1 1 1
## 76.6600036621094 76.6699981689453 76.6800003051758 76.6900024414062
## 3 5 2 4
## 76.6999969482422 76.7099990844727 76.7249984741211 76.7300033569336
## 1 2 1 1
## 76.7399978637695 76.75 76.7600021362305 76.7699966430664
## 2 2 3 3
## 76.7799987792969 76.7900009155273 76.8000030517578 76.8099975585938
## 2 3 3 3
## 76.8150024414062 76.8199996948242 76.8239974975586 76.8300018310547
## 1 1 1 5
## 76.838996887207 76.8399963378906 76.8499984741211 76.870002746582
## 1 4 2 1
## 76.879997253418 76.8899993896484 76.9100036621094 76.9199981689453
## 3 2 3 2
## 76.9240036010742 76.9300003051758 76.9499969482422 76.9509963989258
## 1 3 1 1
## 76.9599990844727 76.9700012207031 76.9789962768555 76.9800033569336
## 3 4 1 1
## 76.9810028076172 76.9899978637695 77 77.0100021362305
## 1 4 1 4
## 77.0199966430664 77.0299987792969 77.0380020141602 77.0400009155273
## 6 3 1 4
## 77.0500030517578 77.0599975585938 77.0699996948242 77.0800018310547
## 1 2 2 2
## 77.0950012207031 77.0999984741211 77.1100006103516 77.120002746582
## 1 1 1 3
## 77.129997253418 77.1340026855469 77.1399993896484 77.1460037231445
## 1 1 2 1
## 77.1500015258789 77.1699981689453 77.1800003051758 77.1880035400391
## 1 3 2 1
## 77.1900024414062 77.1999969482422 77.2099990844727 77.2200012207031
## 2 2 2 1
## 77.2300033569336 77.2399978637695 77.25 77.2600021362305
## 2 4 1 4
## 77.2649993896484 77.2699966430664 77.2799987792969 77.2900009155273
## 1 1 1 2
## 77.3000030517578 77.3099975585938 77.3150024414062 77.3300018310547
## 2 1 1 3
## 77.3399963378906 77.3460006713867 77.3489990234375 77.3499984741211
## 3 1 1 1
## 77.3600006103516 77.370002746582 77.379997253418 77.3899993896484
## 5 1 1 1
## 77.3929977416992 77.3960037231445 77.4000015258789 77.4100036621094
## 1 1 5 4
## 77.4199981689453 77.4300003051758 77.4400024414062 77.4499969482422
## 2 2 1 2
## 77.4800033569336 77.4889984130859 77.4899978637695 77.5
## 1 1 6 3
## 77.5100021362305 77.5199966430664 77.5299987792969 77.5400009155273
## 2 5 2 3
## 77.5449981689453 77.5500030517578 77.5550003051758 77.5599975585938
## 1 3 1 4
## 77.5800018310547 77.5810012817383 77.5899963378906 77.5999984741211
## 2 1 2 3
## 77.6269989013672 77.6370010375977 77.6399993896484 77.6500015258789
## 1 1 4 2
## 77.6600036621094 77.6650009155273 77.6699981689453 77.6800003051758
## 1 1 1 4
## 77.6900024414062 77.6999969482422 77.7099990844727 77.7200012207031
## 4 1 2 4
## 77.7300033569336 77.7399978637695 77.75 77.7600021362305
## 5 1 4 3
## 77.765998840332 77.7699966430664 77.7789993286133 77.7799987792969
## 1 4 1 3
## 77.7900009155273 77.8000030517578 77.8099975585938 77.8209991455078
## 3 4 3 1
## 77.8300018310547 77.8399963378906 77.8499984741211 77.8600006103516
## 4 2 2 1
## 77.8639984130859 77.870002746582 77.8789978027344 77.879997253418
## 1 2 1 1
## 77.9100036621094 77.9199981689453 77.9300003051758 77.9400024414062
## 4 2 3 1
## 77.9449996948242 77.9489974975586 77.9499969482422 77.9599990844727
## 1 1 3 1
## 77.9700012207031 77.9800033569336 77.9869995117188 77.9899978637695
## 3 2 1 3
## 78 78.0100021362305 78.0199966430664 78.0299987792969
## 4 5 4 1
## 78.0400009155273 78.052001953125 78.0599975585938 78.0699996948242
## 1 1 2 2
## 78.0800018310547 78.0899963378906 78.0999984741211 78.1100006103516
## 2 2 2 2
## 78.120002746582 78.129997253418 78.1500015258789 78.1600036621094
## 1 2 5 6
## 78.1699981689453 78.1800003051758 78.1900024414062 78.1999969482422
## 6 2 1 1
## 78.2099990844727 78.2200012207031 78.2259979248047 78.2300033569336
## 1 2 1 1
## 78.2310028076172 78.234001159668 78.2399978637695 78.2699966430664
## 1 1 2 1
## 78.2799987792969 78.2900009155273 78.2979965209961 78.3000030517578
## 2 2 1 1
## 78.3099975585938 78.3170013427734 78.3199996948242 78.3259963989258
## 1 1 2 1
## 78.3399963378906 78.3600006103516 78.370002746582 78.379997253418
## 2 3 2 3
## 78.3899993896484 78.3919982910156 78.4000015258789 78.4100036621094
## 1 1 5 2
## 78.4169998168945 78.4199981689453 78.4300003051758 78.4369964599609
## 1 2 3 1
## 78.4400024414062 78.4499969482422 78.4700012207031 78.4800033569336
## 3 4 1 1
## 78.4899978637695 78.5 78.5199966430664 78.5299987792969
## 6 4 2 3
## 78.5400009155273 78.5500030517578 78.5599975585938 78.5699996948242
## 1 1 5 1
## 78.5800018310547 78.5879974365234 78.5899963378906 78.5999984741211
## 2 1 4 2
## 78.6060028076172 78.6070022583008 78.6100006103516 78.6110000610352
## 1 1 10 1
## 78.620002746582 78.629997253418 78.6399993896484 78.6439971923828
## 1 3 1 1
## 78.6500015258789 78.6520004272461 78.6600036621094 78.6699981689453
## 1 2 3 3
## 78.6900024414062 78.6999969482422 78.7099990844727 78.7200012207031
## 6 3 4 2
## 78.7269973754883 78.7300033569336 78.7399978637695 78.75
## 1 2 2 2
## 78.7600021362305 78.7699966430664 78.7799987792969 78.7900009155273
## 2 1 4 1
## 78.8000030517578 78.8099975585938 78.8199996948242 78.8300018310547
## 4 6 3 2
## 78.838996887207 78.8399963378906 78.8479995727539 78.8499984741211
## 2 3 1 3
## 78.8600006103516 78.870002746582 78.879997253418 78.8899993896484
## 1 2 2 4
## 78.9000015258789 78.9100036621094 78.9199981689453 78.9300003051758
## 5 3 1 5
## 78.9400024414062 78.9499969482422 78.9599990844727 78.9700012207031
## 2 4 5 1
## 78.9800033569336 78.9899978637695 79.0070037841797 79.0199966430664
## 2 1 1 1
## 79.0299987792969 79.0400009155273 79.0490036010742 79.0500030517578
## 2 3 1 1
## 79.0599975585938 79.0699996948242 79.0719985961914 79.0800018310547
## 1 3 1 1
## 79.0899963378906 79.0999984741211 79.1100006103516 79.120002746582
## 5 1 1 2
## 79.1399993896484 79.1500015258789 79.1699981689453 79.1800003051758
## 1 1 3 2
## 79.1849975585938 79.1900024414062 79.1999969482422 79.2099990844727
## 1 1 2 3
## 79.2200012207031 79.2300033569336 79.2399978637695 79.25
## 3 1 1 2
## 79.254997253418 79.2600021362305 79.2699966430664 79.2799987792969
## 1 1 6 4
## 79.2900009155273 79.3000030517578 79.306999206543 79.3199996948242
## 1 3 2 2
## 79.3300018310547 79.3369979858398 79.3399963378906 79.3499984741211
## 4 1 2 1
## 79.3600006103516 79.370002746582 79.379997253418 79.3899993896484
## 3 3 3 3
## 79.4000015258789 79.4100036621094 79.411003112793 79.4150009155273
## 4 1 1 1
## 79.4199981689453 79.4300003051758 79.4400024414062 79.4499969482422
## 2 1 1 3
## 79.4509963989258 79.463996887207 79.4700012207031 79.4800033569336
## 1 1 3 1
## 79.4899978637695 79.5 79.5100021362305 79.5199966430664
## 2 2 3 2
## 79.5299987792969 79.5400009155273 79.5410003662109 79.5500030517578
## 2 1 2 3
## 79.5599975585938 79.5699996948242 79.5800018310547 79.5899963378906
## 1 2 4 1
## 79.5999984741211 79.6100006103516 79.620002746582 79.629997253418
## 3 2 4 4
## 79.6399993896484 79.6500015258789 79.6600036621094 79.6620025634766
## 1 2 2 1
## 79.6699981689453 79.6900024414062 79.6999969482422 79.7099990844727
## 5 2 1 2
## 79.713996887207 79.7300033569336 79.7399978637695 79.7460021972656
## 1 2 1 1
## 79.75 79.7600021362305 79.7699966430664 79.7760009765625
## 3 1 2 1
## 79.7799987792969 79.7900009155273 79.8000030517578 79.8050003051758
## 1 2 6 1
## 79.8199996948242 79.8270034790039 79.8300018310547 79.8320007324219
## 1 1 3 1
## 79.8499984741211 79.8600006103516 79.870002746582 79.879997253418
## 2 1 4 4
## 79.8820037841797 79.8870010375977 79.9000015258789 79.9100036621094
## 1 1 1 3
## 79.9199981689453 79.9300003051758 79.9400024414062 79.9499969482422
## 1 1 3 2
## 79.9599990844727 79.9700012207031 79.9720001220703 79.9800033569336
## 3 4 1 5
## 79.9860000610352 79.9899978637695 79.9970016479492 80
## 1 1 1 2
## 80.0029983520508 80.0100021362305 80.0199966430664 80.0299987792969
## 1 3 2 2
## 80.0400009155273 80.0500030517578 80.0599975585938 80.0699996948242
## 2 1 1 3
## 80.0800018310547 80.0899963378906 80.1100006103516 80.120002746582
## 2 2 3 5
## 80.129997253418 80.1309967041016 80.1429977416992 80.1500015258789
## 2 2 1 2
## 80.1600036621094 80.1640014648438 80.1800003051758 80.1900024414062
## 3 1 2 1
## 80.1999969482422 80.2099990844727 80.2300033569336 80.2399978637695
## 5 5 2 3
## 80.25 80.2630004882812 80.2699966430664 80.2799987792969
## 4 1 2 1
## 80.2890014648438 80.2900009155273 80.3000030517578 80.3199996948242
## 1 2 3 3
## 80.338996887207 80.3399963378906 80.3470001220703 80.3499984741211
## 1 2 2 4
## 80.3600006103516 80.370002746582 80.3759994506836 80.379997253418
## 2 5 1 3
## 80.3809967041016 80.3899993896484 80.4000015258789 80.4199981689453
## 1 4 2 3
## 80.427001953125 80.4380035400391 80.4400024414062 80.4499969482422
## 1 1 2 3
## 80.4599990844727 80.4700012207031 80.4739990234375 80.4800033569336
## 1 1 2 3
## 80.4899978637695 80.5 80.5059967041016 80.5100021362305
## 3 2 1 1
## 80.5199966430664 80.5240020751953 80.5299987792969 80.5500030517578
## 2 1 2 2
## 80.5699996948242 80.5800018310547 80.6070022583008 80.6100006103516
## 2 2 1 2
## 80.620002746582 80.629997253418 80.6399993896484 80.640998840332
## 3 2 3 1
## 80.6569976806641 80.6600036621094 80.6699981689453 80.677001953125
## 2 1 1 1
## 80.6800003051758 80.6880035400391 80.6900024414062 80.7099990844727
## 3 1 1 3
## 80.7200012207031 80.7300033569336 80.7360000610352 80.7399978637695
## 1 2 1 5
## 80.75 80.7600021362305 80.7789993286133 80.7799987792969
## 3 4 2 3
## 80.7900009155273 80.8099975585938 80.8199996948242 80.8249969482422
## 3 2 3 1
## 80.8300018310547 80.8399963378906 80.8499984741211 80.8529968261719
## 5 1 1 1
## 80.8600006103516 80.870002746582 80.9199981689453 80.9499969482422
## 5 5 3 1
## 80.9599990844727 80.9700012207031 80.9800033569336 81
## 3 5 4 1
## 81.0100021362305 81.0139999389648 81.0199966430664 81.0299987792969
## 1 1 3 3
## 81.0400009155273 81.0410003662109 81.0500030517578 81.0530014038086
## 3 1 1 3
## 81.0599975585938 81.0699996948242 81.0800018310547 81.0879974365234
## 1 3 1 1
## 81.088996887207 81.0899963378906 81.0950012207031 81.0999984741211
## 1 2 1 3
## 81.1100006103516 81.1159973144531 81.120002746582 81.129997253418
## 4 1 2 3
## 81.1399993896484 81.1429977416992 81.1500015258789 81.1510009765625
## 3 1 3 1
## 81.1600036621094 81.1699981689453 81.1900024414062 81.1910018920898
## 1 4 2 1
## 81.1999969482422 81.2080001831055 81.2200012207031 81.2300033569336
## 1 1 2 3
## 81.2389984130859 81.2409973144531 81.2429962158203 81.2699966430664
## 1 1 1 2
## 81.2799987792969 81.2900009155273 81.3000030517578 81.3010025024414
## 3 1 2 1
## 81.3099975585938 81.3199996948242 81.3300018310547 81.3399963378906
## 2 5 1 3
## 81.3499984741211 81.3600006103516 81.370002746582 81.3960037231445
## 2 2 4 1
## 81.4000015258789 81.4029998779297 81.4100036621094 81.4169998168945
## 1 1 3 1
## 81.4300003051758 81.4400024414062 81.4499969482422 81.4570007324219
## 1 4 1 1
## 81.4599990844727 81.4700012207031 81.4800033569336 81.4899978637695
## 1 1 1 1
## 81.5 81.5100021362305 81.5199966430664 81.5299987792969
## 1 3 2 2
## 81.5400009155273 81.5500030517578 81.5589981079102 81.5599975585938
## 15 2 1 1
## 81.5699996948242 81.5800018310547 81.5899963378906 81.5999984741211
## 2 1 1 1
## 81.620002746582 81.6230010986328 81.629997253418 81.6399993896484
## 2 1 2 5
## 81.6419982910156 81.6500015258789 81.6520004272461 81.6600036621094
## 1 6 1 1
## 81.6699981689453 81.6800003051758 81.681999206543 81.6900024414062
## 2 3 1 2
## 81.697998046875 81.6999969482422 81.7030029296875 81.7099990844727
## 1 2 1 3
## 81.7119979858398 81.7200012207031 81.7229995727539 81.7399978637695
## 1 1 1 1
## 81.75 81.7580032348633 81.7600021362305 81.7699966430664
## 3 1 2 2
## 81.7799987792969 81.7900009155273 81.8000030517578 81.8099975585938
## 1 3 5 1
## 81.8199996948242 81.8300018310547 81.8399963378906 81.8410034179688
## 1 3 3 1
## 81.8499984741211 81.8600006103516 81.8690032958984 81.879997253418
## 1 1 1 3
## 81.8899993896484 81.9000015258789 81.9100036621094 81.9199981689453
## 1 3 4 1
## 81.9300003051758 81.9400024414062 81.9499969482422 81.9599990844727
## 4 4 1 1
## 81.9700012207031 81.9800033569336 81.9899978637695 82
## 1 3 6 2
## 82.004997253418 82.0100021362305 82.0120010375977 82.0199966430664
## 1 3 1 2
## 82.0299987792969 82.0400009155273 82.0500030517578 82.0599975585938
## 4 2 1 1
## 82.0719985961914 82.0800018310547 82.0899963378906 82.0979995727539
## 1 1 2 1
## 82.0989990234375 82.0999984741211 82.1100006103516 82.1149978637695
## 2 4 4 1
## 82.120002746582 82.1350021362305 82.1399993896484 82.1500015258789
## 2 1 3 1
## 82.1529998779297 82.1600036621094 82.1699981689453 82.1800003051758
## 1 3 2 3
## 82.1839981079102 82.1900024414062 82.1999969482422 82.2099990844727
## 1 3 3 1
## 82.2200012207031 82.2300033569336 82.25 82.2600021362305
## 5 5 1 3
## 82.2699966430664 82.2799987792969 82.3000030517578 82.3300018310547
## 2 1 4 2
## 82.3330001831055 82.3399963378906 82.3499984741211 82.3600006103516
## 1 3 2 2
## 82.370002746582 82.3769989013672 82.3899993896484 82.4000015258789
## 2 1 1 1
## 82.4100036621094 82.4199981689453 82.4300003051758 82.4400024414062
## 2 2 3 2
## 82.4570007324219 82.4599990844727 82.4670028686523 82.4800033569336
## 1 2 1 4
## 82.4899978637695 82.5 82.5100021362305 82.5199966430664
## 2 5 6 1
## 82.5400009155273 82.5410003662109 82.5599975585938 82.5899963378906
## 3 1 4 2
## 82.5999984741211 82.6100006103516 82.620002746582 82.629997253418
## 3 1 4 2
## 82.6399993896484 82.6500015258789 82.6559982299805 82.6600036621094
## 3 4 1 1
## 82.6699981689453 82.6900024414062 82.6999969482422 82.7020034790039
## 3 2 2 1
## 82.7129974365234 82.7200012207031 82.7249984741211 82.7300033569336
## 1 2 1 1
## 82.7399978637695 82.7480010986328 82.7600021362305 82.7630004882812
## 5 1 1 2
## 82.7699966430664 82.7779998779297 82.7799987792969 82.7809982299805
## 1 1 3 1
## 82.7900009155273 82.8000030517578 82.8099975585938 82.8199996948242
## 3 2 2 2
## 82.8290023803711 82.8300018310547 82.8399963378906 82.8499984741211
## 1 2 2 6
## 82.8600006103516 82.870002746582 82.879997253418 82.8899993896484
## 4 2 3 3
## 82.8929977416992 82.9000015258789 82.9100036621094 82.9199981689453
## 1 1 4 2
## 82.9400024414062 82.9499969482422 82.9520034790039 82.9700012207031
## 4 2 1 1
## 82.9800033569336 82.9860000610352 82.9889984130859 82.9899978637695
## 5 1 1 3
## 83 83.0100021362305 83.0189971923828 83.0199966430664
## 4 1 1 3
## 83.0299987792969 83.0400009155273 83.0500030517578 83.0599975585938
## 4 1 2 1
## 83.0699996948242 83.0800018310547 83.0899963378906 83.0999984741211
## 1 1 2 6
## 83.120002746582 83.129997253418 83.1500015258789 83.1600036621094
## 5 1 1 6
## 83.1699981689453 83.1900024414062 83.1969985961914 83.1999969482422
## 3 2 1 3
## 83.2099990844727 83.2200012207031 83.2300033569336 83.2399978637695
## 3 3 2 4
## 83.2600021362305 83.2699966430664 83.2799987792969 83.2900009155273
## 3 5 2 1
## 83.3000030517578 83.3099975585938 83.3199996948242 83.3300018310547
## 3 3 1 4
## 83.3399963378906 83.3499984741211 83.3529968261719 83.3600006103516
## 1 1 2 1
## 83.3639984130859 83.3690032958984 83.370002746582 83.379997253418
## 3 1 2 2
## 83.3899993896484 83.4000015258789 83.4100036621094 83.4130020141602
## 3 3 2 1
## 83.4199981689453 83.4300003051758 83.4349975585938 83.4400024414062
## 4 3 1 4
## 83.4499969482422 83.4599990844727 83.4700012207031 83.4800033569336
## 1 2 2 5
## 83.4899978637695 83.5 83.5100021362305 83.5199966430664
## 3 1 2 2
## 83.5500030517578 83.5599975585938 83.5690002441406 83.5699996948242
## 2 3 1 1
## 83.5800018310547 83.5899963378906 83.5999984741211 83.6100006103516
## 6 3 1 1
## 83.620002746582 83.629997253418 83.6309967041016 83.6399993896484
## 3 3 1 2
## 83.6500015258789 83.6549987792969 83.6600036621094 83.6699981689453
## 1 1 2 4
## 83.6800003051758 83.6900024414062 83.6920013427734 83.6999969482422
## 1 2 1 2
## 83.7099990844727 83.7200012207031 83.7300033569336 83.75
## 1 3 4 1
## 83.7519989013672 83.7620010375977 83.7630004882812 83.7699966430664
## 1 1 1 5
## 83.7799987792969 83.7870025634766 83.7900009155273 83.8000030517578
## 2 1 4 5
## 83.8099975585938 83.8209991455078 83.8300018310547 83.8499984741211
## 3 1 3 4
## 83.8539962768555 83.8600006103516 83.870002746582 83.879997253418
## 1 1 1 2
## 83.8809967041016 83.8860015869141 83.8899993896484 83.9000015258789
## 1 1 2 2
## 83.9100036621094 83.9189987182617 83.9300003051758 83.9400024414062
## 2 1 1 3
## 83.9469985961914 83.9489974975586 83.9499969482422 83.9599990844727
## 1 1 3 2
## 83.9700012207031 83.9800033569336 83.9899978637695 84.0100021362305
## 1 3 1 3
## 84.0199966430664 84.0299987792969 84.0400009155273 84.0510025024414
## 1 1 3 1
## 84.0699996948242 84.0749969482422 84.0800018310547 84.0899963378906
## 4 1 2 1
## 84.0989990234375 84.0999984741211 84.1100006103516 84.120002746582
## 1 3 1 2
## 84.129997253418 84.1500015258789 84.1600036621094 84.1679992675781
## 1 2 1 1
## 84.1800003051758 84.1900024414062 84.2200012207031 84.2300033569336
## 2 1 2 1
## 84.2399978637695 84.245002746582 84.25 84.2600021362305
## 1 1 2 2
## 84.2689971923828 84.2699966430664 84.2799987792969 84.2839965820312
## 1 4 1 1
## 84.2880020141602 84.2900009155273 84.2990036010742 84.3099975585938
## 1 1 1 3
## 84.3300018310547 84.3399963378906 84.3499984741211 84.3600006103516
## 2 2 1 1
## 84.370002746582 84.379997253418 84.3899993896484 84.4000015258789
## 2 3 1 4
## 84.4100036621094 84.4199981689453 84.4229965209961 84.4250030517578
## 2 2 1 1
## 84.4300003051758 84.4380035400391 84.4400024414062 84.443000793457
## 4 1 5 1
## 84.4499969482422 84.4560012817383 84.4599990844727 84.4700012207031
## 4 1 1 4
## 84.4800033569336 84.5 84.5100021362305 84.5199966430664
## 3 2 1 2
## 84.5400009155273 84.5500030517578 84.5599975585938 84.5699996948242
## 1 2 1 3
## 84.5719985961914 84.5800018310547 84.5849990844727 84.5899963378906
## 1 4 1 1
## 84.5999984741211 84.6100006103516 84.629997253418 84.6399993896484
## 1 1 1 1
## 84.6500015258789 84.6699981689453 84.6800003051758 84.6900024414062
## 3 1 1 1
## 84.6959991455078 84.6999969482422 84.7399978637695 84.7600021362305
## 1 1 5 1
## 84.7900009155273 84.8000030517578 84.8099975585938 84.8199996948242
## 5 2 1 3
## 84.8300018310547 84.8399963378906 84.8499984741211 84.8600006103516
## 2 2 3 2
## 84.870002746582 84.879997253418 84.8899993896484 84.9100036621094
## 3 2 3 4
## 84.9199981689453 84.9300003051758 84.9400024414062 84.9599990844727
## 2 2 1 3
## 84.9700012207031 84.9769973754883 84.9800033569336 84.9899978637695
## 1 1 5 1
## 84.9970016479492 85.0059967041016 85.0100021362305 85.0199966430664
## 1 1 1 3
## 85.0270004272461 85.0299987792969 85.0400009155273 85.0500030517578
## 1 1 2 1
## 85.0599975585938 85.0699996948242 85.0800018310547 85.0839996337891
## 2 3 2 1
## 85.0999984741211 85.1050033569336 85.1100006103516 85.120002746582
## 2 1 4 2
## 85.129997253418 85.1399993896484 85.1500015258789 85.1529998779297
## 2 2 2 1
## 85.1600036621094 85.1699981689453 85.1999969482422 85.2099990844727
## 5 2 4 3
## 85.2200012207031 85.2300033569336 85.2399978637695 85.2460021972656
## 5 1 1 1
## 85.2600021362305 85.2699966430664 85.2789993286133 85.2799987792969
## 1 1 1 2
## 85.2900009155273 85.3000030517578 85.302001953125 85.3099975585938
## 1 1 1 1
## 85.3199996948242 85.3219985961914 85.3300018310547 85.3399963378906
## 3 1 4 1
## 85.3470001220703 85.3499984741211 85.3600006103516 85.3720016479492
## 1 2 2 1
## 85.3730010986328 85.3789978027344 85.379997253418 85.4000015258789
## 1 1 1 9
## 85.4100036621094 85.4140014648438 85.4199981689453 85.4209976196289
## 3 1 4 1
## 85.4300003051758 85.4390029907227 85.4400024414062 85.4499969482422
## 1 1 2 3
## 85.4619979858398 85.4800033569336 85.4879989624023 85.5
## 1 4 2 3
## 85.5029983520508 85.5039978027344 85.5100021362305 85.5120010375977
## 1 1 1 1
## 85.5199966430664 85.5299987792969 85.5400009155273 85.5589981079102
## 1 4 4 2
## 85.5599975585938 85.5630035400391 85.5650024414062 85.568000793457
## 3 1 1 1
## 85.5699996948242 85.5820007324219 85.5899963378906 85.609001159668
## 2 1 2 3
## 85.6100006103516 85.620002746582 85.6220016479492 85.629997253418
## 1 2 1 2
## 85.6399993896484 85.6500015258789 85.6600036621094 85.6620025634766
## 1 2 1 1
## 85.6900024414062 85.6969985961914 85.6999969482422 85.7099990844727
## 2 1 1 3
## 85.7109985351562 85.7200012207031 85.7310028076172 85.7399978637695
## 1 2 1 1
## 85.7470016479492 85.7699966430664 85.7799987792969 85.7900009155273
## 2 2 3 1
## 85.8000030517578 85.8300018310547 85.8379974365234 85.8399963378906
## 1 1 1 2
## 85.8499984741211 85.8600006103516 85.8610000610352 85.8669967651367
## 1 1 1 1
## 85.870002746582 85.8990020751953 85.9039993286133 85.9059982299805
## 5 1 1 1
## 85.9100036621094 85.9199981689453 85.9250030517578 85.9499969482422
## 1 1 1 1
## 85.9599990844727 85.9700012207031 85.9800033569336 85.9899978637695
## 1 1 2 5
## 86 86.0029983520508 86.0100021362305 86.0199966430664
## 2 1 4 8
## 86.0299987792969 86.0350036621094 86.0500030517578 86.0599975585938
## 2 1 1 2
## 86.0699996948242 86.0800018310547 86.0999984741211 86.1100006103516
## 2 6 1 4
## 86.120002746582 86.129997253418 86.1399993896484 86.1500015258789
## 2 1 5 6
## 86.1600036621094 86.1699981689453 86.1800003051758 86.1900024414062
## 3 3 2 5
## 86.1999969482422 86.2099990844727 86.2200012207031 86.2300033569336
## 3 2 2 4
## 86.2369995117188 86.2399978637695 86.2480010986328 86.25
## 1 5 1 3
## 86.2539978027344 86.2600021362305 86.2799987792969 86.2809982299805
## 1 3 1 1
## 86.2900009155273 86.3000030517578 86.3079986572266 86.3199996948242
## 2 6 1 2
## 86.3300018310547 86.3399963378906 86.3499984741211 86.379997253418
## 3 1 3 3
## 86.3850021362305 86.3899993896484 86.3949966430664 86.4000015258789
## 1 4 1 1
## 86.4089965820312 86.4100036621094 86.4199981689453 86.4400024414062
## 1 2 2 2
## 86.4599990844727 86.4700012207031 86.4800033569336 86.4899978637695
## 2 2 2 1
## 86.4919967651367 86.5 86.5100021362305 86.5199966430664
## 1 1 2 2
## 86.5299987792969 86.5380020141602 86.5400009155273 86.5410003662109
## 6 2 1 1
## 86.5500030517578 86.5599975585938 86.5699996948242 86.5899963378906
## 1 3 7 2
## 86.5999984741211 86.6100006103516 86.620002746582 86.629997253418
## 2 1 2 2
## 86.6399993896484 86.6449966430664 86.6500015258789 86.6520004272461
## 1 1 3 1
## 86.6699981689453 86.6800003051758 86.6900024414062 86.6999969482422
## 1 3 2 2
## 86.7119979858398 86.7200012207031 86.7239990234375 86.7300033569336
## 1 4 1 3
## 86.7600021362305 86.7699966430664 86.7799987792969 86.7819976806641
## 1 1 1 1
## 86.7900009155273 86.8000030517578 86.8099975585938 86.8140029907227
## 1 3 3 1
## 86.8150024414062 86.8199996948242 86.8300018310547 86.8399963378906
## 1 1 1 4
## 86.8600006103516 86.870002746582 86.8740005493164 86.879997253418
## 3 1 1 2
## 86.8850021362305 86.8899993896484 86.9000015258789 86.9100036621094
## 1 1 3 4
## 86.9199981689453 86.9300003051758 86.9400024414062 86.9599990844727
## 3 1 4 1
## 86.9700012207031 87 87.0100021362305 87.0199966430664
## 4 1 2 1
## 87.0299987792969 87.0400009155273 87.0449981689453 87.0479965209961
## 1 2 1 1
## 87.0500030517578 87.0530014038086 87.0599975585938 87.0699996948242
## 2 1 3 2
## 87.0800018310547 87.0820007324219 87.0899963378906 87.0999984741211
## 2 1 2 2
## 87.1070022583008 87.1100006103516 87.1169967651367 87.120002746582
## 1 2 1 2
## 87.129997253418 87.1600036621094 87.1679992675781 87.1699981689453
## 1 4 1 1
## 87.1719970703125 87.1800003051758 87.1900024414062 87.1999969482422
## 2 1 1 2
## 87.2070007324219 87.2099990844727 87.2200012207031 87.2300033569336
## 1 4 2 3
## 87.2399978637695 87.2600021362305 87.2699966430664 87.2740020751953
## 2 1 3 1
## 87.2799987792969 87.2900009155273 87.3000030517578 87.3059997558594
## 4 1 2 1
## 87.3099975585938 87.3109970092773 87.3199996948242 87.3300018310547
## 3 1 1 2
## 87.3399963378906 87.3499984741211 87.3600006103516 87.370002746582
## 1 1 5 3
## 87.379997253418 87.3860015869141 87.3870010375977 87.3899993896484
## 1 1 1 1
## 87.4100036621094 87.4130020141602 87.4199981689453 87.4449996948242
## 3 1 2 1
## 87.4499969482422 87.4599990844727 87.4700012207031 87.4800033569336
## 3 1 1 4
## 87.4899978637695 87.4929962158203 87.5100021362305 87.5199966430664
## 3 1 1 2
## 87.5240020751953 87.5299987792969 87.5380020141602 87.5400009155273
## 1 2 1 1
## 87.5599975585938 87.5800018310547 87.5899963378906 87.5999984741211
## 1 6 3 1
## 87.6100006103516 87.6110000610352 87.620002746582 87.6220016479492
## 3 1 2 1
## 87.629997253418 87.6399993896484 87.6500015258789 87.6800003051758
## 1 1 1 1
## 87.6900024414062 87.693000793457 87.6999969482422 87.7089996337891
## 2 1 3 1
## 87.7099990844727 87.7200012207031 87.75 87.7600021362305
## 1 1 2 2
## 87.7649993896484 87.7699966430664 87.7799987792969 87.7900009155273
## 1 2 1 1
## 87.8000030517578 87.802001953125 87.8199996948242 87.8239974975586
## 3 2 2 1
## 87.8300018310547 87.8399963378906 87.8600006103516 87.870002746582
## 3 1 1 2
## 87.879997253418 87.8830032348633 87.8899993896484 87.9000015258789
## 2 1 2 4
## 87.9100036621094 87.9199981689453 87.9300003051758 87.9400024414062
## 1 6 2 1
## 87.9499969482422 87.9599990844727 87.9649963378906 87.9800033569336
## 4 3 1 1
## 87.9820022583008 87.9899978637695 88 88.0100021362305
## 1 2 1 4
## 88.0199966430664 88.0299987792969 88.0400009155273 88.0599975585938
## 1 2 2 4
## 88.0699996948242 88.0800018310547 88.0979995727539 88.0999984741211
## 5 1 1 1
## 88.1100006103516 88.1159973144531 88.120002746582 88.129997253418
## 5 1 1 1
## 88.1389999389648 88.1500015258789 88.1600036621094 88.1699981689453
## 1 2 1 1
## 88.1800003051758 88.1900024414062 88.1999969482422 88.2099990844727
## 2 3 3 1
## 88.2200012207031 88.2300033569336 88.2399978637695 88.25
## 1 2 2 5
## 88.2600021362305 88.2699966430664 88.2799987792969 88.2900009155273
## 1 2 3 3
## 88.3000030517578 88.3089981079102 88.3099975585938 88.3199996948242
## 2 1 5 2
## 88.3369979858398 88.3399963378906 88.3499984741211 88.3570022583008
## 1 2 1 1
## 88.3600006103516 88.3639984130859 88.3679962158203 88.370002746582
## 2 2 1 4
## 88.3899993896484 88.3980026245117 88.4000015258789 88.4100036621094
## 3 1 2 6
## 88.4199981689453 88.4300003051758 88.4390029907227 88.4400024414062
## 2 1 1 2
## 88.4499969482422 88.4599990844727 88.4700012207031 88.4800033569336
## 1 3 7 2
## 88.4899978637695 88.4940032958984 88.5 88.504997253418
## 3 1 2 1
## 88.5199966430664 88.5299987792969 88.5309982299805 88.5400009155273
## 3 5 1 2
## 88.552001953125 88.5599975585938 88.5660018920898 88.5699996948242
## 1 2 1 3
## 88.5800018310547 88.5899963378906 88.5970001220703 88.5999984741211
## 5 2 1 2
## 88.6019973754883 88.6100006103516 88.629997253418 88.6330032348633
## 1 1 1 1
## 88.6399993896484 88.6699981689453 88.6750030517578 88.6900024414062
## 3 1 1 5
## 88.7099990844727 88.7200012207031 88.7259979248047 88.7300033569336
## 2 2 1 7
## 88.7389984130859 88.7399978637695 88.7440032958984 88.75
## 1 2 1 1
## 88.7600021362305 88.7649993896484 88.7699966430664 88.7799987792969
## 3 1 2 4
## 88.7900009155273 88.8199996948242 88.8219985961914 88.8300018310547
## 3 5 1 1
## 88.8399963378906 88.8499984741211 88.8600006103516 88.870002746582
## 8 1 3 2
## 88.879997253418 88.8870010375977 88.8899993896484 88.9000015258789
## 5 1 1 1
## 88.9189987182617 88.9199981689453 88.9219970703125 88.9300003051758
## 1 1 1 3
## 88.9530029296875 88.9599990844727 88.9609985351562 88.9700012207031
## 1 5 1 1
## 88.9749984741211 88.9800033569336 88.9899978637695 89.0029983520508
## 1 1 2 1
## 89.0100021362305 89.0199966430664 89.0299987792969 89.0400009155273
## 1 3 2 2
## 89.0500030517578 89.0599975585938 89.0699996948242 89.0899963378906
## 1 5 2 3
## 89.0920028686523 89.0999984741211 89.1100006103516 89.1119995117188
## 1 1 2 1
## 89.120002746582 89.129997253418 89.1399993896484 89.1500015258789
## 1 2 1 3
## 89.1529998779297 89.1600036621094 89.1679992675781 89.1699981689453
## 1 2 1 2
## 89.1800003051758 89.1999969482422 89.2099990844727 89.2200012207031
## 1 1 3 2
## 89.2300033569336 89.234001159668 89.2360000610352 89.2399978637695
## 1 1 1 3
## 89.25 89.2699966430664 89.2799987792969 89.3099975585938
## 1 2 7 2
## 89.3199996948242 89.3300018310547 89.3499984741211 89.3600006103516
## 2 2 1 1
## 89.370002746582 89.379997253418 89.3899993896484 89.4100036621094
## 1 3 2 3
## 89.4179992675781 89.4199981689453 89.4300003051758 89.4369964599609
## 1 7 1 1
## 89.4400024414062 89.4499969482422 89.4570007324219 89.4599990844727
## 1 2 1 1
## 89.4700012207031 89.4800033569336 89.4889984130859 89.4899978637695
## 2 3 2 1
## 89.5 89.5100021362305 89.5299987792969 89.5370025634766
## 1 2 2 1
## 89.5400009155273 89.5469970703125 89.5500030517578 89.5599975585938
## 1 1 4 2
## 89.5650024414062 89.5699996948242 89.5800018310547 89.6100006103516
## 1 2 1 1
## 89.620002746582 89.6210021972656 89.629997253418 89.6490020751953
## 3 1 1 1
## 89.6500015258789 89.6600036621094 89.6900024414062 89.7099990844727
## 1 5 1 1
## 89.7200012207031 89.7320022583008 89.7399978637695 89.75
## 3 1 2 2
## 89.7600021362305 89.7900009155273 89.8000030517578 89.8199996948242
## 1 3 10 2
## 89.8300018310547 89.8399963378906 89.8410034179688 89.8420028686523
## 3 6 1 1
## 89.8499984741211 89.8600006103516 89.870002746582 89.879997253418
## 2 1 2 2
## 89.8899993896484 89.8990020751953 89.9100036621094 89.9300003051758
## 3 1 1 1
## 89.9499969482422 89.9520034790039 89.9599990844727 89.9700012207031
## 3 1 1 6
## 89.9800033569336 89.9820022583008 89.9899978637695 90
## 3 1 1 3
## 90.0080032348633 90.0100021362305 90.0199966430664 90.0270004272461
## 1 1 4 1
## 90.0299987792969 90.0309982299805 90.0400009155273 90.0599975585938
## 2 1 1 2
## 90.0699996948242 90.0800018310547 90.0899963378906 90.0999984741211
## 3 2 2 1
## 90.1100006103516 90.1399993896484 90.1510009765625 90.1600036621094
## 2 5 1 2
## 90.1660003662109 90.1679992675781 90.1699981689453 90.1800003051758
## 1 1 1 2
## 90.1900024414062 90.1999969482422 90.2099990844727 90.2200012207031
## 5 3 4 1
## 90.2300033569336 90.2399978637695 90.2440032958984 90.25
## 1 3 1 6
## 90.2600021362305 90.2699966430664 90.2799987792969 90.3000030517578
## 4 2 2 1
## 90.3099975585938 90.3300018310547 90.3369979858398 90.3399963378906
## 1 1 1 2
## 90.3499984741211 90.3600006103516 90.370002746582 90.3899993896484
## 1 2 3 2
## 90.3919982910156 90.3990020751953 90.4100036621094 90.4199981689453
## 1 1 3 6
## 90.4300003051758 90.4380035400391 90.4400024414062 90.4499969482422
## 2 1 3 1
## 90.4599990844727 90.4800033569336 90.4899978637695 90.5
## 3 1 2 2
## 90.5059967041016 90.5100021362305 90.5199966430664 90.5400009155273
## 1 5 1 1
## 90.5500030517578 90.5599975585938 90.5630035400391 90.5699996948242
## 2 2 1 2
## 90.5719985961914 90.5849990844727 90.5899963378906 90.5999984741211
## 1 1 4 3
## 90.6060028076172 90.6100006103516 90.620002746582 90.629997253418
## 1 3 1 4
## 90.6399993896484 90.6500015258789 90.6600036621094 90.6699981689453
## 1 6 1 1
## 90.6750030517578 90.6800003051758 90.6849975585938 90.6999969482422
## 1 2 1 2
## 90.7200012207031 90.7300033569336 90.7399978637695 90.75
## 1 3 3 3
## 90.7600021362305 90.7699966430664 90.7799987792969 90.7900009155273
## 5 1 3 1
## 90.8000030517578 90.8099975585938 90.8109970092773 90.8199996948242
## 1 5 1 1
## 90.8300018310547 90.8560028076172 90.8600006103516 90.870002746582
## 1 1 3 2
## 90.9000015258789 90.9100036621094 90.9169998168945 90.9199981689453
## 2 2 1 2
## 90.9400024414062 90.9599990844727 90.9700012207031 90.9800033569336
## 1 1 1 1
## 90.9899978637695 90.9919967651367 91.0100021362305 91.0199966430664
## 3 1 1 1
## 91.0299987792969 91.0500030517578 91.0599975585938 91.0699996948242
## 2 2 3 2
## 91.0800018310547 91.0879974365234 91.0899963378906 91.0999984741211
## 2 2 1 1
## 91.1100006103516 91.120002746582 91.1269989013672 91.129997253418
## 3 1 1 3
## 91.1399993896484 91.1500015258789 91.1520004272461 91.1600036621094
## 1 7 1 2
## 91.1699981689453 91.1800003051758 91.1999969482422 91.2099990844727
## 1 1 1 5
## 91.2200012207031 91.2269973754883 91.2300033569336 91.2399978637695
## 1 1 3 2
## 91.25 91.2600021362305 91.2819976806641 91.2900009155273
## 3 2 1 2
## 91.2969970703125 91.2990036010742 91.3000030517578 91.3099975585938
## 2 1 3 1
## 91.3160018920898 91.3199996948242 91.3300018310547 91.3420028686523
## 1 6 1 1
## 91.3440017700195 91.3499984741211 91.3509979248047 91.3600006103516
## 1 1 1 2
## 91.3639984130859 91.370002746582 91.379997253418 91.3899993896484
## 1 2 4 2
## 91.4000015258789 91.4100036621094 91.4120025634766 91.4189987182617
## 3 1 1 1
## 91.4199981689453 91.4300003051758 91.4400024414062 91.4499969482422
## 2 3 1 1
## 91.4589996337891 91.4599990844727 91.4680023193359 91.4700012207031
## 1 2 1 3
## 91.4728779827386 91.4800033569336 91.4810028076172 91.4889984130859
## 442 1 1 1
## 91.4899978637695 91.5 91.5179977416992 91.5299987792969
## 2 2 1 2
## 91.5400009155273 91.5500030517578 91.5530014038086 91.5599975585938
## 1 1 1 2
## 91.5699996948242 91.5800018310547 91.5899963378906 91.5999984741211
## 1 2 1 1
## 91.6100006103516 91.620002746582 91.629997253418 91.6399993896484
## 3 2 1 4
## 91.6500015258789 91.6640014648438 91.6650009155273 91.6699981689453
## 2 1 1 2
## 91.6740036010742 91.6969985961914 91.7200012207031 91.7300033569336
## 1 2 4 1
## 91.75 91.7570037841797 91.7600021362305 91.7699966430664
## 2 1 3 1
## 91.7799987792969 91.7900009155273 91.8000030517578 91.8199996948242
## 2 1 2 2
## 91.8300018310547 91.8470001220703 91.8600006103516 91.870002746582
## 1 1 4 4
## 91.8870010375977 91.8899993896484 91.9000015258789 91.9100036621094
## 1 4 1 3
## 91.911003112793 91.9400024414062 91.9499969482422 91.9599990844727
## 1 1 4 1
## 91.9700012207031 91.9759979248047 91.9800033569336 91.9820022583008
## 2 1 1 1
## 91.9899978637695 92 92.0100021362305 92.0169982910156
## 3 1 2 1
## 92.0210037231445 92.0439987182617 92.0449981689453 92.0510025024414
## 1 1 1 1
## 92.0589981079102 92.0599975585938 92.0699996948242 92.0800018310547
## 1 6 2 1
## 92.0869979858398 92.0899963378906 92.0910034179688 92.0999984741211
## 1 1 1 2
## 92.1100006103516 92.120002746582 92.1220016479492 92.129997253418
## 1 2 1 1
## 92.1399993896484 92.1490020751953 92.1600036621094 92.1699981689453
## 2 1 3 3
## 92.1800003051758 92.1839981079102 92.1900024414062 92.2099990844727
## 3 1 1 7
## 92.2300033569336 92.234001159668 92.2399978637695 92.2440032958984
## 2 1 2 1
## 92.2480010986328 92.2649993896484 92.2900009155273 92.3000030517578
## 1 1 1 3
## 92.3199996948242 92.3300018310547 92.3399963378906 92.3499984741211
## 2 1 3 2
## 92.3600006103516 92.370002746582 92.379997253418 92.3880004882812
## 1 1 5 1
## 92.4000015258789 92.4100036621094 92.4199981689453 92.4300003051758
## 2 1 3 3
## 92.4400024414062 92.4459991455078 92.4499969482422 92.4599990844727
## 1 1 2 2
## 92.4800033569336 92.4899978637695 92.5 92.5100021362305
## 1 3 2 1
## 92.5199966430664 92.5299987792969 92.5400009155273 92.5599975585938
## 1 2 1 1
## 92.5699996948242 92.5800018310547 92.5899963378906 92.5999984741211
## 2 1 2 1
## 92.6100006103516 92.6139984130859 92.6149978637695 92.6169967651367
## 1 1 1 1
## 92.620002746582 92.629997253418 92.6500015258789 92.6699981689453
## 1 1 3 5
## 92.6900024414062 92.6959991455078 92.6999969482422 92.7099990844727
## 2 1 4 3
## 92.7200012207031 92.7269973754883 92.7399978637695 92.7480010986328
## 1 1 3 1
## 92.75 92.7600021362305 92.7799987792969 92.8000030517578
## 1 2 1 2
## 92.8099975585938 92.8170013427734 92.8199996948242 92.8209991455078
## 3 1 1 3
## 92.8300018310547 92.8399963378906 92.8440017700195 92.8499984741211
## 4 2 1 2
## 92.8519973754883 92.8637432516839 92.870002746582 92.8899993896484
## 1 442 2 1
## 92.9000015258789 92.9039993286133 92.9100036621094 92.9199981689453
## 1 1 2 5
## 92.9300003051758 92.9400024414062 92.9599990844727 92.9700012207031
## 4 2 2 4
## 92.9800033569336 92.9899978637695 93 93.0100021362305
## 1 3 1 1
## 93.0199966430664 93.0299987792969 93.0400009155273 93.0500030517578
## 2 3 1 3
## 93.0599975585938 93.0699996948242 93.0800018310547 93.0810012817383
## 3 1 1 1
## 93.0999984741211 93.1129989624023 93.120002746582 93.1259994506836
## 1 2 1 1
## 93.129997253418 93.1389999389648 93.1399993896484 93.1500015258789
## 1 1 1 2
## 93.1600036621094 93.1699981689453 93.1800003051758 93.1900024414062
## 2 1 1 1
## 93.1999969482422 93.2099990844727 93.2220001220703 93.2300033569336
## 3 1 1 2
## 93.25 93.2600021362305 93.2699966430664 93.2799987792969
## 2 1 2 4
## 93.2900009155273 93.3000030517578 93.3099975585938 93.3199996948242
## 2 1 3 3
## 93.3239974975586 93.3300018310547 93.3399963378906 93.3479995727539
## 1 4 2 1
## 93.3499984741211 93.3679962158203 93.370002746582 93.379997253418
## 2 1 2 1
## 93.3899993896484 93.3949966430664 93.4100036621094 93.4199981689453
## 2 1 3 2
## 93.4300003051758 93.4369964599609 93.4400024414062 93.4499969482422
## 2 1 5 1
## 93.4599990844727 93.4800033569336 93.4899978637695 93.4990005493164
## 2 7 1 1
## 93.5 93.504997253418 93.5100021362305 93.5199966430664
## 3 1 2 1
## 93.5299987792969 93.5400009155273 93.5500030517578 93.5599975585938
## 1 2 5 1
## 93.5699996948242 93.572998046875 93.5800018310547 93.5899963378906
## 2 1 2 1
## 93.6100006103516 93.6119995117188 93.620002746582 93.6399993896484
## 2 1 1 3
## 93.6500015258789 93.6600036621094 93.6630020141602 93.6800003051758
## 1 1 1 2
## 93.681999206543 93.6900024414062 93.7089996337891 93.7099990844727
## 1 2 1 6
## 93.7129974365234 93.7200012207031 93.7300033569336 93.7330017089844
## 1 1 1 1
## 93.7399978637695 93.75 93.7519989013672 93.7570037841797
## 1 1 1 1
## 93.7600021362305 93.7699966430664 93.7799987792969 93.7819976806641
## 2 3 1 1
## 93.7900009155273 93.8099975585938 93.8160018920898 93.8239974975586
## 2 1 1 1
## 93.8300018310547 93.8499984741211 93.8600006103516 93.870002746582
## 1 1 1 1
## 93.8720016479492 93.879997253418 93.8899993896484 93.9089965820312
## 1 1 2 1
## 93.9100036621094 93.931999206543 93.9400024414062 93.9499969482422
## 2 1 2 1
## 93.9700012207031 93.9800033569336 93.9899978637695 94.0199966430664
## 3 1 1 1
## 94.0299987792969 94.0400009155273 94.0500030517578 94.0599975585938
## 2 4 1 2
## 94.0699996948242 94.0780029296875 94.0800018310547 94.0810012817383
## 2 1 1 1
## 94.0899963378906 94.0999984741211 94.1100006103516 94.120002746582
## 3 1 1 1
## 94.129997253418 94.1399993896484 94.1589965820312 94.1600036621094
## 1 1 1 2
## 94.1699981689453 94.1800003051758 94.1900024414062 94.2099990844727
## 2 1 1 2
## 94.2200012207031 94.2399978637695 94.25 94.2699966430664
## 2 1 2 2
## 94.2900009155273 94.3000030517578 94.3050003051758 94.3099975585938
## 2 1 1 1
## 94.3199996948242 94.3300018310547 94.3460006713867 94.3499984741211
## 1 2 1 3
## 94.3600006103516 94.379997253418 94.3880004882812 94.3899993896484
## 2 1 1 2
## 94.4000015258789 94.4100036621094 94.4199981689453 94.4229965209961
## 1 2 3 1
## 94.4300003051758 94.4349975585938 94.4400024414062 94.4499969482422
## 1 1 1 1
## 94.4599990844727 94.4700012207031 94.4800033569336 94.4899978637695
## 3 1 2 1
## 94.4980010986328 94.5059967041016 94.5100021362305 94.5169982910156
## 1 1 2 1
## 94.5299987792969 94.5400009155273 94.5500030517578 94.5599975585938
## 3 1 1 2
## 94.5699996948242 94.5800018310547 94.5899963378906 94.6100006103516
## 1 3 1 1
## 94.620002746582 94.629997253418 94.6399993896484 94.6500015258789
## 1 1 1 3
## 94.6600036621094 94.6699981689453 94.6800003051758 94.6999969482422
## 1 1 5 4
## 94.7099990844727 94.7200012207031 94.7399978637695 94.75
## 2 1 2 2
## 94.754997253418 94.7669982910156 94.7699966430664 94.7799987792969
## 1 1 3 1
## 94.7900009155273 94.8000030517578 94.8010025024414 94.8099975585938
## 1 3 1 2
## 94.8199996948242 94.8300018310547 94.8499984741211 94.8600006103516
## 2 1 2 3
## 94.870002746582 94.879997253418 94.8899993896484 94.9000015258789
## 2 3 1 1
## 94.9199981689453 94.9300003051758 94.9400024414062 94.9499969482422
## 3 5 3 2
## 94.9599990844727 94.9660034179688 94.9700012207031 94.9710006713867
## 2 1 2 1
## 94.9800033569336 94.984001159668 94.9879989624023 94.9899978637695
## 2 1 1 1
## 95 95.0100021362305 95.0199966430664 95.0299987792969
## 1 1 1 1
## 95.0599975585938 95.0699996948242 95.0800018310547 95.0899963378906
## 5 2 4 1
## 95.0999984741211 95.1100006103516 95.120002746582 95.129997253418
## 1 1 4 1
## 95.1360015869141 95.1399993896484 95.1500015258789 95.1600036621094
## 1 2 1 1
## 95.1760025024414 95.1800003051758 95.1900024414062 95.1999969482422
## 1 3 3 1
## 95.2099990844727 95.213996887207 95.2249984741211 95.2300033569336
## 1 1 1 2
## 95.2399978637695 95.25 95.2600021362305 95.2639999389648
## 1 3 3 1
## 95.2699966430664 95.2799987792969 95.2829971313477 95.2900009155273
## 1 1 1 2
## 95.2959976196289 95.3000030517578 95.3199996948242 95.3399963378906
## 1 2 2 2
## 95.3499984741211 95.3600006103516 95.370002746582 95.379997253418
## 1 1 2 2
## 95.3899993896484 95.4000015258789 95.4199981689453 95.4300003051758
## 1 2 1 2
## 95.4400024414062 95.4410018920898 95.4499969482422 95.4599990844727
## 1 1 2 1
## 95.4800033569336 95.4899978637695 95.4940032958984 95.5100021362305
## 1 2 1 1
## 95.5120010375977 95.5199966430664 95.5299987792969 95.5400009155273
## 1 2 1 1
## 95.5500030517578 95.5599975585938 95.5800018310547 95.5810012817383
## 1 2 5 1
## 95.5999984741211 95.6100006103516 95.620002746582 95.629997253418
## 3 4 1 1
## 95.6399993896484 95.6600036621094 95.6679992675781 95.6699981689453
## 1 1 1 2
## 95.6800003051758 95.6900024414062 95.6999969482422 95.7099990844727
## 2 3 1 4
## 95.7200012207031 95.7300033569336 95.7399978637695 95.75
## 1 1 1 5
## 95.765998840332 95.7799987792969 95.7900009155273 95.7969970703125
## 1 1 1 1
## 95.8000030517578 95.8099975585938 95.8199996948242 95.8399963378906
## 1 1 3 1
## 95.8470001220703 95.8499984741211 95.8600006103516 95.879997253418
## 1 2 3 3
## 95.8899993896484 95.8929977416992 95.9000015258789 95.9020004272461
## 2 1 7 1
## 95.9100036621094 95.9199981689453 95.9250030517578 95.9300003051758
## 3 4 1 5
## 95.9400024414062 95.9499969482422 95.9599990844727 95.9609985351562
## 3 1 1 1
## 95.9619979858398 95.9700012207031 95.9800033569336 95.9899978637695
## 1 1 1 2
## 95.9960021972656 95.9990005493164 96 96.0100021362305
## 1 1 1 1
## 96.0199966430664 96.0319976806641 96.0400009155273 96.0419998168945
## 1 1 2 1
## 96.0500030517578 96.0599975585938 96.0699996948242 96.0780029296875
## 1 1 1 2
## 96.0800018310547 96.0899963378906 96.0999984741211 96.1100006103516
## 2 4 5 1
## 96.120002746582 96.1309967041016 96.1370010375977 96.1399993896484
## 3 1 1 3
## 96.1500015258789 96.1600036621094 96.1699981689453 96.1800003051758
## 2 1 2 2
## 96.1900024414062 96.1999969482422 96.2099990844727 96.2200012207031
## 2 3 3 3
## 96.2269973754883 96.2399978637695 96.2429962158203 96.25
## 1 6 1 2
## 96.2600021362305 96.2699966430664 96.2799987792969 96.2900009155273
## 2 3 5 1
## 96.3000030517578 96.3099975585938 96.3199996948242 96.3239974975586
## 2 2 1 1
## 96.3300018310547 96.3399963378906 96.3499984741211 96.3600006103516
## 5 3 3 1
## 96.379997253418 96.3899993896484 96.4010009765625 96.4100036621094
## 1 3 1 1
## 96.4199981689453 96.4300003051758 96.4349975585938 96.4400024414062
## 3 4 1 2
## 96.4499969482422 96.4530029296875 96.4599990844727 96.4700012207031
## 4 1 1 2
## 96.4720001220703 96.4800033569336 96.4899978637695 96.5
## 1 4 1 3
## 96.5199966430664 96.5299987792969 96.5400009155273 96.5500030517578
## 3 1 1 3
## 96.5510025024414 96.5699996948242 96.5770034790039 96.5780029296875
## 1 3 1 1
## 96.5800018310547 96.5899963378906 96.5989990234375 96.6029968261719
## 2 4 1 1
## 96.629997253418 96.6399993896484 96.6500015258789 96.6600036621094
## 3 2 3 2
## 96.6660003662109 96.6900024414062 96.6999969482422 96.7099990844727
## 1 2 3 2
## 96.7200012207031 96.7300033569336 96.7399978637695 96.75
## 1 3 5 4
## 96.7600021362305 96.7799987792969 96.7900009155273 96.7910003662109
## 1 3 6 1
## 96.8199996948242 96.8300018310547 96.8330001831055 96.838996887207
## 3 1 1 1
## 96.8399963378906 96.8499984741211 96.8600006103516 96.8610000610352
## 3 1 1 1
## 96.870002746582 96.879997253418 96.8860015869141 96.8899993896484
## 2 1 1 4
## 96.9000015258789 96.9029998779297 96.9100036621094 96.9199981689453
## 3 1 2 3
## 96.9209976196289 96.9219970703125 96.927001953125 96.9300003051758
## 1 1 1 1
## 96.9400024414062 96.9499969482422 96.9599990844727 96.9690017700195
## 1 1 2 1
## 96.9700012207031 96.9800033569336 96.9980010986328 97.0100021362305
## 1 3 1 1
## 97.0319976806641 97.0500030517578 97.0599975585938 97.0699996948242
## 1 2 2 3
## 97.0899963378906 97.0999984741211 97.1100006103516 97.1139984130859
## 3 1 2 1
## 97.1179962158203 97.120002746582 97.129997253418 97.1399993896484
## 1 2 2 2
## 97.1500015258789 97.1600036621094 97.1800003051758 97.181999206543
## 1 2 1 2
## 97.1900024414062 97.1999969482422 97.2099990844727 97.2249984741211
## 1 3 1 1
## 97.2269973754883 97.2279968261719 97.2300033569336 97.2399978637695
## 1 1 1 1
## 97.2699966430664 97.2799987792969 97.2900009155273 97.2929992675781
## 3 2 4 1
## 97.3000030517578 97.3099975585938 97.3300018310547 97.3399963378906
## 3 2 2 2
## 97.3499984741211 97.3600006103516 97.370002746582 97.4000015258789
## 1 1 3 2
## 97.4100036621094 97.4199981689453 97.4300003051758 97.4499969482422
## 3 2 5 1
## 97.4599990844727 97.463996887207 97.4690017700195 97.4700012207031
## 2 1 1 1
## 97.4800033569336 97.4830017089844 97.4899978637695 97.4980010986328
## 1 1 1 1
## 97.5100021362305 97.5199966430664 97.5299987792969 97.5400009155273
## 3 2 1 1
## 97.5500030517578 97.5599975585938 97.568000793457 97.5699996948242
## 4 1 1 1
## 97.5800018310547 97.5899963378906 97.5999984741211 97.6029968261719
## 4 1 1 1
## 97.6100006103516 97.620002746582 97.629997253418 97.6399993896484
## 2 1 5 2
## 97.6500015258789 97.6600036621094 97.6900024414062 97.7200012207031
## 1 3 1 2
## 97.7300033569336 97.7399978637695 97.7470016479492 97.75
## 2 2 1 1
## 97.7600021362305 97.7699966430664 97.7890014648438 97.8000030517578
## 2 6 1 3
## 97.8099975585938 97.8160018920898 97.8300018310547 97.8399963378906
## 1 2 1 2
## 97.8499984741211 97.8600006103516 97.870002746582 97.879997253418
## 3 3 1 1
## 97.8899993896484 97.9100036621094 97.9199981689453 97.9300003051758
## 1 2 4 4
## 97.9390029907227 97.9499969482422 97.9599990844727 97.9619979858398
## 1 1 1 1
## 97.9700012207031 97.9800033569336 97.9899978637695 98
## 3 3 1 2
## 98.0100021362305 98.0299987792969 98.0500030517578 98.0510025024414
## 1 2 2 1
## 98.0599975585938 98.0699996948242 98.0800018310547 98.0999984741211
## 2 1 1 1
## 98.1100006103516 98.1149978637695 98.120002746582 98.1399993896484
## 5 1 1 3
## 98.1500015258789 98.1600036621094 98.1699981689453 98.1800003051758
## 1 1 2 2
## 98.1900024414062 98.193000793457 98.1999969482422 98.2080001831055
## 3 1 1 1
## 98.2200012207031 98.25 98.2600021362305 98.2699966430664
## 1 1 2 3
## 98.2799987792969 98.2900009155273 98.3000030517578 98.306999206543
## 6 1 2 1
## 98.3089981079102 98.3099975585938 98.3199996948242 98.3259963989258
## 1 1 1 1
## 98.3300018310547 98.3499984741211 98.3600006103516 98.370002746582
## 2 1 4 3
## 98.3759994506836 98.379997253418 98.3840026855469 98.3899993896484
## 1 2 1 1
## 98.3980026245117 98.3990020751953 98.4000015258789 98.4100036621094
## 1 1 2 4
## 98.4199981689453 98.4300003051758 98.4339981079102 98.4400024414062
## 2 2 1 3
## 98.447998046875 98.4499969482422 98.4800033569336 98.5100021362305
## 1 1 3 1
## 98.5199966430664 98.5299987792969 98.5400009155273 98.5599975585938
## 1 2 1 1
## 98.5699996948242 98.5800018310547 98.5899963378906 98.6100006103516
## 1 3 1 1
## 98.629997253418 98.6330032348633 98.6389999389648 98.6399993896484
## 1 1 1 1
## 98.6500015258789 98.6600036621094 98.6800003051758 98.6900024414062
## 2 1 3 2
## 98.7099990844727 98.7160034179688 98.7200012207031 98.7239990234375
## 3 1 1 1
## 98.7399978637695 98.75 98.7600021362305 98.7699966430664
## 3 2 1 2
## 98.7799987792969 98.7900009155273 98.8000030517578 98.8099975585938
## 2 1 2 1
## 98.8199996948242 98.8280029296875 98.8300018310547 98.8399963378906
## 3 1 2 3
## 98.8499984741211 98.8509979248047 98.8600006103516 98.870002746582
## 2 1 2 1
## 98.8759994506836 98.879997253418 98.8899993896484 98.8949966430664
## 1 2 1 1
## 98.9100036621094 98.9469985961914 98.9499969482422 98.9690017700195
## 2 1 1 1
## 98.9700012207031 98.9800033569336 98.9899978637695 99.0199966430664
## 3 3 2 2
## 99.0299987792969 99.0400009155273 99.0500030517578 99.0599975585938
## 1 2 3 2
## 99.0699996948242 99.0800018310547 99.0999984741211 99.1100006103516
## 1 1 1 1
## 99.129997253418 99.1399993896484 99.140998840332 99.1490020751953
## 2 3 1 1
## 99.1500015258789 99.1800003051758 99.1999969482422 99.2099990844727
## 1 1 2 3
## 99.2200012207031 99.2300033569336 99.2399978637695 99.25
## 2 1 3 1
## 99.254997253418 99.2799987792969 99.2929992675781 99.3000030517578
## 1 3 1 2
## 99.3059997558594 99.3099975585938 99.3199996948242 99.3300018310547
## 1 2 2 3
## 99.3600006103516 99.370002746582 99.379997253418 99.3899993896484
## 1 1 5 1
## 99.3990020751953 99.4100036621094 99.4120025634766 99.4199981689453
## 1 2 1 1
## 99.4300003051758 99.4400024414062 99.4499969482422 99.4599990844727
## 5 5 4 1
## 99.5 99.5100021362305 99.5199966430664 99.5390014648438
## 1 4 1 1
## 99.5400009155273 99.5500030517578 99.5599975585938 99.5640029907227
## 2 2 1 1
## 99.5800018310547 99.5899963378906 99.620002746582 99.6230010986328
## 1 2 2 1
## 99.629997253418 99.6399993896484 99.6500015258789 99.6600036621094
## 1 1 2 3
## 99.6699981689453 99.6800003051758 99.6999969482422 99.7099990844727
## 1 3 3 1
## 99.7160034179688 99.7200012207031 99.7300033569336 99.7399978637695
## 1 3 1 2
## 99.75 99.7699966430664 99.7799987792969 99.7870025634766
## 4 4 1 1
## 99.7900009155273 99.7979965209961 99.8000030517578 99.8099975585938
## 1 1 2 1
## 99.8199996948242 99.8259963989258 99.8300018310547 99.8379974365234
## 3 1 2 1
## 99.8610000610352 99.870002746582 99.9000015258789 99.9100036621094
## 1 5 1 1
## 99.9199981689453 99.9300003051758 99.9400024414062 99.9499969482422
## 1 2 4 6
## 99.9700012207031 99.9800033569336 100.01000213623 100.012001037598
## 1 3 2 1
## 100.019996643066 100.029998779297 100.040000915527 100.050003051758
## 1 1 2 2
## 100.054000854492 100.069999694824 100.080001831055 100.089996337891
## 1 2 1 1
## 100.110000610352 100.120002746582 100.129997253418 100.139999389648
## 2 1 2 6
## 100.150001525879 100.160003662109 100.161003112793 100.169998168945
## 1 3 1 1
## 100.184997558594 100.190002441406 100.199996948242 100.202003479004
## 1 1 5 1
## 100.209999084473 100.220001220703 100.25 100.261001586914
## 1 1 1 1
## 100.262001037598 100.269996643066 100.275001525879 100.279998779297
## 1 3 1 5
## 100.300003051758 100.309997558594 100.319999694824 100.320999145508
## 2 2 3 1
## 100.349998474121 100.358001708984 100.360000610352 100.379997253418
## 2 1 1 2
## 100.389999389648 100.400001525879 100.410003662109 100.419998168945
## 1 4 4 1
## 100.430000305176 100.449996948242 100.459999084473 100.467002868652
## 1 1 3 1
## 100.468002319336 100.470001220703 100.47200012207 100.480003356934
## 1 3 1 1
## 100.5 100.503997802734 100.51000213623 100.519996643066
## 1 1 4 2
## 100.529998779297 100.540000915527 100.569999694824 100.589996337891
## 2 1 2 2
## 100.599998474121 100.602996826172 100.620002746582 100.629997253418
## 2 1 4 2
## 100.637001037598 100.639999389648 100.650001525879 100.660003662109
## 1 4 2 2
## 100.666999816895 100.669998168945 100.680000305176 100.685997009277
## 1 3 2 1
## 100.690002441406 100.699996948242 100.709999084473 100.714996337891
## 1 2 1 1
## 100.730003356934 100.73999786377 100.75 100.775001525879
## 1 2 1 2
## 100.779998779297 100.787002563477 100.790000915527 100.800003051758
## 2 1 2 2
## 100.809997558594 100.819999694824 100.830001831055 100.839996337891
## 1 1 1 2
## 100.855003356934 100.866996765137 100.870002746582 100.879997253418
## 1 1 3 3
## 100.900001525879 100.919998168945 100.930000305176 100.940002441406
## 2 2 3 1
## 100.949996948242 100.970001220703 100.980003356934 100.98999786377
## 3 3 6 1
## 101 101.002998352051 101.01000213623 101.019996643066
## 6 1 2 3
## 101.040000915527 101.050003051758 101.059997558594 101.069999694824
## 3 1 1 2
## 101.080001831055 101.089996337891 101.099998474121 101.110000610352
## 1 2 4 6
## 101.11499786377 101.120002746582 101.125999450684 101.129997253418
## 1 3 1 1
## 101.150001525879 101.169998168945 101.180000305176 101.190002441406
## 3 4 1 1
## 101.199996948242 101.209999084473 101.220001220703 101.221000671387
## 1 4 3 1
## 101.230003356934 101.23999786377 101.25 101.26000213623
## 1 2 2 4
## 101.269996643066 101.275001525879 101.279998779297 101.290000915527
## 1 1 2 4
## 101.309997558594 101.330001831055 101.346000671387 101.349998474121
## 1 1 1 2
## 101.360000610352 101.370002746582 101.379997253418 101.388999938965
## 2 4 2 1
## 101.419998168945 101.430000305176 101.440002441406 101.449996948242
## 2 1 2 2
## 101.459999084473 101.470001220703 101.480003356934 101.48999786377
## 1 1 1 1
## 101.5 101.51000213623 101.519996643066 101.529998779297
## 1 3 1 2
## 101.540000915527 101.559997558594 101.580001831055 101.589996337891
## 1 1 1 1
## 101.599998474121 101.610000610352 101.620002746582 101.629997253418
## 2 1 2 3
## 101.639999389648 101.650001525879 101.669998168945 101.690002441406
## 2 1 2 4
## 101.695999145508 101.699996948242 101.709999084473 101.710998535156
## 1 3 4 1
## 101.720001220703 101.730003356934 101.75 101.76000213623
## 4 2 1 2
## 101.769996643066 101.779998779297 101.790000915527 101.800003051758
## 3 2 2 4
## 101.819999694824 101.839996337891 101.849998474121 101.860000610352
## 1 1 1 2
## 101.870002746582 101.875999450684 101.879997253418 101.889999389648
## 3 1 6 3
## 101.919998168945 101.930000305176 101.930999755859 101.970001220703
## 1 2 2 2
## 101.980003356934 101.987998962402 101.98999786377 102
## 1 1 1 1
## 102.040000915527 102.050003051758 102.069999694824 102.080001831055
## 1 1 7 2
## 102.089996337891 102.099998474121 102.120002746582 102.129997253418
## 1 2 8 2
## 102.139999389648 102.150001525879 102.160003662109 102.169998168945
## 1 2 4 1
## 102.190002441406 102.199996948242 102.209999084473 102.220001220703
## 2 4 4 2
## 102.230003356934 102.23999786377 102.25 102.26000213623
## 4 1 5 2
## 102.269996643066 102.276000976562 102.279998779297 102.300003051758
## 2 1 1 2
## 102.307998657227 102.309997558594 102.31600189209 102.319999694824
## 1 1 1 3
## 102.330001831055 102.339996337891 102.349998474121 102.360000610352
## 3 3 4 1
## 102.361000061035 102.370002746582 102.389999389648 102.394996643066
## 1 2 3 1
## 102.410003662109 102.420997619629 102.430000305176 102.449996948242
## 5 1 1 2
## 102.456001281738 102.459999084473 102.46900177002 102.470001220703
## 1 4 1 1
## 102.480003356934 102.48999786377 102.495002746582 102.5
## 5 1 1 1
## 102.51000213623 102.519996643066 102.529998779297 102.540000915527
## 2 1 2 2
## 102.550003051758 102.559997558594 102.580001831055 102.589996337891
## 2 1 4 1
## 102.599998474121 102.610000610352 102.620002746582 102.629997253418
## 3 3 3 7
## 102.639999389648 102.650001525879 102.660003662109 102.669998168945
## 2 2 3 1
## 102.680000305176 102.690002441406 102.699996948242 102.700996398926
## 2 1 2 1
## 102.709999084473 102.720001220703 102.730003356934 102.73999786377
## 3 2 1 4
## 102.740997314453 102.75 102.769996643066 102.779998779297
## 1 4 4 2
## 102.790000915527 102.800003051758 102.809997558594 102.819999694824
## 3 1 1 2
## 102.839996337891 102.846000671387 102.860000610352 102.870002746582
## 1 1 2 1
## 102.889999389648 102.900001525879 102.910003662109 102.919998168945
## 1 1 4 2
## 102.925003051758 102.940002441406 102.944999694824 102.949996948242
## 1 1 1 1
## 102.959999084473 102.980003356934 102.98999786377 103
## 2 2 1 2
## 103.01000213623 103.019996643066 103.052001953125 103.069999694824
## 3 1 1 2
## 103.089996337891 103.099998474121 103.110000610352 103.111999511719
## 1 1 2 1
## 103.116996765137 103.120002746582 103.129997253418 103.150001525879
## 1 2 1 5
## 103.160003662109 103.169998168945 103.180000305176 103.190002441406
## 5 3 1 1
## 103.209999084473 103.230003356934 103.23999786377 103.25700378418
## 2 2 3 1
## 103.269996643066 103.279998779297 103.290000915527 103.300003051758
## 2 1 4 1
## 103.319999694824 103.327003479004 103.349998474121 103.370002746582
## 1 1 1 2
## 103.379997253418 103.389999389648 103.400001525879 103.410003662109
## 4 2 1 2
## 103.431999206543 103.440002441406 103.449996948242 103.459999084473
## 1 1 2 1
## 103.470001220703 103.481002807617 103.5 103.501998901367
## 2 1 1 1
## 103.519996643066 103.529998779297 103.540000915527 103.550003051758
## 3 2 4 1
## 103.569999694824 103.583000183105 103.58699798584 103.589996337891
## 1 1 1 2
## 103.620002746582 103.660003662109 103.669998168945 103.680000305176
## 1 2 4 5
## 103.690002441406 103.699996948242 103.709999084473 103.720001220703
## 4 4 1 1
## 103.730003356934 103.73999786377 103.748001098633 103.75
## 2 2 1 1
## 103.76000213623 103.769996643066 103.779998779297 103.790000915527
## 2 1 3 2
## 103.797996520996 103.809997558594 103.819999694824 103.830001831055
## 1 2 1 2
## 103.839996337891 103.849998474121 103.861000061035 103.879997253418
## 1 1 1 1
## 103.889999389648 103.900001525879 103.910003662109 103.919998168945
## 1 1 1 2
## 103.930000305176 103.940002441406 103.949996948242 103.950996398926
## 3 6 1 1
## 103.970001220703 103.980003356934 104 104.019996643066
## 2 5 2 2
## 104.035003662109 104.040000915527 104.050003051758 104.059997558594
## 1 2 1 2
## 104.069999694824 104.08699798584 104.089996337891 104.120002746582
## 2 1 1 1
## 104.129997253418 104.13500213623 104.139999389648 104.150001525879
## 2 1 2 1
## 104.160003662109 104.169998168945 104.180000305176 104.190002441406
## 1 2 2 1
## 104.209999084473 104.220001220703 104.223668806995 104.223999023438
## 1 1 442 1
## 104.230003356934 104.23999786377 104.25 104.262001037598
## 1 2 1 1
## 104.266998291016 104.269996643066 104.279998779297 104.283996582031
## 1 3 1 1
## 104.290000915527 104.300003051758 104.309997558594 104.319999694824
## 1 1 6 5
## 104.323997497559 104.330001831055 104.339996337891 104.360000610352
## 1 3 6 2
## 104.365149850449 104.370002746582 104.376998901367 104.379997253418
## 441 6 1 1
## 104.389999389648 104.400001525879 104.410003662109 104.419998168945
## 1 2 1 1
## 104.430000305176 104.449996948242 104.459999084473 104.463996887207
## 2 1 3 1
## 104.470001220703 104.480003356934 104.488998413086 104.5
## 1 1 1 2
## 104.51000213623 104.519996643066 104.523002624512 104.540000915527
## 3 1 1 2
## 104.547996520996 104.550003051758 104.552001953125 104.559997558594
## 1 3 1 2
## 104.569999694824 104.599998474121 104.610000610352 104.629997253418
## 2 1 1 1
## 104.639999389648 104.650001525879 104.660003662109 104.669998168945
## 2 1 1 4
## 104.689002990723 104.699996948242 104.709999084473 104.720001220703
## 1 1 1 5
## 104.722999572754 104.730003356934 104.75 104.76000213623
## 1 1 2 1
## 104.761001586914 104.769996643066 104.779998779297 104.790000915527
## 1 2 2 1
## 104.800003051758 104.819999694824 104.830001831055 104.839996337891
## 2 5 2 2
## 104.849998474121 104.860000610352 104.870002746582 104.879997253418
## 1 2 1 2
## 104.889999389648 104.900001525879 104.910003662109 104.91300201416
## 2 2 2 1
## 104.930000305176 104.940002441406 104.948997497559 104.949996948242
## 4 2 1 2
## 104.970001220703 104.980003356934 105 105.01000213623
## 4 1 2 2
## 105.019996643066 105.024002075195 105.050003051758 105.059997558594
## 4 1 5 1
## 105.069999694824 105.080001831055 105.089996337891 105.099998474121
## 1 2 1 3
## 105.110000610352 105.120002746582 105.129997253418 105.139999389648
## 3 1 3 1
## 105.146003723145 105.150001525879 105.169998168945 105.180000305176
## 1 1 1 5
## 105.190002441406 105.199996948242 105.209999084473 105.220001220703
## 3 7 3 4
## 105.226997375488 105.23999786377 105.241996765137 105.26000213623
## 1 3 1 2
## 105.269996643066 105.279998779297 105.290000915527 105.300003051758
## 4 3 3 3
## 105.309997558594 105.330001831055 105.339996337891 105.345001220703
## 3 2 3 1
## 105.360000610352 105.370002746582 105.379997253418 105.400001525879
## 1 3 1 2
## 105.410003662109 105.414001464844 105.419998168945 105.430000305176
## 3 1 1 2
## 105.440002441406 105.449996948242 105.459999084473 105.470001220703
## 1 1 5 5
## 105.480003356934 105.49299621582 105.5 105.529998779297
## 1 1 2 2
## 105.540000915527 105.550003051758 105.561996459961 105.569999694824
## 1 1 1 2
## 105.580001831055 105.599998474121 105.610000610352 105.629997253418
## 1 1 2 3
## 105.639999389648 105.649002075195 105.650001525879 105.660003662109
## 3 1 2 5
## 105.669998168945 105.675003051758 105.680000305176 105.690002441406
## 1 1 2 2
## 105.699996948242 105.709999084473 105.730003356934 105.73999786377
## 1 1 3 3
## 105.76000213623 105.769996643066 105.779998779297 105.800003051758
## 1 2 2 2
## 105.809997558594 105.830001831055 105.839996337891 105.849998474121
## 2 1 1 4
## 105.860000610352 105.875 105.879997253418 105.900001525879
## 2 1 4 2
## 105.910003662109 105.919998168945 105.940002441406 105.959999084473
## 2 1 1 3
## 105.970001220703 105.980003356934 106 106.01000213623
## 1 3 2 4
## 106.019996643066 106.029998779297 106.040000915527 106.050003051758
## 1 3 1 2
## 106.059997558594 106.069999694824 106.080001831055 106.089996337891
## 1 1 2 4
## 106.100997924805 106.109001159668 106.110000610352 106.120002746582
## 1 1 2 1
## 106.129997253418 106.149002075195 106.150001525879 106.15299987793
## 3 1 2 1
## 106.169998168945 106.190002441406 106.209999084473 106.220001220703
## 3 2 2 3
## 106.230003356934 106.23999786377 106.25 106.26000213623
## 2 1 3 1
## 106.269996643066 106.279998779297 106.290000915527 106.309997558594
## 1 3 3 2
## 106.317001342773 106.330001831055 106.339996337891 106.349998474121
## 1 2 3 1
## 106.360000610352 106.370002746582 106.379997253418 106.389999389648
## 1 3 3 3
## 106.410003662109 106.419998168945 106.430000305176 106.455001831055
## 3 5 1 1
## 106.470001220703 106.48999786377 106.496002197266 106.519996643066
## 1 2 1 1
## 106.523002624512 106.529998779297 106.531997680664 106.540000915527
## 1 1 1 1
## 106.550003051758 106.580001831055 106.589996337891 106.599998474121
## 2 1 3 1
## 106.610000610352 106.620002746582 106.629997253418 106.634002685547
## 2 1 1 1
## 106.639999389648 106.647003173828 106.650001525879 106.660003662109
## 2 1 1 1
## 106.661003112793 106.669998168945 106.709999084473 106.720001220703
## 1 4 4 1
## 106.725997924805 106.728996276855 106.730003356934 106.738998413086
## 1 1 1 1
## 106.75 106.76000213623 106.779998779297 106.790000915527
## 2 2 2 1
## 106.809997558594 106.819999694824 106.830001831055 106.849998474121
## 2 2 3 2
## 106.860000610352 106.870002746582 106.879997253418 106.889999389648
## 2 1 2 3
## 106.910003662109 106.919998168945 106.930000305176 106.959999084473
## 1 3 3 2
## 106.970001220703 106.98999786377 106.991996765137 107
## 2 3 1 1
## 107.01000213623 107.029998779297 107.040000915527 107.047996520996
## 2 2 1 1
## 107.055999755859 107.069999694824 107.099998474121 107.110000610352
## 1 2 1 4
## 107.120002746582 107.129997253418 107.139999389648 107.150001525879
## 2 2 6 1
## 107.169998168945 107.180000305176 107.190002441406 107.199996948242
## 1 3 4 1
## 107.220001220703 107.230003356934 107.25 107.269996643066
## 3 1 4 3
## 107.279998779297 107.290000915527 107.300003051758 107.309997558594
## 5 1 1 1
## 107.330001831055 107.339996337891 107.349998474121 107.360000610352
## 1 3 3 1
## 107.370002746582 107.379997253418 107.389999389648 107.400001525879
## 1 1 2 4
## 107.410003662109 107.419998168945 107.430000305176 107.440002441406
## 3 6 1 2
## 107.449996948242 107.459999084473 107.46199798584 107.470001220703
## 1 6 1 2
## 107.480003356934 107.48999786377 107.5 107.51000213623
## 1 2 1 1
## 107.519996643066 107.525001525879 107.529998779297 107.550003051758
## 2 1 5 4
## 107.559997558594 107.569999694824 107.580001831055 107.599998474121
## 5 1 2 3
## 107.610000610352 107.620002746582 107.629997253418 107.639999389648
## 1 2 4 1
## 107.650001525879 107.660003662109 107.669998168945 107.680000305176
## 2 2 2 2
## 107.699996948242 107.709999084473 107.710998535156 107.720001220703
## 2 1 1 3
## 107.730003356934 107.73999786377 107.75 107.76000213623
## 2 2 1 4
## 107.774002075195 107.779998779297 107.787002563477 107.790000915527
## 1 2 1 2
## 107.800003051758 107.819999694824 107.830001831055 107.839996337891
## 1 2 1 1
## 107.849998474121 107.870002746582 107.879997253418 107.880996704102
## 1 1 2 1
## 107.889999389648 107.900001525879 107.910003662109 107.930000305176
## 1 4 1 1
## 107.940002441406 107.94100189209 107.959999084473 107.970001220703
## 4 1 2 1
## 107.980003356934 107.98999786377 107.997001647949 108
## 1 2 1 1
## 108.01000213623 108.019996643066 108.029998779297 108.040000915527
## 3 2 1 1
## 108.050003051758 108.059997558594 108.060997009277 108.069999694824
## 1 2 1 1
## 108.080001831055 108.089996337891 108.099998474121 108.110000610352
## 2 3 1 1
## 108.138999938965 108.139999389648 108.150001525879 108.160003662109
## 1 1 3 2
## 108.176002502441 108.180000305176 108.190002441406 108.197998046875
## 1 2 1 1
## 108.199996948242 108.209999084473 108.230003356934 108.23999786377
## 3 3 1 3
## 108.241996765137 108.25 108.26000213623 108.269996643066
## 1 1 2 3
## 108.300003051758 108.319999694824 108.330001831055 108.338996887207
## 3 2 2 1
## 108.339996337891 108.349998474121 108.360000610352 108.370002746582
## 2 1 3 3
## 108.379997253418 108.389999389648 108.400001525879 108.410003662109
## 1 2 1 5
## 108.419998168945 108.430000305176 108.449996948242 108.459999084473
## 2 2 1 3
## 108.462997436523 108.480003356934 108.48999786377 108.5
## 1 2 1 1
## 108.501998901367 108.51000213623 108.519996643066 108.52799987793
## 1 3 1 1
## 108.529998779297 108.540000915527 108.550003051758 108.559997558594
## 2 2 2 1
## 108.569999694824 108.580001831055 108.589996337891 108.599998474121
## 2 2 1 2
## 108.610000610352 108.620002746582 108.650001525879 108.651000976562
## 3 1 1 1
## 108.660003662109 108.680000305176 108.690002441406 108.696998596191
## 1 1 2 1
## 108.699996948242 108.709999084473 108.730003356934 108.75
## 1 1 1 4
## 108.76000213623 108.769996643066 108.790000915527 108.800003051758
## 1 1 2 6
## 108.805999755859 108.809997558594 108.819999694824 108.830001831055
## 1 2 1 1
## 108.839996337891 108.849998474121 108.860000610352 108.870002746582
## 1 3 2 5
## 108.879997253418 108.889999389648 108.910003662109 108.919998168945
## 1 1 4 7
## 108.930000305176 108.939002990723 108.940002441406 108.949996948242
## 3 1 1 2
## 108.959999084473 108.966003417969 108.970001220703 108.976997375488
## 3 1 1 1
## 108.980003356934 109 109.01000213623 109.019996643066
## 1 1 2 1
## 109.029998779297 109.040000915527 109.050003051758 109.059997558594
## 3 3 1 1
## 109.071998596191 109.080001831055 109.099998474121 109.110000610352
## 1 1 3 2
## 109.120002746582 109.129997253418 109.134002685547 109.139999389648
## 3 1 1 3
## 109.150001525879 109.160003662109 109.180000305176 109.190002441406
## 1 2 2 1
## 109.199996948242 109.207000732422 109.220001220703 109.25
## 1 1 4 1
## 109.26000213623 109.269996643066 109.279998779297 109.290000915527
## 2 1 4 2
## 109.300003051758 109.306999206543 109.309997558594 109.330001831055
## 2 1 4 3
## 109.339996337891 109.349998474121 109.360000610352 109.370002746582
## 2 2 2 3
## 109.379997253418 109.389999389648 109.400001525879 109.410003662109
## 1 1 3 2
## 109.419998168945 109.421997070312 109.428001403809 109.430000305176
## 1 1 1 4
## 109.449996948242 109.459999084473 109.470001220703 109.480003356934
## 1 2 6 3
## 109.48999786377 109.51000213623 109.514999389648 109.550003051758
## 2 2 1 2
## 109.569999694824 109.580001831055 109.610000610352 109.620002746582
## 2 1 3 1
## 109.629997253418 109.639999389648 109.660003662109 109.669998168945
## 1 2 1 3
## 109.671997070312 109.680000305176 109.690002441406 109.699996948242
## 2 2 3 1
## 109.709999084473 109.720001220703 109.730003356934 109.735000610352
## 5 1 4 1
## 109.73999786377 109.75 109.76000213623 109.769996643066
## 2 4 2 2
## 109.779998779297 109.790000915527 109.800003051758 109.809997558594
## 2 1 3 1
## 109.819999694824 109.830001831055 109.839996337891 109.84400177002
## 2 2 1 1
## 109.849998474121 109.860000610352 109.86799621582 109.870002746582
## 3 1 1 2
## 109.879997253418 109.889999389648 109.892997741699 109.900001525879
## 1 2 1 3
## 109.910003662109 109.919998168945 109.940002441406 109.948997497559
## 2 1 3 1
## 109.959999084473 109.970001220703 109.980003356934 109.98999786377
## 1 4 2 1
## 110 110.01000213623 110.029998779297 110.040000915527
## 4 1 3 2
## 110.050003051758 110.059997558594 110.069999694824 110.080001831055
## 2 3 1 2
## 110.089996337891 110.099998474121 110.103996276855 110.11799621582
## 2 1 1 1
## 110.129997253418 110.139999389648 110.150001525879 110.169998168945
## 1 4 3 1
## 110.171997070312 110.180000305176 110.199996948242 110.209999084473
## 1 2 1 1
## 110.220001220703 110.230003356934 110.238998413086 110.23999786377
## 1 1 1 3
## 110.25 110.26000213623 110.269996643066 110.279998779297
## 4 1 2 1
## 110.290000915527 110.309997558594 110.319999694824 110.330001831055
## 3 1 1 1
## 110.339996337891 110.349998474121 110.360000610352 110.370002746582
## 1 2 1 1
## 110.379997253418 110.38200378418 110.384002685547 110.389999389648
## 2 1 1 4
## 110.400001525879 110.40299987793 110.410003662109 110.419998168945
## 2 1 1 2
## 110.430000305176 110.440002441406 110.459999084473 110.470001220703
## 3 2 1 1
## 110.472999572754 110.480003356934 110.48999786377 110.5
## 1 1 3 1
## 110.51000213623 110.519996643066 110.529998779297 110.540000915527
## 2 4 1 1
## 110.550003051758 110.559997558594 110.568000793457 110.569999694824
## 3 2 1 1
## 110.589996337891 110.599998474121 110.610000610352 110.620002746582
## 1 1 2 1
## 110.639999389648 110.650001525879 110.660003662109 110.669998168945
## 5 1 2 3
## 110.680000305176 110.690002441406 110.699996948242 110.709999084473
## 5 2 3 2
## 110.720001220703 110.73999786377 110.741996765137 110.75
## 4 1 1 1
## 110.764999389648 110.769996643066 110.779998779297 110.790000915527
## 1 1 2 3
## 110.800003051758 110.809997558594 110.830001831055 110.839996337891
## 1 2 2 1
## 110.846000671387 110.849998474121 110.860000610352 110.870002746582
## 1 2 7 3
## 110.889999389648 110.900001525879 110.910003662109 110.919998168945
## 4 1 3 1
## 110.940002441406 110.944000244141 110.949996948242 110.957000732422
## 2 1 1 1
## 110.959999084473 110.970001220703 110.980003356934 110.98999786377
## 1 1 5 2
## 111 111.01000213623 111.019996643066 111.029998779297
## 2 1 1 1
## 111.040000915527 111.059997558594 111.069999694824 111.084999084473
## 1 2 2 1
## 111.089996337891 111.099998474121 111.110000610352 111.120002746582
## 3 2 3 1
## 111.129997253418 111.139999389648 111.150001525879 111.15299987793
## 1 2 3 1
## 111.160003662109 111.169998168945 111.192001342773 111.199996948242
## 2 4 1 2
## 111.209999084473 111.220001220703 111.230003356934 111.23999786377
## 4 1 2 3
## 111.25 111.26000213623 111.269996643066 111.279998779297
## 4 2 2 3
## 111.290000915527 111.300003051758 111.339996337891 111.347999572754
## 4 5 4 1
## 111.349998474121 111.360000610352 111.370002746582 111.379997253418
## 2 3 1 2
## 111.386001586914 111.389999389648 111.400001525879 111.40299987793
## 1 1 2 1
## 111.410003662109 111.417999267578 111.419998168945 111.430000305176
## 2 1 1 1
## 111.435997009277 111.440002441406 111.470001220703 111.48999786377
## 1 4 3 2
## 111.5 111.51000213623 111.519996643066 111.529998779297
## 1 2 1 3
## 111.540000915527 111.550003051758 111.569999694824 111.580001831055
## 1 1 6 1
## 111.589996337891 111.599998474121 111.610000610352 111.620002746582
## 1 4 2 2
## 111.621002197266 111.629997253418 111.639999389648 111.650001525879
## 1 4 2 3
## 111.660003662109 111.669998168945 111.680999755859 111.690002441406
## 3 1 1 1
## 111.708999633789 111.709999084473 111.720001220703 111.730003356934
## 1 3 1 2
## 111.73999786377 111.76000213623 111.769996643066 111.779998779297
## 2 4 1 2
## 111.790000915527 111.809997558594 111.819999694824 111.830001831055
## 2 1 3 2
## 111.831001281738 111.849998474121 111.860000610352 111.889999389648
## 1 4 1 1
## 111.900001525879 111.919998168945 111.930000305176 111.940002441406
## 4 1 7 2
## 111.949996948242 111.959999084473 111.970001220703 111.971000671387
## 2 4 3 1
## 111.980003356934 111.98999786377 112 112.000999450684
## 1 5 1 1
## 112.01000213623 112.018997192383 112.019996643066 112.029998779297
## 1 1 4 3
## 112.032997131348 112.040000915527 112.050003051758 112.059997558594
## 1 2 4 1
## 112.069999694824 112.080001831055 112.089996337891 112.092002868652
## 3 2 2 1
## 112.099998474121 112.110000610352 112.129997253418 112.139999389648
## 2 2 4 1
## 112.160003662109 112.165000915527 112.180000305176 112.190002441406
## 1 1 1 1
## 112.209999084473 112.220001220703 112.230003356934 112.235000610352
## 2 3 2 1
## 112.23999786377 112.25 112.26000213623 112.269996643066
## 1 2 5 2
## 112.279998779297 112.290000915527 112.300003051758 112.309997558594
## 4 1 1 2
## 112.319999694824 112.330001831055 112.339996337891 112.34400177002
## 1 1 2 1
## 112.349998474121 112.360000610352 112.361000061035 112.379997253418
## 1 1 1 1
## 112.384002685547 112.389999389648 112.400001525879 112.410003662109
## 1 1 1 5
## 112.419998168945 112.440002441406 112.449996948242 112.455001831055
## 1 2 3 1
## 112.459999084473 112.480003356934 112.48999786377 112.498001098633
## 1 1 1 1
## 112.501998901367 112.504997253418 112.51000213623 112.529998779297
## 1 2 2 3
## 112.540000915527 112.550003051758 112.559997558594 112.580001831055
## 4 5 1 2
## 112.602996826172 112.610000610352 112.625999450684 112.629997253418
## 1 2 2 2
## 112.650001525879 112.680000305176 112.690002441406 112.709999084473
## 2 4 3 2
## 112.71199798584 112.730003356934 112.73999786377 112.75
## 1 1 3 2
## 112.76000213623 112.769996643066 112.790000915527 112.791000366211
## 3 1 2 1
## 112.800003051758 112.809997558594 112.819999694824 112.830001831055
## 4 1 1 2
## 112.842002868652 112.849998474121 112.851997375488 112.860000610352
## 1 2 1 4
## 112.870002746582 112.900001525879 112.901000976562 112.910003662109
## 1 3 1 2
## 112.919998168945 112.936996459961 112.940002441406 112.959999084473
## 2 1 6 2
## 112.980003356934 112.98999786377 113 113.01000213623
## 1 2 2 3
## 113.019996643066 113.029998779297 113.040000915527 113.050003051758
## 1 1 1 1
## 113.059997558594 113.089996337891 113.099998474121 113.110000610352
## 2 1 2 2
## 113.13500213623 113.150001525879 113.165000915527 113.169998168945
## 1 2 1 4
## 113.180000305176 113.190002441406 113.192001342773 113.199996948242
## 1 1 1 2
## 113.209999084473 113.216003417969 113.220001220703 113.222999572754
## 2 1 1 1
## 113.230003356934 113.232002258301 113.23999786377 113.249550053811
## 1 1 1 442
## 113.25 113.26000213623 113.269996643066 113.279998779297
## 2 4 3 3
## 113.290000915527 113.300003051758 113.309997558594 113.319999694824
## 2 1 2 2
## 113.330001831055 113.360000610352 113.370002746582 113.400001525879
## 1 6 1 1
## 113.407997131348 113.410003662109 113.419998168945 113.430000305176
## 1 1 2 3
## 113.440002441406 113.449996948242 113.459999084473 113.470001220703
## 1 4 1 2
## 113.475997924805 113.480003356934 113.5 113.519996643066
## 2 2 2 2
## 113.550003051758 113.559997558594 113.569999694824 113.572998046875
## 3 1 1 1
## 113.580001831055 113.599998474121 113.610000610352 113.61799621582
## 1 3 3 1
## 113.620002746582 113.629997253418 113.639999389648 113.650001525879
## 4 2 5 2
## 113.660003662109 113.669998168945 113.680000305176 113.690002441406
## 2 2 2 4
## 113.69100189209 113.709999084473 113.730003356934 113.73999786377
## 1 4 2 1
## 113.76000213623 113.769996643066 113.782997131348 113.790000915527
## 1 2 1 1
## 113.800003051758 113.809997558594 113.819999694824 113.830001831055
## 2 1 2 2
## 113.839996337891 113.849998474121 113.860000610352 113.870002746582
## 1 1 2 4
## 113.871002197266 113.879997253418 113.900001525879 113.910003662109
## 1 1 2 3
## 113.930000305176 113.940002441406 113.949996948242 113.959999084473
## 3 1 1 2
## 113.970001220703 113.97200012207 113.980003356934 113.985000610352
## 1 1 1 1
## 113.98999786377 114 114.005996704102 114.01000213623
## 1 1 1 1
## 114.017997741699 114.019996643066 114.029998779297 114.050003051758
## 1 1 1 2
## 114.054000854492 114.059997558594 114.06600189209 114.069999694824
## 1 2 1 2
## 114.080001831055 114.089996337891 114.099998474121 114.110000610352
## 1 7 1 2
## 114.120002746582 114.129997253418 114.139999389648 114.150001525879
## 1 6 1 1
## 114.151000976562 114.160003662109 114.169998168945 114.190002441406
## 1 1 1 1
## 114.194000244141 114.209999084473 114.223999023438 114.230003356934
## 1 2 1 1
## 114.234001159668 114.23999786377 114.25 114.279998779297
## 1 2 2 3
## 114.303001403809 114.309997558594 114.319999694824 114.328002929688
## 1 2 1 1
## 114.330001831055 114.339996337891 114.349998474121 114.360000610352
## 2 1 4 1
## 114.370002746582 114.379997253418 114.400001525879 114.419998168945
## 1 1 3 1
## 114.459999084473 114.470001220703 114.474998474121 114.480003356934
## 2 1 1 1
## 114.48999786377 114.499000549316 114.5 114.509002685547
## 2 1 1 1
## 114.519996643066 114.529998779297 114.540000915527 114.559997558594
## 1 5 1 3
## 114.569999694824 114.570999145508 114.573997497559 114.580001831055
## 3 1 1 6
## 114.589996337891 114.599998474121 114.610000610352 114.634002685547
## 2 3 3 1
## 114.639999389648 114.643997192383 114.650001525879 114.660003662109
## 1 1 3 1
## 114.669998168945 114.680000305176 114.696998596191 114.702003479004
## 1 3 1 1
## 114.709999084473 114.720001220703 114.722999572754 114.730003356934
## 2 1 1 1
## 114.73999786377 114.76000213623 114.769996643066 114.790000915527
## 1 3 1 3
## 114.800003051758 114.802001953125 114.809997558594 114.813003540039
## 1 1 1 1
## 114.819999694824 114.830001831055 114.839996337891 114.841003417969
## 3 1 2 1
## 114.849998474121 114.860000610352 114.870002746582 114.879997253418
## 1 1 2 1
## 114.888000488281 114.889999389648 114.900001525879 114.916000366211
## 1 3 3 1
## 114.919998168945 114.930000305176 114.940002441406 114.949996948242
## 3 1 1 1
## 114.959999084473 114.970001220703 114.98999786377 115
## 3 3 4 1
## 115.01000213623 115.013000488281 115.019996643066 115.021003723145
## 2 1 3 1
## 115.040000915527 115.050003051758 115.051002502441 115.057998657227
## 3 2 1 1
## 115.059997558594 115.069999694824 115.099998474121 115.110000610352
## 1 2 1 1
## 115.116996765137 115.129997253418 115.139999389648 115.141998291016
## 1 1 4 1
## 115.150001525879 115.160003662109 115.169998168945 115.190002441406
## 3 3 1 1
## 115.199996948242 115.220001220703 115.230003356934 115.235000610352
## 7 5 3 1
## 115.23999786377 115.25 115.276000976562 115.279998779297
## 1 3 1 1
## 115.290000915527 115.300003051758 115.309997558594 115.330001831055
## 1 2 4 1
## 115.339996337891 115.352996826172 115.360000610352 115.370002746582
## 2 1 1 1
## 115.379997253418 115.389999389648 115.400001525879 115.419998168945
## 2 3 1 1
## 115.430000305176 115.440002441406 115.445999145508 115.449996948242
## 2 1 1 3
## 115.458999633789 115.470001220703 115.480003356934 115.48999786377
## 1 1 4 2
## 115.5 115.51000213623 115.519996643066 115.521003723145
## 1 3 5 1
## 115.529998779297 115.540000915527 115.550003051758 115.559997558594
## 1 1 4 2
## 115.580001831055 115.589996337891 115.610000610352 115.61799621582
## 1 2 2 1
## 115.620002746582 115.629997253418 115.639999389648 115.652000427246
## 1 2 1 1
## 115.66300201416 115.680000305176 115.690002441406 115.693000793457
## 1 1 1 1
## 115.699996948242 115.709999084473 115.710998535156 115.720001220703
## 2 1 1 2
## 115.746002197266 115.75 115.76000213623 115.779998779297
## 1 2 2 2
## 115.809997558594 115.819999694824 115.830001831055 115.839996337891
## 2 3 2 1
## 115.841003417969 115.849998474121 115.860000610352 115.870002746582
## 1 1 3 1
## 115.879997253418 115.889999389648 115.900001525879 115.910003662109
## 2 4 2 3
## 115.940002441406 115.959999084473 115.970001220703 115.98999786377
## 2 2 3 2
## 116 116.019996643066 116.050003051758 116.059997558594
## 1 1 9 1
## 116.080001831055 116.089996337891 116.099998474121 116.110000610352
## 2 2 2 1
## 116.120002746582 116.13200378418 116.139999389648 116.169998168945
## 1 1 1 3
## 116.180000305176 116.188003540039 116.190002441406 116.197998046875
## 1 1 3 1
## 116.199996948242 116.209999084473 116.220001220703 116.230003356934
## 2 3 5 2
## 116.23999786377 116.25 116.269996643066 116.279998779297
## 1 2 2 1
## 116.290000915527 116.291000366211 116.291999816895 116.295997619629
## 1 1 1 1
## 116.300003051758 116.309997558594 116.319999694824 116.330001831055
## 5 2 1 1
## 116.339996337891 116.349998474121 116.360000610352 116.370002746582
## 2 1 1 1
## 116.379997253418 116.389999389648 116.403999328613 116.410003662109
## 1 3 1 2
## 116.419998168945 116.430000305176 116.440002441406 116.449996948242
## 2 2 1 4
## 116.457000732422 116.459999084473 116.470001220703 116.480003356934
## 1 3 2 1
## 116.501998901367 116.51000213623 116.519996643066 116.529998779297
## 1 1 1 5
## 116.540000915527 116.550003051758 116.559997558594 116.569999694824
## 1 1 3 1
## 116.580001831055 116.589996337891 116.599998474121 116.606002807617
## 1 3 2 2
## 116.610000610352 116.620002746582 116.629997253418 116.637001037598
## 3 2 5 1
## 116.639999389648 116.650001525879 116.65299987793 116.690002441406
## 1 2 1 2
## 116.696998596191 116.699996948242 116.709999084473 116.720001220703
## 1 1 1 1
## 116.730003356934 116.75 116.76000213623 116.769996643066
## 1 2 3 1
## 116.779998779297 116.790000915527 116.809997558594 116.819999694824
## 3 1 1 2
## 116.830001831055 116.839996337891 116.860000610352 116.879997253418
## 3 4 5 2
## 116.884002685547 116.887001037598 116.889999389648 116.910003662109
## 1 1 3 1
## 116.919998168945 116.930000305176 116.940002441406 116.947998046875
## 1 5 4 1
## 116.959999084473 116.970001220703 116.980003356934 116.98999786377
## 1 1 3 1
## 117 117.01000213623 117.019996643066 117.029998779297
## 3 2 1 3
## 117.040000915527 117.050003051758 117.069999694824 117.080001831055
## 4 4 5 2
## 117.089996337891 117.099998474121 117.110000610352 117.111999511719
## 3 2 2 1
## 117.120002746582 117.129997253418 117.139999389648 117.144996643066
## 1 3 1 1
## 117.160003662109 117.169998168945 117.180000305176 117.199996948242
## 1 4 1 1
## 117.209999084473 117.220001220703 117.230003356934 117.237998962402
## 3 4 4 1
## 117.23999786377 117.25 117.26000213623 117.269996643066
## 2 1 3 2
## 117.279998779297 117.290000915527 117.300003051758 117.309997558594
## 3 1 2 4
## 117.319999694824 117.330001831055 117.339996337891 117.342002868652
## 2 2 4 1
## 117.349998474121 117.360000610352 117.370002746582 117.379997253418
## 2 1 1 3
## 117.380996704102 117.389999389648 117.410003662109 117.419998168945
## 1 1 1 3
## 117.430000305176 117.43399810791 117.449996948242 117.459999084473
## 2 1 1 2
## 117.470001220703 117.48999786377 117.51000213623 117.519996643066
## 3 3 4 1
## 117.529998779297 117.540000915527 117.554000854492 117.559997558594
## 3 2 1 1
## 117.580001831055 117.589996337891 117.599998474121 117.629997253418
## 5 5 1 3
## 117.639999389648 117.650001525879 117.660003662109 117.669998168945
## 1 1 2 2
## 117.690002441406 117.699996948242 117.704002380371 117.709999084473
## 1 3 1 3
## 117.730003356934 117.73999786377 117.741996765137 117.75
## 3 5 1 2
## 117.76000213623 117.773002624512 117.779998779297 117.790000915527
## 1 1 1 1
## 117.800003051758 117.809997558594 117.818000793457 117.819000244141
## 2 1 1 1
## 117.819999694824 117.830001831055 117.835998535156 117.839996337891
## 3 1 2 3
## 117.848999023438 117.855003356934 117.860000610352 117.870002746582
## 1 1 4 2
## 117.879997253418 117.889999389648 117.897003173828 117.898002624512
## 3 1 1 1
## 117.900001525879 117.910003662109 117.919998168945 117.940002441406
## 1 1 3 2
## 117.949996948242 117.959999084473 117.970001220703 117.980003356934
## 3 1 2 1
## 117.98999786377 118.01000213623 118.011001586914 118.019996643066
## 2 1 1 1
## 118.040000915527 118.050003051758 118.059997558594 118.069999694824
## 2 2 3 1
## 118.073997497559 118.099998474121 118.110000610352 118.121002197266
## 2 4 1 1
## 118.129997253418 118.139999389648 118.146003723145 118.150001525879
## 1 3 1 1
## 118.160003662109 118.180000305176 118.190002441406 118.209999084473
## 1 2 4 1
## 118.25 118.26000213623 118.269996643066 118.279998779297
## 2 2 2 2
## 118.290000915527 118.300003051758 118.309997558594 118.319999694824
## 1 3 1 2
## 118.330001831055 118.349998474121 118.360000610352 118.370002746582
## 2 2 2 1
## 118.379997253418 118.400001525879 118.410003662109 118.411003112793
## 4 1 2 1
## 118.419998168945 118.430000305176 118.440002441406 118.449996948242
## 2 1 2 1
## 118.459999084473 118.463996887207 118.470001220703 118.480003356934
## 2 1 2 2
## 118.5 118.500999450684 118.504997253418 118.51000213623
## 2 1 1 3
## 118.519996643066 118.540000915527 118.550003051758 118.559997558594
## 6 7 1 1
## 118.569999694824 118.580001831055 118.599998474121 118.610000610352
## 1 1 3 1
## 118.620002746582 118.629997253418 118.639999389648 118.650001525879
## 1 1 3 2
## 118.660003662109 118.666000366211 118.669998168945 118.672996520996
## 2 1 3 1
## 118.680000305176 118.690002441406 118.699996948242 118.704002380371
## 2 1 4 1
## 118.720001220703 118.735000610352 118.73999786377 118.75
## 5 1 1 3
## 118.769996643066 118.779998779297 118.790000915527 118.800003051758
## 4 3 4 1
## 118.809997558594 118.819999694824 118.830001831055 118.839996337891
## 1 1 2 2
## 118.860000610352 118.870002746582 118.889999389648 118.919998168945
## 1 2 3 1
## 118.940002441406 118.949996948242 118.959999084473 118.970001220703
## 1 1 3 2
## 118.973999023438 118.98999786377 119 119.01000213623
## 1 1 3 3
## 119.019996643066 119.050003051758 119.059997558594 119.064002990723
## 2 3 3 1
## 119.069999694824 119.080001831055 119.099998474121 119.110000610352
## 3 1 1 3
## 119.129997253418 119.139999389648 119.150001525879 119.158996582031
## 1 2 1 1
## 119.160003662109 119.166999816895 119.180000305176 119.199996948242
## 2 1 1 1
## 119.209999084473 119.220001220703 119.228996276855 119.230003356934
## 1 2 1 3
## 119.23999786377 119.25 119.269996643066 119.279998779297
## 1 3 2 3
## 119.289001464844 119.290000915527 119.300003051758 119.309997558594
## 1 1 2 3
## 119.319999694824 119.330001831055 119.339996337891 119.349998474121
## 1 1 2 1
## 119.360000610352 119.363998413086 119.370002746582 119.379997253418
## 2 1 1 1
## 119.386001586914 119.389999389648 119.400001525879 119.410003662109
## 1 2 3 1
## 119.419998168945 119.430000305176 119.440002441406 119.459999084473
## 2 1 2 2
## 119.470001220703 119.480003356934 119.48999786377 119.5
## 1 2 3 1
## 119.51000213623 119.519996643066 119.529998779297 119.542999267578
## 2 2 2 1
## 119.550003051758 119.559997558594 119.569999694824 119.583000183105
## 1 1 1 1
## 119.587997436523 119.589996337891 119.599998474121 119.605003356934
## 1 1 3 1
## 119.610000610352 119.620002746582 119.629997253418 119.669998168945
## 5 1 1 2
## 119.680000305176 119.690002441406 119.709999084473 119.720001220703
## 1 1 4 1
## 119.730003356934 119.73999786377 119.75 119.76000213623
## 1 1 1 2
## 119.769996643066 119.779998779297 119.785003662109 119.796997070312
## 2 2 1 1
## 119.800003051758 119.809997558594 119.819999694824 119.839996337891
## 1 3 1 2
## 119.849998474121 119.850997924805 119.860000610352 119.870002746582
## 2 1 1 3
## 119.889999389648 119.900001525879 119.910003662109 119.919998168945
## 2 2 1 1
## 119.940002441406 119.945999145508 119.953002929688 119.959999084473
## 1 1 1 2
## 119.970001220703 119.980003356934 119.98999786377 120.01000213623
## 2 2 1 3
## 120.019996643066 120.029998779297 120.040000915527 120.050003051758
## 2 2 2 3
## 120.059997558594 120.069999694824 120.080001831055 120.089996337891
## 5 2 1 4
## 120.098999023438 120.099998474121 120.110000610352 120.120002746582
## 1 2 2 1
## 120.139999389648 120.150001525879 120.160003662109 120.171997070312
## 1 1 2 1
## 120.180000305176 120.190002441406 120.195999145508 120.199996948242
## 2 1 1 2
## 120.209999084473 120.220001220703 120.230003356934 120.23999786377
## 2 2 1 2
## 120.25 120.269996643066 120.276000976562 120.279998779297
## 3 1 1 1
## 120.290000915527 120.300003051758 120.309997558594 120.315002441406
## 2 2 2 1
## 120.319999694824 120.330001831055 120.349998474121 120.360000610352
## 6 2 1 3
## 120.377998352051 120.379997253418 120.389999389648 120.400001525879
## 1 2 1 1
## 120.410003662109 120.419998168945 120.440002441406 120.449996948242
## 2 1 1 1
## 120.457000732422 120.470001220703 120.473999023438 120.480003356934
## 1 1 1 3
## 120.48999786377 120.49299621582 120.5 120.51000213623
## 1 1 2 2
## 120.519996643066 120.529998779297 120.540000915527 120.541000366211
## 6 1 3 1
## 120.550003051758 120.559997558594 120.580001831055 120.589996337891
## 2 1 2 2
## 120.599998474121 120.606002807617 120.610000610352 120.612998962402
## 2 1 2 1
## 120.620002746582 120.629997253418 120.639999389648 120.650001525879
## 2 2 1 1
## 120.660003662109 120.661003112793 120.671997070312 120.680000305176
## 3 1 1 2
## 120.699996948242 120.709999084473 120.730003356934 120.73999786377
## 2 1 3 1
## 120.75 120.76000213623 120.763000488281 120.769996643066
## 2 4 1 1
## 120.779998779297 120.781997680664 120.790000915527 120.800003051758
## 5 1 1 2
## 120.819999694824 120.830001831055 120.834999084473 120.846000671387
## 2 1 1 1
## 120.849998474121 120.860000610352 120.870002746582 120.879997253418
## 1 4 1 2
## 120.889999389648 120.900001525879 120.903999328613 120.910003662109
## 2 2 1 2
## 120.919998168945 120.922996520996 120.930000305176 120.940002441406
## 1 1 3 1
## 120.949996948242 120.959999084473 120.970001220703 120.980003356934
## 2 2 1 1
## 121 121.01000213623 121.019996643066 121.040000915527
## 1 2 3 3
## 121.050003051758 121.067001342773 121.069999694824 121.080001831055
## 1 1 2 4
## 121.089996337891 121.092002868652 121.099998474121 121.110000610352
## 1 1 1 1
## 121.111999511719 121.120002746582 121.129997253418 121.139999389648
## 1 1 1 1
## 121.150001525879 121.151000976562 121.160003662109 121.169998168945
## 5 1 2 1
## 121.172996520996 121.190002441406 121.209999084473 121.216003417969
## 1 2 5 1
## 121.220001220703 121.230003356934 121.23999786377 121.247001647949
## 2 2 1 1
## 121.25 121.26000213623 121.279998779297 121.289001464844
## 3 3 1 1
## 121.290000915527 121.300003051758 121.309997558594 121.31682413661
## 2 2 2 442
## 121.319999694824 121.330001831055 121.331001281738 121.33699798584
## 1 4 1 1
## 121.339996337891 121.349998474121 121.360000610352 121.373001098633
## 4 5 1 1
## 121.389999389648 121.400001525879 121.40299987793 121.410003662109
## 1 1 1 1
## 121.416000366211 121.419998168945 121.430000305176 121.440002441406
## 1 4 4 4
## 121.449996948242 121.454002380371 121.459999084473 121.470001220703
## 1 1 1 2
## 121.48999786377 121.497001647949 121.5 121.509002685547
## 1 1 2 1
## 121.519996643066 121.540000915527 121.569999694824 121.584999084473
## 1 1 3 1
## 121.589996337891 121.595001220703 121.599998474121 121.610000610352
## 2 1 2 2
## 121.620002746582 121.628997802734 121.639999389648 121.650001525879
## 1 1 2 2
## 121.660003662109 121.669998168945 121.680000305176 121.690002441406
## 3 1 3 3
## 121.699996948242 121.709999084473 121.71900177002 121.720001220703
## 1 4 1 2
## 121.730003356934 121.73999786377 121.75 121.751998901367
## 1 1 3 1
## 121.769996643066 121.779998779297 121.790000915527 121.797996520996
## 1 5 3 1
## 121.800003051758 121.809997558594 121.830001831055 121.839996337891
## 5 3 2 1
## 121.850997924805 121.860000610352 121.865997314453 121.870002746582
## 1 1 1 2
## 121.879997253418 121.900001525879 121.919998168945 121.930000305176
## 1 3 3 1
## 121.940002441406 121.942001342773 121.948997497559 121.949996948242
## 3 1 1 1
## 121.959999084473 121.980003356934 121.98999786377 122
## 2 1 2 2
## 122.01000213623 122.019996643066 122.040000915527 122.045997619629
## 2 2 1 1
## 122.050003051758 122.059997558594 122.065002441406 122.069999694824
## 3 2 1 1
## 122.080001831055 122.097999572754 122.099998474121 122.110000610352
## 2 1 1 3
## 122.120002746582 122.129997253418 122.150001525879 122.169998168945
## 1 4 1 1
## 122.180000305176 122.190002441406 122.199996948242 122.202003479004
## 1 3 3 1
## 122.203002929688 122.220001220703 122.224998474121 122.238998413086
## 1 2 1 1
## 122.23999786377 122.25 122.26000213623 122.267997741699
## 5 1 1 1
## 122.269996643066 122.290000915527 122.300003051758 122.309997558594
## 2 2 2 1
## 122.319999694824 122.339996337891 122.349998474121 122.360000610352
## 1 1 3 2
## 122.370002746582 122.379997253418 122.38200378418 122.389999389648
## 1 1 1 2
## 122.400001525879 122.410003662109 122.419998168945 122.428001403809
## 1 1 3 1
## 122.430000305176 122.440002441406 122.449996948242 122.459999084473
## 1 4 2 1
## 122.463996887207 122.470001220703 122.480003356934 122.48999786377
## 1 1 2 1
## 122.5 122.51000213623 122.519996643066 122.529998779297
## 1 1 2 1
## 122.540000915527 122.552001953125 122.589996337891 122.599998474121
## 1 1 3 1
## 122.610000610352 122.613998413086 122.620002746582 122.625999450684
## 2 1 1 1
## 122.629997253418 122.639999389648 122.669998168945 122.690002441406
## 4 3 2 1
## 122.698997497559 122.699996948242 122.709999084473 122.717002868652
## 1 1 2 1
## 122.730003356934 122.73999786377 122.76000213623 122.779998779297
## 2 1 1 2
## 122.790000915527 122.796997070312 122.800003051758 122.809997558594
## 1 1 2 2
## 122.827003479004 122.830001831055 122.849998474121 122.860000610352
## 1 1 1 2
## 122.870002746582 122.879997253418 122.886001586914 122.900001525879
## 3 4 2 1
## 122.911003112793 122.919998168945 122.930000305176 122.940002441406
## 1 1 2 1
## 122.945999145508 122.949996948242 122.959999084473 122.970001220703
## 1 1 3 4
## 122.980003356934 122.98999786377 123 123.01000213623
## 5 3 3 3
## 123.011001586914 123.019996643066 123.029998779297 123.040000915527
## 1 2 2 4
## 123.050003051758 123.059997558594 123.069999694824 123.080001831055
## 2 2 2 5
## 123.083000183105 123.089996337891 123.092002868652 123.099998474121
## 1 4 1 4
## 123.101997375488 123.111000061035 123.11499786377 123.120002746582
## 1 1 1 2
## 123.121002197266 123.124000549316 123.129997253418 123.13500213623
## 1 1 3 1
## 123.139999389648 123.150001525879 123.160003662109 123.167999267578
## 2 2 3 1
## 123.180000305176 123.190002441406 123.199996948242 123.209999084473
## 2 3 1 1
## 123.220001220703 123.25 123.26000213623 123.265998840332
## 3 6 5 1
## 123.269996643066 123.279998779297 123.290000915527 123.300003051758
## 2 1 1 4
## 123.309997558594 123.322998046875 123.339996337891 123.360000610352
## 1 1 3 1
## 123.370002746582 123.372001647949 123.379997253418 123.389999389648
## 2 1 1 2
## 123.393997192383 123.400001525879 123.430000305176 123.440002441406
## 1 1 1 3
## 123.449996948242 123.470001220703 123.473999023438 123.480003356934
## 2 5 1 3
## 123.483001708984 123.48999786377 123.5 123.51000213623
## 1 3 1 3
## 123.513999938965 123.519996643066 123.529998779297 123.540000915527
## 1 4 1 4
## 123.550003051758 123.569999694824 123.580001831055 123.58699798584
## 2 1 2 1
## 123.589996337891 123.599998474121 123.610000610352 123.620002746582
## 3 2 1 3
## 123.629997253418 123.639999389648 123.650001525879 123.654998779297
## 2 4 2 1
## 123.680000305176 123.690002441406 123.709999084473 123.730003356934
## 2 3 1 3
## 123.731002807617 123.747001647949 123.75 123.76000213623
## 1 1 2 2
## 123.769996643066 123.77799987793 123.779998779297 123.800003051758
## 1 1 1 1
## 123.809997558594 123.819999694824 123.839996337891 123.84400177002
## 1 1 1 1
## 123.849998474121 123.860000610352 123.870002746582 123.889999389648
## 2 3 1 2
## 123.899002075195 123.900001525879 123.919998168945 123.930000305176
## 1 2 2 1
## 123.940002441406 123.949996948242 123.959999084473 123.970001220703
## 1 1 3 1
## 123.98999786377 124 124.019996643066 124.029998779297
## 1 1 1 1
## 124.040000915527 124.055999755859 124.059997558594 124.069999694824
## 1 1 1 2
## 124.072998046875 124.089996337891 124.095001220703 124.099998474121
## 1 1 1 3
## 124.110000610352 124.11499786377 124.120002746582 124.125
## 2 1 2 1
## 124.129997253418 124.134002685547 124.139999389648 124.152000427246
## 2 1 3 1
## 124.15299987793 124.160003662109 124.169998168945 124.180000305176
## 1 3 1 1
## 124.182998657227 124.190002441406 124.193000793457 124.199996948242
## 1 2 1 1
## 124.209999084473 124.222999572754 124.230003356934 124.23999786377
## 1 1 2 3
## 124.26000213623 124.269996643066 124.290000915527 124.299003601074
## 1 2 1 1
## 124.300003051758 124.304000854492 124.309997558594 124.325996398926
## 1 1 3 1
## 124.330001831055 124.339996337891 124.360000610352 124.370002746582
## 2 4 1 1
## 124.379997253418 124.389999389648 124.400001525879 124.419998168945
## 3 2 2 2
## 124.449996948242 124.452003479004 124.470001220703 124.48999786377
## 1 1 1 2
## 124.5 124.51000213623 124.519996643066 124.529998779297
## 2 1 1 1
## 124.540000915527 124.550003051758 124.557998657227 124.559997558594
## 1 1 1 4
## 124.569999694824 124.578002929688 124.580001831055 124.588996887207
## 1 1 1 1
## 124.589996337891 124.61499786377 124.620002746582 124.629997253418
## 2 1 2 2
## 124.639999389648 124.650001525879 124.65299987793 124.660003662109
## 4 1 1 2
## 124.664001464844 124.669998168945 124.680000305176 124.699996948242
## 1 2 1 1
## 124.709999084473 124.730003356934 124.73999786377 124.75
## 2 3 1 2
## 124.758003234863 124.76000213623 124.769996643066 124.776000976562
## 1 1 1 1
## 124.779998779297 124.790000915527 124.800003051758 124.802001953125
## 1 1 1 1
## 124.809997558594 124.819999694824 124.839996337891 124.849998474121
## 1 3 1 2
## 124.866996765137 124.879997253418 124.883003234863 124.889999389648
## 1 3 1 1
## 124.900001525879 124.907997131348 124.910003662109 124.919998168945
## 2 1 2 1
## 124.930000305176 124.940002441406 124.949996948242 124.959999084473
## 2 3 1 2
## 124.970001220703 124.980003356934 124.98999786377 124.999000549316
## 1 1 4 1
## 125.01000213623 125.019996643066 125.040000915527 125.043998718262
## 1 3 3 1
## 125.050003051758 125.069000244141 125.069999694824 125.080001831055
## 1 1 3 3
## 125.092002868652 125.099998474121 125.110000610352 125.129997253418
## 1 2 1 3
## 125.139999389648 125.141998291016 125.142997741699 125.150001525879
## 2 1 1 1
## 125.160003662109 125.169998168945 125.181999206543 125.190002441406
## 1 2 1 1
## 125.199996948242 125.207000732422 125.209999084473 125.223999023438
## 1 1 1 1
## 125.23999786377 125.25 125.26000213623 125.269996643066
## 1 2 1 3
## 125.279998779297 125.289001464844 125.290000915527 125.294998168945
## 2 1 1 1
## 125.300003051758 125.309997558594 125.319999694824 125.330001831055
## 1 2 3 2
## 125.339996337891 125.349998474121 125.370002746582 125.379997253418
## 1 3 1 3
## 125.389999389648 125.400001525879 125.425003051758 125.430000305176
## 1 4 1 1
## 125.440002441406 125.452003479004 125.459999084473 125.46900177002
## 1 1 1 1
## 125.5 125.502998352051 125.51000213623 125.518997192383
## 1 1 2 1
## 125.529998779297 125.540000915527 125.550003051758 125.551002502441
## 4 3 1 1
## 125.554000854492 125.569999694824 125.580001831055 125.589996337891
## 2 1 1 1
## 125.599998474121 125.601997375488 125.610000610352 125.612998962402
## 2 1 1 1
## 125.620002746582 125.629997253418 125.639999389648 125.650001525879
## 2 1 3 2
## 125.660003662109 125.669998168945 125.680000305176 125.690002441406
## 3 2 1 1
## 125.699996948242 125.709999084473 125.730003356934 125.736000061035
## 3 2 2 1
## 125.73999786377 125.75 125.769996643066 125.790000915527
## 1 4 1 1
## 125.800003051758 125.805999755859 125.809997558594 125.819999694824
## 7 1 7 1
## 125.823997497559 125.830001831055 125.839996337891 125.849998474121
## 1 1 2 2
## 125.860000610352 125.870002746582 125.889999389648 125.900001525879
## 1 1 1 3
## 125.910003662109 125.919998168945 125.930000305176 125.940002441406
## 1 2 1 3
## 125.944999694824 125.949996948242 125.959999084473 125.970001220703
## 1 2 2 2
## 125.980003356934 125.987998962402 126.01000213623 126.019996643066
## 3 1 1 6
## 126.029998779297 126.050003051758 126.055000305176 126.059997558594
## 3 3 1 1
## 126.069999694824 126.089996337891 126.099998474121 126.110000610352
## 3 1 5 2
## 126.11799621582 126.120002746582 126.125 126.129997253418
## 1 1 1 1
## 126.133003234863 126.139999389648 126.140998840332 126.148002624512
## 1 4 2 1
## 126.150001525879 126.160003662109 126.169998168945 126.180000305176
## 1 2 4 4
## 126.190002441406 126.199996948242 126.220001220703 126.230003356934
## 3 2 1 2
## 126.235000610352 126.23999786377 126.25 126.255996704102
## 1 4 3 1
## 126.279998779297 126.290000915527 126.300003051758 126.319999694824
## 4 1 1 1
## 126.330001831055 126.349998474121 126.360000610352 126.370002746582
## 3 2 2 1
## 126.400001525879 126.419998168945 126.424003601074 126.440002441406
## 1 2 1 1
## 126.449996948242 126.459999084473 126.463996887207 126.470001220703
## 1 4 1 2
## 126.474998474121 126.480003356934 126.48999786377 126.5
## 1 3 3 1
## 126.51000213623 126.516998291016 126.519996643066 126.529998779297
## 2 1 3 1
## 126.53099822998 126.540000915527 126.550003051758 126.569999694824
## 1 3 2 1
## 126.580001831055 126.589996337891 126.599998474121 126.610000610352
## 4 1 1 2
## 126.620002746582 126.629997253418 126.639999389648 126.650001525879
## 2 1 3 1
## 126.65299987793 126.669998168945 126.680000305176 126.69100189209
## 1 1 2 1
## 126.699996948242 126.709999084473 126.720001220703 126.730003356934
## 3 8 2 3
## 126.73999786377 126.75 126.752998352051 126.769996643066
## 2 2 1 1
## 126.779998779297 126.800003051758 126.809997558594 126.819000244141
## 1 2 3 1
## 126.819999694824 126.830001831055 126.839996337891 126.849998474121
## 5 3 1 1
## 126.860000610352 126.862998962402 126.870002746582 126.879997253418
## 3 1 3 2
## 126.889999389648 126.900001525879 126.904998779297 126.910003662109
## 3 1 1 3
## 126.919998168945 126.940002441406 126.949996948242 126.959999084473
## 1 2 3 6
## 126.970001220703 126.980003356934 126.98999786377 127.01000213623
## 1 2 1 2
## 127.019996643066 127.029998779297 127.040000915527 127.050003051758
## 2 4 2 3
## 127.059997558594 127.064002990723 127.072998046875 127.080001831055
## 5 1 1 1
## 127.089996337891 127.099998474121 127.110000610352 127.120002746582
## 1 2 3 2
## 127.139999389648 127.150001525879 127.160003662109 127.169998168945
## 2 2 1 4
## 127.180000305176 127.180999755859 127.18399810791 127.199996948242
## 2 1 1 2
## 127.209999084473 127.220001220703 127.230003356934 127.23999786377
## 2 2 1 2
## 127.25 127.26000213623 127.279998779297 127.290000915527
## 3 1 1 1
## 127.300003051758 127.309997558594 127.319999694824 127.339996337891
## 4 1 4 2
## 127.349998474121 127.378997802734 127.379997253418 127.388999938965
## 2 1 2 1
## 127.389999389648 127.400001525879 127.401000976562 127.410003662109
## 1 1 1 3
## 127.419998168945 127.430000305176 127.440002441406 127.449996948242
## 1 2 2 3
## 127.459999084473 127.470001220703 127.480003356934 127.48999786377
## 3 1 1 3
## 127.495002746582 127.5 127.51000213623 127.519996643066
## 1 4 5 1
## 127.529998779297 127.540000915527 127.550003051758 127.552001953125
## 1 3 2 1
## 127.555000305176 127.559997558594 127.569999694824 127.580001831055
## 1 2 2 1
## 127.599998474121 127.610000610352 127.620002746582 127.626998901367
## 1 2 4 1
## 127.629997253418 127.650001525879 127.65599822998 127.660003662109
## 3 1 1 2
## 127.669998168945 127.680000305176 127.690002441406 127.699996948242
## 1 1 4 3
## 127.709999084473 127.730003356934 127.732002258301 127.73999786377
## 2 2 1 3
## 127.749000549316 127.75 127.76000213623 127.769996643066
## 2 3 3 3
## 127.778999328613 127.779998779297 127.790000915527 127.800003051758
## 1 4 4 3
## 127.809997558594 127.819999694824 127.830001831055 127.834999084473
## 3 1 3 1
## 127.839996337891 127.845001220703 127.860000610352 127.870002746582
## 5 1 1 3
## 127.879997253418 127.910003662109 127.91300201416 127.919998168945
## 3 1 1 5
## 127.930000305176 127.940002441406 127.944000244141 127.949996948242
## 1 3 1 1
## 127.956001281738 127.959999084473 127.960998535156 127.980003356934
## 1 3 1 1
## 127.98999786377 128 128.009994506836 128.020004272461
## 1 2 1 1
## 128.029998779297 128.031997680664 128.039993286133 128.050003051758
## 1 1 2 3
## 128.059997558594 128.070007324219 128.080001831055 128.089996337891
## 1 3 1 4
## 128.100006103516 128.110000610352 128.119995117188 128.130004882812
## 5 4 1 1
## 128.134002685547 128.139999389648 128.149993896484 128.160003662109
## 1 2 4 2
## 128.169998168945 128.179992675781 128.190002441406 128.199996948242
## 1 5 3 2
## 128.210006713867 128.220001220703 128.25 128.259994506836
## 3 5 1 1
## 128.264999389648 128.279998779297 128.300994873047 128.309997558594
## 1 6 1 1
## 128.315002441406 128.320007324219 128.32600402832 128.337997436523
## 1 1 1 1
## 128.339996337891 128.350006103516 128.350997924805 128.356002807617
## 2 1 1 1
## 128.360000610352 128.365005493164 128.369995117188 128.380004882812
## 1 1 1 2
## 128.389999389648 128.393997192383 128.399993896484 128.406997680664
## 2 1 2 1
## 128.410003662109 128.430999755859 128.438995361328 128.440002441406
## 3 1 1 1
## 128.449996948242 128.458999633789 128.460006713867 128.479995727539
## 2 1 3 2
## 128.483993530273 128.485000610352 128.490005493164 128.5
## 1 1 2 2
## 128.501998901367 128.509994506836 128.520004272461 128.539993286133
## 1 3 4 3
## 128.541000366211 128.550003051758 128.555999755859 128.559997558594
## 1 2 1 3
## 128.565994262695 128.570007324219 128.580001831055 128.600006103516
## 1 1 3 4
## 128.610000610352 128.619995117188 128.630004882812 128.641998291016
## 3 3 3 1
## 128.649993896484 128.660003662109 128.664993286133 128.667007446289
## 3 3 1 1
## 128.669998168945 128.679992675781 128.686996459961 128.690002441406
## 3 1 1 1
## 128.710006713867 128.720001220703 128.725997924805 128.729995727539
## 1 1 1 2
## 128.740005493164 128.740997314453 128.75 128.759994506836
## 1 1 1 1
## 128.770004272461 128.77099609375 128.779998779297 128.789993286133
## 5 1 5 1
## 128.792007446289 128.800003051758 128.815994262695 128.820007324219
## 1 3 1 3
## 128.830001831055 128.839996337891 128.850006103516 128.856002807617
## 2 1 2 1
## 128.869995117188 128.884994506836 128.889999389648 128.893997192383
## 1 1 1 1
## 128.90299987793 128.910003662109 128.929992675781 128.940002441406
## 1 1 4 2
## 128.960006713867 128.970001220703 128.979995727539 128.994995117188
## 3 2 1 1
## 129.005996704102 129.009994506836 129.029998779297 129.039993286133
## 1 1 3 2
## 129.050003051758 129.059997558594 129.070007324219 129.078002929688
## 5 4 1 1
## 129.085006713867 129.089996337891 129.110000610352 129.119995117188
## 1 1 3 1
## 129.130004882812 129.139999389648 129.143997192383 129.149993896484
## 2 1 1 2
## 129.160003662109 129.169998168945 129.199996948242 129.210006713867
## 1 5 4 3
## 129.229995727539 129.240005493164 129.25 129.270004272461
## 4 3 1 1
## 129.279998779297 129.289993286133 129.309997558594 129.320007324219
## 1 1 5 5
## 129.330001831055 129.339996337891 129.350006103516 129.369995117188
## 1 2 2 3
## 129.376007080078 129.389999389648 129.393005371094 129.399993896484
## 1 1 1 2
## 129.408004760742 129.410003662109 129.419998168945 129.429992675781
## 1 5 1 1
## 129.440002441406 129.449996948242 129.460006713867 129.470001220703
## 1 2 1 2
## 129.479995727539 129.490005493164 129.5 129.509994506836
## 3 2 1 2
## 129.520004272461 129.529998779297 129.539993286133 129.544006347656
## 2 3 2 1
## 129.550003051758 129.559997558594 129.570007324219 129.580001831055
## 4 2 4 2
## 129.587005615234 129.589996337891 129.600006103516 129.610000610352
## 1 1 3 1
## 129.619995117188 129.630004882812 129.639999389648 129.649993896484
## 1 2 1 2
## 129.660003662109 129.669998168945 129.679992675781 129.690002441406
## 1 1 5 4
## 129.695999145508 129.710006713867 129.720001220703 129.729995727539
## 1 1 2 4
## 129.744003295898 129.759994506836 129.770004272461 129.774002075195
## 1 2 1 1
## 129.779998779297 129.800003051758 129.809997558594 129.830001831055
## 2 1 6 3
## 129.839996337891 129.850006103516 129.860000610352 129.863998413086
## 3 2 2 2
## 129.869995117188 129.880004882812 129.884002685547 129.889999389648
## 1 2 1 3
## 129.891006469727 129.899993896484 129.910003662109 129.919998168945
## 1 2 1 2
## 129.927993774414 129.929992675781 129.932998657227 129.940002441406
## 1 3 1 2
## 129.947006225586 129.949996948242 129.960006713867 129.970001220703
## 1 5 2 2
## 129.990005493164 130 130.009994506836 130.020004272461
## 1 3 2 2
## 130.022994995117 130.029998779297 130.039001464844 130.039993286133
## 1 1 1 1
## 130.050003051758 130.050994873047 130.059997558594 130.070007324219
## 5 2 3 2
## 130.080001831055 130.087005615234 130.089996337891 130.108001708984
## 1 1 3 1
## 130.110000610352 130.119995117188 130.130004882812 130.134994506836
## 3 1 2 1
## 130.139999389648 130.149993896484 130.160003662109 130.169998168945
## 2 2 1 2
## 130.190002441406 130.197006225586 130.199996948242 130.207000732422
## 2 1 2 1
## 130.210006713867 130.220001220703 130.229995727539 130.240005493164
## 2 5 1 2
## 130.240997314453 130.257995605469 130.279998779297 130.289993286133
## 1 1 2 1
## 130.300003051758 130.309997558594 130.320007324219 130.326995849609
## 1 4 5 1
## 130.330001831055 130.332000732422 130.339996337891 130.350006103516
## 2 1 2 2
## 130.360000610352 130.369995117188 130.380004882812 130.389999389648
## 4 2 9 1
## 130.393005371094 130.399993896484 130.410003662109 130.419998168945
## 1 2 1 2
## 130.429992675781 130.438995361328 130.440002441406 130.442993164062
## 2 1 1 1
## 130.460006713867 130.470001220703 130.47900390625 130.490005493164
## 1 2 1 1
## 130.5 130.513000488281 130.520004272461 130.52799987793
## 2 2 3 1
## 130.529998779297 130.539993286133 130.559997558594 130.580001831055
## 4 1 1 1
## 130.585998535156 130.589996337891 130.602996826172 130.619003295898
## 1 1 1 1
## 130.619995117188 130.630004882812 130.630996704102 130.649993896484
## 3 1 1 3
## 130.660003662109 130.679992675781 130.684005737305 130.690002441406
## 1 1 1 3
## 130.699996948242 130.710006713867 130.720001220703 130.729995727539
## 3 2 3 2
## 130.740005493164 130.75 130.759994506836 130.770004272461
## 5 1 2 2
## 130.779998779297 130.789993286133 130.800003051758 130.809997558594
## 2 1 1 1
## 130.820007324219 130.839996337891 130.850006103516 130.869995117188
## 2 1 1 1
## 130.878997802734 130.880004882812 130.901992797852 130.919998168945
## 1 2 1 6
## 130.934005737305 130.940002441406 130.949996948242 130.953002929688
## 1 3 1 1
## 130.960006713867 130.970001220703 130.990005493164 130.996994018555
## 4 2 1 1
## 131 131.009994506836 131.020004272461 131.029998779297
## 3 1 2 1
## 131.039993286133 131.050003051758 131.059997558594 131.070007324219
## 2 3 1 3
## 131.078994750977 131.080001831055 131.089996337891 131.110000610352
## 1 3 2 3
## 131.119995117188 131.130004882812 131.139999389648 131.149993896484
## 1 3 1 4
## 131.160003662109 131.167007446289 131.169998168945 131.179992675781
## 1 1 3 3
## 131.190002441406 131.199996948242 131.210006713867 131.218002319336
## 5 1 4 1
## 131.220001220703 131.229995727539 131.240005493164 131.25
## 1 1 2 1
## 131.259994506836 131.270004272461 131.279998779297 131.289993286133
## 2 3 1 1
## 131.300003051758 131.320007324219 131.330001831055 131.337997436523
## 1 2 1 1
## 131.339996337891 131.348007202148 131.350006103516 131.360000610352
## 2 1 2 4
## 131.365005493164 131.380004882812 131.389999389648 131.399993896484
## 1 1 4 3
## 131.419998168945 131.436004638672 131.440002441406 131.449996948242
## 2 2 1 1
## 131.453994750977 131.460006713867 131.470001220703 131.479995727539
## 1 4 3 2
## 131.5 131.509994506836 131.520004272461 131.529998779297
## 3 1 3 2
## 131.539993286133 131.550003051758 131.559997558594 131.569000244141
## 1 1 4 1
## 131.570007324219 131.576995849609 131.582000732422 131.589996337891
## 2 1 1 1
## 131.600006103516 131.610000610352 131.619003295898 131.630004882812
## 4 1 1 3
## 131.639999389648 131.649993896484 131.660003662109 131.667007446289
## 3 1 2 1
## 131.669998168945 131.679992675781 131.690002441406 131.710006713867
## 4 2 7 3
## 131.720001220703 131.729995727539 131.740005493164 131.748992919922
## 2 6 3 1
## 131.75 131.779998779297 131.781997680664 131.800003051758
## 4 2 1 5
## 131.809997558594 131.815994262695 131.819000244141 131.820007324219
## 3 1 1 2
## 131.830001831055 131.835006713867 131.839996337891 131.850006103516
## 6 1 3 3
## 131.860000610352 131.86799621582 131.869995117188 131.889999389648
## 2 1 3 1
## 131.897003173828 131.899993896484 131.910003662109 131.919998168945
## 1 2 1 2
## 131.929992675781 131.940002441406 131.942001342773 131.949996948242
## 1 2 1 1
## 131.960006713867 131.970001220703 131.979995727539 131.986999511719
## 2 2 2 1
## 131.990005493164 132 132.009994506836 132.014007568359
## 1 4 3 1
## 132.016006469727 132.020004272461 132.029998779297 132.039993286133
## 1 1 2 2
## 132.050003051758 132.059997558594 132.070007324219 132.080001831055
## 3 1 3 1
## 132.100006103516 132.110000610352 132.130004882812 132.139999389648
## 3 3 2 2
## 132.156005859375 132.160003662109 132.179992675781 132.184005737305
## 1 1 1 1
## 132.195007324219 132.199996948242 132.205001831055 132.210006713867
## 1 5 1 3
## 132.220001220703 132.229995727539 132.240005493164 132.25
## 1 2 2 1
## 132.259994506836 132.279998779297 132.300003051758 132.309997558594
## 3 1 1 3
## 132.332000732422 132.332992553711 132.339996337891 132.350006103516
## 1 1 2 6
## 132.369995117188 132.376998901367 132.380004882812 132.386993408203
## 1 2 1 1
## 132.389999389648 132.399993896484 132.410003662109 132.412994384766
## 1 2 4 6
## 132.419998168945 132.429992675781 132.440002441406 132.449996948242
## 3 1 2 5
## 132.460006713867 132.470001220703 132.5 132.509994506836
## 2 1 1 4
## 132.520004272461 132.531005859375 132.535003662109 132.535995483398
## 2 1 2 1
## 132.539993286133 132.550003051758 132.559997558594 132.570007324219
## 5 4 1 1
## 132.580001831055 132.585998535156 132.600006103516 132.608993530273
## 4 1 2 1
## 132.610000610352 132.619995117188 132.630004882812 132.639999389648
## 3 2 1 2
## 132.649993896484 132.653667359266 132.660003662109 132.67399597168
## 1 442 1 1
## 132.679992675781 132.692993164062 132.699996948242 132.710006713867
## 3 1 2 2
## 132.714996337891 132.748001098633 132.75 132.751007080078
## 1 1 4 1
## 132.759994506836 132.770004272461 132.779998779297 132.789993286133
## 5 3 2 3
## 132.800003051758 132.804000854492 132.809997558594 132.817001342773
## 6 1 3 2
## 132.820007324219 132.830001831055 132.839996337891 132.850006103516
## 3 3 1 2
## 132.865997314453 132.869995117188 132.899993896484 132.910003662109
## 2 1 3 1
## 132.919998168945 132.921005249023 132.92399597168 132.932998657227
## 1 1 1 1
## 132.940002441406 132.955993652344 132.960006713867 132.970001220703
## 1 1 2 3
## 132.979995727539 132.990005493164 133 133.009994506836
## 1 6 4 1
## 133.020004272461 133.029998779297 133.033996582031 133.039993286133
## 4 4 1 2
## 133.050003051758 133.059997558594 133.089996337891 133.100006103516
## 4 3 2 1
## 133.102996826172 133.110000610352 133.119995117188 133.130004882812
## 1 3 3 1
## 133.13200378418 133.139999389648 133.149993896484 133.151000976562
## 1 3 2 1
## 133.162002563477 133.169998168945 133.179992675781 133.190002441406
## 1 1 1 4
## 133.205001831055 133.210006713867 133.220001220703 133.229995727539
## 1 2 4 1
## 133.240005493164 133.24299621582 133.25 133.259994506836
## 2 1 3 2
## 133.264007568359 133.270004272461 133.283996582031 133.289993286133
## 2 3 1 2
## 133.294998168945 133.300003051758 133.309997558594 133.320007324219
## 1 1 4 1
## 133.330001831055 133.332992553711 133.339996337891 133.350006103516
## 3 1 1 2
## 133.360000610352 133.369995117188 133.380004882812 133.384994506836
## 4 2 2 1
## 133.399993896484 133.419998168945 133.421997070312 133.423004150391
## 2 1 1 1
## 133.445999145508 133.449996948242 133.460006713867 133.479995727539
## 1 4 2 1
## 133.490005493164 133.5 133.507995605469 133.509994506836
## 3 2 1 2
## 133.520004272461 133.52799987793 133.529998779297 133.539001464844
## 2 1 1 1
## 133.550003051758 133.559997558594 133.570007324219 133.589996337891
## 2 1 2 2
## 133.600006103516 133.610000610352 133.619995117188 133.630004882812
## 5 3 2 2
## 133.639999389648 133.649993896484 133.654006958008 133.660003662109
## 1 4 1 3
## 133.669998168945 133.671005249023 133.679000854492 133.679992675781
## 2 1 2 3
## 133.682998657227 133.692001342773 133.699996948242 133.707000732422
## 1 1 1 2
## 133.710006713867 133.716995239258 133.718994140625 133.740005493164
## 1 1 1 1
## 133.75 133.759994506836 133.770004272461 133.779998779297
## 1 2 2 1
## 133.789993286133 133.798004150391 133.800003051758 133.809997558594
## 2 1 4 2
## 133.820007324219 133.839996337891 133.854995727539 133.858001708984
## 6 1 1 1
## 133.860000610352 133.869995117188 133.880004882812 133.889999389648
## 2 5 2 2
## 133.899993896484 133.925003051758 133.929992675781 133.940002441406
## 2 1 6 1
## 133.960006713867 133.970001220703 133.979995727539 133.99299621582
## 5 2 1 1
## 133.994003295898 134 134.009994506836 134.020004272461
## 1 4 2 1
## 134.029998779297 134.039993286133 134.050003051758 134.059997558594
## 1 5 2 1
## 134.063995361328 134.065002441406 134.070007324219 134.080001831055
## 2 1 1 3
## 134.089996337891 134.110000610352 134.119995117188 134.139999389648
## 1 1 1 1
## 134.149993896484 134.158004760742 134.160003662109 134.169998168945
## 5 1 1 3
## 134.177001953125 134.179992675781 134.190002441406 134.195007324219
## 1 1 1 1
## 134.205993652344 134.207992553711 134.210006713867 134.220001220703
## 1 2 3 1
## 134.240005493164 134.248992919922 134.25 134.255996704102
## 2 1 1 1
## 134.259994506836 134.279998779297 134.300003051758 134.309997558594
## 2 1 2 1
## 134.315002441406 134.320007324219 134.324005126953 134.330001831055
## 1 6 1 1
## 134.339996337891 134.343002319336 134.350006103516 134.360000610352
## 1 1 1 1
## 134.369995117188 134.371002197266 134.389999389648 134.399993896484
## 2 1 1 3
## 134.410003662109 134.419998168945 134.429992675781 134.440002441406
## 2 5 1 2
## 134.449996948242 134.468002319336 134.470001220703 134.486999511719
## 1 1 1 1
## 134.490005493164 134.496994018555 134.5 134.501998901367
## 1 1 1 1
## 134.509994506836 134.520004272461 134.522994995117 134.539993286133
## 1 1 1 2
## 134.550003051758 134.559997558594 134.570007324219 134.576995849609
## 1 1 2 1
## 134.580993652344 134.589996337891 134.595001220703 134.598007202148
## 1 3 1 1
## 134.600006103516 134.610000610352 134.615005493164 134.619995117188
## 3 2 1 1
## 134.626007080078 134.630004882812 134.639999389648 134.649993896484
## 1 3 4 3
## 134.654998779297 134.669998168945 134.675994873047 134.679992675781
## 1 2 1 3
## 134.686996459961 134.690002441406 134.710006713867 134.720001220703
## 1 2 2 2
## 134.720993041992 134.740005493164 134.75 134.759994506836
## 3 4 4 3
## 134.763000488281 134.770004272461 134.779998779297 134.781005859375
## 1 2 2 1
## 134.789993286133 134.800003051758 134.809997558594 134.820007324219
## 3 2 1 2
## 134.830001831055 134.833999633789 134.839004516602 134.839996337891
## 1 1 1 3
## 134.850006103516 134.860000610352 134.869995117188 134.873992919922
## 1 1 3 1
## 134.893997192383 134.899993896484 134.906997680664 134.929992675781
## 1 1 1 1
## 134.940002441406 134.940994262695 134.949996948242 134.960006713867
## 1 1 4 2
## 134.970001220703 134.975997924805 134.979995727539 134.990005493164
## 3 1 5 3
## 135.00700378418 135.020004272461 135.02099609375 135.029998779297
## 1 3 1 2
## 135.031005859375 135.035003662109 135.048004150391 135.050003051758
## 1 1 1 1
## 135.069000244141 135.070007324219 135.089996337891 135.100006103516
## 1 1 4 1
## 135.106994628906 135.110000610352 135.119995117188 135.139999389648
## 1 3 3 1
## 135.149993896484 135.154006958008 135.160003662109 135.164001464844
## 3 1 1 1
## 135.179992675781 135.190002441406 135.210006713867 135.216995239258
## 3 2 1 1
## 135.220001220703 135.25 135.259994506836 135.268005371094
## 1 1 3 1
## 135.270004272461 135.279998779297 135.289993286133 135.300003051758
## 2 2 5 2
## 135.305999755859 135.309997558594 135.320007324219 135.330001831055
## 2 4 2 1
## 135.345993041992 135.360000610352 135.369995117188 135.380004882812
## 1 3 3 4
## 135.389999389648 135.399993896484 135.401992797852 135.406005859375
## 1 2 2 1
## 135.410003662109 135.414993286133 135.419998168945 135.42399597168
## 1 1 4 1
## 135.429992675781 135.449996948242 135.470001220703 135.479995727539
## 3 1 3 1
## 135.490005493164 135.5 135.505996704102 135.509994506836
## 1 1 1 1
## 135.511993408203 135.529998779297 135.539001464844 135.539993286133
## 1 1 1 3
## 135.544006347656 135.550003051758 135.552993774414 135.554000854492
## 1 1 1 1
## 135.559997558594 135.570007324219 135.580001831055 135.587005615234
## 3 2 3 3
## 135.589996337891 135.600006103516 135.601254237206 135.602996826172
## 2 3 442 1
## 135.610000610352 135.610992431641 135.630004882812 135.639999389648
## 1 2 5 3
## 135.641998291016 135.649993896484 135.667999267578 135.669998168945
## 1 2 1 4
## 135.675994873047 135.679992675781 135.699996948242 135.703994750977
## 1 1 2 1
## 135.710006713867 135.712005615234 135.729995727539 135.731002807617
## 1 1 2 2
## 135.740005493164 135.75700378418 135.759994506836 135.770004272461
## 1 1 1 1
## 135.77799987793 135.779998779297 135.794006347656 135.794998168945
## 1 1 1 2
## 135.800003051758 135.809997558594 135.820007324219 135.830001831055
## 1 6 1 1
## 135.839996337891 135.850006103516 135.869995117188 135.876007080078
## 1 1 2 1
## 135.880004882812 135.889999389648 135.899993896484 135.910003662109
## 3 2 3 2
## 135.919998168945 135.929000854492 135.932998657227 135.940002441406
## 1 1 1 3
## 135.949996948242 135.958999633789 135.960006713867 135.970001220703
## 2 1 1 3
## 135.979995727539 135.990005493164 136 136.00700378418
## 4 1 1 3
## 136.011001586914 136.020004272461 136.029998779297 136.039993286133
## 2 3 2 1
## 136.046997070312 136.050003051758 136.059997558594 136.070007324219
## 1 1 3 3
## 136.070999145508 136.080001831055 136.089996337891 136.100006103516
## 1 1 1 1
## 136.119995117188 136.126007080078 136.130004882812 136.139007568359
## 5 1 1 1
## 136.139999389648 136.147994995117 136.156005859375 136.160003662109
## 1 2 1 3
## 136.169998168945 136.171997070312 136.179992675781 136.180999755859
## 1 1 1 1
## 136.186004638672 136.190002441406 136.197998046875 136.199996948242
## 1 3 1 2
## 136.210006713867 136.22200012207 136.229995727539 136.240005493164
## 3 1 4 1
## 136.246002197266 136.25 136.253005981445 136.270004272461
## 1 1 1 3
## 136.279998779297 136.300003051758 136.307998657227 136.309997558594
## 4 2 1 1
## 136.315002441406 136.317993164062 136.320007324219 136.320999145508
## 1 3 1 1
## 136.330001831055 136.339996337891 136.350006103516 136.360000610352
## 3 1 3 1
## 136.389999389648 136.399993896484 136.404006958008 136.419998168945
## 4 2 1 5
## 136.429992675781 136.440002441406 136.442001342773 136.445999145508
## 1 2 1 1
## 136.449996948242 136.460006713867 136.47200012207 136.479995727539
## 2 2 1 2
## 136.488998413086 136.490005493164 136.490997314453 136.5
## 1 1 2 1
## 136.505004882812 136.509994506836 136.520004272461 136.529998779297
## 1 1 1 3
## 136.531005859375 136.533996582031 136.539993286133 136.559997558594
## 1 1 2 1
## 136.570007324219 136.580001831055 136.589996337891 136.600006103516
## 4 4 1 3
## 136.610000610352 136.613998413086 136.619995117188 136.630004882812
## 1 1 1 1
## 136.639999389648 136.649002075195 136.654998779297 136.662002563477
## 1 1 2 1
## 136.669998168945 136.679992675781 136.684005737305 136.699996948242
## 3 1 1 2
## 136.710006713867 136.720001220703 136.740005493164 136.75
## 3 1 5 1
## 136.755004882812 136.757995605469 136.759994506836 136.770004272461
## 1 1 5 1
## 136.779998779297 136.800003051758 136.802001953125 136.809997558594
## 1 3 1 2
## 136.820007324219 136.830001831055 136.839004516602 136.839996337891
## 1 5 1 2
## 136.850006103516 136.854995727539 136.869995117188 136.899993896484
## 3 1 2 1
## 136.910003662109 136.919998168945 136.929992675781 136.934005737305
## 1 1 2 1
## 136.940002441406 136.949996948242 136.968994140625 136.970001220703
## 4 2 1 4
## 136.979995727539 136.990005493164 137 137.011993408203
## 2 4 2 1
## 137.020004272461 137.024993896484 137.029998779297 137.039001464844
## 2 1 1 3
## 137.039993286133 137.050003051758 137.059997558594 137.070007324219
## 2 1 3 2
## 137.080001831055 137.089004516602 137.089996337891 137.095993041992
## 1 1 1 1
## 137.100006103516 137.104995727539 137.108993530273 137.110000610352
## 2 1 2 3
## 137.134002685547 137.139007568359 137.149002075195 137.154998779297
## 1 1 1 1
## 137.160003662109 137.169998168945 137.179992675781 137.195999145508
## 3 1 2 1
## 137.199996948242 137.220001220703 137.229995727539 137.231994628906
## 2 2 3 2
## 137.238998413086 137.240005493164 137.25 137.253997802734
## 1 1 2 1
## 137.259002685547 137.259994506836 137.272994995117 137.281997680664
## 1 2 1 1
## 137.289993286133 137.300003051758 137.320007324219 137.330001831055
## 2 1 7 1
## 137.339996337891 137.360000610352 137.36799621582 137.369995117188
## 2 1 1 3
## 137.380004882812 137.384994506836 137.389999389648 137.399993896484
## 3 1 3 2
## 137.410003662109 137.419006347656 137.419998168945 137.421997070312
## 3 1 7 1
## 137.42399597168 137.429992675781 137.434997558594 137.440002441406
## 1 1 1 3
## 137.449996948242 137.453002929688 137.455993652344 137.460006713867
## 1 1 1 1
## 137.466995239258 137.479995727539 137.490005493164 137.5
## 1 1 1 1
## 137.509994506836 137.514999389648 137.520004272461 137.52099609375
## 2 1 2 1
## 137.529998779297 137.550003051758 137.559997558594 137.570007324219
## 1 6 8 1
## 137.589996337891 137.591003417969 137.595001220703 137.600006103516
## 1 1 1 1
## 137.610000610352 137.619995117188 137.630004882812 137.63200378418
## 1 2 2 1
## 137.639999389648 137.643997192383 137.649993896484 137.660003662109
## 1 1 2 1
## 137.662994384766 137.669998168945 137.67399597168 137.679992675781
## 1 3 1 4
## 137.699996948242 137.710006713867 137.720001220703 137.729995727539
## 1 3 1 3
## 137.733993530273 137.740005493164 137.75 137.759994506836
## 1 1 2 3
## 137.779998779297 137.789993286133 137.792999267578 137.800003051758
## 1 1 1 2
## 137.820007324219 137.830001831055 137.839996337891 137.843002319336
## 3 3 2 1
## 137.850006103516 137.860000610352 137.861999511719 137.869995117188
## 1 4 1 2
## 137.880004882812 137.889999389648 137.899993896484 137.901000976562
## 1 1 3 1
## 137.919998168945 137.925003051758 137.927993774414 137.929992675781
## 3 1 1 1
## 137.940002441406 137.949005126953 137.949996948242 137.960006713867
## 1 1 1 4
## 137.979995727539 137.990005493164 138 138.003005981445
## 1 2 3 1
## 138.022003173828 138.022994995117 138.029998779297 138.037002563477
## 1 1 1 2
## 138.039993286133 138.054000854492 138.059997558594 138.07600402832
## 1 2 1 1
## 138.080001831055 138.100006103516 138.119995117188 138.121002197266
## 1 2 1 1
## 138.123992919922 138.130004882812 138.15299987793 138.160003662109
## 1 2 1 1
## 138.164993286133 138.169998168945 138.17399597168 138.210006713867
## 1 2 1 5
## 138.220001220703 138.229995727539 138.240005493164 138.25
## 1 2 1 4
## 138.261993408203 138.279998779297 138.281005859375 138.289993286133
## 1 2 1 3
## 138.300003051758 138.309997558594 138.311996459961 138.322998046875
## 2 1 1 2
## 138.330001831055 138.339996337891 138.350006103516 138.360000610352
## 7 2 1 2
## 138.373992919922 138.380004882812 138.389999389648 138.410003662109
## 1 5 5 2
## 138.419998168945 138.429992675781 138.440002441406 138.442001342773
## 3 5 3 1
## 138.447998046875 138.460006713867 138.466003417969 138.470001220703
## 1 2 1 1
## 138.479995727539 138.488998413086 138.490005493164 138.494995117188
## 1 1 1 1
## 138.5 138.516006469727 138.520004272461 138.529998779297
## 3 1 3 2
## 138.542999267578 138.550003051758 138.559997558594 138.570007324219
## 1 2 1 2
## 138.580001831055 138.589996337891 138.595001220703 138.600006103516
## 1 3 1 1
## 138.602996826172 138.610000610352 138.619995117188 138.630004882812
## 1 2 1 1
## 138.638000488281 138.641998291016 138.649993896484 138.656997680664
## 1 1 1 1
## 138.658996582031 138.660003662109 138.669998168945 138.671005249023
## 1 1 2 1
## 138.690002441406 138.699996948242 138.710998535156 138.720001220703
## 3 5 1 2
## 138.729995727539 138.735992431641 138.740005493164 138.75
## 1 1 2 4
## 138.759994506836 138.763000488281 138.770004272461 138.779998779297
## 2 1 1 1
## 138.789993286133 138.791000366211 138.793594301748 138.800003051758
## 2 1 442 3
## 138.809005737305 138.809997558594 138.813995361328 138.820007324219
## 1 4 2 1
## 138.82600402832 138.850006103516 138.860000610352 138.869995117188
## 1 2 4 3
## 138.880004882812 138.889999389648 138.891998291016 138.899993896484
## 1 2 1 2
## 138.901000976562 138.90299987793 138.917007446289 138.919998168945
## 1 1 1 1
## 138.923004150391 138.940002441406 138.960006713867 138.973999023438
## 1 1 5 1
## 138.979995727539 138.990005493164 139 139.001998901367
## 3 2 4 1
## 139.009994506836 139.020004272461 139.029998779297 139.042007446289
## 1 2 4 1
## 139.050003051758 139.059997558594 139.070007324219 139.080001831055
## 1 2 2 1
## 139.089996337891 139.100006103516 139.110000610352 139.119995117188
## 1 1 1 4
## 139.130004882812 139.139999389648 139.151000976562 139.166000366211
## 1 2 2 1
## 139.169998168945 139.173004150391 139.190002441406 139.197006225586
## 3 1 2 1
## 139.199996948242 139.201995849609 139.210006713867 139.218994140625
## 1 1 2 1
## 139.220001220703 139.229995727539 139.240005493164 139.25
## 3 2 2 3
## 139.25700378418 139.259994506836 139.270004272461 139.279998779297
## 1 1 2 3
## 139.289993286133 139.300003051758 139.309997558594 139.317993164062
## 6 2 4 1
## 139.320007324219 139.330001831055 139.339996337891 139.350006103516
## 3 2 2 1
## 139.360000610352 139.369995117188 139.373001098633 139.389999389648
## 6 2 1 1
## 139.399993896484 139.410003662109 139.421005249023 139.429992675781
## 3 1 1 1
## 139.432998657227 139.440002441406 139.449996948242 139.460006713867
## 1 3 1 1
## 139.464004516602 139.470001220703 139.479995727539 139.490005493164
## 1 3 1 2
## 139.494995117188 139.5 139.507995605469 139.509994506836
## 1 2 1 2
## 139.516006469727 139.520004272461 139.529998779297 139.539993286133
## 1 1 1 1
## 139.550003051758 139.559997558594 139.570007324219 139.580001831055
## 2 1 1 2
## 139.595001220703 139.600006103516 139.619995117188 139.630004882812
## 1 1 1 1
## 139.660003662109 139.669998168945 139.671005249023 139.679992675781
## 1 4 1 1
## 139.699996948242 139.708999633789 139.710006713867 139.720001220703
## 1 1 1 2
## 139.729995727539 139.740005493164 139.75 139.751998901367
## 3 2 2 1
## 139.759994506836 139.768005371094 139.800003051758 139.809997558594
## 1 1 3 1
## 139.820007324219 139.830001831055 139.839996337891 139.850006103516
## 2 2 6 4
## 139.860000610352 139.869995117188 139.871994018555 139.899993896484
## 1 1 1 1
## 139.910003662109 139.919998168945 139.929992675781 139.936004638672
## 7 7 1 2
## 139.949996948242 139.960006713867 139.970001220703 139.973999023438
## 1 1 1 1
## 139.979995727539 139.988998413086 139.992004394531 140
## 1 1 1 1
## 140.020004272461 140.029998779297 140.033996582031 140.039993286133
## 2 2 1 1
## 140.050003051758 140.070007324219 140.080001831055 140.100006103516
## 1 1 1 1
## 140.110000610352 140.119995117188 140.130004882812 140.149993896484
## 1 5 1 4
## 140.169998168945 140.171997070312 140.186004638672 140.220001220703
## 3 1 1 2
## 140.25 140.257995605469 140.259994506836 140.263000488281
## 10 2 1 1
## 140.279998779297 140.285003662109 140.289993286133 140.292007446289
## 1 2 3 1
## 140.29899597168 140.300003051758 140.307006835938 140.307998657227
## 1 2 1 1
## 140.309997558594 140.320007324219 140.320999145508 140.330001831055
## 2 2 1 6
## 140.339996337891 140.350006103516 140.360000610352 140.367004394531
## 2 1 2 1
## 140.380004882812 140.388000488281 140.389999389648 140.393005371094
## 1 1 2 1
## 140.399002075195 140.410003662109 140.419998168945 140.429992675781
## 4 2 2 2
## 140.430999755859 140.440002441406 140.449996948242 140.460006713867
## 1 3 2 1
## 140.470001220703 140.490005493164 140.505004882812 140.509994506836
## 1 1 1 1
## 140.520004272461 140.529998779297 140.533996582031 140.539993286133
## 1 2 3 1
## 140.546005249023 140.550003051758 140.559997558594 140.570007324219
## 1 4 1 1
## 140.580001831055 140.589996337891 140.600006103516 140.610000610352
## 2 2 3 3
## 140.610992431641 140.619003295898 140.619995117188 140.623001098633
## 1 1 3 1
## 140.630004882812 140.639999389648 140.649993896484 140.656005859375
## 3 1 3 1
## 140.656997680664 140.660003662109 140.669998168945 140.679992675781
## 1 1 4 2
## 140.682998657227 140.690002441406 140.720001220703 140.729995727539
## 1 3 2 2
## 140.740005493164 140.744003295898 140.751998901367 140.759994506836
## 2 1 1 1
## 140.770004272461 140.779998779297 140.787002563477 140.789993286133
## 1 2 1 1
## 140.817993164062 140.820007324219 140.830001831055 140.839996337891
## 1 1 1 1
## 140.843994140625 140.850006103516 140.860000610352 140.860992431641
## 1 2 1 1
## 140.869995117188 140.871994018555 140.880004882812 140.888000488281
## 2 1 1 1
## 140.889999389648 140.893005371094 140.897003173828 140.899993896484
## 6 1 1 4
## 140.912002563477 140.914001464844 140.914993286133 140.919998168945
## 1 1 1 1
## 140.929992675781 140.940002441406 140.949996948242 140.970001220703
## 5 2 1 3
## 140.97200012207 140.990005493164 141 141.005996704102
## 1 1 2 1
## 141.009994506836 141.011993408203 141.029998779297 141.035003662109
## 2 1 1 1
## 141.039993286133 141.050003051758 141.059997558594 141.070007324219
## 2 1 11 3
## 141.080001831055 141.089004516602 141.089996337891 141.095993041992
## 1 1 3 1
## 141.100006103516 141.100997924805 141.110000610352 141.119995117188
## 1 1 1 1
## 141.130004882812 141.139999389648 141.149993896484 141.184997558594
## 2 1 1 1
## 141.190002441406 141.210006713867 141.214996337891 141.220001220703
## 3 1 1 1
## 141.229995727539 141.240005493164 141.25 141.259994506836
## 5 3 3 2
## 141.270004272461 141.27799987793 141.289993286133 141.298004150391
## 1 1 1 3
## 141.300003051758 141.304992675781 141.320007324219 141.330001831055
## 2 1 3 2
## 141.339996337891 141.350006103516 141.360000610352 141.380004882812
## 2 1 1 1
## 141.389999389648 141.399993896484 141.410003662109 141.419998168945
## 3 2 1 1
## 141.429992675781 141.449996948242 141.451995849609 141.460006713867
## 1 2 2 1
## 141.462997436523 141.470001220703 141.490005493164 141.5
## 1 1 3 4
## 141.50700378418 141.509994506836 141.52799987793 141.529998779297
## 1 3 1 2
## 141.535003662109 141.539993286133 141.550003051758 141.559997558594
## 1 1 1 1
## 141.580001831055 141.589996337891 141.600006103516 141.602005004883
## 1 2 2 1
## 141.610000610352 141.619995117188 141.654998779297 141.660003662109
## 2 2 1 3
## 141.669998168945 141.679992675781 141.688003540039 141.699996948242
## 1 1 1 1
## 141.710006713867 141.720001220703 141.725997924805 141.729995727539
## 1 1 1 1
## 141.759994506836 141.770004272461 141.789993286133 141.809997558594
## 1 1 5 3
## 141.828002929688 141.830001831055 141.839996337891 141.848007202148
## 1 1 1 1
## 141.850006103516 141.869995117188 141.876998901367 141.880004882812
## 2 1 1 3
## 141.882995605469 141.889999389648 141.910003662109 141.919998168945
## 1 1 2 3
## 141.929992675781 141.940002441406 141.957000732422 141.960006713867
## 2 3 1 2
## 141.979995727539 141.988006591797 141.994003295898 142
## 4 1 1 2
## 142.009994506836 142.011001586914 142.020004272461 142.039993286133
## 1 1 1 1
## 142.050003051758 142.059997558594 142.063003540039 142.065002441406
## 1 1 1 1
## 142.070007324219 142.080001831055 142.089996337891 142.100006103516
## 1 2 3 2
## 142.119995117188 142.130004882812 142.149993896484 142.160003662109
## 1 1 4 1
## 142.166000366211 142.169998168945 142.180999755859 142.188003540039
## 1 1 1 7
## 142.199996948242 142.229995727539 142.233001708984 142.233993530273
## 1 1 1 1
## 142.238006591797 142.25 142.259994506836 142.27099609375
## 1 1 4 2
## 142.279998779297 142.300003051758 142.320007324219 142.330001831055
## 1 3 4 1
## 142.339996337891 142.343002319336 142.360000610352 142.363006591797
## 1 1 1 1
## 142.367004394531 142.369995117188 142.380004882812 142.389999389648
## 1 1 1 2
## 142.410003662109 142.429992675781 142.440002441406 142.447006225586
## 2 1 1 1
## 142.460006713867 142.468994140625 142.479995727539 142.490005493164
## 1 1 1 1
## 142.5 142.509994506836 142.539993286133 142.550003051758
## 2 2 2 2
## 142.554992675781 142.559997558594 142.570007324219 142.580001831055
## 1 1 1 1
## 142.587005615234 142.589996337891 142.610000610352 142.619995117188
## 1 1 1 1
## 142.630004882812 142.639999389648 142.647003173828 142.649993896484
## 1 1 2 2
## 142.658996582031 142.662994384766 142.669998168945 142.675003051758
## 1 1 2 1
## 142.679000854492 142.679992675781 142.690002441406 142.692001342773
## 1 5 2 1
## 142.703002929688 142.710006713867 142.729995727539 142.740005493164
## 1 1 4 2
## 142.75 142.768997192383 142.779998779297 142.787994384766
## 2 1 3 1
## 142.789993286133 142.796005249023 142.809997558594 142.820007324219
## 1 1 1 3
## 142.830001831055 142.850006103516 142.860000610352 142.880004882812
## 1 1 1 3
## 142.889999389648 142.891998291016 142.897003173828 142.899993896484
## 2 1 1 2
## 142.906005859375 142.910003662109 142.919998168945 142.940002441406
## 1 3 2 1
## 142.960006713867 142.964996337891 142.970001220703 142.975006103516
## 3 1 1 2
## 142.990005493164 142.996002197266 143 143.009994506836
## 4 1 1 4
## 143.016998291016 143.020004272461 143.022994995117 143.039993286133
## 1 2 1 1
## 143.04899597168 143.050003051758 143.059997558594 143.070007324219
## 1 3 3 1
## 143.070999145508 143.080001831055 143.080993652344 143.100006103516
## 1 2 1 1
## 143.110000610352 143.119003295898 143.121002197266 143.130004882812
## 2 1 1 1
## 143.139999389648 143.141998291016 143.149993896484 143.160003662109
## 1 1 2 3
## 143.179992675781 143.190002441406 143.199996948242 143.207992553711
## 1 2 3 1
## 143.210006713867 143.220001220703 143.229995727539 143.25
## 2 1 4 3
## 143.270004272461 143.279998779297 143.289993286133 143.300003051758
## 1 5 3 1
## 143.320007324219 143.330001831055 143.341995239258 143.360000610352
## 7 1 1 1
## 143.375 143.389999389648 143.399002075195 143.399993896484
## 1 1 1 2
## 143.410003662109 143.410995483398 143.429992675781 143.440002441406
## 3 1 2 1
## 143.460006713867 143.464996337891 143.479995727539 143.490005493164
## 3 1 2 3
## 143.5 143.509994506836 143.511993408203 143.520004272461
## 2 2 1 1
## 143.522003173828 143.529998779297 143.539993286133 143.542007446289
## 1 2 2 1
## 143.54899597168 143.550003051758 143.565994262695 143.570007324219
## 1 2 1 2
## 143.580001831055 143.589996337891 143.610000610352 143.623992919922
## 1 1 1 1
## 143.626998901367 143.630004882812 143.649993896484 143.660003662109
## 1 3 2 6
## 143.679992675781 143.690002441406 143.699996948242 143.710006713867
## 3 1 2 3
## 143.720001220703 143.731994628906 143.735992431641 143.75
## 2 1 1 3
## 143.770004272461 143.779998779297 143.789993286133 143.800003051758
## 1 1 4 1
## 143.809997558594 143.820007324219 143.830001831055 143.85400390625
## 1 1 2 1
## 143.860000610352 143.860992431641 143.880004882812 143.880996704102
## 2 1 5 1
## 143.910003662109 143.929992675781 143.940002441406 143.940994262695
## 1 1 1 1
## 143.949996948242 143.968994140625 143.970001220703 143.979995727539
## 3 1 4 4
## 143.990005493164 144.009994506836 144.020004272461 144.039993286133
## 4 1 2 1
## 144.050003051758 144.070007324219 144.078002929688 144.080001831055
## 1 1 1 1
## 144.089996337891 144.102005004883 144.110000610352 144.119995117188
## 1 1 1 1
## 144.139999389648 144.149993896484 144.179992675781 144.184005737305
## 2 4 1 1
## 144.188003540039 144.199996948242 144.210006713867 144.220001220703
## 1 1 2 1
## 144.229995727539 144.235000610352 144.266998291016 144.268005371094
## 1 1 1 1
## 144.270004272461 144.279998779297 144.289993286133 144.300003051758
## 1 5 3 3
## 144.309997558594 144.320007324219 144.328002929688 144.330001831055
## 7 2 1 2
## 144.339996337891 144.369995117188 144.380004882812 144.389999389648
## 2 1 4 2
## 144.397994995117 144.399993896484 144.419998168945 144.425994873047
## 1 1 3 1
## 144.429992675781 144.440002441406 144.449996948242 144.451995849609
## 3 1 3 1
## 144.460006713867 144.470001220703 144.47200012207 144.479995727539
## 2 2 1 2
## 144.490005493164 144.505004882812 144.520004272461 144.529006958008
## 1 1 1 1
## 144.529998779297 144.539993286133 144.542007446289 144.559997558594
## 1 1 1 3
## 144.570007324219 144.576995849609 144.580001831055 144.589996337891
## 1 1 2 2
## 144.593994140625 144.600006103516 144.610000610352 144.619995117188
## 1 1 1 1
## 144.623001098633 144.630004882812 144.639999389648 144.649993896484
## 1 3 2 2
## 144.660003662109 144.669998168945 144.67399597168 144.679992675781
## 1 3 1 5
## 144.690002441406 144.694000244141 144.714004516602 144.718002319336
## 2 1 1 1
## 144.718055988468 144.720001220703 144.740005493164 144.742004394531
## 442 1 2 1
## 144.744003295898 144.75 144.757995605469 144.759994506836
## 1 2 1 2
## 144.779998779297 144.800003051758 144.804992675781 144.820007324219
## 1 2 1 3
## 144.839996337891 144.848999023438 144.850006103516 144.852005004883
## 2 1 2 1
## 144.869995117188 144.880004882812 144.899993896484 144.910003662109
## 2 3 1 3
## 144.919998168945 144.929992675781 144.949996948242 144.960006713867
## 3 2 2 1
## 144.970001220703 144.990005493164 145.009994506836 145.014007568359
## 1 1 1 1
## 145.020004272461 145.029998779297 145.039993286133 145.057998657227
## 2 2 1 1
## 145.063003540039 145.063995361328 145.070007324219 145.080001831055
## 1 1 2 1
## 145.089996337891 145.093002319336 145.100006103516 145.100997924805
## 1 1 2 1
## 145.104995727539 145.108993530273 145.110000610352 145.128005981445
## 1 1 1 1
## 145.130996704102 145.139999389648 145.149002075195 145.160003662109
## 1 1 1 1
## 145.164993286133 145.177001953125 145.179992675781 145.203994750977
## 1 1 1 1
## 145.220001220703 145.220993041992 145.229995727539 145.240005493164
## 1 1 3 3
## 145.25 145.279998779297 145.300003051758 145.305999755859
## 1 3 1 1
## 145.309997558594 145.315994262695 145.320007324219 145.330001831055
## 1 1 1 3
## 145.339996337891 145.360000610352 145.369995117188 145.380004882812
## 1 1 1 1
## 145.380996704102 145.384002685547 145.389999389648 145.399993896484
## 1 1 1 2
## 145.40299987793 145.406997680664 145.419998168945 145.429992675781
## 1 1 2 2
## 145.440002441406 145.440994262695 145.449996948242 145.460006713867
## 1 1 1 1
## 145.470001220703 145.509994506836 145.531997680664 145.537994384766
## 2 1 1 1
## 145.539993286133 145.550003051758 145.563003540039 145.570007324219
## 1 4 1 2
## 145.580001831055 145.610000610352 145.619995117188 145.630004882812
## 1 3 1 1
## 145.632995605469 145.638000488281 145.649993896484 145.660003662109
## 1 1 1 1
## 145.67399597168 145.690002441406 145.695007324219 145.699996948242
## 1 2 1 2
## 145.710006713867 145.740005493164 145.75 145.759994506836
## 1 1 2 1
## 145.776000976562 145.779998779297 145.783996582031 145.789993286133
## 1 2 1 2
## 145.791000366211 145.802001953125 145.817001342773 145.820007324219
## 1 1 1 3
## 145.830001831055 145.860000610352 145.869995117188 145.891006469727
## 2 1 1 1
## 145.899002075195 145.899993896484 145.912994384766 145.919998168945
## 1 2 1 2
## 145.921005249023 145.940002441406 145.949996948242 145.970001220703
## 1 10 1 1
## 145.973007202148 145.979995727539 145.981994628906 145.990005493164
## 1 2 1 1
## 146 146.009994506836 146.020004272461 146.029998779297
## 1 2 1 5
## 146.039993286133 146.046005249023 146.050003051758 146.059997558594
## 3 1 1 1
## 146.070007324219 146.078002929688 146.089996337891 146.100006103516
## 1 1 3 3
## 146.110000610352 146.119995117188 146.130004882812 146.139999389648
## 2 1 2 1
## 146.149993896484 146.160003662109 146.169998168945 146.179992675781
## 1 1 2 3
## 146.182998657227 146.190002441406 146.199996948242 146.220001220703
## 1 1 2 3
## 146.229995727539 146.240005493164 146.25 146.259002685547
## 2 1 2 1
## 146.270004272461 146.289993286133 146.300003051758 146.320999145508
## 3 1 1 1
## 146.335998535156 146.350006103516 146.358993530273 146.360000610352
## 1 2 1 2
## 146.369995117188 146.399993896484 146.410003662109 146.427993774414
## 1 3 1 1
## 146.429992675781 146.436004638672 146.440002441406 146.444000244141
## 1 1 1 1
## 146.460006713867 146.464996337891 146.475997924805 146.479995727539
## 1 1 1 2
## 146.5 146.520004272461 146.531997680664 146.548004150391
## 1 1 1 1
## 146.559997558594 146.570007324219 146.57600402832 146.580001831055
## 1 1 1 1
## 146.589996337891 146.600006103516 146.604995727539 146.619995117188
## 1 1 1 1
## 146.630004882812 146.649993896484 146.660003662109 146.669998168945
## 5 1 2 2
## 146.679992675781 146.686004638672 146.686996459961 146.690002441406
## 3 1 1 2
## 146.699996948242 146.707992553711 146.710006713867 146.714004516602
## 2 1 1 2
## 146.720001220703 146.72900390625 146.740005493164 146.75
## 1 1 2 2
## 146.770004272461 146.787002563477 146.789993286133 146.796005249023
## 1 1 1 1
## 146.807006835938 146.807998657227 146.809997558594 146.820007324219
## 1 1 4 1
## 146.830001831055 146.839996337891 146.848007202148 146.850006103516
## 1 1 1 1
## 146.860000610352 146.869995117188 146.880004882812 146.889999389648
## 1 3 2 3
## 146.897003173828 146.899993896484 146.910003662109 146.940002441406
## 1 1 1 1
## 146.949996948242 146.970001220703 146.981994628906 146.990005493164
## 1 2 1 2
## 146.992004394531 147 147.007995605469 147.050003051758
## 1 1 1 2
## 147.059997558594 147.070007324219 147.080001831055 147.089996337891
## 3 2 2 1
## 147.100006103516 147.110000610352 147.117004394531 147.119995117188
## 2 1 1 3
## 147.130004882812 147.134994506836 147.139999389648 147.160003662109
## 1 1 1 1
## 147.169998168945 147.182998657227 147.190002441406 147.199996948242
## 1 1 1 1
## 147.227996826172 147.233993530273 147.25 147.270004272461
## 1 1 1 3
## 147.300003051758 147.320007324219 147.326995849609 147.337005615234
## 1 2 1 1
## 147.337997436523 147.339996337891 147.350006103516 147.360000610352
## 1 1 1 2
## 147.365005493164 147.380004882812 147.389999389648 147.401992797852
## 1 2 3 1
## 147.419998168945 147.429000854492 147.451995849609 147.485992431641
## 2 1 3 1
## 147.490005493164 147.5 147.509994506836 147.520004272461
## 1 1 1 1
## 147.539993286133 147.550003051758 147.559997558594 147.570007324219
## 3 1 2 2
## 147.580001831055 147.582992553711 147.589996337891 147.598999023438
## 1 1 1 1
## 147.613998413086 147.619995117188 147.630004882812 147.639999389648
## 1 1 1 1
## 147.649993896484 147.658996582031 147.660003662109 147.669998168945
## 1 2 1 1
## 147.679992675781 147.690002441406 147.697998046875 147.699996948242
## 2 1 1 2
## 147.714996337891 147.729995727539 147.740005493164 147.744003295898
## 1 1 2 2
## 147.759994506836 147.764007568359 147.770004272461 147.779998779297
## 3 1 1 1
## 147.789993286133 147.809997558594 147.815994262695 147.830001831055
## 1 1 1 5
## 147.850006103516 147.860000610352 147.860992431641 147.880004882812
## 1 2 1 1
## 147.899993896484 147.919998168945 147.929992675781 147.940002441406
## 2 4 1 2
## 147.949996948242 147.953994750977 147.970001220703 147.990005493164
## 1 1 2 3
## 148 148.009994506836 148.039993286133 148.050003051758
## 1 1 2 2
## 148.059997558594 148.080001831055 148.093994140625 148.106002807617
## 2 1 1 1
## 148.110000610352 148.130004882812 148.139999389648 148.14599609375
## 3 1 3 1
## 148.149993896484 148.156997680664 148.160003662109 148.169998168945
## 3 1 1 3
## 148.177993774414 148.182998657227 148.184005737305 148.190002441406
## 1 2 1 1
## 148.197006225586 148.199996948242 148.210006713867 148.229995727539
## 1 4 3 2
## 148.240005493164 148.246994018555 148.25 148.259994506836
## 1 1 1 2
## 148.270004272461 148.279998779297 148.296005249023 148.300003051758
## 1 2 1 3
## 148.309997558594 148.313995361328 148.320007324219 148.330001831055
## 2 1 1 1
## 148.339996337891 148.35400390625 148.360000610352 148.360992431641
## 2 1 2 1
## 148.369995117188 148.389999389648 148.395004272461 148.399993896484
## 1 1 1 4
## 148.410003662109 148.414001464844 148.419998168945 148.429992675781
## 1 1 2 1
## 148.440002441406 148.445999145508 148.447006225586 148.453002929688
## 2 1 1 1
## 148.464996337891 148.470001220703 148.475997924805 148.5
## 1 3 1 2
## 148.509994506836 148.520004272461 148.542999267578 148.54899597168
## 2 2 1 1
## 148.550003051758 148.557006835938 148.559997558594 148.561004638672
## 1 1 2 1
## 148.580001831055 148.591995239258 148.619995117188 148.626007080078
## 2 1 1 1
## 148.649993896484 148.660003662109 148.682998657227 148.690002441406
## 2 2 1 1
## 148.699996948242 148.716003417969 148.720001220703 148.72900390625
## 1 1 1 1
## 148.740005493164 148.75 148.759994506836 148.761001586914
## 3 1 1 1
## 148.770004272461 148.779998779297 148.79899597168 148.800003051758
## 1 3 3 2
## 148.809997558594 148.815002441406 148.820007324219 148.830001831055
## 1 1 1 3
## 148.835006713867 148.839996337891 148.850006103516 148.860000610352
## 1 3 3 1
## 148.886993408203 148.889999389648 148.910003662109 148.929000854492
## 1 1 4 1
## 148.949996948242 148.968002319336 148.97200012207 148.979995727539
## 1 1 2 2
## 148.992004394531 149 149.005996704102 149.007995605469
## 1 3 1 1
## 149.029998779297 149.033004760742 149.039993286133 149.050003051758
## 2 2 2 5
## 149.059997558594 149.070007324219 149.080001831055 149.089996337891
## 2 2 2 2
## 149.100006103516 149.110000610352 149.139999389648 149.14599609375
## 1 1 1 1
## 149.149993896484 149.160003662109 149.17399597168 149.190002441406
## 2 1 1 3
## 149.192993164062 149.199996948242 149.210006713867 149.220001220703
## 1 5 1 6
## 149.229995727539 149.240005493164 149.264999389648 149.270004272461
## 1 1 1 2
## 149.272003173828 149.289993286133 149.291000366211 149.300003051758
## 1 1 1 2
## 149.302993774414 149.304992675781 149.309997558594 149.311996459961
## 1 1 2 1
## 149.319000244141 149.320007324219 149.322998046875 149.328994750977
## 1 3 1 1
## 149.330001831055 149.339996337891 149.348999023438 149.360000610352
## 1 1 1 2
## 149.376998901367 149.380004882812 149.384994506836 149.429992675781
## 1 1 1 1
## 149.449996948242 149.460006713867 149.466003417969 149.470001220703
## 1 2 1 1
## 149.473999023438 149.479995727539 149.5 149.509994506836
## 1 2 2 2
## 149.520004272461 149.529998779297 149.546005249023 149.550003051758
## 1 1 2 1
## 149.576621857672 149.60400390625 149.610000610352 149.639999389648
## 442 1 2 1
## 149.649993896484 149.662994384766 149.669998168945 149.679992675781
## 2 1 1 2
## 149.690002441406 149.699996948242 149.727996826172 149.729995727539
## 1 1 1 1
## 149.733001708984 149.740005493164 149.742004394531 149.75
## 3 1 1 2
## 149.759994506836 149.779006958008 149.800003051758 149.809997558594
## 2 1 3 2
## 149.820007324219 149.820999145508 149.850006103516 149.856994628906
## 1 1 2 2
## 149.860000610352 149.869995117188 149.871002197266 149.893997192383
## 1 1 4 1
## 149.904006958008 149.910003662109 149.919998168945 149.940002441406
## 1 1 5 1
## 149.949996948242 149.957992553711 149.960006713867 149.970001220703
## 1 1 6 1
## 149.975997924805 149.979995727539 149.990005493164 150.005004882812
## 1 1 1 1
## 150.009994506836 150.018997192383 150.020004272461 150.050003051758
## 2 1 2 1
## 150.059005737305 150.059997558594 150.080001831055 150.089996337891
## 1 1 1 1
## 150.100006103516 150.106994628906 150.110000610352 150.119995117188
## 1 3 1 2
## 150.126998901367 150.130004882812 150.138000488281 150.139999389648
## 1 1 1 1
## 150.149993896484 150.160003662109 150.164001464844 150.169998168945
## 2 5 2 2
## 150.188003540039 150.190002441406 150.199996948242 150.220001220703
## 1 1 1 3
## 150.229995727539 150.231994628906 150.240005493164 150.25
## 2 1 1 1
## 150.259002685547 150.259994506836 150.270004272461 150.291000366211
## 1 1 1 1
## 150.320007324219 150.330001831055 150.330993652344 150.350006103516
## 1 1 1 2
## 150.35400390625 150.354995727539 150.360000610352 150.369995117188
## 1 1 1 1
## 150.399993896484 150.410003662109 150.429992675781 150.436996459961
## 2 1 2 1
## 150.449996948242 150.457992553711 150.460006713867 150.47200012207
## 2 1 1 1
## 150.481002807617 150.5 150.501007080078 150.520004272461
## 1 1 2 1
## 150.559997558594 150.570007324219 150.589996337891 150.600006103516
## 2 1 4 1
## 150.619995117188 150.621002197266 150.628997802734 150.630004882812
## 3 1 1 1
## 150.639007568359 150.639999389648 150.649993896484 150.660003662109
## 1 2 1 1
## 150.660995483398 150.669998168945 150.677001953125 150.679000854492
## 1 2 1 1
## 150.690002441406 150.699996948242 150.707000732422 150.710006713867
## 1 1 1 1
## 150.72200012207 150.729995727539 150.740005493164 150.759994506836
## 1 2 3 1
## 150.770004272461 150.779998779297 150.785995483398 150.800003051758
## 1 2 1 3
## 150.809997558594 150.830001831055 150.839996337891 150.860000610352
## 1 1 1 1
## 150.863998413086 150.876007080078 150.880004882812 150.899993896484
## 1 1 4 2
## 150.912002563477 150.929992675781 150.940002441406 150.949996948242
## 2 1 1 1
## 150.960006713867 150.970001220703 150.970993041992 150.990005493164
## 1 6 1 2
## 151 151.009994506836 151.024002075195 151.026000976562
## 1 1 1 1
## 151.029998779297 151.033004760742 151.033996582031 151.050003051758
## 2 1 2 1
## 151.059997558594 151.069000244141 151.070007324219 151.080993652344
## 2 1 1 2
## 151.089996337891 151.098999023438 151.100006103516 151.110000610352
## 1 1 2 1
## 151.119995117188 151.139999389648 151.149993896484 151.151992797852
## 2 2 1 1
## 151.154006958008 151.158004760742 151.169998168945 151.179992675781
## 1 1 1 2
## 151.220001220703 151.229995727539 151.238006591797 151.259994506836
## 1 2 1 1
## 151.270004272461 151.281005859375 151.287002563477 151.289993286133
## 1 2 1 1
## 151.300003051758 151.309997558594 151.320007324219 151.339996337891
## 1 1 2 3
## 151.348999023438 151.358001708984 151.360000610352 151.365997314453
## 1 2 2 1
## 151.369995117188 151.373992919922 151.38200378418 151.389999389648
## 1 1 1 1
## 151.406005859375 151.410003662109 151.419998168945 151.423004150391
## 1 1 1 1
## 151.429992675781 151.436996459961 151.440002441406 151.447998046875
## 1 1 2 1
## 151.449996948242 151.460006713867 151.462005615234 151.468994140625
## 2 3 2 2
## 151.490005493164 151.490997314453 151.5 151.503997802734
## 1 1 2 1
## 151.509994506836 151.520004272461 151.529998779297 151.539001464844
## 1 1 1 1
## 151.539993286133 151.544006347656 151.546005249023 151.550003051758
## 2 1 1 1
## 151.559997558594 151.563003540039 151.580001831055 151.585006713867
## 2 1 3 2
## 151.585998535156 151.589996337891 151.600006103516 151.604995727539
## 1 1 2 1
## 151.619995117188 151.632995605469 151.639999389648 151.643005371094
## 1 1 1 1
## 151.654998779297 151.669998168945 151.671005249023 151.679992675781
## 1 1 2 1
## 151.690002441406 151.710006713867 151.720001220703 151.740005493164
## 1 1 1 2
## 151.744003295898 151.753997802734 151.779998779297 151.787994384766
## 1 1 1 1
## 151.789993286133 151.809997558594 151.811004638672 151.820007324219
## 2 1 1 1
## 151.833999633789 151.839996337891 151.850006103516 151.865005493164
## 1 2 1 1
## 151.875 151.889007568359 151.889999389648 151.910003662109
## 1 1 2 2
## 151.912002563477 151.919998168945 151.927993774414 151.929992675781
## 1 1 1 1
## 151.940002441406 151.949996948242 151.966003417969 151.979995727539
## 1 1 1 2
## 151.990997314453 151.998992919922 152 152.003005981445
## 1 1 2 1
## 152.005004882812 152.020004272461 152.029998779297 152.042007446289
## 1 1 1 3
## 152.046005249023 152.059997558594 152.061996459961 152.080001831055
## 1 1 1 2
## 152.100006103516 152.108993530273 152.110000610352 152.115005493164
## 4 1 4 1
## 152.119995117188 152.123001098633 152.130004882812 152.134994506836
## 3 1 3 1
## 152.139999389648 152.149993896484 152.160003662109 152.167999267578
## 1 3 1 1
## 152.175994873047 152.179992675781 152.190002441406 152.199996948242
## 1 1 2 2
## 152.210006713867 152.220001220703 152.238998413086 152.240005493164
## 1 3 1 2
## 152.25 152.270004272461 152.274002075195 152.285003662109
## 3 2 1 1
## 152.289001464844 152.289993286133 152.300003051758 152.304992675781
## 1 2 3 1
## 152.307998657227 152.309997558594 152.317993164062 152.320007324219
## 1 1 1 2
## 152.328002929688 152.339996337891 152.350006103516 152.360000610352
## 1 1 1 1
## 152.363998413086 152.375 152.378005981445 152.380004882812
## 1 1 1 1
## 152.386993408203 152.389007568359 152.389999389648 152.410003662109
## 1 2 2 1
## 152.419998168945 152.429992675781 152.440002441406 152.449005126953
## 1 1 1 1
## 152.449996948242 152.460006713867 152.479995727539 152.507995605469
## 2 1 2 1
## 152.539993286133 152.550003051758 152.552001953125 152.559997558594
## 1 1 1 1
## 152.570007324219 152.589996337891 152.600006103516 152.608993530273
## 1 1 1 1
## 152.610000610352 152.61799621582 152.619995117188 152.621002197266
## 1 1 4 1
## 152.643997192383 152.649993896484 152.669998168945 152.677993774414
## 1 1 1 1
## 152.679992675781 152.690002441406 152.690994262695 152.699005126953
## 3 2 1 1
## 152.710006713867 152.714004516602 152.720001220703 152.729995727539
## 1 1 1 1
## 152.740005493164 152.75 152.759994506836 152.779998779297
## 1 1 1 1
## 152.79899597168 152.800003051758 152.802001953125 152.809997558594
## 1 2 1 5
## 152.828994750977 152.841995239258 152.850006103516 152.860000610352
## 1 1 3 2
## 152.880004882812 152.889999389648 152.906997680664 152.925003051758
## 1 1 1 2
## 152.929992675781 152.940002441406 152.949996948242 152.953994750977
## 1 2 1 1
## 152.955993652344 152.960006713867 152.979995727539 152.996002197266
## 1 1 1 1
## 153.009994506836 153.013000488281 153.02099609375 153.029998779297
## 2 1 4 4
## 153.050003051758 153.052993774414 153.059997558594 153.065994262695
## 2 1 2 1
## 153.070007324219 153.089996337891 153.100006103516 153.110992431641
## 1 2 3 1
## 153.119995117188 153.154998779297 153.169998168945 153.190002441406
## 1 1 6 1
## 153.199996948242 153.210006713867 153.220001220703 153.229995727539
## 1 3 2 2
## 153.246994018555 153.25 153.259994506836 153.279998779297
## 1 1 2 2
## 153.289993286133 153.300003051758 153.309997558594 153.326995849609
## 1 2 1 1
## 153.339996337891 153.341995239258 153.350006103516 153.352005004883
## 1 1 1 1
## 153.360000610352 153.363998413086 153.382995605469 153.399993896484
## 1 1 1 1
## 153.410003662109 153.419998168945 153.425994873047 153.436996459961
## 1 3 1 1
## 153.449996948242 153.457000732422 153.460006713867 153.490005493164
## 1 1 1 1
## 153.498001098633 153.5 153.509994506836 153.511001586914
## 1 3 1 1
## 153.513000488281 153.52099609375 153.531005859375 153.535003662109
## 1 1 1 1
## 153.539993286133 153.550003051758 153.552993774414 153.559997558594
## 1 2 1 1
## 153.589996337891 153.600006103516 153.606002807617 153.610000610352
## 3 2 1 1
## 153.613998413086 153.630004882812 153.643005371094 153.649993896484
## 1 1 1 1
## 153.656997680664 153.669998168945 153.690002441406 153.703994750977
## 1 1 3 1
## 153.710006713867 153.716995239258 153.720001220703 153.729995727539
## 2 1 1 1
## 153.731002807617 153.735992431641 153.74299621582 153.746002197266
## 1 3 1 2
## 153.746994018555 153.75 153.75700378418 153.759002685547
## 1 1 2 1
## 153.759994506836 153.764999389648 153.826995849609 153.830001831055
## 1 1 1 2
## 153.850006103516 153.850997924805 153.860000610352 153.889007568359
## 1 1 1 1
## 153.899993896484 153.908004760742 153.914001464844 153.919998168945
## 2 1 1 1
## 153.949996948242 153.960006713867 153.964004516602 153.979995727539
## 3 1 1 1
## 154 154.001998901367 154.007995605469 154.029998779297
## 2 2 1 1
## 154.037002563477 154.041000366211 154.052001953125 154.052993774414
## 1 1 1 1
## 154.063995361328 154.070007324219 154.080001831055 154.080993652344
## 1 2 3 1
## 154.082992553711 154.100006103516 154.119995117188 154.130004882812
## 1 2 2 1
## 154.139999389648 154.158004760742 154.160003662109 154.169998168945
## 1 2 1 1
## 154.179992675781 154.199005126953 154.199996948242 154.208999633789
## 1 1 1 1
## 154.225997924805 154.229995727539 154.240005493164 154.253005981445
## 1 1 1 1
## 154.259994506836 154.270004272461 154.287002563477 154.289993286133
## 3 3 1 1
## 154.294006347656 154.309997558594 154.311004638672 154.313003540039
## 1 1 1 2
## 154.320007324219 154.330001831055 154.330993652344 154.335006713867
## 1 1 1 1
## 154.339996337891 154.350006103516 154.369995117188 154.371002197266
## 1 2 1 1
## 154.380004882812 154.399993896484 154.419998168945 154.429992675781
## 4 1 1 1
## 154.434997558594 154.440002441406 154.445999145508 154.460006713867
## 1 1 1 4
## 154.470001220703 154.47900390625 154.479995727539 154.50700378418
## 2 2 2 2
## 154.520004272461 154.533996582031 154.539993286133 154.544998168945
## 1 1 1 1
## 154.550003051758 154.559997558594 154.570007324219 154.580001831055
## 1 1 1 3
## 154.589996337891 154.595993041992 154.610000610352 154.617004394531
## 1 1 1 1
## 154.619995117188 154.630004882812 154.639999389648 154.649993896484
## 3 1 1 1
## 154.660003662109 154.679992675781 154.690002441406 154.699996948242
## 1 2 2 1
## 154.720001220703 154.72900390625 154.729995727539 154.748001098633
## 2 1 1 1
## 154.759994506836 154.770004272461 154.776992797852 154.781997680664
## 2 1 1 1
## 154.789993286133 154.809997558594 154.820007324219 154.845993041992
## 1 1 2 1
## 154.852005004883 154.863998413086 154.878005981445 154.889999389648
## 1 1 1 1
## 154.899993896484 154.910003662109 154.919998168945 154.929992675781
## 1 1 1 2
## 154.940002441406 154.960006713867 154.964004516602 154.988006591797
## 3 2 1 1
## 154.990005493164 155.014999389648 155.020004272461 155.029998779297
## 1 1 2 1
## 155.037002563477 155.039001464844 155.039993286133 155.050003051758
## 6 1 2 1
## 155.059997558594 155.070007324219 155.070999145508 155.080001831055
## 2 1 1 2
## 155.089996337891 155.100997924805 155.110000610352 155.119995117188
## 2 1 1 1
## 155.128005981445 155.139999389648 155.149993896484 155.179000854492
## 1 1 2 1
## 155.180999755859 155.190002441406 155.199996948242 155.220001220703
## 1 1 1 1
## 155.223999023438 155.242004394531 155.279998779297 155.289993286133
## 1 1 1 1
## 155.300003051758 155.302001953125 155.311996459961 155.320007324219
## 1 1 1 2
## 155.330001831055 155.330993652344 155.335006713867 155.350006103516
## 3 1 1 1
## 155.358993530273 155.369995117188 155.380004882812 155.410003662109
## 1 1 3 1
## 155.419998168945 155.436996459961 155.440002441406 155.449005126953
## 2 1 5 1
## 155.449996948242 155.479995727539 155.496994018555 155.5
## 3 1 1 2
## 155.509994506836 155.522003173828 155.529998779297 155.539993286133
## 2 1 2 1
## 155.550003051758 155.550994873047 155.578994750977 155.580001831055
## 3 1 1 2
## 155.593002319336 155.606994628906 155.610000610352 155.610992431641
## 2 1 2 1
## 155.619995117188 155.630004882812 155.634994506836 155.638000488281
## 2 2 1 1
## 155.660003662109 155.662994384766 155.679992675781 155.682998657227
## 2 1 1 1
## 155.70100402832 155.720001220703 155.729995727539 155.740005493164
## 1 2 1 1
## 155.75 155.770004272461 155.779998779297 155.789993286133
## 1 4 3 1
## 155.809997558594 155.811996459961 155.815994262695 155.817993164062
## 2 1 1 1
## 155.830001831055 155.843994140625 155.848007202148 155.848999023438
## 1 3 1 1
## 155.850006103516 155.856994628906 155.858001708984 155.860992431641
## 2 1 1 1
## 155.869995117188 155.910003662109 155.912002563477 155.919998168945
## 1 2 1 3
## 155.929992675781 155.932998657227 155.940002441406 155.966003417969
## 1 1 1 1
## 155.970001220703 155.992004394531 156 156.001998901367
## 2 1 1 1
## 156.020004272461 156.026992797852 156.029006958008 156.039993286133
## 1 1 1 1
## 156.050003051758 156.057006835938 156.070007324219 156.080001831055
## 2 1 1 1
## 156.085006713867 156.089996337891 156.100006103516 156.102005004883
## 1 1 3 1
## 156.108001708984 156.110000610352 156.113006591797 156.130004882812
## 1 2 1 1
## 156.158004760742 156.160003662109 156.169998168945 156.194000244141
## 1 1 2 1
## 156.199996948242 156.220001220703 156.238006591797 156.240005493164
## 1 2 1 1
## 156.259994506836 156.268997192383 156.270004272461 156.279998779297
## 1 3 1 1
## 156.300003051758 156.309997558594 156.311004638672 156.332000732422
## 1 1 1 1
## 156.339996337891 156.350006103516 156.365997314453 156.380004882812
## 1 1 1 1
## 156.380996704102 156.386001586914 156.389999389648 156.399993896484
## 1 1 1 2
## 156.412994384766 156.417999267578 156.449005126953 156.470001220703
## 1 2 2 2
## 156.473999023438 156.490005493164 156.5 156.50700378418
## 1 1 2 1
## 156.509994506836 156.529998779297 156.539993286133 156.546997070312
## 1 2 1 1
## 156.550003051758 156.554000854492 156.559997558594 156.565002441406
## 2 1 1 1
## 156.570007324219 156.589996337891 156.593002319336 156.602996826172
## 1 3 1 1
## 156.604995727539 156.610000610352 156.619995117188 156.623001098633
## 1 1 1 2
## 156.630004882812 156.639999389648 156.641998291016 156.649993896484
## 1 5 1 2
## 156.662002563477 156.669998168945 156.679992675781 156.690002441406
## 1 1 1 1
## 156.699996948242 156.720001220703 156.75 156.751007080078
## 1 2 1 1
## 156.763000488281 156.766998291016 156.770004272461 156.779998779297
## 1 1 1 1
## 156.785995483398 156.789993286133 156.809005737305 156.809997558594
## 1 4 1 1
## 156.813003540039 156.820007324219 156.850006103516 156.880004882812
## 1 1 2 2
## 156.889999389648 156.906997680664 156.910003662109 156.919998168945
## 2 1 2 1
## 156.945999145508 156.964996337891 156.970001220703 156.973007202148
## 1 1 4 1
## 156.97900390625 157.009994506836 157.020004272461 157.022003173828
## 1 2 1 2
## 157.029998779297 157.033004760742 157.059997558594 157.080001831055
## 3 1 1 1
## 157.110992431641 157.123001098633 157.149993896484 157.151992797852
## 1 2 1 1
## 157.160003662109 157.169998168945 157.210006713867 157.229995727539
## 2 4 3 1
## 157.259994506836 157.279998779297 157.300003051758 157.309997558594
## 2 1 2 1
## 157.313003540039 157.315994262695 157.320007324219 157.330001831055
## 1 1 2 1
## 157.369995117188 157.380004882812 157.389999389648 157.391006469727
## 2 1 1 1
## 157.399993896484 157.406997680664 157.410003662109 157.419998168945
## 1 1 1 1
## 157.429992675781 157.434997558594 157.449996948242 157.460006713867
## 1 2 5 2
## 157.479995727539 157.488998413086 157.5 157.509994506836
## 3 1 2 1
## 157.520004272461 157.533996582031 157.550003051758 157.559997558594
## 2 1 2 1
## 157.563995361328 157.574005126953 157.578994750977 157.589996337891
## 1 1 2 3
## 157.600006103516 157.615997314453 157.619995117188 157.660003662109
## 1 1 1 2
## 157.679992675781 157.686996459961 157.690002441406 157.692993164062
## 1 1 1 2
## 157.699996948242 157.720001220703 157.729995727539 157.746002197266
## 1 2 1 1
## 157.75 157.761993408203 157.770004272461 157.779998779297
## 4 1 1 2
## 157.783004760742 157.785003662109 157.789993286133 157.792007446289
## 1 1 1 1
## 157.798004150391 157.802001953125 157.830001831055 157.839996337891
## 2 1 1 1
## 157.850006103516 157.869995117188 157.880004882812 157.889999389648
## 1 1 3 2
## 157.899993896484 157.919998168945 157.925003051758 157.929992675781
## 1 1 1 2
## 157.934005737305 157.949996948242 157.970001220703 157.979995727539
## 1 3 1 1
## 157.990005493164 158.005004882812 158.005996704102 158.020004272461
## 2 1 1 1
## 158.044006347656 158.050003051758 158.052001953125 158.052993774414
## 2 1 1 1
## 158.067993164062 158.070007324219 158.089996337891 158.104995727539
## 1 4 1 1
## 158.110000610352 158.119995117188 158.130004882812 158.139999389648
## 1 1 1 1
## 158.149993896484 158.169998168945 158.199996948242 158.220001220703
## 1 1 2 2
## 158.229995727539 158.235000610352 158.238006591797 158.270004272461
## 2 1 2 2
## 158.274002075195 158.287002563477 158.300003051758 158.304992675781
## 1 1 5 1
## 158.309997558594 158.320007324219 158.326995849609 158.339996337891
## 1 1 1 1
## 158.350997924805 158.358993530273 158.380004882812 158.389999389648
## 1 1 2 1
## 158.399002075195 158.410003662109 158.416000366211 158.419998168945
## 1 2 1 3
## 158.425003051758 158.429992675781 158.470001220703 158.490005493164
## 1 1 2 2
## 158.509994506836 158.514007568359 158.520004272461 158.529998779297
## 2 1 2 1
## 158.535003662109 158.535995483398 158.550003051758 158.559997558594
## 2 1 1 1
## 158.580001831055 158.585998535156 158.589996337891 158.600006103516
## 1 1 2 1
## 158.610000610352 158.623001098633 158.630004882812 158.634994506836
## 1 1 1 1
## 158.639999389648 158.649993896484 158.669998168945 158.671997070312
## 1 2 1 7
## 158.705001831055 158.710006713867 158.720001220703 158.740005493164
## 1 3 1 3
## 158.748001098633 158.75 158.766006469727 158.796005249023
## 2 2 1 1
## 158.800003051758 158.830001831055 158.84700012207 158.856002807617
## 1 2 1 1
## 158.869995117188 158.880004882812 158.897003173828 158.910003662109
## 4 1 1 1
## 158.919998168945 158.929992675781 158.942993164062 158.949996948242
## 1 1 1 1
## 158.968002319336 158.973007202148 158.990005493164 159
## 1 2 2 2
## 159.009994506836 159.050003051758 159.059997558594 159.070007324219
## 1 1 2 1
## 159.080001831055 159.089996337891 159.093994140625 159.100006103516
## 1 4 1 3
## 159.110000610352 159.119995117188 159.130004882812 159.134002685547
## 1 1 1 2
## 159.139999389648 159.149993896484 159.160003662109 159.169998168945
## 1 2 1 1
## 159.17399597168 159.179992675781 159.182006835938 159.194000244141
## 1 1 1 3
## 159.197998046875 159.201995849609 159.210006713867 159.220001220703
## 1 1 2 2
## 159.229995727539 159.268005371094 159.270004272461 159.287002563477
## 2 1 2 1
## 159.300003051758 159.309997558594 159.320007324219 159.339996337891
## 2 1 5 1
## 159.343002319336 159.360000610352 159.369995117188 159.380004882812
## 2 1 3 1
## 159.389999389648 159.399993896484 159.419998168945 159.429992675781
## 2 1 1 2
## 159.449996948242 159.470001220703 159.479995727539 159.5
## 2 1 3 1
## 159.520004272461 159.529006958008 159.529998779297 159.550003051758
## 1 1 3 1
## 159.550994873047 159.570007324219 159.619995117188 159.621002197266
## 1 5 1 1
## 159.639999389648 159.660003662109 159.662002563477 159.669998168945
## 1 1 1 2
## 159.679992675781 159.710006713867 159.712005615234 159.729995727539
## 1 2 1 3
## 159.740005493164 159.75 159.789993286133 159.800003051758
## 1 1 1 1
## 159.809997558594 159.839996337891 159.845001220703 159.850006103516
## 2 1 1 2
## 159.869995117188 159.880004882812 159.889007568359 159.889999389648
## 1 2 1 2
## 159.897003173828 159.906997680664 159.914993286133 159.938003540039
## 1 1 1 1
## 159.940002441406 159.949996948242 159.970001220703 159.979995727539
## 2 2 1 2
## 160.001007080078 160.005004882812 160.029006958008 160.031997680664
## 1 1 1 1
## 160.050003051758 160.059997558594 160.080001831055 160.130004882812
## 2 2 1 3
## 160.139999389648 160.162002563477 160.169998168945 160.188995361328
## 1 1 2 1
## 160.199996948242 160.210006713867 160.220001220703 160.229995727539
## 1 1 1 1
## 160.231002807617 160.240005493164 160.270004272461 160.279006958008
## 1 1 5 3
## 160.279998779297 160.289993286133 160.29899597168 160.300003051758
## 2 1 1 3
## 160.309997558594 160.313003540039 160.315994262695 160.320007324219
## 3 1 1 1
## 160.34700012207 160.348007202148 160.369003295898 160.369995117188
## 1 1 1 1
## 160.376007080078 160.380004882812 160.389999389648 160.393997192383
## 1 2 1 1
## 160.399993896484 160.406997680664 160.410003662109 160.429992675781
## 1 1 2 2
## 160.440002441406 160.442001342773 160.460006713867 160.468994140625
## 1 1 5 2
## 160.477996826172 160.479995727539 160.5 160.503005981445
## 1 4 1 1
## 160.520004272461 160.524993896484 160.539993286133 160.550003051758
## 2 1 1 1
## 160.557998657227 160.559997558594 160.572006225586 160.593002319336
## 1 1 1 1
## 160.59700012207 160.600006103516 160.610000610352 160.619995117188
## 1 3 1 2
## 160.630004882812 160.639999389648 160.660003662109 160.669998168945
## 1 1 3 3
## 160.673004150391 160.694000244141 160.699996948242 160.712005615234
## 1 1 2 1
## 160.720001220703 160.729995727539 160.738006591797 160.740005493164
## 2 1 1 1
## 160.742004394531 160.779998779297 160.781005859375 160.787994384766
## 1 3 1 1
## 160.802001953125 160.809997558594 160.820007324219 160.82600402832
## 1 1 1 1
## 160.830001831055 160.832000732422 160.835998535156 160.841003417969
## 1 1 1 2
## 160.843002319336 160.850006103516 160.860000610352 160.86799621582
## 1 2 1 1
## 160.869995117188 160.914001464844 160.929000854492 160.929992675781
## 5 1 1 2
## 160.949996948242 160.957992553711 160.960006713867 160.977005004883
## 1 1 2 1
## 160.990997314453 161.003997802734 161.020004272461 161.035995483398
## 1 1 2 1
## 161.054992675781 161.057006835938 161.059997558594 161.070007324219
## 2 1 3 1
## 161.11799621582 161.160003662109 161.164993286133 161.179992675781
## 1 1 1 1
## 161.190002441406 161.199996948242 161.205993652344 161.220001220703
## 1 2 1 2
## 161.240005493164 161.25 161.259994506836 161.289993286133
## 1 1 2 1
## 161.300994873047 161.302001953125 161.304000854492 161.320007324219
## 1 1 1 1
## 161.330001831055 161.339996337891 161.341995239258 161.350006103516
## 3 1 1 3
## 161.360000610352 161.369995117188 161.380004882812 161.389999389648
## 1 1 2 1
## 161.399993896484 161.40299987793 161.410003662109 161.419998168945
## 2 1 2 3
## 161.425003051758 161.429992675781 161.436996459961 161.440002441406
## 1 2 1 1
## 161.444000244141 161.460006713867 161.477996826172 161.479995727539
## 1 1 1 3
## 161.481002807617 161.490005493164 161.494003295898 161.5
## 1 2 1 1
## 161.520004272461 161.52099609375 161.529998779297 161.539993286133
## 1 1 1 3
## 161.550003051758 161.554000854492 161.555999755859 161.589996337891
## 2 1 1 2
## 161.595001220703 161.606994628906 161.610000610352 161.630004882812
## 1 1 1 3
## 161.636993408203 161.656997680664 161.658996582031 161.679992675781
## 4 1 1 1
## 161.690002441406 161.695999145508 161.699996948242 161.705001831055
## 1 1 1 1
## 161.716995239258 161.718002319336 161.720001220703 161.729995727539
## 1 1 2 1
## 161.738006591797 161.746994018555 161.751998901367 161.768997192383
## 1 1 1 1
## 161.770004272461 161.774002075195 161.789993286133 161.809997558594
## 1 1 2 2
## 161.820007324219 161.822998046875 161.828002929688 161.850006103516
## 3 1 1 1
## 161.858001708984 161.860000610352 161.863998413086 161.869995117188
## 1 1 1 1
## 161.880004882812 161.893997192383 161.901000976562 161.919998168945
## 3 1 1 1
## 161.92399597168 161.929992675781 161.949996948242 161.953002929688
## 1 3 1 1
## 161.960006713867 161.970001220703 161.973999023438 161.979995727539
## 2 1 1 4
## 161.990005493164 162.001007080078 162.009994506836 162.035003662109
## 1 1 1 1
## 162.039993286133 162.070007324219 162.080001831055 162.100006103516
## 3 1 2 1
## 162.113998413086 162.119003295898 162.119995117188 162.128997802734
## 1 1 1 1
## 162.136001586914 162.149993896484 162.169998168945 162.179992675781
## 1 1 1 1
## 162.190002441406 162.195007324219 162.199996948242 162.203002929688
## 1 1 4 1
## 162.210006713867 162.210998535156 162.218002319336 162.220001220703
## 2 1 1 1
## 162.22900390625 162.229995727539 162.240005493164 162.259994506836
## 1 1 1 4
## 162.270004272461 162.279998779297 162.29899597168 162.300003051758
## 1 1 1 1
## 162.313995361328 162.317993164062 162.326995849609 162.330001831055
## 1 2 1 1
## 162.339996337891 162.350006103516 162.360000610352 162.380004882812
## 1 1 1 1
## 162.384002685547 162.401992797852 162.429992675781 162.440002441406
## 1 1 1 1
## 162.460006713867 162.470001220703 162.479995727539 162.490005493164
## 2 1 1 1
## 162.496994018555 162.5 162.514999389648 162.520004272461
## 1 1 1 2
## 162.539001464844 162.550003051758 162.559997558594 162.570007324219
## 1 2 1 1
## 162.580001831055 162.600006103516 162.619995117188 162.630004882812
## 1 2 1 2
## 162.656005859375 162.660003662109 162.669998168945 162.682998657227
## 1 1 3 1
## 162.690002441406 162.692993164062 162.699996948242 162.723007202148
## 1 1 5 1
## 162.729995727539 162.744995117188 162.75 162.759994506836
## 1 1 1 2
## 162.768997192383 162.770004272461 162.779998779297 162.783004760742
## 1 2 1 1
## 162.783996582031 162.787002563477 162.789993286133 162.796005249023
## 1 1 3 3
## 162.809997558594 162.832992553711 162.839996337891 162.850006103516
## 1 1 2 1
## 162.856002807617 162.860000610352 162.869995117188 162.876998901367
## 1 2 2 1
## 162.889999389648 162.910003662109 162.914993286133 162.919998168945
## 1 4 1 1
## 162.921997070312 162.929000854492 162.929992675781 162.932998657227
## 1 1 2 1
## 162.940002441406 162.949996948242 162.960006713867 163.003997802734
## 1 2 3 1
## 163.009994506836 163.029998779297 163.050003051758 163.054000854492
## 1 1 1 1
## 163.059997558594 163.078994750977 163.080001831055 163.115005493164
## 2 1 1 1
## 163.123001098633 163.130004882812 163.136001586914 163.139999389648
## 1 1 1 1
## 163.141998291016 163.149993896484 163.169998168945 163.190002441406
## 1 1 2 3
## 163.205993652344 163.214004516602 163.223007202148 163.229995727539
## 1 1 1 1
## 163.240005493164 163.25 163.259002685547 163.261001586914
## 2 1 1 1
## 163.261993408203 163.270004272461 163.279998779297 163.289993286133
## 1 1 1 1
## 163.300003051758 163.317001342773 163.328002929688 163.330001831055
## 3 1 1 3
## 163.339996337891 163.360000610352 163.369995117188 163.380004882812
## 1 2 2 1
## 163.429992675781 163.440002441406 163.444000244141 163.449996948242
## 1 2 1 2
## 163.460006713867 163.468002319336 163.470001220703 163.479995727539
## 1 1 1 1
## 163.494995117188 163.509994506836 163.520004272461 163.522994995117
## 2 1 2 1
## 163.529998779297 163.565002441406 163.580001831055 163.589996337891
## 1 1 1 1
## 163.59700012207 163.606994628906 163.619995117188 163.630004882812
## 1 1 1 1
## 163.639007568359 163.639999389648 163.641998291016 163.645004272461
## 1 3 1 1
## 163.647994995117 163.654006958008 163.660003662109 163.679992675781
## 1 1 2 2
## 163.680999755859 163.690002441406 163.692993164062 163.695007324219
## 1 2 1 1
## 163.707992553711 163.710006713867 163.729995727539 163.740005493164
## 1 1 3 1
## 163.744995117188 163.75 163.759994506836 163.768005371094
## 1 1 1 1
## 163.770004272461 163.798004150391 163.800003051758 163.802993774414
## 1 1 1 1
## 163.809997558594 163.815994262695 163.830001831055 163.860000610352
## 4 1 1 1
## 163.865005493164 163.869995117188 163.880004882812 163.899993896484
## 1 1 1 2
## 163.908004760742 163.912002563477 163.929992675781 163.960006713867
## 1 1 1 1
## 163.97200012207 163.973007202148 163.973999023438 163.981994628906
## 1 1 1 1
## 163.988006591797 163.990005493164 163.996002197266 164.005996704102
## 1 3 1 5
## 164.009994506836 164.020004272461 164.029006958008 164.031997680664
## 1 3 4 1
## 164.041000366211 164.04899597168 164.059997558594 164.074005126953
## 1 1 5 1
## 164.078002929688 164.089996337891 164.093994140625 164.100006103516
## 1 1 1 2
## 164.104995727539 164.111999511719 164.113006591797 164.11799621582
## 2 1 1 1
## 164.128997802734 164.149993896484 164.151000976562 164.156997680664
## 1 1 1 1
## 164.169998168945 164.190002441406 164.203994750977 164.207992553711
## 2 1 1 1
## 164.208999633789 164.210006713867 164.240005493164 164.246994018555
## 1 1 1 1
## 164.251007080078 164.261993408203 164.279998779297 164.281997680664
## 1 1 1 1
## 164.289993286133 164.298004150391 164.300003051758 164.311996459961
## 1 1 1 1
## 164.313995361328 164.324005126953 164.345001220703 164.350006103516
## 1 1 1 4
## 164.360000610352 164.363006591797 164.373992919922 164.380004882812
## 4 1 1 1
## 164.389999389648 164.399993896484 164.410003662109 164.419998168945
## 1 2 2 1
## 164.425003051758 164.440002441406 164.449996948242 164.460006713867
## 1 1 2 2
## 164.490005493164 164.496002197266 164.509994506836 164.518005371094
## 2 1 1 2
## 164.529998779297 164.550003051758 164.576995849609 164.591995239258
## 3 1 1 1
## 164.600006103516 164.610000610352 164.619995117188 164.623001098633
## 1 2 3 2
## 164.630004882812 164.649993896484 164.660003662109 164.664001464844
## 2 1 1 1
## 164.669998168945 164.684005737305 164.690002441406 164.699996948242
## 1 1 3 1
## 164.710006713867 164.720001220703 164.729995727539 164.759002685547
## 1 1 3 1
## 164.759994506836 164.764007568359 164.77799987793 164.796997070312
## 1 1 1 2
## 164.800003051758 164.804992675781 164.809997558594 164.813995361328
## 1 1 2 1
## 164.830001831055 164.845001220703 164.867004394531 164.876007080078
## 2 1 1 1
## 164.880004882812 164.884002685547 164.889999389648 164.891998291016
## 1 1 2 1
## 164.895004272461 164.899993896484 164.910003662109 164.919998168945
## 1 2 1 1
## 164.944000244141 164.960006713867 164.970993041992 164.975997924805
## 1 5 1 1
## 164.990005493164 165.001998901367 165.020004272461 165.026992797852
## 2 1 2 1
## 165.029998779297 165.031997680664 165.050003051758 165.059997558594
## 1 1 2 1
## 165.065994262695 165.080001831055 165.082992553711 165.089996337891
## 1 1 1 1
## 165.102005004883 165.110000610352 165.130004882812 165.139999389648
## 1 1 1 1
## 165.149993896484 165.154006958008 165.160003662109 165.175003051758
## 1 5 1 1
## 165.190994262695 165.199996948242 165.205001831055 165.214996337891
## 1 1 1 1
## 165.220001220703 165.25 165.253005981445 165.259994506836
## 2 1 1 1
## 165.270004272461 165.274993896484 165.300003051758 165.309997558594
## 2 1 2 2
## 165.317001342773 165.320007324219 165.328002929688 165.343994140625
## 3 1 1 1
## 165.345001220703 165.350006103516 165.35400390625 165.369995117188
## 1 1 1 2
## 165.371994018555 165.384002685547 165.39599609375 165.408996582031
## 2 2 1 1
## 165.410003662109 165.42399597168 165.427001953125 165.429992675781
## 1 1 1 1
## 165.430999755859 165.438003540039 165.442001342773 165.447998046875
## 1 1 1 1
## 165.449996948242 165.460006713867 165.468994140625 165.470001220703
## 2 1 1 1
## 165.473999023438 165.479995727539 165.490005493164 165.496994018555
## 1 1 1 3
## 165.501998901367 165.509994506836 165.511993408203 165.522994995117
## 1 1 1 1
## 165.539993286133 165.546997070312 165.570007324219 165.580001831055
## 1 1 1 1
## 165.589996337891 165.606002807617 165.610000610352 165.630004882812
## 3 1 2 1
## 165.639999389648 165.641006469727 165.649993896484 165.660003662109
## 2 1 4 2
## 165.673004150391 165.686996459961 165.699996948242 165.718994140625
## 1 1 2 1
## 165.720001220703 165.724987476276 165.727005004883 165.729995727539
## 1 442 1 1
## 165.740005493164 165.75 165.757995605469 165.759994506836
## 2 2 1 2
## 165.779998779297 165.800003051758 165.809997558594 165.820007324219
## 1 1 2 1
## 165.824996948242 165.839996337891 165.850006103516 165.860000610352
## 1 1 3 2
## 165.873001098633 165.880004882812 165.886993408203 165.889999389648
## 1 2 1 3
## 165.904998779297 165.910003662109 165.912002563477 165.919998168945
## 1 1 1 4
## 165.929992675781 165.934005737305 165.947006225586 165.949996948242
## 5 2 1 1
## 165.962997436523 165.990005493164 166 166.00700378418
## 1 2 2 1
## 166.013000488281 166.020004272461 166.039993286133 166.050994873047
## 1 1 1 1
## 166.067001342773 166.080001831055 166.089996337891 166.100006103516
## 1 1 3 1
## 166.104995727539 166.115997314453 166.119995117188 166.123992919922
## 1 1 2 1
## 166.139999389648 166.190002441406 166.192993164062 166.199996948242
## 2 1 1 1
## 166.210006713867 166.220001220703 166.22200012207 166.223999023438
## 1 2 1 1
## 166.240005493164 166.244995117188 166.259994506836 166.270004272461
## 1 1 1 1
## 166.279998779297 166.287002563477 166.326995849609 166.339996337891
## 1 1 1 1
## 166.350006103516 166.358001708984 166.369995117188 166.399993896484
## 1 1 1 1
## 166.410003662109 166.417007446289 166.417999267578 166.423004150391
## 1 1 1 1
## 166.442001342773 166.479995727539 166.483001708984 166.490005493164
## 2 1 2 3
## 166.496994018555 166.503005981445 166.511001586914 166.520004272461
## 1 1 1 1
## 166.529998779297 166.539993286133 166.541000366211 166.550003051758
## 5 2 1 1
## 166.559997558594 166.572998046875 166.598007202148 166.600006103516
## 1 1 1 2
## 166.610000610352 166.619995117188 166.628005981445 166.630004882812
## 2 1 1 2
## 166.673004150391 166.684005737305 166.699996948242 166.710006713867
## 1 1 1 2
## 166.716003417969 166.716995239258 166.75 166.753005981445
## 1 1 2 1
## 166.759994506836 166.768997192383 166.770004272461 166.783004760742
## 4 2 2 1
## 166.789993286133 166.800003051758 166.802001953125 166.809997558594
## 1 1 1 1
## 166.820007324219 166.830001831055 166.832992553711 166.839996337891
## 1 1 1 1
## 166.850006103516 166.852996826172 166.856994628906 166.860000610352
## 3 2 1 1
## 166.860992431641 166.880004882812 166.889999389648 166.910003662109
## 1 1 1 1
## 166.940002441406 166.945999145508 166.97900390625 166.979995727539
## 1 1 1 2
## 166.990005493164 166.99299621582 167.020004272461 167.024993896484
## 3 1 1 1
## 167.029998779297 167.037994384766 167.039993286133 167.054000854492
## 3 1 1 1
## 167.059997558594 167.070007324219 167.080001831055 167.087997436523
## 1 1 1 2
## 167.130004882812 167.134994506836 167.139999389648 167.160003662109
## 1 1 1 4
## 167.177993774414 167.195007324219 167.229995727539 167.238006591797
## 1 1 2 1
## 167.257995605469 167.259994506836 167.274993896484 167.283996582031
## 1 1 1 1
## 167.289993286133 167.309997558594 167.317001342773 167.32600402832
## 2 1 1 1
## 167.330001831055 167.339996337891 167.350006103516 167.35400390625
## 2 3 1 1
## 167.389999389648 167.391006469727 167.410003662109 167.419998168945
## 1 1 1 2
## 167.42399597168 167.429992675781 167.445007324219 167.460006713867
## 1 1 1 1
## 167.468002319336 167.470001220703 167.479995727539 167.485000610352
## 1 2 1 1
## 167.488998413086 167.490005493164 167.496994018555 167.520004272461
## 1 1 1 1
## 167.529998779297 167.539993286133 167.544998168945 167.550003051758
## 3 1 1 2
## 167.567001342773 167.570007324219 167.600006103516 167.639999389648
## 1 2 1 1
## 167.643997192383 167.649993896484 167.660003662109 167.679992675781
## 1 1 3 1
## 167.690002441406 167.699005126953 167.707000732422 167.710006713867
## 1 1 1 1
## 167.725997924805 167.733001708984 167.75 167.759994506836
## 1 1 1 2
## 167.766998291016 167.779998779297 167.794006347656 167.820007324219
## 1 2 1 1
## 167.830001831055 167.835006713867 167.839996337891 167.850006103516
## 3 1 1 1
## 167.858993530273 167.860000610352 167.869995117188 167.886993408203
## 1 2 3 1
## 167.893997192383 167.908004760742 167.910003662109 167.919998168945
## 1 1 1 1
## 167.929992675781 167.949996948242 167.960006713867 167.970001220703
## 1 3 1 1
## 167.979995727539 167.988998413086 168.020004272461 168.042007446289
## 1 1 1 1
## 168.044998168945 168.048004150391 168.059997558594 168.070007324219
## 1 1 2 2
## 168.089996337891 168.100006103516 168.110000610352 168.113998413086
## 1 2 3 1
## 168.138000488281 168.139999389648 168.160003662109 168.190002441406
## 1 1 1 3
## 168.195999145508 168.199996948242 168.205993652344 168.210006713867
## 1 2 1 2
## 168.223999023438 168.229995727539 168.235992431641 168.240005493164
## 1 2 1 3
## 168.25 168.25700378418 168.261993408203 168.264007568359
## 2 1 1 1
## 168.266006469727 168.270004272461 168.272003173828 168.283004760742
## 2 1 1 1
## 168.289993286133 168.298004150391 168.300003051758 168.302001953125
## 1 1 1 1
## 168.304000854492 168.304992675781 168.315002441406 168.320007324219
## 1 1 1 1
## 168.322998046875 168.324996948242 168.328002929688 168.330001831055
## 1 1 2 1
## 168.332000732422 168.350006103516 168.360000610352 168.373992919922
## 6 1 1 1
## 168.389999389648 168.419998168945 168.429992675781 168.440002441406
## 1 1 1 1
## 168.449996948242 168.455001831055 168.455993652344 168.457000732422
## 3 1 1 2
## 168.460006713867 168.468002319336 168.479995727539 168.483001708984
## 1 1 3 2
## 168.5 168.501007080078 168.520004272461 168.529998779297
## 5 2 1 3
## 168.539001464844 168.559997558594 168.576995849609 168.580001831055
## 1 2 1 1
## 168.589996337891 168.593994140625 168.610000610352 168.619995117188
## 1 1 1 1
## 168.630996704102 168.63200378418 168.643997192383 168.649002075195
## 1 1 2 1
## 168.649993896484 168.656997680664 168.658004760742 168.666000366211
## 1 1 1 2
## 168.671997070312 168.690002441406 168.710998535156 168.759994506836
## 1 1 1 1
## 168.779998779297 168.809997558594 168.815994262695 168.820007324219
## 1 6 1 1
## 168.820999145508 168.822998046875 168.850006103516 168.863006591797
## 1 2 1 1
## 168.865005493164 168.86799621582 168.869995117188 168.880004882812
## 1 1 1 1
## 168.889999389648 168.910003662109 168.919998168945 168.929992675781
## 1 1 1 1
## 168.936004638672 168.940002441406 168.949996948242 168.960006713867
## 1 4 1 1
## 168.970001220703 168.973007202148 168.977005004883 168.979995727539
## 2 1 1 2
## 169.039993286133 169.070007324219 169.078994750977 169.087997436523
## 2 1 1 1
## 169.089996337891 169.102996826172 169.110000610352 169.119995117188
## 1 1 1 2
## 169.121002197266 169.139999389648 169.160003662109 169.190002441406
## 1 1 1 1
## 169.20100402832 169.229995727539 169.244995117188 169.25
## 1 1 1 1
## 169.251007080078 169.259994506836 169.261001586914 169.264007568359
## 2 2 2 1
## 169.270004272461 169.281997680664 169.300003051758 169.307998657227
## 2 1 2 1
## 169.320007324219 169.324005126953 169.330001831055 169.34700012207
## 2 1 1 1
## 169.350006103516 169.363998413086 169.410003662109 169.419998168945
## 1 1 1 1
## 169.429992675781 169.440002441406 169.449996948242 169.460006713867
## 2 1 1 1
## 169.470993041992 169.473999023438 169.479995727539 169.490997314453
## 1 1 3 1
## 169.5 169.520004272461 169.550003051758 169.550994873047
## 1 1 1 1
## 169.559997558594 169.563003540039 169.600006103516 169.606002807617
## 2 1 1 1
## 169.610000610352 169.630004882812 169.647994995117 169.654998779297
## 1 1 1 1
## 169.660003662109 169.662002563477 169.671997070312 169.673004150391
## 1 1 1 1
## 169.690002441406 169.695007324219 169.699996948242 169.710006713867
## 1 1 1 2
## 169.725997924805 169.729995727539 169.736999511719 169.75
## 1 3 1 1
## 169.759994506836 169.779998779297 169.789001464844 169.796005249023
## 1 1 2 1
## 169.804992675781 169.809997558594 169.811996459961 169.820007324219
## 1 1 1 1
## 169.830001831055 169.850006103516 169.884994506836 169.891998291016
## 2 2 2 2
## 169.906997680664 169.910003662109 169.919006347656 169.919998168945
## 1 3 1 4
## 169.921005249023 169.92399597168 169.929992675781 169.940002441406
## 1 1 4 1
## 169.949996948242 169.957000732422 169.970001220703 169.979995727539
## 1 1 1 1
## 169.985000610352 170 170.009994506836 170.016006469727
## 1 1 1 1
## 170.020004272461 170.029998779297 170.035003662109 170.039993286133
## 1 2 1 1
## 170.050003051758 170.059997558594 170.074005126953 170.078994750977
## 3 1 1 1
## 170.089004516602 170.089996337891 170.110000610352 170.119995117188
## 1 2 1 1
## 170.139999389648 170.14599609375 170.158004760742 170.160003662109
## 2 1 1 1
## 170.164993286133 170.169998168945 170.182998657227 170.184997558594
## 1 1 1 1
## 170.190002441406 170.218002319336 170.229995727539 170.259994506836
## 1 1 1 2
## 170.270004272461 170.279998779297 170.300003051758 170.307998657227
## 1 1 1 1
## 170.309997558594 170.320007324219 170.330001831055 170.350006103516
## 1 1 1 1
## 170.378005981445 170.380004882812 170.384002685547 170.389007568359
## 1 1 1 1
## 170.399993896484 170.40299987793 170.410995483398 170.412994384766
## 3 1 2 1
## 170.429992675781 170.440002441406 170.442993164062 170.479995727539
## 1 1 1 1
## 170.490005493164 170.496002197266 170.5 170.505004882812
## 1 1 2 1
## 170.511001586914 170.514007568359 170.520004272461 170.529998779297
## 1 1 2 1
## 170.533004760742 170.535003662109 170.535995483398 170.539993286133
## 1 1 1 1
## 170.550003051758 170.559997558594 170.600006103516 170.610000610352
## 5 1 3 2
## 170.619995117188 170.630004882812 170.649993896484 170.654006958008
## 2 1 1 1
## 170.686004638672 170.710006713867 170.720001220703 170.729995727539
## 1 1 1 1
## 170.753997802734 170.757995605469 170.759994506836 170.794998168945
## 1 1 1 1
## 170.800003051758 170.817001342773 170.826995849609 170.835998535156
## 1 1 1 1
## 170.839996337891 170.848999023438 170.850006103516 170.860000610352
## 1 1 1 2
## 170.863006591797 170.869003295898 170.869995117188 170.873992919922
## 1 1 2 1
## 170.875 170.889999389648 170.895004272461 170.899002075195
## 1 1 2 1
## 170.899993896484 170.910003662109 170.919998168945 170.940002441406
## 3 2 1 1
## 170.942993164062 170.949996948242 170.962005615234 170.979995727539
## 1 2 1 1
## 170.990005493164 171 171.011001586914 171.020004272461
## 2 1 1 2
## 171.029998779297 171.044998168945 171.059997558594 171.070007324219
## 1 1 1 1
## 171.074005126953 171.080001831055 171.089996337891 171.100006103516
## 1 2 1 1
## 171.119995117188 171.130004882812 171.149993896484 171.179992675781
## 4 1 1 1
## 171.199996948242 171.210006713867 171.218994140625 171.274002075195
## 1 2 1 1
## 171.274993896484 171.300003051758 171.304992675781 171.309997558594
## 1 1 1 2
## 171.317001342773 171.322006225586 171.324005126953 171.335006713867
## 1 4 1 1
## 171.339996337891 171.350006103516 171.360000610352 171.380004882812
## 1 1 1 2
## 171.393005371094 171.399993896484 171.419998168945 171.440994262695
## 2 1 1 2
## 171.479995727539 171.490005493164 171.5 171.520004272461
## 1 1 2 1
## 171.524002075195 171.526000976562 171.533004760742 171.537002563477
## 1 1 1 1
## 171.550003051758 171.572006225586 171.574996948242 171.587005615234
## 1 1 1 1
## 171.600006103516 171.60400390625 171.619995117188 171.621002197266
## 1 1 2 1
## 171.647003173828 171.649993896484 171.679992675781 171.699996948242
## 1 1 1 1
## 171.705001831055 171.710006713867 171.725006103516 171.735000610352
## 1 1 1 1
## 171.75 171.755004882812 171.755996704102 171.759994506836
## 2 1 1 1
## 171.768005371094 171.779998779297 171.800003051758 171.809997558594
## 1 2 1 1
## 171.815002441406 171.819000244141 171.820007324219 171.848007202148
## 1 1 1 1
## 171.860000610352 171.865005493164 171.869995117188 171.889999389648
## 2 1 5 1
## 171.899002075195 171.906005859375 171.908996582031 171.92399597168
## 2 1 1 1
## 171.940002441406 171.949996948242 171.979995727539 172.009994506836
## 1 2 1 1
## 172.020004272461 172.048004150391 172.09700012207 172.100006103516
## 1 1 1 1
## 172.100997924805 172.102005004883 172.102996826172 172.139999389648
## 1 1 1 1
## 172.141006469727 172.156997680664 172.182006835938 172.210006713867
## 1 1 1 4
## 172.274993896484 172.276000976562 172.285995483398 172.289993286133
## 1 2 1 1
## 172.309997558594 172.320007324219 172.339996337891 172.345001220703
## 1 1 3 1
## 172.350006103516 172.360000610352 172.369995117188 172.380004882812
## 2 1 1 1
## 172.384002685547 172.399993896484 172.419998168945 172.425003051758
## 1 1 1 1
## 172.442993164062 172.453994750977 172.460006713867 172.470001220703
## 1 1 2 2
## 172.473007202148 172.475006103516 172.479995727539 172.488006591797
## 1 2 1 1
## 172.490997314453 172.49299621582 172.520004272461 172.533004760742
## 1 1 1 2
## 172.539993286133 172.542999267578 172.544998168945 172.559997558594
## 2 1 1 1
## 172.565994262695 172.570007324219 172.578994750977 172.585998535156
## 1 4 1 1
## 172.593002319336 172.606994628906 172.610000610352 172.623992919922
## 1 1 2 1
## 172.639007568359 172.654006958008 172.669998168945 172.699996948242
## 1 1 3 1
## 172.703002929688 172.705993652344 172.707000732422 172.710006713867
## 1 1 1 1
## 172.720001220703 172.72200012207 172.764999389648 172.789993286133
## 2 1 1 1
## 172.79899597168 172.802993774414 172.805999755859 172.815002441406
## 1 1 1 1
## 172.835998535156 172.841003417969 172.852005004883 172.852996826172
## 1 1 1 1
## 172.85400390625 172.86799621582 172.876007080078 172.880004882812
## 1 1 1 1
## 172.880996704102 172.889999389648 172.940002441406 172.95100402832
## 1 1 1 2
## 172.960006713867 173 173.020004272461 173.044006347656
## 2 1 1 1
## 173.052001953125 173.063003540039 173.089996337891 173.098007202148
## 1 1 1 1
## 173.100006103516 173.110000610352 173.117004394531 173.177993774414
## 1 1 3 2
## 173.179992675781 173.186996459961 173.199996948242 173.240005493164
## 2 1 1 2
## 173.25 173.259994506836 173.261001586914 173.268997192383
## 1 2 3 2
## 173.27099609375 173.276992797852 173.279998779297 173.292007446289
## 1 1 2 1
## 173.300003051758 173.311996459961 173.330001831055 173.345993041992
## 1 1 3 1
## 173.358001708984 173.361999511719 173.371994018555 173.38200378418
## 2 5 1 1
## 173.399993896484 173.410003662109 173.419998168945 173.436996459961
## 1 2 1 1
## 173.457992553711 173.460006713867 173.47900390625 173.490005493164
## 1 1 1 1
## 173.509994506836 173.52799987793 173.539993286133 173.542007446289
## 1 2 4 1
## 173.550003051758 173.569000244141 173.589996337891 173.600006103516
## 1 1 1 1
## 173.604995727539 173.610000610352 173.630004882812 173.639999389648
## 1 1 1 1
## 173.643005371094 173.649002075195 173.649993896484 173.658004760742
## 1 1 2 1
## 173.660003662109 173.669998168945 173.690994262695 173.710006713867
## 1 1 1 4
## 173.720001220703 173.729995727539 173.75 173.759994506836
## 1 1 4 1
## 173.789001464844 173.835998535156 173.860000610352 173.875
## 1 1 1 1
## 173.919998168945 173.929992675781 173.938003540039 173.960006713867
## 1 1 3 1
## 173.996002197266 174.009994506836 174.029998779297 174.039993286133
## 1 3 1 1
## 174.055999755859 174.067001342773 174.070007324219 174.089996337891
## 1 1 2 1
## 174.102005004883 174.110000610352 174.110992431641 174.11799621582
## 1 2 1 1
## 174.130004882812 174.143997192383 174.147003173828 174.149993896484
## 1 1 1 2
## 174.154998779297 174.180999755859 174.188995361328 174.201995849609
## 1 1 1 1
## 174.203994750977 174.205001831055 174.218994140625 174.231002807617
## 1 1 1 1
## 174.240005493164 174.244995117188 174.270004272461 174.360000610352
## 2 1 1 1
## 174.369995117188 174.380004882812 174.389999389648 174.399993896484
## 1 1 1 1
## 174.457992553711 174.460006713867 174.492004394531 174.514007568359
## 1 1 1 2
## 174.548004150391 174.550003051758 174.559997558594 174.565002441406
## 1 1 1 1
## 174.570999145508 174.580001831055 174.580993652344 174.593994140625
## 1 1 1 1
## 174.606002807617 174.610000610352 174.610992431641 174.626007080078
## 1 1 1 1
## 174.639999389648 174.649993896484 174.669998168945 174.671997070312
## 4 1 2 1
## 174.679992675781 174.682006835938 174.690002441406 174.723999023438
## 1 2 1 1
## 174.740005493164 174.77099609375 174.779998779297 174.781997680664
## 1 1 1 1
## 174.792999267578 174.794006347656 174.800003051758 174.809997558594
## 1 2 1 1
## 174.819000244141 174.820007324219 174.830001831055 174.845001220703
## 1 2 1 1
## 174.850006103516 174.86799621582 174.910003662109 174.929992675781
## 1 1 1 1
## 174.949996948242 174.960006713867 174.979995727539 174.988998413086
## 1 1 1 1
## 174.990005493164 174.992004394531 175.009994506836 175.014999389648
## 1 1 2 1
## 175.031005859375 175.050003051758 175.067001342773 175.070007324219
## 1 1 1 1
## 175.076995849609 175.113006591797 175.130004882812 175.147994995117
## 3 2 2 1
## 175.179992675781 175.190002441406 175.199005126953 175.216995239258
## 1 1 1 1
## 175.261993408203 175.266998291016 175.279998779297 175.289993286133
## 1 1 3 1
## 175.29899597168 175.304000854492 175.309997558594 175.319000244141
## 1 1 1 1
## 175.330001831055 175.345001220703 175.348007202148 175.371002197266
## 1 1 1 1
## 175.380004882812 175.389999389648 175.414993286133 175.460006713867
## 1 1 2 1
## 175.468994140625 175.470001220703 175.470993041992 175.490005493164
## 1 1 1 1
## 175.5 175.541000366211 175.550003051758 175.561004638672
## 2 1 1 1
## 175.570007324219 175.578002929688 175.589996337891 175.591003417969
## 1 1 2 1
## 175.643005371094 175.645004272461 175.649993896484 175.679992675781
## 1 1 2 1
## 175.694000244141 175.720001220703 175.729995727539 175.746002197266
## 1 1 1 1
## 175.779006958008 175.789993286133 175.804000854492 175.809997558594
## 1 1 1 1
## 175.815994262695 175.820007324219 175.841995239258 175.850006103516
## 1 1 1 1
## 175.865997314453 175.886993408203 175.893997192383 175.901992797852
## 1 1 1 1
## 175.910003662109 175.929992675781 175.938995361328 175.940002441406
## 1 1 1 1
## 175.949996948242 175.960006713867 176 176.007995605469
## 2 1 2 1
## 176.009994506836 176.050003051758 176.054000854492 176.057006835938
## 3 2 1 1
## 176.057998657227 176.076995849609 176.078994750977 176.089996337891
## 1 1 1 1
## 176.100006103516 176.121002197266 176.126007080078 176.130004882812
## 1 1 1 1
## 176.149993896484 176.15299987793 176.160003662109 176.171997070312
## 1 1 1 1
## 176.22200012207 176.244003295898 176.248992919922 176.253997802734
## 1 1 1 1
## 176.274993896484 176.294998168945 176.296997070312 176.345993041992
## 1 1 1 1
## 176.350006103516 176.360000610352 176.380004882812 176.389999389648
## 1 1 1 1
## 176.391998291016 176.404998779297 176.417007446289 176.440002441406
## 1 1 1 1
## 176.445007324219 176.466995239258 176.470001220703 176.481002807617
## 1 1 3 1
## 176.490997314453 176.5 176.503997802734 176.529006958008
## 1 1 1 1
## 176.529998779297 176.550003051758 176.567993164062 176.602005004883
## 2 2 2 3
## 176.608993530273 176.632995605469 176.649002075195 176.660003662109
## 1 3 1 1
## 176.690002441406 176.699996948242 176.703002929688 176.708999633789
## 1 1 1 1
## 176.710998535156 176.714996337891 176.729995727539 176.740005493164
## 1 1 1 1
## 176.75 176.779006958008 176.800003051758 176.807998657227
## 3 1 1 1
## 176.809997558594 176.820007324219 176.826995849609 176.830993652344
## 1 1 1 1
## 176.832000732422 176.854995727539 176.869995117188 176.893005371094
## 1 1 1 1
## 176.904006958008 176.938995361328 176.940002441406 176.945007324219
## 1 1 2 1
## 176.970001220703 176.979995727539 176.990005493164 177.014007568359
## 1 1 2 1
## 177.037994384766 177.044998168945 177.050003051758 177.059997558594
## 1 1 1 1
## 177.080001831055 177.119995117188 177.123001098633 177.130004882812
## 3 1 2 1
## 177.139999389648 177.158004760742 177.160003662109 177.212005615234
## 1 1 2 1
## 177.25 177.274993896484 177.279998779297 177.320999145508
## 1 1 1 1
## 177.335006713867 177.339996337891 177.350006103516 177.356994628906
## 1 1 1 1
## 177.397994995117 177.399993896484 177.401000976562 177.410003662109
## 1 1 1 1
## 177.412994384766 177.419998168945 177.429992675781 177.449996948242
## 1 1 1 1
## 177.460006713867 177.473999023438 177.477005004883 177.490005493164
## 1 1 1 1
## 177.524993896484 177.529998779297 177.550003051758 177.561996459961
## 1 1 1 1
## 177.576995849609 177.602996826172 177.615997314453 177.619995117188
## 1 1 1 1
## 177.632995605469 177.649993896484 177.651992797852 177.708999633789
## 1 1 2 1
## 177.740005493164 177.75 177.759994506836 177.770004272461
## 1 1 1 1
## 177.772003173828 177.779998779297 177.789993286133 177.817001342773
## 1 1 1 1
## 177.820007324219 177.830001831055 177.832992553711 177.839996337891
## 2 2 1 1
## 177.869995117188 177.873001098633 177.880004882812 177.889999389648
## 1 1 2 2
## 177.908004760742 177.910003662109 177.912994384766 177.917999267578
## 1 1 1 1
## 177.929000854492 177.947006225586 177.957000732422 177.960006713867
## 1 1 1 1
## 177.964996337891 177.979995727539 177.981994628906 178.029998779297
## 1 3 1 1
## 178.039001464844 178.039993286133 178.055999755859 178.061996459961
## 1 1 1 2
## 178.087005615234 178.089004516602 178.089996337891 178.115005493164
## 1 1 1 1
## 178.130004882812 178.149993896484 178.151000976562 178.160003662109
## 1 1 1 1
## 178.188995361328 178.199996948242 178.210006713867 178.220001220703
## 1 1 1 1
## 178.244995117188 178.25 178.251007080078 178.259994506836
## 1 2 1 1
## 178.268997192383 178.270004272461 178.285003662109 178.294006347656
## 1 1 1 1
## 178.330001831055 178.367004394531 178.378997802734 178.399993896484
## 3 1 1 1
## 178.419998168945 178.434005737305 178.438003540039 178.442993164062
## 1 1 1 1
## 178.453994750977 178.460006713867 178.5 178.501007080078
## 1 1 1 1
## 178.52099609375 178.529998779297 178.567001342773 178.63200378418
## 1 1 1 1
## 178.639999389648 178.649002075195 178.669998168945 178.671997070312
## 2 1 1 2
## 178.675003051758 178.697998046875 178.710006713867 178.770004272461
## 1 1 1 1
## 178.789993286133 178.839004516602 178.858001708984 178.899993896484
## 1 1 1 1
## 178.901000976562 178.912002563477 178.919998168945 178.92399597168
## 1 1 1 1
## 178.929992675781 178.945007324219 178.95100402832 178.979995727539
## 1 1 1 1
## 179 179.020004272461 179.048004150391 179.057998657227
## 1 1 1 1
## 179.10400390625 179.130996704102 179.149993896484 179.160003662109
## 1 1 1 1
## 179.162002563477 179.162994384766 179.166000366211 179.253997802734
## 1 1 1 1
## 179.259994506836 179.261001586914 179.270004272461 179.291000366211
## 3 1 2 1
## 179.294006347656 179.296997070312 179.300003051758 179.309997558594
## 1 1 1 1
## 179.313003540039 179.324996948242 179.330001831055 179.350006103516
## 1 1 2 1
## 179.354995727539 179.360000610352 179.369995117188 179.380996704102
## 2 1 1 1
## 179.38200378418 179.399002075195 179.410003662109 179.412002563477
## 1 1 1 1
## 179.412994384766 179.419998168945 179.429992675781 179.449996948242
## 1 1 1 4
## 179.460006713867 179.470001220703 179.477996826172 179.479995727539
## 1 2 1 1
## 179.490005493164 179.496994018555 179.5 179.509994506836
## 2 1 1 1
## 179.529998779297 179.537994384766 179.559005737305 179.570007324219
## 3 1 1 1
## 179.576995849609 179.580001831055 179.593994140625 179.595993041992
## 1 1 1 1
## 179.59700012207 179.600006103516 179.623992919922 179.632995605469
## 1 1 1 1
## 179.639999389648 179.679992675781 179.710006713867 179.712997436523
## 1 1 1 1
## 179.729995727539 179.75 179.751998901367 179.753997802734
## 1 2 1 1
## 179.759994506836 179.798004150391 179.79899597168 179.807006835938
## 1 1 1 1
## 179.809997558594 179.811004638672 179.820999145508 179.841995239258
## 1 1 1 1
## 179.848007202148 179.860000610352 179.869995117188 179.884994506836
## 1 2 1 1
## 179.886993408203 179.917999267578 179.934005737305 179.970001220703
## 1 1 1 1
## 179.973007202148 179.977005004883 179.990005493164 180.009994506836
## 1 1 1 1
## 180.037994384766 180.048004150391 180.09700012207 180.100006103516
## 1 1 1 1
## 180.106994628906 180.110000610352 180.119003295898 180.138000488281
## 1 1 1 1
## 180.149993896484 180.182998657227 180.190002441406 180.20100402832
## 1 1 1 1
## 180.210006713867 180.225006103516 180.229995727539 180.231002807617
## 1 1 1 1
## 180.240005493164 180.274002075195 180.279998779297 180.292007446289
## 1 3 1 1
## 180.292999267578 180.309997558594 180.320007324219 180.345001220703
## 1 1 2 1
## 180.354995727539 180.356002807617 180.360000610352 180.376007080078
## 1 1 1 3
## 180.393997192383 180.399002075195 180.404006958008 180.438003540039
## 1 1 1 1
## 180.475006103516 180.496002197266 180.529998779297 180.550994873047
## 1 1 1 1
## 180.552993774414 180.611999511719 180.615997314453 180.639007568359
## 1 1 2 1
## 180.656005859375 180.660003662109 180.684997558594 180.699996948242
## 1 1 2 2
## 180.710998535156 180.720001220703 180.727996826172 180.729995727539
## 1 1 1 1
## 180.731994628906 180.740005493164 180.74299621582 180.751998901367
## 1 1 1 1
## 180.761001586914 180.811004638672 180.820007324219 180.828994750977
## 1 1 1 1
## 180.832000732422 180.889999389648 180.940994262695 180.949996948242
## 5 1 1 1
## 180.990005493164 180.99299621582 181.018005371094 181.020004272461
## 1 1 1 1
## 181.039993286133 181.041000366211 181.050003051758 181.059997558594
## 1 1 1 2
## 181.070007324219 181.080001831055 181.089996337891 181.100006103516
## 2 1 1 1
## 181.100997924805 181.121994018555 181.125 181.128005981445
## 1 1 2 1
## 181.160995483398 181.186004638672 181.195007324219 181.203002929688
## 1 1 1 1
## 181.240005493164 181.253997802734 181.259002685547 181.272003173828
## 1 1 1 1
## 181.289993286133 181.296005249023 181.304000854492 181.330001831055
## 1 1 1 1
## 181.332000732422 181.341003417969 181.35400390625 181.360000610352
## 1 1 1 2
## 181.369003295898 181.386001586914 181.399993896484 181.410003662109
## 2 1 1 1
## 181.421005249023 181.440002441406 181.449996948242 181.451995849609
## 1 3 3 1
## 181.457000732422 181.458999633789 181.462997436523 181.509994506836
## 1 1 1 1
## 181.550003051758 181.554000854492 181.580001831055 181.628997802734
## 1 1 2 1
## 181.658004760742 181.675003051758 181.690994262695 181.699996948242
## 1 1 1 1
## 181.718994140625 181.725006103516 181.75 181.776000976562
## 1 1 1 1
## 181.783996582031 181.804992675781 181.809997558594 181.830001831055
## 2 1 1 1
## 181.852996826172 181.858993530273 181.869995117188 181.884994506836
## 1 1 1 1
## 181.893005371094 181.929992675781 181.934005737305 181.940002441406
## 1 1 1 2
## 181.944000244141 181.947006225586 181.949996948242 181.975006103516
## 1 1 2 1
## 181.979995727539 182 182.054000854492 182.082000732422
## 1 1 1 1
## 182.091995239258 182.100006103516 182.110000610352 182.119995117188
## 1 1 2 1
## 182.123992919922 182.134002685547 182.15299987793 182.162994384766
## 1 1 1 1
## 182.173004150391 182.179992675781 182.186996459961 182.195999145508
## 1 3 2 1
## 182.199996948242 182.218994140625 182.223999023438 182.229995727539
## 1 1 1 2
## 182.240005493164 182.268005371094 182.270004272461 182.279006958008
## 1 1 1 1
## 182.294006347656 182.324005126953 182.339996337891 182.360000610352
## 1 1 2 1
## 182.389999389648 182.419998168945 182.436996459961 182.449996948242
## 1 3 1 1
## 182.457992553711 182.475006103516 182.507995605469 182.514999389648
## 1 1 1 1
## 182.54899597168 182.565002441406 182.570999145508 182.589004516602
## 1 2 3 1
## 182.589996337891 182.593002319336 182.600006103516 182.602996826172
## 1 1 2 1
## 182.628005981445 182.628997802734 182.639999389648 182.669998168945
## 1 1 1 1
## 182.684997558594 182.686004638672 182.695007324219 182.699996948242
## 1 1 1 4
## 182.738998413086 182.776000976562 182.779998779297 182.800003051758
## 1 1 1 1
## 182.809997558594 182.835998535156 182.869995117188 182.880996704102
## 1 1 1 1
## 182.925003051758 182.949996948242 183 183.009994506836
## 1 1 3 1
## 183.020004272461 183.076995849609 183.080001831055 183.100006103516
## 1 1 1 2
## 183.110000610352 183.130004882812 183.138000488281 183.139999389648
## 2 1 2 1
## 183.156997680664 183.169006347656 183.169998168945 183.186004638672
## 1 1 1 1
## 183.192001342773 183.238998413086 183.264007568359 183.281997680664
## 1 1 1 1
## 183.294006347656 183.300003051758 183.339004516602 183.350006103516
## 1 1 1 1
## 183.365997314453 183.369995117188 183.389999389648 183.391006469727
## 1 1 1 1
## 183.412994384766 183.419998168945 183.42399597168 183.440002441406
## 1 1 1 1
## 183.442993164062 183.449996948242 183.460006713867 183.477005004883
## 1 1 2 1
## 183.479995727539 183.485000610352 183.5 183.520004272461
## 1 1 2 1
## 183.52099609375 183.541000366211 183.576995849609 183.578002929688
## 2 1 2 1
## 183.610000610352 183.619995117188 183.630004882812 183.630996704102
## 1 1 1 1
## 183.669998168945 183.684997558594 183.716003417969 183.742004394531
## 1 1 1 1
## 183.759994506836 183.820007324219 183.830001831055 183.845001220703
## 1 1 1 1
## 183.850006103516 183.865005493164 183.880004882812 183.897994995117
## 1 2 1 1
## 183.899002075195 183.908996582031 183.940002441406 183.960006713867
## 1 1 1 2
## 183.977996826172 183.981994628906 183.983001708984 183.990005493164
## 1 1 1 1
## 184.031005859375 184.031997680664 184.050003051758 184.104995727539
## 1 1 1 1
## 184.139999389648 184.149993896484 184.15299987793 184.192993164062
## 1 1 1 1
## 184.212997436523 184.229995727539 184.251007080078 184.263000488281
## 1 1 1 1
## 184.27799987793 184.279006958008 184.279998779297 184.300994873047
## 1 2 2 1
## 184.363998413086 184.401000976562 184.47200012207 184.490005493164
## 1 1 1 1
## 184.501998901367 184.514007568359 184.520004272461 184.550994873047
## 1 1 1 1
## 184.559997558594 184.580001831055 184.666000366211 184.679992675781
## 1 1 1 1
## 184.699005126953 184.699996948242 184.720001220703 184.729995727539
## 1 1 1 1
## 184.733001708984 184.740997314453 184.794006347656 184.809997558594
## 1 1 1 1
## 184.817001342773 184.914001464844 184.919998168945 184.929992675781
## 1 1 1 2
## 184.947006225586 184.966995239258 184.979995727539 184.981002807617
## 1 1 1 1
## 185.018005371094 185.020004272461 185.029998779297 185.037002563477
## 1 1 1 1
## 185.046005249023 185.04899597168 185.059997558594 185.070007324219
## 1 4 1 1
## 185.080001831055 185.100006103516 185.110000610352 185.149993896484
## 1 2 1 1
## 185.175994873047 185.201995849609 185.216995239258 185.22900390625
## 1 1 1 1
## 185.25 185.270004272461 185.328994750977 185.339996337891
## 1 1 1 1
## 185.350006103516 185.360000610352 185.386001586914 185.389999389648
## 1 1 1 1
## 185.425003051758 185.440002441406 185.449005126953 185.460006713867
## 1 1 1 1
## 185.468994140625 185.503005981445 185.50700378418 185.539993286133
## 1 1 1 1
## 185.559997558594 185.567993164062 185.593994140625 185.610000610352
## 1 1 2 1
## 185.630004882812 185.649002075195 185.669998168945 185.710006713867
## 1 2 2 1
## 185.789993286133 185.792007446289 185.804992675781 185.820007324219
## 1 1 1 1
## 185.850997924805 185.852005004883 185.86799621582 185.919998168945
## 1 1 2 1
## 185.929992675781 185.960006713867 185.990005493164 186.009994506836
## 1 1 1 1
## 186.070007324219 186.089996337891 186.126007080078 186.149993896484
## 1 1 1 1
## 186.227005004883 186.289993286133 186.317993164062 186.419998168945
## 1 1 2 1
## 186.449996948242 186.470001220703 186.47900390625 186.488998413086
## 6 1 1 1
## 186.5 186.507995605469 186.509994506836 186.550003051758
## 1 1 2 1
## 186.582000732422 186.602005004883 186.606002807617 186.619995117188
## 1 1 1 1
## 186.675994873047 186.680999755859 186.701995849609 186.720001220703
## 1 1 2 1
## 186.735992431641 186.759994506836 186.785995483398 186.843994140625
## 1 1 1 1
## 186.850006103516 186.860000610352 186.867004394531 186.869995117188
## 3 2 1 1
## 186.873992919922 186.889999389648 186.899993896484 186.901992797852
## 1 1 1 2
## 186.906005859375 186.910003662109 186.919998168945 186.929992675781
## 1 1 1 1
## 186.962005615234 186.973007202148 186.979995727539 187.020004272461
## 1 1 1 2
## 187.046997070312 187.050003051758 187.070007324219 187.100006103516
## 1 1 1 1
## 187.126998901367 187.130004882812 187.15299987793 187.169998168945
## 1 2 1 1
## 187.182006835938 187.218002319336 187.225006103516 187.240005493164
## 2 1 1 1
## 187.248001098633 187.266006469727 187.292999267578 187.300003051758
## 1 1 2 1
## 187.330001831055 187.416000366211 187.421005249023 187.427993774414
## 1 1 2 1
## 187.440002441406 187.442001342773 187.45100402832 187.453994750977
## 1 1 1 1
## 187.488006591797 187.505004882812 187.561996459961 187.567993164062
## 1 1 1 1
## 187.600006103516 187.654006958008 187.666000366211 187.684005737305
## 2 2 1 1
## 187.710998535156 187.723999023438 187.742004394531 187.75700378418
## 1 1 1 1
## 187.759994506836 187.785995483398 187.789993286133 187.809997558594
## 1 1 1 1
## 187.865997314453 187.889999389648 187.919998168945 187.973999023438
## 1 1 1 1
## 187.988998413086 188.009994506836 188.050003051758 188.080001831055
## 1 1 1 1
## 188.093994140625 188.100006103516 188.151000976562 188.229995727539
## 1 1 1 1
## 188.272994995117 188.279998779297 188.328994750977 188.339996337891
## 1 3 1 1
## 188.39599609375 188.460998535156 188.468994140625 188.475006103516
## 1 1 1 1
## 188.490005493164 188.511993408203 188.570007324219 188.595993041992
## 1 1 1 2
## 188.600006103516 188.610000610352 188.619995117188 188.664993286133
## 1 1 1 1
## 188.699996948242 188.712005615234 188.740005493164 188.740997314453
## 1 1 1 2
## 188.75 188.759994506836 188.785995483398 188.789993286133
## 2 1 1 1
## 188.839996337891 188.848999023438 188.850006103516 188.869995117188
## 1 1 1 1
## 188.889999389648 188.919998168945 188.949996948242 188.970001220703
## 2 1 1 1
## 188.990005493164 189.009994506836 189.016006469727 189.050003051758
## 1 1 1 1
## 189.089996337891 189.100997924805 189.110000610352 189.289993286133
## 1 1 1 1
## 189.339996337891 189.408996582031 189.421997070312 189.440002441406
## 1 1 1 1
## 189.477996826172 189.505004882812 189.539993286133 189.600006103516
## 1 2 1 2
## 189.602005004883 189.647003173828 189.649993896484 189.669998168945
## 1 1 1 1
## 189.72200012207 189.738006591797 189.75 189.764999389648
## 1 1 1 1
## 189.813003540039 189.817993164062 189.839996337891 189.850006103516
## 1 1 1 1
## 189.856994628906 189.910003662109 189.917999267578 189.919998168945
## 1 1 1 1
## 189.929992675781 189.970001220703 190.039993286133 190.108993530273
## 1 1 1 1
## 190.110000610352 190.141006469727 190.151000976562 190.160003662109
## 1 1 1 1
## 190.164993286133 190.190002441406 190.195999145508 190.199996948242
## 1 1 1 1
## 190.225997924805 190.229995727539 190.263000488281 190.289993286133
## 1 1 1 1
## 190.319000244141 190.322998046875 190.440002441406 190.460006713867
## 1 1 1 1
## 190.490005493164 190.520004272461 190.526000976562 190.526992797852
## 1 2 1 1
## 190.634994506836 190.714996337891 190.718994140625 190.729995727539
## 1 1 1 1
## 190.779998779297 190.802001953125 190.839996337891 190.869995117188
## 1 1 1 1
## 190.957000732422 190.968994140625 190.979995727539 190.988998413086
## 1 1 1 1
## 191.011001586914 191.011993408203 191.029998779297 191.037994384766
## 2 1 1 1
## 191.039993286133 191.057006835938 191.059997558594 191.108993530273
## 1 1 1 3
## 191.179992675781 191.220001220703 191.22200012207 191.25
## 1 2 1 1
## 191.283004760742 191.320007324219 191.322998046875 191.350006103516
## 1 2 1 1
## 191.360000610352 191.365005493164 191.373001098633 191.389999389648
## 1 1 1 1
## 191.399993896484 191.410003662109 191.475006103516 191.490005493164
## 1 1 1 3
## 191.561004638672 191.630004882812 191.660995483398 191.690994262695
## 1 1 1 1
## 191.720001220703 191.729995727539 191.759994506836 191.779998779297
## 1 1 1 1
## 191.800003051758 191.820007324219 191.850006103516 191.863998413086
## 1 2 2 1
## 191.880004882812 191.88200378418 191.919998168945 191.927001953125
## 1 1 1 1
## 191.990005493164 192 192.016006469727 192.029998779297
## 3 1 2 1
## 192.059005737305 192.074996948242 192.080001831055 192.139999389648
## 1 1 1 2
## 192.169998168945 192.175994873047 192.208999633789 192.229995727539
## 1 1 3 1
## 192.240005493164 192.289993286133 192.292007446289 192.384002685547
## 1 1 2 1
## 192.391998291016 192.42399597168 192.429992675781 192.444000244141
## 1 2 1 3
## 192.460998535156 192.509994506836 192.52799987793 192.529998779297
## 1 1 1 1
## 192.535003662109 192.550003051758 192.589996337891 192.641998291016
## 3 3 1 1
## 192.64599609375 192.660003662109 192.699005126953 192.714996337891
## 2 1 4 1
## 192.733001708984 192.740005493164 192.764999389648 192.779998779297
## 1 1 2 1
## 192.787994384766 192.807998657227 192.858993530273 192.944000244141
## 1 1 1 1
## 192.960006713867 193.003997802734 193.009002685547 193.009994506836
## 1 1 1 1
## 193.02799987793 193.046005249023 193.050003051758 193.125
## 1 1 1 1
## 193.197998046875 193.279998779297 193.281005859375 193.283996582031
## 2 1 1 1
## 193.309997558594 193.313003540039 193.339996337891 193.429992675781
## 1 1 2 1
## 193.440002441406 193.449996948242 193.460006713867 193.479995727539
## 1 1 1 1
## 193.509994506836 193.520004272461 193.587005615234 193.600006103516
## 1 2 1 2
## 193.621002197266 193.679992675781 193.703002929688 193.774993896484
## 1 1 1 1
## 193.789993286133 193.800994873047 193.830001831055 193.899993896484
## 1 1 1 1
## 193.929992675781 193.970001220703 194.029998779297 194.130004882812
## 1 1 1 1
## 194.160003662109 194.199996948242 194.220001220703 194.233001708984
## 2 1 1 1
## 194.259994506836 194.279998779297 194.339996337891 194.376998901367
## 1 1 1 2
## 194.419998168945 194.42399597168 194.429992675781 194.539993286133
## 1 3 1 1
## 194.639999389648 194.679000854492 194.679992675781 194.729995727539
## 1 1 1 1
## 194.735992431641 194.740005493164 194.75 194.759994506836
## 1 1 1 1
## 194.779998779297 194.789993286133 194.809997558594 194.811004638672
## 1 1 2 2
## 194.837997436523 194.850006103516 194.860000610352 194.910003662109
## 1 1 1 1
## 194.919998168945 194.949996948242 194.960006713867 195.024993896484
## 1 1 1 1
## 195.07600402832 195.089996337891 195.110992431641 195.139007568359
## 1 1 2 1
## 195.162002563477 195.162994384766 195.169998168945 195.199996948242
## 2 1 1 1
## 195.255004882812 195.255996704102 195.259994506836 195.263000488281
## 2 1 1 1
## 195.289993286133 195.309997558594 195.311004638672 195.320007324219
## 1 1 1 1
## 195.330001831055 195.332992553711 195.397003173828 195.419998168945
## 1 1 1 1
## 195.429992675781 195.442001342773 195.479995727539 195.509994506836
## 1 1 1 1
## 195.559997558594 195.563995361328 195.625 195.649993896484
## 1 1 1 1
## 195.656005859375 195.667999267578 195.669998168945 195.707000732422
## 1 1 1 1
## 195.75700378418 195.802001953125 195.929992675781 195.930999755859
## 1 1 1 1
## 195.953002929688 195.960006713867 196.067993164062 196.074996948242
## 1 1 2 1
## 196.108001708984 196.139999389648 196.190002441406 196.192993164062
## 1 1 1 1
## 196.229995727539 196.307998657227 196.317993164062 196.350006103516
## 1 1 1 1
## 196.352996826172 196.416000366211 196.429992675781 196.501998901367
## 1 1 1 1
## 196.520004272461 196.537002563477 196.539993286133 196.563003540039
## 1 1 2 1
## 196.570007324219 196.630004882812 196.660003662109 196.714996337891
## 1 1 1 5
## 196.729995727539 196.740997314453 196.744003295898 196.764007568359
## 1 1 1 1
## 196.79899597168 196.822998046875 196.837997436523 196.841003417969
## 1 1 1 1
## 196.869995117188 196.880004882812 196.889999389648 196.929992675781
## 2 1 1 2
## 196.940002441406 196.949996948242 196.970001220703 196.990005493164
## 1 1 1 1
## 196.99299621582 197.016998291016 197.048004150391 197.070007324219
## 1 1 1 2
## 197.087997436523 197.089004516602 197.089996337891 197.095993041992
## 3 1 2 1
## 197.100006103516 197.125 197.171997070312 197.197006225586
## 2 1 1 1
## 197.220001220703 197.225006103516 197.240005493164 197.274993896484
## 1 1 1 1
## 197.289993286133 197.389999389648 197.42399597168 197.442001342773
## 3 1 1 1
## 197.460006713867 197.5 197.537002563477 197.639999389648
## 3 1 1 1
## 197.647003173828 197.649002075195 197.660003662109 197.679992675781
## 1 1 1 1
## 197.759002685547 197.869995117188 197.919006347656 197.927001953125
## 1 1 2 1
## 197.940002441406 197.951995849609 198.00700378418 198.046005249023
## 1 1 1 1
## 198.059997558594 198.119995117188 198.139999389648 198.238998413086
## 2 1 1 1
## 198.259994506836 198.264999389648 198.311996459961 198.345993041992
## 1 1 2 1
## 198.470001220703 198.479995727539 198.526992797852 198.570007324219
## 1 2 1 1
## 198.606994628906 198.641006469727 198.74299621582 198.77799987793
## 1 1 1 1
## 198.779998779297 198.820007324219 198.822998046875 198.919998168945
## 2 1 1 1
## 198.940002441406 198.964004516602 198.970993041992 198.990005493164
## 1 1 1 1
## 199 199.003997802734 199.009994506836 199.033996582031
## 1 1 1 1
## 199.065002441406 199.098007202148 199.115997314453 199.139999389648
## 1 2 3 1
## 199.270004272461 199.289993286133 199.369995117188 199.380004882812
## 1 1 1 1
## 199.386993408203 199.389999389648 199.410003662109 199.457992553711
## 1 1 1 1
## 199.479995727539 199.486999511719 199.561004638672 199.576995849609
## 1 2 1 1
## 199.582992553711 199.600006103516 199.613006591797 199.630004882812
## 1 1 1 2
## 199.712005615234 199.723999023438 199.75 199.789993286133
## 1 1 1 1
## 199.811996459961 199.824005126953 199.880004882812 199.925994873047
## 1 1 1 3
## 199.929000854492 200 200.02799987793 200.085006713867
## 1 1 2 1
## 200.149993896484 200.151000976562 200.171005249023 200.188003540039
## 1 2 1 3
## 200.190002441406 200.220001220703 200.225006103516 200.259994506836
## 1 1 3 1
## 200.339996337891 200.365997314453 200.423004150391 200.468002319336
## 1 1 2 1
## 200.539001464844 200.561996459961 200.619995117188 200.699996948242
## 1 1 3 1
## 200.710998535156 200.738998413086 200.755996704102 200.761993408203
## 1 1 1 1
## 200.774993896484 200.789993286133 200.809997558594 200.811996459961
## 1 1 1 1
## 200.815002441406 200.848007202148 200.850006103516 200.856994628906
## 1 1 2 1
## 200.917007446289 200.949996948242 201.020004272461 201.031997680664
## 1 1 1 1
## 201.098007202148 201.106002807617 201.149993896484 201.154006958008
## 1 1 1 1
## 201.169998168945 201.188003540039 201.199996948242 201.240997314453
## 1 2 1 1
## 201.320999145508 201.399993896484 201.47900390625 201.488006591797
## 1 1 2 1
## 201.5 201.654998779297 201.809997558594 201.884994506836
## 1 1 1 1
## 201.910003662109 201.985000610352 202.039993286133 202.050003051758
## 2 2 4 1
## 202.057006835938 202.076995849609 202.14599609375 202.225997924805
## 1 1 1 3
## 202.229995727539 202.294998168945 202.332992553711 202.470001220703
## 1 2 1 1
## 202.600006103516 202.679992675781 202.707992553711 202.779998779297
## 1 1 2 1
## 202.804992675781 202.869995117188 202.917999267578 202.925003051758
## 2 1 1 1
## 203.039993286133 203.050003051758 203.080001831055 203.087997436523
## 2 1 1 1
## 203.089996337891 203.160003662109 203.253997802734 203.25700378418
## 2 1 1 2
## 203.259994506836 203.279998779297 203.462005615234 203.524993896484
## 2 1 2 1
## 203.563003540039 203.630004882812 203.649002075195 203.712005615234
## 1 2 3 1
## 203.735992431641 203.740005493164 203.802993774414 203.815994262695
## 3 2 1 1
## 203.837005615234 203.895004272461 203.899002075195 203.919998168945
## 1 2 1 1
## 203.942993164062 203.949996948242 204.100006103516 204.110000610352
## 1 1 1 1
## 204.139999389648 204.160003662109 204.179992675781 204.210006713867
## 1 2 1 1
## 204.35400390625 204.380004882812 204.470001220703 204.475997924805
## 3 1 1 2
## 204.582000732422 204.669998168945 204.671005249023 204.886001586914
## 1 1 1 1
## 204.940002441406 204.949996948242 205.039993286133 205.050003051758
## 1 1 2 1
## 205.070007324219 205.10400390625 205.169998168945 205.225006103516
## 2 1 1 2
## 205.229995727539 205.259994506836 205.279998779297 205.289993286133
## 2 1 1 1
## 205.369995117188 205.410003662109 205.496002197266 205.589996337891
## 1 1 1 1
## 205.660003662109 205.679992675781 205.70100402832 205.716995239258
## 1 1 3 1
## 205.805999755859 205.830001831055 205.923004150391 205.979995727539
## 1 1 2 1
## 205.983001708984 206 206.041000366211 206.220001220703
## 4 2 1 1
## 206.279998779297 206.311996459961 206.380004882812 206.470001220703
## 1 2 1 3
## 206.511993408203 206.630004882812 206.75 206.789993286133
## 2 1 1 1
## 206.809997558594 206.830001831055 206.97900390625 207
## 1 1 1 1
## 207.009994506836 207.029998779297 207.149993896484 207.192001342773
## 1 1 1 1
## 207.194000244141 207.199996948242 207.261993408203 207.34700012207
## 1 1 1 1
## 207.352996826172 207.369995117188 207.389007568359 207.401992797852
## 1 1 2 1
## 207.423004150391 207.440994262695 207.444000244141 207.490005493164
## 1 1 5 1
## 207.516006469727 207.57600402832 207.753997802734 207.79899597168
## 1 3 1 1
## 207.850997924805 207.938003540039 208.054992675781 208.199996948242
## 1 1 2 1
## 208.248001098633 208.268005371094 208.270004272461 208.279998779297
## 1 1 1 1
## 208.350006103516 208.354995727539 208.360000610352 208.453994750977
## 1 1 1 6
## 208.473999023438 208.535003662109 208.694000244141 208.779998779297
## 4 1 1 1
## 208.804000854492 208.809997558594 208.889999389648 208.893997192383
## 1 1 1 1
## 208.929000854492 208.929992675781 208.985000610352 208.998992919922
## 1 1 1 1
## 209.10400390625 209.156005859375 209.164993286133 209.216003417969
## 1 2 1 1
## 209.320007324219 209.350006103516 209.360000610352 209.365997314453
## 1 1 1 1
## 209.389999389648 209.444000244141 209.457000732422 209.671997070312
## 1 1 1 1
## 209.690002441406 209.727005004883 209.770004272461 209.970001220703
## 1 1 2 1
## 210.020004272461 210.039993286133 210.059997558594 210.070007324219
## 3 1 1 1
## 210.078994750977 210.110000610352 210.229995727539 210.279998779297
## 1 1 1 1
## 210.389999389648 210.393997192383 210.509994506836 210.563003540039
## 1 1 1 1
## 210.570007324219 210.580001831055 210.606994628906 210.660995483398
## 1 3 1 1
## 210.667007446289 210.686004638672 210.75 210.869995117188
## 1 1 1 1
## 210.897994995117 210.910003662109 210.990005493164 211.07600402832
## 1 3 1 2
## 211.139999389648 211.179992675781 211.259002685547 211.350997924805
## 1 1 1 1
## 211.559997558594 211.619995117188 211.660003662109 211.679000854492
## 1 1 1 1
## 211.789993286133 211.856994628906 211.899993896484 211.949996948242
## 1 1 1 3
## 211.970001220703 212.210006713867 212.270004272461 212.320007324219
## 1 1 1 1
## 212.401992797852 212.429000854492 212.621002197266 212.626007080078
## 1 1 1 1
## 212.63200378418 212.735000610352 212.757995605469 212.860000610352
## 3 1 1 1
## 212.869995117188 212.960006713867 212.979995727539 213.080001831055
## 1 1 1 1
## 213.25 213.279998779297 213.300003051758 213.317993164062
## 1 1 1 1
## 213.328994750977 213.380996704102 213.389999389648 213.490005493164
## 1 1 2 1
## 213.669998168945 213.725997924805 213.764999389648 213.770004272461
## 1 1 1 1
## 213.783996582031 213.889999389648 213.919998168945 214.020004272461
## 2 1 1 1
## 214.029998779297 214.050003051758 214.115005493164 214.229995727539
## 1 1 1 1
## 214.231002807617 214.263000488281 214.300003051758 214.479995727539
## 2 1 1 4
## 214.559997558594 214.649993896484 214.789993286133 214.919998168945
## 1 1 1 1
## 215.029006958008 215.110000610352 215.119995117188 215.259994506836
## 1 1 1 1
## 215.360000610352 215.36799621582 215.380004882812 215.401992797852
## 1 1 1 1
## 215.429992675781 215.440002441406 215.636001586914 215.682006835938
## 1 1 1 1
## 215.699996948242 215.740005493164 215.755004882812 216.039993286133
## 1 5 1 1
## 216.160003662109 216.190002441406 216.199996948242 216.240005493164
## 1 1 2 3
## 216.39599609375 216.429992675781 216.639999389648 216.660003662109
## 1 1 1 2
## 216.690002441406 216.761001586914 216.770004272461 216.820007324219
## 1 1 1 1
## 216.940002441406 217.039993286133 217.100006103516 217.268005371094
## 1 2 2 1
## 217.399993896484 217.518005371094 217.675003051758 217.729995727539
## 3 1 1 2
## 217.839996337891 217.861999511719 217.889007568359 217.906005859375
## 1 1 1 1
## 218 218.210006713867 218.259994506836 218.380004882812
## 1 1 4 1
## 218.639999389648 218.675003051758 218.740005493164 218.748001098633
## 1 1 2 2
## 218.759994506836 218.779998779297 218.876007080078 218.889999389648
## 3 1 2 2
## 219.175994873047 219.210006713867 219.449996948242 219.490005493164
## 2 1 1 6
## 219.526000976562 219.550003051758 219.72900390625 219.759994506836
## 1 1 1 1
## 219.860000610352 220.018997192383 220.050003051758 220.110000610352
## 1 1 1 1
## 220.235000610352 220.240005493164 220.356002807617 220.483993530273
## 1 2 1 1
## 220.5 220.630004882812 220.705001831055 220.845001220703
## 2 1 1 1
## 221.020004272461 221.460006713867 221.516006469727 221.555999755859
## 1 1 1 1
## 221.740005493164 222.240005493164 222.460006713867 222.559005737305
## 1 2 2 2
## 222.940002441406 223.020004272461 223.029998779297 223.070007324219
## 1 1 1 1
## 223.141998291016 223.479995727539 223.490005493164 223.520004272461
## 2 1 2 1
## 223.679992675781 223.75 224.005996704102 224.139999389648
## 1 1 1 2
## 224.199996948242 224.619995117188 224.660003662109 224.669998168945
## 1 1 1 1
## 224.77099609375 224.839996337891 225.074996948242 225.199996948242
## 1 1 1 1
## 225.320007324219 225.401992797852 225.559997558594 225.869995117188
## 1 1 3 3
## 226.039993286133 226.119995117188 226.244003295898 226.320007324219
## 2 1 1 1
## 226.529998779297 226.770004272461 227.110000610352 227.175994873047
## 2 1 1 1
## 227.229995727539 227.419998168945 227.470001220703 227.552993774414
## 1 1 1 1
## 227.710006713867 228.093994140625 228.100006103516 228.190002441406
## 1 1 1 1
## 228.369995117188 228.863998413086 229.108001708984 229.130004882812
## 2 1 2 1
## 229.869995117188 230.279998779297 230.589996337891 230.779998779297
## 2 1 5 1
## 231.100006103516 232.130004882812 233.509994506836 234.781997680664
## 1 3 1 1
## 234.800994873047 235.643997192383 237.695007324219 238.380004882812
## 1 1 1 1
## 238.856994628906 239.671005249023 240.130004882812 240.188995361328
## 1 1 1 1
## 240.729995727539 241.055999755859 241.783996582031 246.253005981445
## 1 2 2 1
## 250.009002685547 252.263000488281 254.600006103516 257.489990234375
## 1 1 2 1
## 261.809997558594 265.029998779297 266.962005615234 281.532989501953
## 1 1 2 1
## 284.683013916016
## 1
#suppressMessages(library(spatstat))
#Rds = readOGR(dsn = "F://MartenPhDWork//Hecology//Allroads",
# layer = "output",
# stringsAsFactors = FALSE)
#Rds = spTransform(Rds, nProj) #convert projection
#Road.psp = as.psp(Rds) #format roads
#load("F://MartenPhDWork//Hecology//Rds.RData")
loc.road = raster("./Roads/locrdssecsum")
maj.road = raster("./Roads/majrdssecsum")
#M.pp = as.ppp(Mod.pnts) #format marten points
#Distance from each point to nearest road
#Mod.pnts$nRoad = nncross(M.pp, Road.psp)[,"dist"]
Mod.pnts$loc= as.numeric(
extract(loc.road, #Finding values for each location
spTransform(Mod.pnts,
proj4string(loc.road)),
method = "simple"))
Mod.pnts$loc[Mod.pnts$loc < 0] = NA
Mod.pnts$loc[is.na(Mod.pnts$loc)] = 0 #these aren't random (mostly mesh points over water)
Mod.pnts$maj = as.numeric(
extract(maj.road, #Finding values for each location
spTransform(Mod.pnts,
proj4string(maj.road)),
method = "simple"))
Mod.pnts$maj[Mod.pnts$maj < 0] = NA
Mod.pnts$maj[is.na(Mod.pnts$maj)] = 0
LandFire are factor-type attributes, not continuous.
VDISTURB: 1. Extract data.
2. Create a “Look.up” value based on closest matching year.
3. Match individual records to available landfore years.
#LOad the data
VDISTURB <- list.files(path="./LANDFIRE/VDISTURB", pattern = "secmaj$", full.names = TRUE)
VDISTURB.LF <- raster::stack(VDISTURB)
#Extract to a data frame
VDISTURB.df = as.data.frame(
extract(VDISTURB.LF,
spTransform(Mod.pnts,
proj4string(VDISTURB.LF), method = "simple")))
head(VDISTURB.df)
## v2008secmaj v2010secmaj v2012secmaj v2014secmaj
## 1 0 0 0 0
## 2 0 0 0 0
## 3 0 0 0 0
## 4 0 0 0 0
## 5 0 0 0 0
## 6 0 0 0 0
#create year column
VDISTURB.mlt = melt(VDISTURB.df)
## No id variables; using all as measure variables
VDISTURB.mlt$Year = substr(VDISTURB.mlt$variable, 2, 5)
head(VDISTURB.mlt)
## variable value Year
## 1 v2008secmaj 0 2008
## 2 v2008secmaj 0 2008
## 3 v2008secmaj 0 2008
## 4 v2008secmaj 0 2008
## 5 v2008secmaj 0 2008
## 6 v2008secmaj 0 2008
Available.yrs = as.numeric(unique(VDISTURB.mlt$Year)) #ID available years in dataset, convert to number
Available.yrs
## [1] 2008 2010 2012 2014
Mod.pnts$Year = as.integer(Mod.pnts$Year) #Convert to number
Close.match = function(x){which.min(abs(x - Available.yrs))} #what is the position of the number with minimal absolute difference.
#Test (demo)
Close.match(2010) #test with 2010 that is available
## [1] 2
Available.yrs[Close.match(2010)]
## [1] 2010
Close.match(2011) #test with 2011 (not available)
## [1] 2
Available.yrs[Close.match(2011)]
## [1] 2010
Close.match(2013) #test with 2013 (not available)
## [1] 3
Available.yrs[Close.match(2013)]
## [1] 2012
Mod.pnts$Look.up = Available.yrs[sapply(Mod.pnts$Year, Close.match)]
head(Mod.pnts[,c("Year","Look.up")]) #2014 is most recent
## Year Look.up
## 1 2010 2010
## 2 2004 2008
## 3 2004 2008
## 4 2014 2014
## 5 2007 2008
## 6 2013 2012
tail(Mod.pnts[,c("Year","Look.up")])
## Year Look.up
## 41330 2018 2014
## 41331 2018 2014
## 41332 2018 2014
## 41333 2018 2014
## 41334 2018 2014
## 41335 2018 2014
#Assign column based on Look.up year
Mod.pnts$VDISTURB = ifelse(Mod.pnts$Look.up == 2014, VDISTURB.df$v2014secmaj,
ifelse(Mod.pnts$Look.up == 2008, VDISTURB.df$v2008secmaj,
ifelse(Mod.pnts$Look.up == 2010, VDISTURB.df$v2010secmaj,
ifelse(Mod.pnts$Look.up == 2012, VDISTURB.df$v2012secmaj,
NA))))
Mod.pnts$VDISTURB[is.na(Mod.pnts$VDISTURB)] = 0
CBD
#LOad the data
CBD <- list.files(path="./LANDFIRE/CBD",
pattern = "secmaj$", full.names = TRUE)
CBD.LF <- raster::stack(CBD)
#Extract to a data frame
CBD.df = as.data.frame(
extract(CBD.LF,
spTransform(Mod.pnts,
proj4string(CBD.LF), method = "simple")))
head(CBD.df)
## cbd2001secmaj cbd2008secmaj cbd2010secmaj cbd2012secmaj cbd2014secmaj
## 1 1 1 1 1 1
## 2 0 0 0 0 0
## 3 16 16 0 0 0
## 4 0 0 0 0 0
## 5 1 1 1 1 1
## 6 16 16 16 16 16
#create year column
CBD.mlt = melt(CBD.df)
## No id variables; using all as measure variables
CBD.mlt$Year = substr(CBD.mlt$variable, 4, 7)
head(CBD.mlt)
## variable value Year
## 1 cbd2001secmaj 1 2001
## 2 cbd2001secmaj 0 2001
## 3 cbd2001secmaj 16 2001
## 4 cbd2001secmaj 0 2001
## 5 cbd2001secmaj 1 2001
## 6 cbd2001secmaj 16 2001
Available.yrs = as.numeric(unique(CBD.mlt$Year)) #ID available years in dataset, convert to number
Available.yrs
## [1] 2001 2008 2010 2012 2014
Mod.pnts$Year = as.integer(Mod.pnts$Year) #Convert to number
Mod.pnts$Look.up = Available.yrs[sapply(Mod.pnts$Year, Close.match)] #Overwrite prior look up year
#Assign column based on Look.up year
Mod.pnts$CBD = ifelse(Mod.pnts$Look.up == 2014, CBD.df$cbd2014secmaj,
ifelse(Mod.pnts$Look.up == 2001, CBD.df$cbd2001secmaj,
ifelse(Mod.pnts$Look.up == 2010, CBD.df$cbd2010secmaj,
ifelse(Mod.pnts$Look.up == 2012, CBD.df$cbd2012secmaj,
ifelse(Mod.pnts$Look.up == 2008, CBD.df$cbd2008secmaj,
NA)))))
Mod.pnts$CBD[is.na(Mod.pnts$CBD)] = 0
EVC
#LOad the data
EVC <- list.files(path="./LANDFIRE/EVC",
pattern = "secmaj$", full.names = TRUE)
EVC.LF <- raster::stack(EVC)
#Extract to a data frame
EVC.df = as.data.frame(
extract(EVC.LF,
spTransform(Mod.pnts,
proj4string(EVC.LF), method = "simple")))
head(EVC.df)
## evc2001secmaj evc2008secmaj evc2010secmaj evc2012secmaj evc2014secmaj
## 1 106 106 106 106 107
## 2 106 106 107 107 107
## 3 106 106 106 106 106
## 4 66 66 122 65 65
## 5 106 106 107 107 107
## 6 106 106 106 106 106
#create year column
EVC.mlt = melt(EVC.df)
## No id variables; using all as measure variables
EVC.mlt$Year = substr(EVC.mlt$variable, 4, 7)
head(EVC.mlt)
## variable value Year
## 1 evc2001secmaj 106 2001
## 2 evc2001secmaj 106 2001
## 3 evc2001secmaj 106 2001
## 4 evc2001secmaj 66 2001
## 5 evc2001secmaj 106 2001
## 6 evc2001secmaj 106 2001
Available.yrs = as.numeric(unique(EVC.mlt$Year)) #ID available years in dataset, convert to number
Available.yrs
## [1] 2001 2008 2010 2012 2014
Mod.pnts$Year = as.integer(Mod.pnts$Year) #Convert to number
Mod.pnts$Look.up = Available.yrs[sapply(Mod.pnts$Year, Close.match)] #Overwrite prior look up year
#Assign column based on Look.up year
Mod.pnts$EVC = ifelse(Mod.pnts$Look.up == 2014, EVC.df$evc2014secmaj,
ifelse(Mod.pnts$Look.up == 2001, EVC.df$evc2001secmaj,
ifelse(Mod.pnts$Look.up == 2010, EVC.df$evc2010secmaj,
ifelse(Mod.pnts$Look.up == 2012, EVC.df$evc2012secmaj,
ifelse(Mod.pnts$Look.up == 2008, EVC.df$evc2008secmaj,
NA)))))
Mod.pnts$EVC[is.na(Mod.pnts$EVC)] = 0
Mod.pnts$EVC[Mod.pnts$EVC < 0] = 0
EVH
#Load the data
EVH <- list.files(path="./LANDFIRE/EVH", pattern = "secmaj$", full.names = TRUE)
EVH.LF <- raster::stack(EVH)
#Extract to a data frame
EVH.df = as.data.frame(
extract(EVH.LF,
spTransform(Mod.pnts,
proj4string(EVH.LF), method = "simple")))
head(EVH.df)
## evh2001secmaj evh2008secmaj evh2010secmaj evh2012secmaj
## 1 110 110 110 110
## 2 110 110 110 110
## 3 110 110 110 110
## 4 110 110 102 110
## 5 110 110 110 110
## 6 110 110 110 110
#create year column
EVH.mlt = melt(EVH.df)
## No id variables; using all as measure variables
EVH.mlt$Year = substr(EVH.mlt$variable, 4, 7)
head(EVH.mlt)
## variable value Year
## 1 evh2001secmaj 110 2001
## 2 evh2001secmaj 110 2001
## 3 evh2001secmaj 110 2001
## 4 evh2001secmaj 110 2001
## 5 evh2001secmaj 110 2001
## 6 evh2001secmaj 110 2001
Available.yrs = as.numeric(unique(EVH.mlt$Year)) #ID available years in dataset, convert to number
Available.yrs
## [1] 2001 2008 2010 2012
Mod.pnts$Year = as.integer(Mod.pnts$Year) #Convert to number
Mod.pnts$Look.up = Available.yrs[sapply(Mod.pnts$Year, Close.match)] #Overwrite prior look up year
#Assign column based on Look.up year
Mod.pnts$EVH = ifelse(Mod.pnts$Look.up == 2001, EVH.df$evh2001secmaj,
ifelse(Mod.pnts$Look.up == 2010, EVH.df$evh2010secmaj,
ifelse(Mod.pnts$Look.up == 2012, EVH.df$evh2012secmaj,
ifelse(Mod.pnts$Look.up == 2008, EVH.df$evh2008secmaj,
NA))))
Mod.pnts$EVH[is.na(Mod.pnts$EVH)] = 0
EVT
#Load the data
EVT <- list.files(path="./LANDFIRE/EVT", pattern = "secmaj$", full.names = TRUE)
EVT.LF <- raster::stack(EVT)
#Extract to a data frame
EVT.df = as.data.frame(
extract(EVT.LF,
spTransform(Mod.pnts,
proj4string(EVT.LF), method = "simple")))
head(EVT.df)
## evt2001secmaj evt2008secmaj evt2010secmaj evt2012secmaj evt2014secmaj
## 1 2302 2302 3302 3302 3302
## 2 2481 2302 3302 3302 3302
## 3 2481 2481 3481 3481 3481
## 4 66 66 3975 3975 3975
## 5 2481 2481 3481 3481 3481
## 6 2481 2481 3481 3481 3481
#create year column
EVT.mlt = melt(EVT.df)
## No id variables; using all as measure variables
EVT.mlt$Year = substr(EVT.mlt$variable, 4, 7)
head(EVT.mlt)
## variable value Year
## 1 evt2001secmaj 2302 2001
## 2 evt2001secmaj 2481 2001
## 3 evt2001secmaj 2481 2001
## 4 evt2001secmaj 66 2001
## 5 evt2001secmaj 2481 2001
## 6 evt2001secmaj 2481 2001
Available.yrs = as.numeric(unique(EVT.mlt$Year)) #ID available years in dataset, convert to number
Available.yrs
## [1] 2001 2008 2010 2012 2014
Mod.pnts$Year = as.integer(Mod.pnts$Year) #Convert to number
Mod.pnts$Look.up = Available.yrs[sapply(Mod.pnts$Year, Close.match)] #Overwrite prior look up year
#Assign column based on Look.up year
Mod.pnts$EVT = ifelse(Mod.pnts$Look.up == 2014, EVT.df$evt2014secmaj,
ifelse(Mod.pnts$Look.up == 2001, EVT.df$evt2001secmaj,
ifelse(Mod.pnts$Look.up == 2010, EVT.df$evt2010secmaj,
ifelse(Mod.pnts$Look.up == 2012, EVT.df$evt2012secmaj,
ifelse(Mod.pnts$Look.up == 2008, EVT.df$evt2008secmaj,
NA)))))
Mod.pnts$EVT[is.na(Mod.pnts$EVT)] = 0
#Temp Months
Tmp.Oct.sc = scale(Mod.pnts$Tmp.Oct, scale=T, center=T)
Mod.pnts$Tmp.Oct.sc = as.numeric(Tmp.Oct.sc)
Tmp.Nov.sc = scale(Mod.pnts$Tmp.Nov, scale=T, center=T)
Mod.pnts$Tmp.Nov.sc = as.numeric(Tmp.Nov.sc)
Tmp.Dec.sc = scale(Mod.pnts$Tmp.Dec, scale=T, center=T)
Mod.pnts$Tmp.Dec.sc = as.numeric(Tmp.Dec.sc)
#PPT Months
PPT.Oct.sc = scale(Mod.pnts$PPT.Oct, scale=T, center=T)
Mod.pnts$PPT.Oct.sc = as.numeric(PPT.Oct.sc)
PPT.Nov.sc = scale(Mod.pnts$PPT.Nov, scale=T, center=T)
Mod.pnts$PPT.Nov.sc = as.numeric(PPT.Nov.sc)
PPT.Dec.sc = scale(Mod.pnts$PPT.Dec, scale=T, center=T)
Mod.pnts$PPT.Dec.sc = as.numeric(PPT.Dec.sc)
#Road measures
loc.sc = scale(Mod.pnts$loc, scale=T, center = T)
Mod.pnts$loc.sc = as.numeric(loc.sc)
maj.sc= scale(Mod.pnts$maj, scale=T, center = T)
Mod.pnts$maj.sc = as.numeric(maj.sc)
Check Data
Chk.frm = as.data.frame(
Mod.pnts@data %>%
group_by(Year, Source, OBS) %>%
summarise(Count = length(Year)))
Chk.frm
## Year Source OBS Count
## 1 2000 MDNR 1 67
## 2 2000 Mesh 0 1994
## 3 2001 MDNR 1 63
## 4 2001 Mesh 0 1994
## 5 2002 MDNR 1 63
## 6 2002 Mesh 0 1994
## 7 2003 MDNR 1 113
## 8 2003 Mesh 0 1994
## 9 2004 MDNR 1 134
## 10 2004 Mesh 0 1994
## 11 2005 MDNR 1 125
## 12 2005 Mesh 0 1994
## 13 2006 MDNR 1 144
## 14 2006 Mesh 0 1994
## 15 2007 MDNR 1 231
## 16 2007 Mesh 0 1994
## 17 2008 MDNR 1 216
## 18 2008 Mesh 0 1994
## 19 2009 MDNR 1 214
## 20 2009 Mesh 0 1994
## 21 2010 MDNR 1 253
## 22 2010 Mesh 0 1994
## 23 2011 MDNR 1 177
## 24 2011 Mesh 0 1994
## 25 2012 MDNR 1 273
## 26 2012 Mesh 0 1994
## 27 2013 MDNR 1 249
## 28 2013 Mesh 0 1994
## 29 2014 MDNR 1 299
## 30 2014 Mesh 0 1994
## 31 2015 MDNR 1 218
## 32 2015 Mesh 0 1994
## 33 2016 MDNR 1 95
## 34 2016 Mesh 0 1994
## 35 2017 MDNR 1 169
## 36 2017 Mesh 0 1994
## 37 2018 MDNR 1 346
## 38 2018 Mesh 0 1994
#Reduce data
Mod.pnts$UP = is.na(over(Mod.pnts, UP.union.prj))
Mod.pnts = subset(Mod.pnts, UP == FALSE)
Correlation should not be an issue based on this analysis.
library(perturb)
##
## Attaching package: 'perturb'
## The following object is masked from 'package:raster':
##
## reclassify
Colinear.df = Mod.pnts@data %>%
select(Tmp.Oct.sc, Tmp.Nov.sc, Tmp.Dec.sc,
PPT.Oct.sc, PPT.Nov.sc, PPT.Dec.sc,
loc.sc, maj.sc, Harv.Prior.Yr)
CorCov = cor(Colinear.df)
CI = colldiag(CorCov)
CI
## Condition
## Index Variance Decomposition Proportions
## intercept Tmp.Oct.sc Tmp.Nov.sc Tmp.Dec.sc PPT.Oct.sc PPT.Nov.sc
## 1 1.000 0.180 0.019 0.010 0.002 0.015 0.009
## 2 1.262 0.133 0.047 0.003 0.020 0.132 0.002
## 3 1.323 0.000 0.010 0.017 0.068 0.006 0.005
## 4 1.428 0.003 0.002 0.014 0.010 0.032 0.150
## 5 1.712 0.053 0.006 0.003 0.001 0.019 0.000
## 6 2.227 0.135 0.081 0.003 0.078 0.472 0.233
## 7 2.404 0.002 0.000 0.000 0.000 0.000 0.000
## 8 2.737 0.483 0.275 0.000 0.051 0.059 0.047
## 9 5.808 0.010 0.560 0.949 0.770 0.264 0.554
## PPT.Dec.sc loc.sc maj.sc Harv.Prior.Yr
## 1 0.024 0.012 0.010 0.018
## 2 0.000 0.042 0.050 0.004
## 3 0.010 0.087 0.085 0.006
## 4 0.043 0.044 0.039 0.017
## 5 0.013 0.016 0.041 0.802
## 6 0.035 0.008 0.006 0.006
## 7 0.001 0.779 0.735 0.006
## 8 0.486 0.009 0.033 0.093
## 9 0.388 0.001 0.000 0.050
Plot.set = Mod.pnts@data %>%
filter(OBS == 1) %>%
select(Year, Tmp.Oct, Tmp.Nov, Tmp.Dec,
PPT.Oct, PPT.Nov, PPT.Dec)
Plot.setm = melt(Plot.set, "Year")
Plot.setm$Month = substr(Plot.setm$variable, 5, 7)
Plot.setm$Climate = substr(Plot.setm$variable, 1, 3)
myTable = as.data.frame(
Plot.setm %>%
group_by(Year, Climate, Month) %>%
summarise(Mean = mean(value)))
ggplot(myTable, aes(Year, Mean)) +
geom_bar(stat="identity") +
facet_wrap(Month~Climate, scales = "free")
myTable2 = as.data.frame(
Plot.setm %>%
group_by(Year, Climate) %>%
summarise(Mean = mean(value)))
ggplot(myTable2, aes(Year, Mean)) +
geom_bar(stat="identity") +
facet_wrap(~Climate, scales = "free")
#Total marten harvested in prior year (PriorHarv)
Q.plt$lag.Count = lag(Q.plt$Count, 1)
Mod.pnts$PriorHarv = with(Q.plt,
lag.Count[match(
Mod.pnts$Year,
Year)])
Select Time Steps and Knots (time) This model uses an autoregressive term for temporal correlation.
Mod.pnts = subset(Mod.pnts, Year >= 2001) #Dropping Year = 2000, per talk on 8/29
k1 = length(levels(factor(Mod.pnts$Year))) #Total Years in the data
Mod.pnts$Step = as.integer(as.factor(Mod.pnts$Year)) #Integer version
range(Mod.pnts$Step)
## [1] 1 18
#Reduce temporal dimenstion
gtime1 = seq(1, k1, 2) #Group all available years by 2
mesh.t1 = inla.mesh.1d(gtime1, degree = 1) #Converting to matrix
locs1 = cbind(Mod.pnts$Longp, Mod.pnts$Latp) #Marten locations
A.mart = inla.spde.make.A(mesh = mesh,
loc = locs1,
group.mesh = mesh.t1, #Time knots
group = Mod.pnts$Step) #All data years
Spatial Prior and Index
FE.df = Mod.pnts@data
spde0 = inla.spde2.pcmatern(mesh,
alpha = 2,
prior.range=c(500, 0.01),
prior.sigma=c(1, 0.01),
constr = TRUE)
field1 = inla.spde.make.index("field1",
spde0$n.spde,
n.group=mesh.t1$n)
LF.tab = FE.df %>%
select(OBS, VDISTURB)
Unique.codes = as.data.frame(as.integer(unique(LF.tab$VDISTURB)))
names(Unique.codes) = "Code"
LF.tab$OBS = ifelse(LF.tab$OBS == 1, "Marten", "Background")
LF.sum = as.data.frame(
LF.tab %>%
group_by(OBS, VDISTURB) %>%
summarise(Sections = length(VDISTURB)))
Mart.lf = LF.sum %>% filter(OBS == "Marten")
BG.lf = LF.sum %>% filter(OBS == "Background")
Unique.codes$Marten = as.numeric(with(Mart.lf,
Sections[match(Unique.codes$Code,
VDISTURB)]))
Unique.codes$Marten[is.na(Unique.codes$Marten)] = 0
Unique.codes$Mart.perc = round((Unique.codes$Marten/sum(Unique.codes$Marten))*100,0)
Unique.codes$Background = as.numeric(with(BG.lf,
Sections[match(Unique.codes$Code,
VDISTURB)]))
Unique.codes$Background[is.na(Unique.codes$Background)] = 0
Unique.codes$Back.perc = round((Unique.codes$Background/sum(Unique.codes$Background))*100,0)
library(kableExtra)
##
## Attaching package: 'kableExtra'
## The following object is masked from 'package:dplyr':
##
## group_rows
Unique.codes = arrange(Unique.codes, Code)
kable(Unique.codes, caption = "VDISTURB", digits=0) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
Code | Marten | Mart.perc | Background | Back.perc |
---|---|---|---|---|
0 | 3361 | 99 | 24595 | 99 |
111 | 0 | 0 | 4 | 0 |
112 | 1 | 0 | 18 | 0 |
113 | 0 | 0 | 10 | 0 |
121 | 1 | 0 | 2 | 0 |
122 | 1 | 0 | 16 | 0 |
123 | 0 | 0 | 7 | 0 |
132 | 3 | 0 | 11 | 0 |
133 | 2 | 0 | 7 | 0 |
212 | 0 | 0 | 8 | 0 |
213 | 3 | 0 | 19 | 0 |
311 | 0 | 0 | 2 | 0 |
312 | 8 | 0 | 24 | 0 |
313 | 0 | 0 | 4 | 0 |
322 | 1 | 0 | 11 | 0 |
323 | 0 | 0 | 5 | 0 |
332 | 1 | 0 | 7 | 0 |
LF.tab = FE.df %>%
select(OBS, CBD)
Unique.codes = as.data.frame(as.integer(unique(LF.tab$CBD)))
names(Unique.codes) = "Code"
LF.tab$OBS = ifelse(LF.tab$OBS == 1, "Marten", "Background")
LF.sum = as.data.frame(
LF.tab %>%
group_by(OBS, CBD) %>%
summarise(Sections = length(CBD)))
Mart.lf = LF.sum %>% filter(OBS == "Marten")
BG.lf = LF.sum %>% filter(OBS == "Background")
Unique.codes$Marten = as.numeric(with(Mart.lf,
Sections[match(Unique.codes$Code,
CBD)]))
Unique.codes$Marten[is.na(Unique.codes$Marten)] = 0
Unique.codes$Mart.perc = round((Unique.codes$Marten/sum(Unique.codes$Marten))*100,0)
Unique.codes$Background = as.numeric(with(BG.lf,
Sections[match(Unique.codes$Code,
CBD)]))
Unique.codes$Background[is.na(Unique.codes$Background)] = 0
Unique.codes$Back.perc = round((Unique.codes$Background/sum(Unique.codes$Background))*100,0)
Unique.codes = arrange(Unique.codes, Code)
kable(Unique.codes, caption = "CBD", digits=0) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
Code | Marten | Mart.perc | Background | Back.perc |
---|---|---|---|---|
0 | 379 | 11 | 8431 | 34 |
1 | 2375 | 70 | 12216 | 49 |
6 | 2 | 0 | 0 | 0 |
8 | 5 | 0 | 13 | 0 |
9 | 10 | 0 | 78 | 0 |
11 | 60 | 2 | 541 | 2 |
16 | 306 | 9 | 2021 | 8 |
22 | 231 | 7 | 1450 | 6 |
30 | 14 | 0 | 0 | 0 |
LF.tab = FE.df %>%
select(OBS, EVC)
Unique.codes = as.data.frame(as.integer(unique(LF.tab$EVC)))
names(Unique.codes) = "Code"
LF.tab$OBS = ifelse(LF.tab$OBS == 1, "Marten", "Background")
LF.sum = as.data.frame(
LF.tab %>%
group_by(OBS, EVC) %>%
summarise(Sections = length(EVC)))
Mart.lf = LF.sum %>% filter(OBS == "Marten")
BG.lf = LF.sum %>% filter(OBS == "Background")
Unique.codes$Marten = as.numeric(with(Mart.lf,
Sections[match(Unique.codes$Code,
EVC)]))
Unique.codes$Marten[is.na(Unique.codes$Marten)] = 0
Unique.codes$Mart.perc = round((Unique.codes$Marten/sum(Unique.codes$Marten))*100,0)
Unique.codes$Background = as.numeric(with(BG.lf,
Sections[match(Unique.codes$Code,
EVC)]))
Unique.codes$Background[is.na(Unique.codes$Background)] = 0
Unique.codes$Back.perc = round((Unique.codes$Background/sum(Unique.codes$Background))*100,0)
Unique.codes = arrange(Unique.codes, Code)
kable(Unique.codes, caption = "EVC", digits=0) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
Code | Marten | Mart.perc | Background | Back.perc |
---|---|---|---|---|
0 | 7 | 0 | 4643 | 19 |
11 | 38 | 1 | 430 | 2 |
16 | 6 | 0 | 18 | 0 |
17 | 0 | 0 | 7 | 0 |
22 | 1 | 0 | 9 | 0 |
23 | 0 | 0 | 18 | 0 |
25 | 3 | 0 | 94 | 0 |
31 | 0 | 0 | 72 | 0 |
32 | 0 | 0 | 47 | 0 |
64 | 0 | 0 | 27 | 0 |
65 | 1 | 0 | 75 | 0 |
66 | 1 | 0 | 33 | 0 |
81 | 2 | 0 | 12 | 0 |
82 | 16 | 0 | 171 | 1 |
95 | 19 | 1 | 253 | 1 |
100 | 0 | 0 | 9 | 0 |
101 | 0 | 0 | 12 | 0 |
102 | 2 | 0 | 37 | 0 |
103 | 29 | 1 | 168 | 1 |
104 | 5 | 0 | 79 | 0 |
105 | 119 | 4 | 1087 | 4 |
106 | 489 | 14 | 4164 | 17 |
107 | 2139 | 63 | 10805 | 44 |
108 | 389 | 12 | 1583 | 6 |
111 | 55 | 2 | 359 | 1 |
112 | 4 | 0 | 4 | 0 |
113 | 3 | 0 | 34 | 0 |
114 | 0 | 0 | 29 | 0 |
115 | 2 | 0 | 50 | 0 |
121 | 17 | 1 | 91 | 0 |
122 | 8 | 0 | 96 | 0 |
123 | 0 | 0 | 4 | 0 |
124 | 9 | 0 | 96 | 0 |
125 | 18 | 1 | 134 | 1 |
LF.tab = FE.df %>%
select(OBS, EVH)
Unique.codes = as.data.frame(as.integer(unique(LF.tab$EVH)))
names(Unique.codes) = "Code"
LF.tab$OBS = ifelse(LF.tab$OBS == 1, "Marten", "Background")
LF.sum = as.data.frame(
LF.tab %>%
group_by(OBS, EVH) %>%
summarise(Sections = length(EVH)))
Mart.lf = LF.sum %>% filter(OBS == "Marten")
BG.lf = LF.sum %>% filter(OBS == "Background")
Unique.codes$Marten = as.numeric(with(Mart.lf,
Sections[match(Unique.codes$Code,
EVH)]))
Unique.codes$Marten[is.na(Unique.codes$Marten)] = 0
Unique.codes$Mart.perc = round((Unique.codes$Marten/sum(Unique.codes$Marten))*100,0)
Unique.codes$Background = as.numeric(with(BG.lf,
Sections[match(Unique.codes$Code,
EVH)]))
Unique.codes$Background[is.na(Unique.codes$Background)] = 0
Unique.codes$Back.perc = round((Unique.codes$Background/sum(Unique.codes$Background))*100,0)
Unique.codes = arrange(Unique.codes, Code)
kable(Unique.codes, caption = "EVH", digits=0) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
Code | Marten | Mart.perc | Background | Back.perc |
---|---|---|---|---|
0 | 6 | 0 | 4626 | 19 |
11 | 11 | 0 | 237 | 1 |
16 | 2 | 0 | 0 | 0 |
25 | 0 | 0 | 63 | 0 |
31 | 0 | 0 | 72 | 0 |
32 | 0 | 0 | 36 | 0 |
64 | 0 | 0 | 9 | 0 |
65 | 0 | 0 | 14 | 0 |
81 | 0 | 0 | 4 | 0 |
82 | 1 | 0 | 36 | 0 |
95 | 6 | 0 | 67 | 0 |
101 | 5 | 0 | 32 | 0 |
102 | 18 | 1 | 118 | 0 |
103 | 0 | 0 | 2 | 0 |
104 | 12 | 0 | 108 | 0 |
107 | 11 | 0 | 77 | 0 |
108 | 4 | 0 | 12 | 0 |
110 | 3306 | 98 | 19237 | 78 |
LF.tab = FE.df %>%
select(OBS, EVT)
Unique.codes = as.data.frame(as.integer(unique(LF.tab$EVT)))
names(Unique.codes) = "Code"
LF.tab$OBS = ifelse(LF.tab$OBS == 1, "Marten", "Background")
LF.sum = as.data.frame(
LF.tab %>%
group_by(OBS, EVT) %>%
summarise(Sections = length(EVT)))
Mart.lf = LF.sum %>% filter(OBS == "Marten")
BG.lf = LF.sum %>% filter(OBS == "Background")
Unique.codes$Marten = as.numeric(with(Mart.lf,
Sections[match(Unique.codes$Code,
EVT)]))
Unique.codes$Marten[is.na(Unique.codes$Marten)] = 0
Unique.codes$Mart.perc = round((Unique.codes$Marten/sum(Unique.codes$Marten))*100,0)
Unique.codes$Background = as.numeric(with(BG.lf,
Sections[match(Unique.codes$Code,
EVT)]))
Unique.codes$Background[is.na(Unique.codes$Background)] = 0
Unique.codes$Back.perc = round((Unique.codes$Background/sum(Unique.codes$Background))*100,0)
Unique.codes = arrange(Unique.codes, Code)
kable(Unique.codes, caption = "EVT", digits=0) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
Code | Marten | Mart.perc | Background | Back.perc |
---|---|---|---|---|
0 | 6 | 0 | 4626 | 19 |
11 | 12 | 0 | 189 | 1 |
16 | 2 | 0 | 9 | 0 |
25 | 0 | 0 | 27 | 0 |
31 | 0 | 0 | 36 | 0 |
32 | 0 | 0 | 27 | 0 |
64 | 0 | 0 | 9 | 0 |
65 | 0 | 0 | 5 | 0 |
66 | 1 | 0 | 24 | 0 |
81 | 2 | 0 | 4 | 0 |
82 | 6 | 0 | 118 | 0 |
95 | 9 | 0 | 144 | 1 |
2191 | 17 | 1 | 101 | 0 |
2195 | 5 | 0 | 10 | 0 |
2198 | 0 | 0 | 5 | 0 |
2301 | 1 | 0 | 27 | 0 |
2302 | 860 | 25 | 5650 | 23 |
2344 | 21 | 1 | 180 | 1 |
2362 | 4 | 0 | 27 | 0 |
2365 | 36 | 1 | 469 | 2 |
2366 | 45 | 1 | 153 | 1 |
2407 | 2 | 0 | 18 | 0 |
2444 | 3 | 0 | 9 | 0 |
2466 | 0 | 0 | 9 | 0 |
2475 | 11 | 0 | 36 | 0 |
2477 | 72 | 2 | 386 | 2 |
2481 | 169 | 5 | 2200 | 9 |
2492 | 0 | 0 | 8 | 0 |
2534 | 21 | 1 | 182 | 1 |
3191 | 7 | 0 | 31 | 0 |
3195 | 1 | 0 | 13 | 0 |
3240 | 28 | 1 | 61 | 0 |
3241 | 4 | 0 | 0 | 0 |
3242 | 0 | 0 | 9 | 0 |
3245 | 0 | 0 | 27 | 0 |
3272 | 1 | 0 | 0 | 0 |
3277 | 1 | 0 | 0 | 0 |
3279 | 13 | 0 | 99 | 0 |
3281 | 3 | 0 | 63 | 0 |
3285 | 14 | 0 | 144 | 1 |
3292 | 36 | 1 | 216 | 1 |
3294 | 0 | 0 | 36 | 0 |
3295 | 0 | 0 | 20 | 0 |
3299 | 1 | 0 | 36 | 0 |
3301 | 3 | 0 | 36 | 0 |
3302 | 1438 | 43 | 5969 | 24 |
3344 | 50 | 1 | 224 | 1 |
3362 | 1 | 0 | 9 | 0 |
3365 | 58 | 2 | 250 | 1 |
3366 | 5 | 0 | 36 | 0 |
3407 | 21 | 1 | 36 | 0 |
3444 | 3 | 0 | 9 | 0 |
3466 | 0 | 0 | 9 | 0 |
3475 | 5 | 0 | 36 | 0 |
3477 | 76 | 2 | 234 | 1 |
3481 | 263 | 8 | 2016 | 8 |
3494 | 2 | 0 | 0 | 0 |
3534 | 20 | 1 | 151 | 1 |
3909 | 0 | 0 | 7 | 0 |
3974 | 0 | 0 | 4 | 0 |
3975 | 3 | 0 | 52 | 0 |
3977 | 20 | 1 | 229 | 1 |
Cov.cont = FE.df %>% select(OBS, Tmp.Oct, Tmp.Nov, Tmp.Dec, PPT.Oct, PPT.Nov, PPT.Dec, loc, maj)
Cov.cont$OBS = ifelse(Cov.cont$OBS == 1, "Marten", "Background")
Cov.cont.mlt = melt(Cov.cont, "OBS")
Mart.Cov.cont.mlt = Cov.cont.mlt %>% filter(OBS == "Marten")
Var.cont.tab = as.data.frame(
Mart.Cov.cont.mlt %>%
group_by(OBS, variable) %>%
summarise(Mean = mean(value, na.rm=T),
Min = min(value, na.rm=T),
Max = max(value, na.rm=T),
SE = sd(value)/sqrt(length(value))))
kable(Var.cont.tab[,2:6], caption = "Marten", digits=2) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
variable | Mean | Min | Max | SE |
---|---|---|---|---|
Tmp.Oct | 13.82 | 9.70 | 17.84 | 0.03 |
Tmp.Nov | 6.37 | 2.09 | 12.62 | 0.04 |
Tmp.Dec | -3.28 | -10.06 | 3.99 | 0.07 |
PPT.Oct | 64.70 | 5.55 | 200.03 | 0.71 |
PPT.Nov | 71.13 | 32.42 | 132.49 | 0.24 |
PPT.Dec | 59.36 | 17.69 | 161.59 | 0.36 |
loc | 165.44 | 0.00 | 2353.00 | 3.23 |
maj | 108.01 | 0.00 | 1038.00 | 2.84 |
Cov.cont = FE.df %>% select(OBS, Tmp.Oct, Tmp.Nov, Tmp.Dec, PPT.Oct, PPT.Nov, PPT.Dec, loc, maj)
Cov.cont$OBS = ifelse(Cov.cont$OBS == 1, "Marten", "Background")
Cov.cont.mlt = melt(Cov.cont, "OBS")
Mart.Cov.cont.mlt = Cov.cont.mlt %>% filter(OBS == "Background")
Var.cont.tab = as.data.frame(
Mart.Cov.cont.mlt %>%
group_by(OBS, variable) %>%
summarise(Mean = mean(value, na.rm=T),
Min = min(value, na.rm=T),
Max = max(value, na.rm=T),
SE = sd(value)/sqrt(length(value))))
kable(Var.cont.tab[,2:6], caption = "Background", digits=2) %>%
kable_styling("striped", full_width = F) %>%
row_spec(0, font_size = 20) %>%
column_spec(1, bold = T)
variable | Mean | Min | Max | SE |
---|---|---|---|---|
Tmp.Oct | 12.27 | 6.15 | 19.15 | 0.01 |
Tmp.Nov | 4.63 | -3.25 | 11.27 | 0.02 |
Tmp.Dec | -2.01 | -10.95 | 5.71 | 0.02 |
PPT.Oct | 102.18 | 21.95 | 284.68 | 0.27 |
PPT.Nov | 64.63 | 4.55 | 202.84 | 0.20 |
PPT.Dec | 59.82 | 3.49 | 164.93 | 0.16 |
loc | 118.52 | 0.00 | 2018.00 | 1.20 |
maj | 90.87 | 0.00 | 1731.00 | 1.10 |
Organize data
FE.df$Age2 = FE.df$Age
FE.df$Age2[is.na(FE.df$Age2)] = "Unknown"
FE.df$Harv.Prior.Yr.f = ifelse(FE.df$Harv.Prior.Yr == 1, "Y", "N")
FE.lst = list(c(field1, #Spatial index (created in step above)
list(intercept1 = 1)), #intercept
list(Tmp.Oct.sc = FE.df[,"Tmp.Oct.sc"], #PPT months
Tmp.Nov.sc = FE.df[,"Tmp.Nov.sc"],
Tmp.Dec.sc = FE.df[,"Tmp.Dec.sc"],
PPT.Oct.sc = FE.df[,"PPT.Oct.sc"], #Max Temp covariate
PPT.Nov.sc = FE.df[,"PPT.Nov.sc"], #Precip covariate
PPT.Dec.sc = FE.df[,"PPT.Dec.sc"],
PriorHarv = FE.df[,"PriorHarv"], #Prior year's total harvest
loc.sc = FE.df[,"loc.sc"], #Road variable 1
maj.sc = FE.df[,"maj.sc"], #Road variable 2
Age = FE.df[,"Age2"],
vDist = FE.df[,"VDISTURB"], #Veg disturbance
CBD = FE.df[,"CBD"], #bulk density
EVC = FE.df[,"EVC"], #cover type
EVH = FE.df[,"EVH"],
EVT = FE.df[,"EVT"],
Sect.Prior.Yr = FE.df[,"Harv.Prior.Yr.f"], #Harvest from section prior year?
Year = FE.df[,"Year"],
Sex = FE.df[,"Sex"]))
Stack1 = inla.stack(data = list(PA = FE.df$OBS), #PA = either a 1 (marten) or zero (mesh point/node)
A = list(A.mart, 1), #created 2 steps above, loaction info
effects = FE.lst,
tag = "mart.0") #just an arbitrary name for the file
#Temporal Reduced
#save(list=c("Stack1", "spde0"), file="./HPCC/FMart_082419.RData") #New One 8/24/19
#save(list=c("Stack1", "spde0"), file="./HPCC/FMart_082919.RData") #New One 8/29/19; dropping 2000
#save(list=c("Stack1", "spde0"), file="./HPCC/NewModel_092819.RData") #New One 8/28/19; Monthly climate
#save(list=c("Stack1", "spde0"), file="./HPCC/NewModel_092919.RData") #New One 8/29/19; Prior Harvest
#save(list=c("Stack1", "spde0"), file="./HPCC/NewModel_101419.RData") #Fixed climate variable matching
This was previously run; load results:
load("E:/HarvMod/HarvestModeling/HPCC/Model0_RES112119.RData")
h.spec = list(theta=list(prior='pccor1', param=c(0, 0.9)))
YearPrior = list(prec = list(prior="pc.prec", param = c(1, 0.0001)))
iid.prior = list(theta=list(prior = "normal", param=c(0, 5))) #LandFire prior
Frm0 = PA ~ -1 + intercept1 +
#f(field1,
# model=spde0,
# group = field1.group,
# control.group=list(model="ar1"),
# hyper=h.spec) +
f(vDist,
model="iid",
hyper = iid.prior) +
f(CBD,
model="iid",
hyper = iid.prior) +
f(EVC,
model="iid",
hyper = iid.prior) +
f(EVH,
model="iid",
hyper = iid.prior) +
f(EVT,
model="iid",
hyper = iid.prior) +
f(Sect.Prior.Yr,
model="iid",
hyper = iid.prior) +
f(Year,
model="iid",
hyper = iid.prior) +
f(Age,
model="iid",
hyper = iid.prior) +
f(Sex,
model="iid",
hyper = iid.prior) +
Tmp.Oct.sc + Tmp.Nov.sc + Tmp.Dec.sc +
PPT.Oct.sc + PPT.Nov.sc + PPT.Dec.sc +
loc.sc + maj.sc + PriorHarv
Model0 = inla(Frm0,
data = inla.stack.data(Stack1, spde=spde0),
family = "binomial",
verbose = TRUE,
control.fixed = list(prec = 0.01,
prec.intercept = 0.001),
control.predictor = list(
A = inla.stack.A(Stack1),
compute = TRUE,
link = 1),
control.inla = list(int.strategy = "eb"),
control.results = list(return.marginals.random = TRUE,
return.marginals.predictor = TRUE),
control.compute=list(dic = TRUE, cpo = TRUE, waic = TRUE))
#save(list=c("Model0"), file="./HPCC/Model0_RES101419.RData")
#save(list=c("Model0"), file="./HPCC/Model0_RES112119.RData")
summary(Model0)
##
## Call:
## c("inla(formula = Frm0, family = \"binomial\", data = inla.stack.data(Stack1, ", " spde = spde0), verbose = TRUE, control.compute = list(dic = TRUE, ", " cpo = TRUE, waic = TRUE), control.predictor = list(A = inla.stack.A(Stack1), ", " compute = TRUE, link = 1), control.inla = list(int.strategy = \"eb\"), ", " control.results = list(return.marginals.random = TRUE, return.marginals.predictor = TRUE), ", " control.fixed = list(prec = 0.01, prec.intercept = 0.001))" )
##
## Time used:
## Pre-processing Running inla Post-processing Total
## 5.1363 642.0049 2.2400 649.3812
##
## Fixed effects:
## mean sd 0.025quant 0.5quant 0.975quant mode kld
## intercept1 0.2081 1.7903 -3.3002 0.2058 3.7263 0.2012 0
## Tmp.Oct.sc -0.0535 0.0436 -0.1390 -0.0535 0.0320 -0.0535 0
## Tmp.Nov.sc 1.3734 0.0509 1.2741 1.3732 1.4737 1.3727 0
## Tmp.Dec.sc -0.4432 0.0396 -0.5211 -0.4432 -0.3656 -0.4431 0
## PPT.Oct.sc -0.5481 0.0433 -0.6334 -0.5479 -0.4636 -0.5476 0
## PPT.Nov.sc 0.3387 0.0403 0.2596 0.3388 0.4176 0.3388 0
## PPT.Dec.sc -0.9409 0.0414 -1.0226 -0.9407 -0.8601 -0.9403 0
## loc.sc 0.1290 0.0283 0.0732 0.1291 0.1844 0.1292 0
## maj.sc -0.0074 0.0289 -0.0644 -0.0073 0.0490 -0.0071 0
## PriorHarv 0.0027 0.0032 -0.0037 0.0027 0.0090 0.0027 0
##
## Random effects:
## Name Model
## vDist IID model
## CBD IID model
## EVC IID model
## EVH IID model
## EVT IID model
## Sect.Prior.Yr IID model
## Year IID model
## Age IID model
## Sex IID model
##
## Model hyperparameters:
## mean sd 0.025quant 0.5quant 0.975quant
## Precision for vDist 1.2831 0.5532 0.5268 1.1771 2.6586
## Precision for CBD 0.8307 0.3393 0.3588 0.7679 1.6667
## Precision for EVC 1.5675 0.5838 0.7254 1.4682 2.9870
## Precision for EVH 1.0113 0.4252 0.4269 0.9306 2.0621
## Precision for EVT 1.8843 0.6396 0.9371 1.7827 3.4189
## Precision for Sect.Prior.Yr 0.3654 0.1237 0.1780 0.3473 0.6581
## Precision for Year 1.1101 0.3277 0.5917 1.0693 1.8651
## Precision for Age 0.2914 0.0847 0.1576 0.2807 0.4875
## Precision for Sex 0.7712 0.3734 0.2884 0.6914 1.7143
## mode
## Precision for vDist 0.9923
## Precision for CBD 0.6577
## Precision for EVC 1.2896
## Precision for EVH 0.7900
## Precision for EVT 1.5972
## Precision for Sect.Prior.Yr 0.3134
## Precision for Year 0.9916
## Precision for Age 0.2603
## Precision for Sex 0.5601
##
## Expected number of effective parameters(std dev): 101.08(0.00)
## Number of equivalent replicates : 278.33
##
## Deviance Information Criterion (DIC) ...............: 8650.44
## Deviance Information Criterion (DIC, saturated) ....: 8650.43
## Effective number of parameters .....................: 98.79
##
## Watanabe-Akaike information criterion (WAIC) ...: 8643.82
## Effective number of parameters .................: 88.84
##
## Marginal log-Likelihood: -4488.48
## CPO and PIT are computed
##
## Posterior marginals for linear predictor and fitted values computed
This was previously run; load results:
load("E:/HarvMod/HarvestModeling/HPCC/Marten_RES101419.RData")
h.spec = list(theta=list(prior='pccor1', param=c(0, 0.9)))
YearPrior = list(prec = list(prior="pc.prec", param = c(1, 0.0001)))
iid.prior = list(theta=list(prior = "normal", param=c(0, 5))) #LandFire prior
Frm1 = PA ~ -1 + intercept1 +
f(field1,
model=spde0,
group = field1.group,
control.group=list(model="ar1"),
hyper=h.spec) +
f(vDist,
model="iid",
hyper = iid.prior) +
f(CBD,
model="iid",
hyper = iid.prior) +
f(EVC,
model="iid",
hyper = iid.prior) +
f(EVH,
model="iid",
hyper = iid.prior) +
f(EVT,
model="iid",
hyper = iid.prior) +
f(Sect.Prior.Yr,
model="iid",
hyper = iid.prior) +
f(Year,
model="iid",
hyper = iid.prior) +
f(Age,
model="iid",
hyper = iid.prior) +
f(Sex,
model="iid",
hyper = iid.prior) +
Tmp.Oct.sc + Tmp.Nov.sc + Tmp.Dec.sc +
PPT.Oct.sc + PPT.Nov.sc + PPT.Dec.sc +
loc.sc + maj.sc + PriorHarv
#theta1 = Model1$internal.summary.hyperpar$mean
theta1 = c(4.58805105, 0.98981293, 4.67939473, 0.04240057, -0.36810601, 0.46620214, -0.30317983, 0.79101802, -0.07998374, -1.59858746, -0.40020424)
Model1 = inla(Frm1,
data = inla.stack.data(Stack1),
family = "binomial",
verbose = TRUE,
control.fixed = list(prec = 0.01,
prec.intercept = 0.001),
control.predictor = list(
A = inla.stack.A(Stack1),
compute = TRUE,
link = 1),
control.mode = list(restart = TRUE, theta = theta1),
control.inla = list(strategy = "gaussian", int.strategy = "eb"),
control.results = list(return.marginals.random = TRUE,
return.marginals.predictor = TRUE),
control.compute=list(dic = TRUE, cpo = TRUE, waic = TRUE))
summary(Model1)
##
## Call:
## c("inla(formula = Frm1, family = \"binomial\", data = inla.stack.data(Stack1), ", " verbose = TRUE, control.compute = list(dic = TRUE, cpo = TRUE, ", " waic = TRUE), control.predictor = list(A = inla.stack.A(Stack1), ", " compute = TRUE, link = 1), control.inla = list(strategy = \"gaussian\", ", " int.strategy = \"eb\"), control.results = list(return.marginals.random = TRUE, ", " return.marginals.predictor = TRUE), control.fixed = list(prec = 0.01, ", " prec.intercept = 0.001), control.mode = list(restart = TRUE, ", " theta = theta1), num.threads = 8)")
##
## Time used:
## Pre-processing Running inla Post-processing Total
## 2.5070 7779.6244 4.2917 7786.4230
##
## Fixed effects:
## mean sd 0.025quant 0.5quant 0.975quant mode kld
## intercept1 -1.9950 2.0386 -5.9976 -1.9951 2.0041 -1.9950 0
## Tmp.Oct.sc 1.2117 0.0737 1.0670 1.2117 1.3563 1.2117 0
## Tmp.Nov.sc 4.4696 0.1308 4.2128 4.4696 4.7262 4.4696 0
## Tmp.Dec.sc -2.2520 0.0824 -2.4138 -2.2520 -2.0903 -2.2520 0
## PPT.Oct.sc -0.6441 0.0652 -0.7720 -0.6441 -0.5163 -0.6441 0
## PPT.Nov.sc 0.6106 0.0521 0.5084 0.6106 0.7128 0.6106 0
## PPT.Dec.sc -0.3157 0.0524 -0.4186 -0.3157 -0.2128 -0.3157 0
## loc.sc 0.1368 0.0423 0.0539 0.1368 0.2197 0.1368 0
## maj.sc 0.0972 0.0432 0.0124 0.0972 0.1819 0.0972 0
## PriorHarv -0.0048 0.0052 -0.0151 -0.0048 0.0055 -0.0048 0
##
## Random effects:
## Name Model
## field1 SPDE2 model
## vDist IID model
## CBD IID model
## EVC IID model
## EVH IID model
## EVT IID model
## Sect.Prior.Yr IID model
## Year IID model
## Age IID model
## Sex IID model
##
## Model hyperparameters:
## mean sd 0.025quant 0.5quant
## Range for field1 153.4955 28.3337 106.6059 150.3954
## Stdev for field1 2.6398 0.4320 1.9131 2.5964
## GroupRho for field1 0.9890 0.0056 0.9750 0.9901
## Precision for vDist 1.2808 0.5551 0.5209 1.1746
## Precision for CBD 1.1849 0.5579 0.4482 1.0707
## Precision for EVC 1.7907 0.7165 0.7837 1.6613
## Precision for EVH 1.0184 0.4454 0.4147 0.9316
## Precision for EVT 2.0632 0.7352 0.9942 1.9405
## Precision for Sect.Prior.Yr 0.3221 0.1085 0.1584 0.3059
## Precision for Year 0.4054 0.1004 0.2384 0.3958
## Precision for Age 0.2931 0.0810 0.1651 0.2827
## Precision for Sex 0.8795 0.4036 0.3388 0.7990
## 0.975quant mode
## Range for field1 217.6843 144.0565
## Stdev for field1 3.6079 2.5052
## GroupRho for field1 0.9966 0.9922
## Precision for vDist 2.6559 0.9892
## Precision for CBD 2.5909 0.8770
## Precision for EVC 3.5502 1.4317
## Precision for EVH 2.1255 0.7816
## Precision for EVT 3.8393 1.7193
## Precision for Sect.Prior.Yr 0.5803 0.2758
## Precision for Year 0.6303 0.3776
## Precision for Age 0.4813 0.2631
## Precision for Sex 1.8840 0.6605
##
## Expected number of effective parameters(std dev): 240.05(0.00)
## Number of equivalent replicates : 117.19
##
## Deviance Information Criterion (DIC) ...............: 4744.65
## Deviance Information Criterion (DIC, saturated) ....: NULL
## Effective number of parameters .....................: 250.83
##
## Watanabe-Akaike information criterion (WAIC) ...: 4697.57
## Effective number of parameters .................: 193.25
##
## Marginal log-Likelihood: -2596.21
## CPO and PIT are computed
##
## Posterior marginals for linear predictor and fitted values computed
mic.df = as.data.frame(Model1$summary.random$Age)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
mic.df$ID = ordered(mic.df$ID, levels = c("0.5", "1.5", "2.5", "3.5", "4.5", "5.5", "6.5", "7.5", "8.5", "9.5", "10.5", "11.5", "12.5", "Unknown"))
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_hline(yintercept = 0,
linetype = "solid",
colour = "darkgray",
size = 1) +
geom_point(size=2, pch=19, col = "black") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
theme_classic() +
xlab("Age Class") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=24),
axis.title.x = element_text(face="bold", size=24),
axis.text.y = element_text(face="bold", size=18),
axis.text.x = element_text(face="bold", size=18,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/age_data.csv")
mic.df = as.data.frame(Model1$summary.random$Sex)[2:3,]
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=ID, y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("Sex Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/sex_data.csv")
mic.df = as.data.frame(Model1$summary.random$Year)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("Year Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/year_data.csv")
mic.df = as.data.frame(Model1$summary.random$vDist)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("VDIST Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
mic.df = as.data.frame(Model1$summary.random$CBD)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("CBD Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
mic.df = as.data.frame(Model1$summary.random$EVC)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("EVC Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
mic.df = as.data.frame(Model1$summary.random$EVH)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("EVH Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
mic.df = as.data.frame(Model1$summary.random$EVT)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("EVT Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
mic.df = as.data.frame(Model1$summary.random$Sect.Prior.Yr)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
mic.df$ID[mic.df$ID == "N"] = "No"
mic.df$ID[mic.df$ID == "Y"] = "Yes"
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("Harvest Prior Year") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=22),
axis.title.x = element_text(face="bold", size=22),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=18,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
load("E:/HarvMod/HarvestModeling/HPCC/Marten_consrt_RES012120.RData")
Frm1 = PA ~ -1 + intercept1 +
f(field1,
model=spde0,
group = field1.group,
control.group=list(model="ar1"),
hyper=h.spec) +
f(vDist,
model="iid",
constr=TRUE, #Adding constraint to sum to zero on each iid
hyper = iid.prior) +
f(CBD,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(EVC,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(EVH,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(EVT,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Sect.Prior.Yr,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Year,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Age,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Sex,
model="iid",
constr=TRUE,
hyper = iid.prior) +
Tmp.Oct.sc + Tmp.Nov.sc + Tmp.Dec.sc +
PPT.Oct.sc + PPT.Nov.sc + PPT.Dec.sc +
loc.sc + maj.sc + PriorHarv
#theta1 = Model1$internal.summary.hyperpar$mean
theta1 = c(4.58805105, 0.98981293, 4.67939473, 0.04240057, -0.36810601, 0.46620214, -0.30317983, 0.79101802, 0.5, -0.07998374, -1.59858746, -0.40020424)
Model1.constr = inla(Frm1,
#num.threads = 8,
data = inla.stack.data(Stack1),
family = "binomial",
verbose = TRUE,
control.fixed = list(prec = 0.01,
prec.intercept = 0.001),
control.predictor = list(
A = inla.stack.A(Stack1),
compute = TRUE,
link = 1),
control.mode = list(restart = TRUE, theta = theta1),
control.inla = list(strategy = "gaussian", int.strategy = "eb"),
control.results = list(return.marginals.random = TRUE,
return.marginals.predictor = TRUE),
control.compute=list(dic = TRUE, cpo = TRUE, waic = TRUE))
summary(Model1.constr)
##
## Call:
## c("inla(formula = Frm1, family = \"binomial\", data = inla.stack.data(Stack1), ", " verbose = TRUE, control.compute = list(dic = TRUE, cpo = TRUE, ", " waic = TRUE), control.predictor = list(A = inla.stack.A(Stack1), ", " compute = TRUE, link = 1), control.inla = list(strategy = \"gaussian\", ", " int.strategy = \"eb\"), control.results = list(return.marginals.random = TRUE, ", " return.marginals.predictor = TRUE), control.fixed = list(prec = 0.01, ", " prec.intercept = 0.001), control.mode = list(restart = TRUE, ", " theta = theta1), num.threads = 8)")
##
## Time used:
## Pre-processing Running inla Post-processing Total
## 2.5681 8300.0244 4.1391 8306.7316
##
## Fixed effects:
## mean sd 0.025quant 0.5quant 0.975quant mode kld
## intercept1 -2.0491 1.2853 -4.5726 -2.0491 0.4723 -2.0491 0
## Tmp.Oct.sc 1.2120 0.0737 1.0673 1.2120 1.3566 1.2120 0
## Tmp.Nov.sc 4.4706 0.1309 4.2137 4.4706 4.7273 4.4706 0
## Tmp.Dec.sc -2.2524 0.0824 -2.4142 -2.2524 -2.0906 -2.2524 0
## PPT.Oct.sc -0.6441 0.0652 -0.7721 -0.6441 -0.5163 -0.6441 0
## PPT.Nov.sc 0.6108 0.0521 0.5085 0.6108 0.7130 0.6108 0
## PPT.Dec.sc -0.3158 0.0524 -0.4188 -0.3158 -0.2130 -0.3158 0
## loc.sc 0.1369 0.0423 0.0539 0.1369 0.2199 0.1369 0
## maj.sc 0.0972 0.0432 0.0123 0.0972 0.1820 0.0972 0
## PriorHarv -0.0048 0.0052 -0.0151 -0.0048 0.0055 -0.0048 0
##
## Random effects:
## Name Model
## field1 SPDE2 model
## vDist IID model
## CBD IID model
## EVC IID model
## EVH IID model
## EVT IID model
## Sect.Prior.Yr IID model
## Year IID model
## Age IID model
## Sex IID model
##
## Model hyperparameters:
## mean sd 0.025quant 0.5quant
## Range for field1 153.7335 28.4149 106.3997 150.7398
## Stdev for field1 2.6536 0.4345 1.9176 2.6118
## GroupRho for field1 0.9890 0.0056 0.9749 0.9901
## Precision for vDist 1.2814 0.5556 0.5210 1.1750
## Precision for CBD 1.1846 0.5580 0.4477 1.0703
## Precision for EVC 1.7894 0.7206 0.7786 1.6585
## Precision for EVH 1.0151 0.4415 0.4154 0.9292
## Precision for EVT 2.0644 0.7358 0.9945 1.9415
## Precision for Sect.Prior.Yr 0.3217 0.1084 0.1582 0.3055
## Precision for Year 0.4047 0.1004 0.2389 0.3944
## Precision for Age 0.2937 0.0807 0.1649 0.2838
## Precision for Sex 0.8806 0.4044 0.3394 0.7998
## 0.975quant mode
## Range for field1 217.6275 144.6895
## Stdev for field1 3.6194 2.5254
## GroupRho for field1 0.9965 0.9922
## Precision for vDist 2.6577 0.9895
## Precision for CBD 2.5915 0.8765
## Precision for EVC 3.5605 1.4268
## Precision for EVH 2.1088 0.7808
## Precision for EVT 3.8425 1.7200
## Precision for Sect.Prior.Yr 0.5800 0.2754
## Precision for Year 0.6304 0.3751
## Precision for Age 0.4803 0.2651
## Precision for Sex 1.8881 0.6610
##
## Expected number of effective parameters(std dev): 240.71(0.00)
## Number of equivalent replicates : 116.87
##
## Deviance Information Criterion (DIC) ...............: 4744.72
## Deviance Information Criterion (DIC, saturated) ....: NULL
## Effective number of parameters .....................: 251.61
##
## Watanabe-Akaike information criterion (WAIC) ...: 4697.47
## Effective number of parameters .................: 193.79
##
## Marginal log-Likelihood: -2596.19
## CPO and PIT are computed
##
## Posterior marginals for linear predictor and fitted values computed
load("E:/HarvMod/HarvestModeling/HPCC/Marten_red_RES012120.RData")
Frm1 = PA ~ -1 + intercept1 +
f(field1,
model=spde0,
group = field1.group,
control.group=list(model="ar1"),
hyper=h.spec) +
# f(vDist,
# model="iid",
# constr=TRUE, #Adding constraint to sum to zero on each iid
# hyper = iid.prior) +
# f(CBD,
# model="iid",
# constr=TRUE,
# hyper = iid.prior) +
#f(EVC,
# model="iid",
# constr=TRUE,
# hyper = iid.prior) +
# f(EVH,
# model="iid",
# constr=TRUE,
# hyper = iid.prior) +
f(EVT,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Sect.Prior.Yr,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Year,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Age,
model="iid",
constr=TRUE,
hyper = iid.prior) +
f(Sex,
model="iid",
constr=TRUE,
hyper = iid.prior) +
Tmp.Oct.sc + Tmp.Nov.sc + Tmp.Dec.sc +
PPT.Oct.sc + PPT.Nov.sc + PPT.Dec.sc +
loc.sc + maj.sc + PriorHarv
#theta1 = Model1$internal.summary.hyperpar$mean
theta1 = c(4.58805105, 0.98981293, 4.67939473, 0.04240057, -0.36810601, 0.46620214, -0.30317983, 0.79101802, 0.5, -0.07998374, -1.59858746, -0.40020424)
Model1.red = inla(Frm1,
#num.threads = 8,
data = inla.stack.data(Stack1),
family = "binomial",
verbose = TRUE,
control.fixed = list(prec = 0.01,
prec.intercept = 0.001),
control.predictor = list(
A = inla.stack.A(Stack1),
compute = TRUE,
link = 1),
control.mode = list(restart = TRUE, theta = theta1),
control.inla = list(strategy = "gaussian", int.strategy = "eb"),
control.results = list(return.marginals.random = TRUE,
return.marginals.predictor = TRUE),
control.compute=list(dic = TRUE, cpo = TRUE, waic = TRUE))
Model0$dic$dic
## [1] 8650.438
Model1$dic$dic
## [1] 4744.652
Model1.constr$dic$dic
## [1] 4744.718
Model1.red$dic$dic
## [1] 4756.422
Model0$waic$waic
## [1] 8643.819
Model1$waic$waic
## [1] 4697.573
Model1.constr$waic$waic
## [1] 4697.466
Model1.red$waic$waic
## [1] 4712.52
mic.df = as.data.frame(Model1.constr$summary.random$Sex)[2:3,]
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=ID, y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("Sex Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/sex_data2.csv")
mic.df = as.data.frame(Model1.constr$summary.random$CBD)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("CBD Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/cbd_data2.csv")
mic.df = as.data.frame(Model1.constr$summary.random$EVT)
names(mic.df) = c("ID", "Mean", "sd", "Q025", "Q50", "Q975")
ggplot(mic.df, aes(x=factor(ID), y=Mean)) +
geom_point(size=2, pch=19, col = "red") +
geom_linerange(aes(ymin=Q025, ymax=Q975), colour="black") +
geom_hline(yintercept = 0,
linetype = "dotted",
colour = "red",
size = 1) +
theme_classic() +
xlab("EVT Effect") +
ylab("Effect (logit)") +
theme(axis.title.y = element_text(face="bold", size=16),
axis.title.x = element_text(face="bold", size=14),
axis.text.y = element_text(face="bold", size=16),
axis.text.x = element_text(face="bold", size=10,
vjust=1, hjust=1, angle=45),
strip.text = element_text(face="bold", size = 20))
#write.csv(mic.df, "E:/HarvMod/HarvestModeling/Figures/evt_data2.csv")