So in summary:
data = imported results from ALL SELECTIONS, directly from RavenPro tables. contains information from every single male for every single one of his calls.
DATA / manual.data = all 30 calls for all males, full set of data (1886 observations)
Tdat = the temperature corrected, all 30 calls (1886 observations)
means = the temperature corrected means for each male (62 observations)
cvs = the temperature corrected cvs for each male (62 observations)
# for importing Raven selection files
library(Rraven)
# for correlations
library(reshape2)
# for graphs
library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr 1.1.4 ✔ readr 2.1.5
## ✔ forcats 1.0.0 ✔ stringr 1.5.1
## ✔ ggplot2 3.5.1 ✔ tibble 3.2.1
## ✔ lubridate 1.9.3 ✔ tidyr 1.3.1
## ✔ purrr 1.0.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag() masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(dplyr)
library(ggplot2)
library(RColorBrewer)
library(extrafont)
## Registering fonts with R
# for importing files
library(readr)
library(readxl)
# for linear regressions
library (lme4)
## Loading required package: Matrix
##
## Attaching package: 'Matrix'
##
## The following objects are masked from 'package:tidyr':
##
## expand, pack, unpack
library(car)
## Warning: package 'car' was built under R version 4.4.1
## Loading required package: carData
##
## Attaching package: 'car'
##
## The following object is masked from 'package:dplyr':
##
## recode
##
## The following object is masked from 'package:purrr':
##
## some
library(fitdistrplus)
## Loading required package: MASS
##
## Attaching package: 'MASS'
##
## The following object is masked from 'package:dplyr':
##
## select
##
## Loading required package: survival
# for PCA
library (vegan)
## Loading required package: permute
## Loading required package: lattice
## This is vegan 2.6-6.1
library('factoextra')
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
library(PCAtest)
library(cluster)
# for dredge
library(MuMIn)
# for Beecher's statistic
library(IDmeasurer)
# function for calculating coefficient of variation
cv <- function(x) (sd(x)/mean(x))
# function that gets mode of a character value (e.g. which word is most common)
mode_char <- function(x) unique(x)[which.max(tabulate(match(x, unique(x))))]
# Import spectrogram data into R from Raven Selection Tables.
data <- imp_raven(all.data = TRUE,
only.spectro.view = TRUE,
path = '~/Raven Pro 1.6/Selections')
# Import metadata containing body temperature and collection data
meta.data <- read_csv("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/Spring Peeper Data - Collection Data.csv")
## Rows: 73 Columns: 17
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (7): Male ID, Date, Location, Catcher, Recorder, Processer, Prevalence
## dbl (10): Body Temp, Weight (Bag + Frog), Weight (Bag), SVL, Tibia, Frog Wei...
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
# Take the file (in the table as PC-000-24_MMDDYYYY_XX.wav) and separate into it's parts
data <- data %>% separate(`Begin File`,
c("ID", "Date", "Location.wav"),
sep = "_",
remove = FALSE
)
# New simpler column for location
data <- data %>% mutate(Location = case_when(`Location.wav`=='FR.wav' ~ 'FR',
`Location.wav`=='CV.wav' ~ 'CV'))
# Discard columns not needed for future
data <- data %>% dplyr::select(-c(`View`,`Channel`,`Occupancy`,`Low Freq (Hz)`,`High Freq (Hz)`,`Location.wav`, `Frame Duration`, `Reason`))
# Calculate ICI for values based on strict row calculation.
data <- data %>% mutate(ICI = lead(`Begin Time (s)`)-`End Time (s)`)
data <- data %>% filter (ICI >= 0)
# Calculate Call_Period (Duration + ICI) and Instantaneous Rate (1/Call_Period)*60
data <- data %>% mutate(Call_Period = `Delta Time (s)`+ICI)
data <- data %>% mutate(Call_Rate_Inst = (1/Call_Period)*60)
# Output the resulting files into a CSV, gets written in a working directory. Only have to do this once if nothing before this is being done
# write.csv(data,"data.csv",row.names=FALSE)
# In the CSV file, go through each Raven file and decide which 30 consecutive calls to use. Ideally, in a calling bout, start from the 6th bout and exclude the last call. Want consecutive call numbers. Save this as a new file (e.g. edited.data and import).
import.data <- read_csv("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/edited.data.csv")
## Rows: 1886 Columns: 16
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (5): Begin File, ID, Date, selec.file, Location
## dbl (11): Selection, Begin Time (s), End Time (s), Delta Time (s), Peak Freq...
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
# When importing data, going to go with the manually edited data.
manual.data <- left_join(import.data, meta.data, by = join_by(ID == `Male ID`))
manual.data <- manual.data %>% dplyr::select(-Selection)
manual.data <- as.data.frame(manual.data)
write.csv(manual.data, "080724_data.csv",row.names=FALSE)
# Use the edited data sheet that was found using the previous code. Should be the same as manual.data.
DATA <- read_csv("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/080724_data.csv")
## Rows: 1886 Columns: 31
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (11): Begin File, ID, Date.x, selec.file, Location.x, Date.y, Location.y...
## dbl (20): Begin Time (s), End Time (s), Delta Time (s), Peak Freq (Hz), Freq...
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
DATA <- as.data.frame(DATA)
body.condition.model <- lm(data = DATA, `Frog Weight (g)`^(1/3) ~ SVL)
DATA <- DATA %>% mutate(condition = body.condition.model$residuals/SVL)
cormat <- cor(DATA[ , c(18, 21, 32, 3, 4, 7, 15)])
melted_cormat <- melt(cormat)
get_upper_tri <- function(cormat){
cormat[lower.tri(cormat)]<- NA
return(cormat)
}
upper_tri <- get_upper_tri(cormat)
upper_cormat <- melt(upper_tri, na.rm = TRUE)
ggplot(data = upper_cormat, aes(Var2, Var1, fill = value))+
geom_tile(color = "white")+
scale_fill_gradient2(low = "blue", high = "red", mid = "white",
midpoint = 0, limit = c(-1,1), space = "Lab",
name="Pearson\nCorrelation") +
theme_minimal()+
theme(axis.text.x = element_text(angle = 45, vjust = 1,
size = 12, hjust = 1))+
coord_fixed()+
geom_text(aes(Var2, Var1, label = round(value,4)), color = "black", size = 3)
# Remember - if you change the name of the column for body temperature, you will need to edit the name within m & the Tcorrected_matrix to accurately reflect the new column name
Tcorr <- function(col_numbers, target_temp, data){
num_cols <- length(col_numbers)
Tcorrected_matrix <- matrix(NA, nrow = nrow(data), ncol = num_cols)
for(i in seq_along(col_numbers)){
m <- lm(data[,col_numbers[i]] ~ data$`Body Temp`, data)$coefficients[2] # Calculate m by doing a linear regression
Tcorrected_matrix[, i] <- data[,col_numbers[i]] - m * (data$`Body Temp` - target_temp) # Save a vector so I can use it outside the function
}
avg <- apply(Tcorrected_matrix, 1, mean)
stdev <- apply(Tcorrected_matrix, 1, sd)
colnames(Tcorrected_matrix) <- colnames(data[, col_numbers])
result <- list(avg = avg, stdev = stdev, Tcorrected_matrix = Tcorrected_matrix)
return(result)
}
Bcorr <- function(col_numbers, target_svl, data){
num_cols <- length(col_numbers)
Bcorrected_matrix <- matrix(NA, nrow = nrow(data), ncol = num_cols)
for(i in seq_along(col_numbers)){
m <- lm(data[,col_numbers[i]] ~ DATA$SVL, data)$coefficients[2] # Calculate m by doing a linear regression
Bcorrected_matrix[, i] <- data[,col_numbers[i]] - m * (DATA$SVL - target_svl) # Save a vector so I can use it outside the function
}
avg <- apply(Bcorrected_matrix, 1, mean)
stdev <- apply(Bcorrected_matrix, 1, sd)
colnames(Bcorrected_matrix) <- colnames(data[, col_numbers])
result <- list(avg = avg, stdev = stdev, Bcorrected_matrix = Bcorrected_matrix)
return(result)
}
# Set Values that you want to temperature correct for
# 3 = Delta Time
# 4 = Peak Freq
# 5 = Freq 5%
# 6 = Freq 95%
# 7 = BW 90%
# 13 = ICI
# 14 = Call Period
# 15 = Instantaneous Call Rate
selections <- c(3:7,13:15)
# Do the temperature correction to the target temp, aka 14
result <- Tcorr(selections, target_temp = 14, data = DATA)
# Format results as a dataframe
Tdat <- as.data.frame(result$Tcorrected_matrix)
# Add information such as ID, Location, and Prevalence
Tdat <- cbind(DATA[,c(9,10,12,18,21,22,23,30,31,32)],Tdat)
# 9 = ID
# 10 = Date
# 12 = Location
# 18 = Body Temp
# 21 = SVL
# 22 = Tibia
# 23 = Frog Weight (g)
# 30 = Log Infection
# 31 = Prevalence
# 32 = Condition
write.csv(Tdat,"102424_temp_corrected_data.csv",row.names=FALSE)
# Do the correction to the target size, aka 27 SVL
result <- Bcorr(col_numbers = c(11:15, 18), target_svl = 27, data = Tdat)
# 11 = Delta Time
# 12 = Peak Freq (Hz)
# 13 = Freq 5% (Hz)
# 14 = Freq 95% (Hz)
# 15 = BW 90% (Hz)
# 18 = Call_Rate_Inst
# Format results as a dataframe
Test <- as.data.frame(result$Bcorrected_matrix)
# Get rid of the corresponding columns in Tdat so that there are no duplicates
Tdat <- subset(Tdat, select = -c(11:15, 18))
# Bind the body correlated factors to the temperature corrected ones.
Tdat<-cbind(Tdat,Test)
write.csv(Tdat,"102424_temp_body_corrected_data.csv",row.names=FALSE)
# use Excel to calculate the means and the sds of the CVs, then format it in a way that makes R happy
cv.table <- read_xlsx("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/Peeper_CVs_Means_SDs.xlsx")
ggplot(cv.table, aes(x=reorder(Variable, Means), y=Means,fill=Variable)) +
geom_bar(stat="identity")+
theme_classic()+
theme(axis.text.x = element_text(angle = 50, vjust = 0.5, hjust=0.5),
legend.position = "none")+
geom_errorbar( aes(ymin = Min, ymax = Max),
data = cv.table, width = 0.2, alpha = 0.3)+
geom_text(aes(label=round(Means,4)), vjust=-0.3, size=3.5, alpha=1)+
labs(x = "Variable",
y = "CV",
title = "Variables ordered by CV, with Min and Max CVs")+
scale_color_brewer(palette = "Set2")
ggplot(cv.table, aes(x=reorder(Variable, Means), y=Means,fill=Variable)) +
geom_bar(stat="identity")+
theme_classic()+
theme(axis.text.x = element_text(angle = 50, vjust = 0.5, hjust=0.5),
legend.position = "none")+
geom_errorbar( aes(ymin = Means - SDs, ymax = Means + SDs),
data = cv.table, width = 0.2, alpha = 0.3)+
geom_text(aes(label=round(Means,4)), vjust=-0.3, size=3.5, alpha=1)+
labs(x = "Variable",
y = "CV",
title = "Variables ordered by CV, with SDs")+
scale_color_brewer(palette = "Set2")
subset.cv.table <- cv.table %>% slice(c(1,2,5))
ggplot(subset.cv.table, aes(x=reorder(Variable, Means), y=Means,fill=Variable)) +
geom_bar(stat="identity")+
theme_classic()+
theme(axis.text.x = element_text(angle = 50, vjust = 0.5, hjust=0.5),
legend.position = "none")+
geom_errorbar( aes(ymin = Min, ymax = Max),
data = subset.cv.table, width = 0.2, alpha = 0.3)+
geom_text(aes(label=round(Means,4)), vjust=-0.3, size=3.5, alpha=1)+
labs(x = "Variable",
y = "CV",
title = "Variables ordered by CV, with Min and Max CVs")+
scale_color_brewer(palette = "Set2")
subset.cv.table <- subset.cv.table %>% mutate(Variable2 = c("Call Rate", "Call Duration", "Dominant Frequency"))
ggplot(subset.cv.table, aes(x=reorder(Variable2, Means), y=Means,fill=Variable2)) +
geom_bar(stat="identity")+
theme_classic()+
geom_errorbar(aes(ymin = Means - SDs, ymax = Means + SDs),
data = subset.cv.table, width = 0.2, alpha = 0.3)+
geom_text(aes(label=round(Means,4)),
vjust=-0.3, size=3.5, alpha=1,
family = "Times New Roman")+
labs(x = "\nVariable",
y = "CV",
title = "Variables ordered by CV (with SDs)")+
scale_color_brewer(palette = "Set2")+
theme(axis.text.x = element_text(hjust=0.5),
legend.position = "none",
text = element_text(family = "Times New Roman"))
?geom_text()
Tdat$Date <- format(as.Date(Tdat$Date.x, format = "%m%d%y"), "%m/%d/%Y")
# summarize means of these parameters by ID
means <- Tdat %>%
dplyr::group_by(ID, Date, Location.x, SVL, Tibia, Prevalence) %>%
dplyr::summarize(Temp = mean(`Body Temp`),
Weight = mean(`Frog Weight (g)`),
Infection = mean(`Log Infection`),
Condition = mean(condition),
Call_Rate_Inst = mean(Call_Rate_Inst),
Duration = mean(`Delta Time (s)`),
ICI = mean(ICI),
Period = mean(Call_Period),
Freq = mean(`Peak Freq (Hz)`),
Freq_5 = mean(`Freq 5% (Hz)`),
Freq_95 = mean(`Freq 95% (Hz)`),
BW = mean(`BW 90% (Hz)`),
Load = 10^(Infection))
## `summarise()` has grouped output by 'ID', 'Date', 'Location.x', 'SVL', 'Tibia'.
## You can override using the `.groups` argument.
means <- ungroup(means)
FR <- means %>% filter(Location.x=='FR')
CV <- means %>% filter(Location.x=='CV')
write.csv(means,"peeper_infection_by_ID_means.csv",row.names=FALSE)
means %>% dplyr::summarize(weight.mean = mean(Weight),
weight.sd = sd(Weight),
svl.mean = mean(SVL),
svl.sd = sd(SVL),
tibia.mean = mean(Tibia),
tibia.sd = sd(Tibia),
load.mean = mean(Load),
load.sv = sd(Load),
load.max = max(Load),
load.min = min(Load))
## # A tibble: 1 × 10
## weight.mean weight.sd svl.mean svl.sd tibia.mean tibia.sd load.mean load.sv
## <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 1.52 0.324 27.4 1.72 13.9 0.940 372. 1681.
## # ℹ 2 more variables: load.max <dbl>, load.min <dbl>
means %>% dplyr::group_by(Location.x) %>% dplyr::summarize(weight.mean = mean(Weight),
weight.sd = sd(Weight),
load.mean = mean(Load),
load.sv = sd(Load))
## # A tibble: 2 × 5
## Location.x weight.mean weight.sd load.mean load.sv
## <chr> <dbl> <dbl> <dbl> <dbl>
## 1 CV 1.44 0.316 564. 2308.
## 2 FR 1.60 0.314 168. 406.
cvs <- Tdat %>%
group_by(ID, Date, Location.x, SVL, Tibia, Prevalence) %>%
dplyr::summarize(Temp = mean(`Body Temp`),
Weight = mean(`Frog Weight (g)`),
Infection = mean(`Log Infection`),
Condition = mean(condition),
Call_Rate_Inst = cv(Call_Rate_Inst),
Duration = cv(`Delta Time (s)`),
ICI = cv(ICI),
Period = cv(Call_Period),
Freq = cv(`Peak Freq (Hz)`),
Freq_5 = cv(`Freq 5% (Hz)`),
Freq_95 = cv(`Freq 95% (Hz)`),
BW = cv(`BW 90% (Hz)`),
Load = 10^(Infection))
## `summarise()` has grouped output by 'ID', 'Date', 'Location.x', 'SVL', 'Tibia'.
## You can override using the `.groups` argument.
cvs <- ungroup(cvs)
FR.cv <- cvs %>% filter(Location.x=='FR')
CV.cv <- cvs %>% filter(Location.x=='CV')
write.csv(cvs,"peeper_infection_by_ID_cvs.csv",row.names=FALSE)
ggplot(data = data.frame(x = means$Call_Rate_Inst, y = cvs$Call_Rate_Inst), aes(x = x, y = y))+
geom_point()+
theme_minimal()+
labs(x = "CR",
y = "CVw")+
stat_smooth(method = "lm",
formula = y ~ x + I(x^2),
se = FALSE)
library(lubridate) # gives options more robust to different formats - or else use library(tidyverse)
background <- read_csv("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/pscr_records.csv")
## New names:
## Rows: 174 Columns: 5
## ── Column specification
## ──────────────────────────────────────────────────────── Delimiter: "," chr
## (2): swab_id, bd_status dbl (2): ...1, bd_load date (1): date
## ℹ Use `spec()` to retrieve the full column specification for this data. ℹ
## Specify the column types or set `show_col_types = FALSE` to quiet this message.
## • `` -> `...1`
background.new <- read_csv("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/pscr_records_full.csv")
## Rows: 247 Columns: 3
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (2): date, bd_status
## dbl (1): bd_load
##
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
background.new <- as.data.frame(background.new)
background.new$Date <- mdy(background.new$date)
background %>% group_by(bd_status) %>%
summarize(n = n(),
mean = mean(bd_load),
sd = sd(bd_load),
max = max(bd_load))
## # A tibble: 2 × 5
## bd_status n mean sd max
## <chr> <int> <dbl> <dbl> <dbl>
## 1 negative 123 0 0 0
## 2 positive 51 802. 2679. 15988.
51/(123+51)
## [1] 0.2931034
ggplot(data = background, aes(x = date, y = bd_load))+
geom_point()+
theme_minimal()
ggplot(data = means, aes(x = Date, y = Load))+
geom_point()+
theme_minimal()
ggplot(data = background.new, aes(x = Date, y = bd_load))+
geom_point()+
theme_minimal()
twentytwo <- background.new %>% filter(between(Date, as.Date('2022-01-01'), as.Date('2022-12-31')))
twentythree <- background.new %>% filter(between(Date, as.Date('2023-01-01'), as.Date('2023-12-31')))
twentyfour <- background.new %>% filter(between(Date, as.Date('2024-01-01'), as.Date('2024-12-31')))
ggplot(data = twentytwo, aes(x = Date, y = bd_load))+
geom_point()+
theme_minimal()+
labs(title = "2022")
ggplot(data = twentythree, aes(x = Date, y = bd_load))+
geom_point()+
theme_minimal()+
labs(title = "2023")
ggplot(data = twentyfour, aes(x = Date, y = bd_load))+
geom_point()+
theme_minimal()+
labs(title = "2024")
t.test(FR$SVL, CV$SVL)
##
## Welch Two Sample t-test
##
## data: FR$SVL and CV$SVL
## t = 0.099258, df = 59.741, p-value = 0.9213
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.8344102 0.9215352
## sample estimates:
## mean of x mean of y
## 27.47200 27.42844
t.test(FR$Tibia, CV$Tibia)
##
## Welch Two Sample t-test
##
## data: FR$Tibia and CV$Tibia
## t = 0.53143, df = 58.182, p-value = 0.5971
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.3546734 0.6110901
## sample estimates:
## mean of x mean of y
## 13.97133 13.84313
t.test(FR$Weight, CV$Weight) # p = 0.04076 (FR weigh more)
##
## Welch Two Sample t-test
##
## data: FR$Weight and CV$Weight
## t = 2.0912, df = 59.802, p-value = 0.04076
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## 0.007268515 0.327523151
## sample estimates:
## mean of x mean of y
## 1.603333 1.435938
t.test(FR$Temp, CV$Temp) # p = 0.00104 (FR is colder)
##
## Welch Two Sample t-test
##
## data: FR$Temp and CV$Temp
## t = -3.4895, df = 50.425, p-value = 0.001014
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -4.536395 -1.222355
## sample estimates:
## mean of x mean of y
## 13.63000 16.50937
t.test(FR$Infection, CV$Infection)
##
## Welch Two Sample t-test
##
## data: FR$Infection and CV$Infection
## t = -0.60249, df = 59.999, p-value = 0.5491
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.7500039 0.4027840
## sample estimates:
## mean of x mean of y
## 1.138851 1.312461
t.test(FR$Condition, CV$Condition) # p = 0.0259 (FR in better condition)
##
## Welch Two Sample t-test
##
## data: FR$Condition and CV$Condition
## t = 2.2877, df = 56.877, p-value = 0.0259
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## 0.0002062304 0.0031034703
## sample estimates:
## mean of x mean of y
## 0.0008430817 -0.0008117687
t.test(FR$Call_Rate_Inst, CV$Call_Rate_Inst) # 0.05821 (FR as slower)
##
## Welch Two Sample t-test
##
## data: FR$Call_Rate_Inst and CV$Call_Rate_Inst
## t = -1.9333, df = 56.597, p-value = 0.05821
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -14.0176910 0.2474667
## sample estimates:
## mean of x mean of y
## 75.20998 82.09510
t.test(FR$Duration, CV$Duration) # 0.0902
##
## Welch Two Sample t-test
##
## data: FR$Duration and CV$Duration
## t = 1.7245, df = 55.414, p-value = 0.0902
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.001417704 0.018928660
## sample estimates:
## mean of x mean of y
## 0.1125010 0.1037455
t.test(FR$Freq, CV$Freq)
##
## Welch Two Sample t-test
##
## data: FR$Freq and CV$Freq
## t = 1.0152, df = 49.687, p-value = 0.3149
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -28.79341 87.63243
## sample estimates:
## mean of x mean of y
## 2943.453 2914.033
t.test(FR.cv$Call_Rate_Inst, CV.cv$Call_Rate_Inst)
##
## Welch Two Sample t-test
##
## data: FR.cv$Call_Rate_Inst and CV.cv$Call_Rate_Inst
## t = -0.92993, df = 58.408, p-value = 0.3562
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.08633059 0.03155612
## sample estimates:
## mean of x mean of y
## 0.1966349 0.2240222
t.test(FR.cv$Duration, CV.cv$Duration) # p = 0.07271
##
## Welch Two Sample t-test
##
## data: FR.cv$Duration and CV.cv$Duration
## t = 1.8375, df = 45.252, p-value = 0.07271
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.001472842 0.032172354
## sample estimates:
## mean of x mean of y
## 0.07405864 0.05870888
t.test(FR.cv$Freq, CV.cv$Freq)
##
## Welch Two Sample t-test
##
## data: FR.cv$Freq and CV.cv$Freq
## t = 1.0061, df = 56.337, p-value = 0.3187
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.001864403 0.005627529
## sample estimates:
## mean of x mean of y
## 0.01257389 0.01069232
ggplot(data = means, aes(x = Infection, y = Condition))+
geom_point()+
theme_minimal()+
stat_smooth(method = "lm",
se = FALSE)
## `geom_smooth()` using formula = 'y ~ x'
ggplot(means, aes(x = Infection, y = Condition, color = Location.x))+
geom_point()+
theme_minimal()+
stat_smooth(method = "lm",
se = FALSE)
## `geom_smooth()` using formula = 'y ~ x'
absent <- means %>% filter(Prevalence == "Absent")
present <- means %>% filter(Prevalence == "Present")
absent.cvs <- cvs %>% filter(Prevalence == "Absent")
present.cvs <- cvs %>% filter(Prevalence == "Present")
means %>% dplyr::group_by(Prevalence) %>% dplyr::summarize(weight.mean = mean(Weight),
weight.sd = sd(Weight),
svl.mean = mean(SVL),
svl.sd = sd(SVL),
tibia.mean = mean(Tibia),
tibia.sd = sd(Tibia),
load.mean = mean(Load),
load.sv = sd(Load),
load.min = min(Load),
load.max = max(Load))
## # A tibble: 2 × 11
## Prevalence weight.mean weight.sd svl.mean svl.sd tibia.mean tibia.sd load.mean
## <chr> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
## 1 Absent 1.56 0.334 27.5 1.24 14.0 0.878 1
## 2 Present 1.50 0.321 27.4 1.89 13.9 0.974 524.
## # ℹ 3 more variables: load.sv <dbl>, load.min <dbl>, load.max <dbl>
t.test(absent$SVL, present$SVL)
##
## Welch Two Sample t-test
##
## data: absent$SVL and present$SVL
## t = 0.082092, df = 47.716, p-value = 0.9349
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.7885493 0.8556705
## sample estimates:
## mean of x mean of y
## 27.47333 27.43977
t.test(absent$Tibia, present$Tibia)
##
## Welch Two Sample t-test
##
## data: absent$Tibia and present$Tibia
## t = 0.27987, df = 34.909, p-value = 0.7812
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.4441327 0.5861529
## sample estimates:
## mean of x mean of y
## 13.95556 13.88455
t.test(absent$Weight, present$Weight)
##
## Welch Two Sample t-test
##
## data: absent$Weight and present$Weight
## t = 0.6732, df = 30.576, p-value = 0.5059
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.1264435 0.2509385
## sample estimates:
## mean of x mean of y
## 1.561111 1.498864
t.test(absent$Temp, present$Temp)
##
## Welch Two Sample t-test
##
## data: absent$Temp and present$Temp
## t = 0.53987, df = 31.417, p-value = 0.5931
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -1.479705 2.545867
## sample estimates:
## mean of x mean of y
## 15.49444 14.96136
t.test(absent$Condition, present$Condition) # no difference in condition between absent v present
##
## Welch Two Sample t-test
##
## data: absent$Condition and present$Condition
## t = 0.56133, df = 35.578, p-value = 0.5781
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.001148318 0.002026738
## sample estimates:
## mean of x mean of y
## 0.0003006626 -0.0001385471
t.test(absent$Call_Rate_Inst, present$Call_Rate_Inst)
##
## Welch Two Sample t-test
##
## data: absent$Call_Rate_Inst and present$Call_Rate_Inst
## t = 0.076262, df = 25.225, p-value = 0.9398
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -9.113764 9.814988
## sample estimates:
## mean of x mean of y
## 79.01241 78.66180
t.test(absent$Duration, present$Duration)
##
## Welch Two Sample t-test
##
## data: absent$Duration and present$Duration
## t = 0.89459, df = 34.652, p-value = 0.3772
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.006166278 0.015875971
## sample estimates:
## mean of x mean of y
## 0.1114274 0.1065726
t.test(absent$Freq, present$Freq)
##
## Welch Two Sample t-test
##
## data: absent$Freq and present$Freq
## t = 0.1947, df = 27.949, p-value = 0.847
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -64.49056 78.03660
## sample estimates:
## mean of x mean of y
## 2933.075 2926.302
t.test(absent.cvs$Call_Rate_Inst, present.cvs$Call_Rate_Inst)
##
## Welch Two Sample t-test
##
## data: absent.cvs$Call_Rate_Inst and present.cvs$Call_Rate_Inst
## t = -0.93768, df = 43.595, p-value = 0.3536
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.08442222 0.03081858
## sample estimates:
## mean of x mean of y
## 0.1917496 0.2185515
t.test(absent.cvs$Duration, present.cvs$Duration)
##
## Welch Two Sample t-test
##
## data: absent.cvs$Duration and present.cvs$Duration
## t = -0.77032, df = 48.086, p-value = 0.4449
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.021648787 0.009655016
## sample estimates:
## mean of x mean of y
## 0.06188033 0.06787721
t.test(absent.cvs$Freq, present.cvs$Freq)
##
## Welch Two Sample t-test
##
## data: absent.cvs$Freq and present.cvs$Freq
## t = 0.8019, df = 30.002, p-value = 0.4289
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
## -0.002611655 0.005988508
## sample estimates:
## mean of x mean of y
## 0.01280099 0.01111257
PCA <- means %>% dplyr::select(c('Call_Rate_Inst','Duration','Freq'))
PCA <- as.data.frame(PCA)
rownames(PCA) <- c(means$ID)
asprcomp <- prcomp(PCA, scale = TRUE)
summary(asprcomp)
## Importance of components:
## PC1 PC2 PC3
## Standard deviation 1.1506 1.0433 0.7665
## Proportion of Variance 0.4413 0.3628 0.1958
## Cumulative Proportion 0.4413 0.8042 1.0000
asprcomp
## Standard deviations (1, .., p=3):
## [1] 1.1506475 1.0433114 0.7664932
##
## Rotation (n x k) = (3 x 3):
## PC1 PC2 PC3
## Call_Rate_Inst -0.4994145 0.67579434 -0.5421136
## Duration 0.7481873 0.02093696 -0.6631572
## Freq -0.4368077 -0.73679282 -0.5160769
result <- PCAtest(PCA, 100, 100, 0.05, varcorr=FALSE, counter=FALSE, plot=TRUE)
##
## Sampling bootstrap replicates... Please wait
##
## Calculating confidence intervals of empirical statistics... Please wait
##
## Sampling random permutations... Please wait
##
## Comparing empirical statistics with their null distributions... Please wait
##
## ========================================================
## Test of PCA significance: 3 variables, 62 observations
## 100 bootstrap replicates, 100 random permutations
## ========================================================
##
## Empirical Psi = 0.2829, Max null Psi = 0.3889, Min null Psi = 0.0043, p-value = 0.03
## Empirical Phi = 0.2172, Max null Phi = 0.2546, Min null Phi = 0.0267, p-value = 0.03
##
## Empirical eigenvalue #1 = 1.32399, Max null eigenvalue = 1.43063, p-value = 0.11
## Empirical eigenvalue #2 = 1.0885, Max null eigenvalue = 1.10257, p-value = 0.01
## Empirical eigenvalue #3 = 0.58751, Max null eigenvalue = 0.95611, p-value = 0.99
##
## PC 1 is significant and accounts for 44.1% (95%-CI:41.4-56.1) of the total variation
##
## Variables , and 2 have significant loadings on PC 1
fviz_eig(asprcomp, addlabels = TRUE)
## Registered S3 method overwritten by 'broom':
## method from
## nobs.multinom MuMIn
fviz_pca_var(asprcomp,axes = c(1, 2))
fviz_cos2(asprcomp, choice = "var", axes = 1:2)
fviz_pca_var(asprcomp, col.var = "cos2",
gradient.cols = c("black", "orange", "green"),
repel = TRUE)
scores = scores(asprcomp)
pcs <- as.data.frame(scores) # same as scores
full.data <- cbind(means, pcs)
rawLoadings <- asprcomp$rotation[,1:2] %*% diag(asprcomp$sdev, 2, 2)
rotatedLoadings <- varimax(rawLoadings)$loadings
invLoadings <- t(pracma::pinv(rotatedLoadings))
scores2 <- scale(PCA) %*% invLoadings
rotatedLoadings
##
## Loadings:
## [,1] [,2]
## Call_Rate_Inst -0.894 0.170
## Duration 0.645 0.571
## Freq 0.110 -0.912
##
## [,1] [,2]
## SS loadings 1.226 1.186
## Proportion Var 0.409 0.395
## Cumulative Var 0.409 0.804
# from https://rpubs.com/esobolewska/pcr-step-by-step
pcs2 <- as.data.frame(scores2) # same as scores
# binding PC scores with the individual data (summarized for each individual)
full.data <- cbind(full.data, pcs2)
https://uc-r.github.io/kmeans_clustering
cluster.test <- full.data[, c("V1", "V2")]
fviz_nbclust(cluster.test, FUNcluster = kmeans, method = "wss")
fviz_nbclust(cluster.test, FUNcluster = kmeans, method = "silhouette")
gap_stat <- clusGap(cluster.test, FUN = kmeans, nstart = 25,
K.max = 10, B = 50)
fviz_gap_stat(gap_stat)
set.seed(48) # Set seed for reproducibility
kmeans_result <- kmeans(full.data[, c("V1", "V2")], centers = 2)
# Add cluster information to the combined data
full.data$Cluster <- as.factor(kmeans_result$cluster)
# Plot the clusters
ggplot(data = full.data, aes(x = V1, y = V2, col = Cluster, label = Prevalence)) +
geom_point() +
labs(x = "V1", y = "V2", col = "Cluster")+
theme_minimal()+
labs(title = "Color by Cluster")+
geom_text(hjust=0, vjust=0)
fviz_cluster(kmeans_result, data = full.data[, c("V1", "V2")],
geom = "point",
ellipse.type = "convex",
ggtheme = theme_minimal()
)
ggplot(data = full.data, aes(x = V1, y = V2, col = Prevalence)) +
geom_point() +
labs(x = "V1", y = "V2", col = "Prevalence")+
theme_minimal()+
labs(title = "Color by Prevalence")+
scale_color_brewer(palette = "Set2")
ggplot(data = full.data, aes (x = Location.x, y = Prevalence, color = Cluster))+
geom_jitter()+
theme_minimal()
ggplot(data = full.data, aes (x = Location.x, y = Condition, color = Cluster))+
geom_jitter()+
theme_minimal()
ggplot(data = full.data, aes (x = Prevalence, y = Condition, color = Cluster))+
geom_jitter()+
theme_minimal()
table(full.data$Cluster, full.data$Prevalence)
##
## Absent Present
## 1 10 22
## 2 8 22
fisher.test(full.data$Cluster, full.data$Prevalence)
##
## Fisher's Exact Test for Count Data
##
## data: full.data$Cluster and full.data$Prevalence
## p-value = 0.783
## alternative hypothesis: true odds ratio is not equal to 1
## 95 percent confidence interval:
## 0.3627262 4.3948578
## sample estimates:
## odds ratio
## 1.245506
ggplot(data = full.data, aes(x = Infection, y = V1))+
geom_point()+
stat_smooth(method = "lm",
se = FALSE)+
theme_minimal()+
labs(x = "Infection Load",
y ="PC1 Score")
## `geom_smooth()` using formula = 'y ~ x'
V1.global.model = lmer(data = full.data, V1 ~ Infection*Condition + (1|Location.x), na.action = "na.fail",
REML = FALSE)
Anova(V1.global.model)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: V1
## Chisq Df Pr(>Chisq)
## Infection 0.3892 1 0.53272
## Condition 0.0549 1 0.81482
## Infection:Condition 3.5044 1 0.06121 .
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(V1.global.model)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: V1 ~ Infection * Condition + (1 | Location.x)
## Data: full.data
##
## AIC BIC logLik deviance df.resid
## 181.3 194.0 -84.6 169.3 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -2.94906 -0.61573 -0.00683 0.63298 2.17025
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 0.05589 0.2364
## Residual 0.86683 0.9310
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 0.09468 0.24243 0.391
## Infection -0.06264 0.10575 -0.592
## Condition -93.16972 69.13850 -1.348
## Infection:Condition 68.65983 36.67704 1.872
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.535
## Condition -0.026 0.010
## Infctn:Cndt 0.016 0.017 -0.796
ggplot(data = full.data, aes(x = Infection, y = V2))+
geom_point()+
stat_smooth(method = "lm",
se = FALSE)+
theme_minimal()+
labs(x = "Infection Load",
y ="PC2 Score")
## `geom_smooth()` using formula = 'y ~ x'
V2.global.model = lmer(data = full.data, V2 ~ Infection*Condition + (1|Location.x), na.action = "na.fail",
REML = FALSE)
## boundary (singular) fit: see help('isSingular')
Anova(V2.global.model)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: V2
## Chisq Df Pr(>Chisq)
## Infection 0.0009 1 0.97553
## Condition 3.6097 1 0.05744 .
## Infection:Condition 1.0961 1 0.29513
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(V2.global.model)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: V2 ~ Infection * Condition + (1 | Location.x)
## Data: full.data
##
## AIC BIC logLik deviance df.resid
## 182.4 195.2 -85.2 170.4 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -2.23478 -0.70450 0.01302 0.37841 2.75885
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 0.0000 0.0000
## Residual 0.9142 0.9562
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 0.009139 0.180281 0.051
## Infection -0.001399 0.108455 -0.013
## Condition 20.350930 70.337401 0.289
## Infection:Condition 39.433851 37.666292 1.047
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.738
## Condition -0.039 0.017
## Infctn:Cndt 0.022 0.017 -0.804
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
call.rate.global.model <- lmer(data = means, Call_Rate_Inst ~ Infection * Condition + (1|Location.x),
REML = FALSE,
na.action = "na.fail")
summary(call.rate.global.model)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: Call_Rate_Inst ~ Infection * Condition + (1 | Location.x)
## Data: means
##
## AIC BIC logLik deviance df.resid
## 516.7 529.4 -252.3 504.7 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -2.75196 -0.54147 -0.04832 0.47375 2.40262
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 6.94 2.634
## Residual 195.95 13.998
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 78.1800 3.2309 24.198
## Infection 0.3577 1.5895 0.225
## Condition 1067.0137 1037.3176 1.029
## Infection:Condition -517.7037 551.4420 -0.939
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.603
## Condition -0.030 0.011
## Infctn:Cndt 0.018 0.017 -0.797
call.rate.cvs.global <- lmer(data = cvs, Call_Rate_Inst ~ Infection * Condition + (1|Location.x),
REML = FALSE,
na.action = "na.fail")
## boundary (singular) fit: see help('isSingular')
summary(call.rate.cvs.global)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: Call_Rate_Inst ~ Infection * Condition + (1 | Location.x)
## Data: cvs
##
## AIC BIC logLik deviance df.resid
## -85.3 -72.5 48.6 -97.3 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -2.1291 -0.5876 -0.1355 0.2660 4.6858
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 0.0000 0.0000
## Residual 0.0122 0.1104
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 0.213912 0.020822 10.273
## Infection -0.002295 0.012526 -0.183
## Condition -15.540016 8.123769 -1.913
## Infection:Condition 2.709214 4.350349 0.623
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.738
## Condition -0.039 0.017
## Infctn:Cndt 0.022 0.017 -0.804
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
ggplot(means, aes(x = Infection, y = Call_Rate_Inst))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(y = "Call Rate (calls / min)",
x = "Log Infection Load")
## `geom_smooth()` using formula = 'y ~ x'
ggplot(cvs, aes(x = Infection, y = Call_Rate_Inst))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(title = "Call Rate CV")
## `geom_smooth()` using formula = 'y ~ x'
call.duration.global.model <- lmer(data = means, Duration ~ Infection * Condition + (1|Location.x),
REML = FALSE,
na.action = "na.fail")
## boundary (singular) fit: see help('isSingular')
summary(call.duration.global.model)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: Duration ~ Infection * Condition + (1 | Location.x)
## Data: means
##
## AIC BIC logLik deviance df.resid
## -308.4 -295.6 160.2 -320.4 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.8886 -0.7759 0.1124 0.8140 2.0338
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 0.0000000 0.00000
## Residual 0.0003338 0.01827
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 0.110503 0.003445 32.080
## Infection -0.001791 0.002072 -0.864
## Condition -0.962140 1.343928 -0.716
## Infection:Condition 1.815350 0.719685 2.522
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.738
## Condition -0.039 0.017
## Infctn:Cndt 0.022 0.017 -0.804
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
ggplot(means, aes(x = Infection, y = Duration))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(y = "Call Duration (s)",
x = "Log Infection Load")
## `geom_smooth()` using formula = 'y ~ x'
ggplot(cvs, aes(x = Infection, y = Duration))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(title = "Duration CVs")
## `geom_smooth()` using formula = 'y ~ x'
freq.global.model <- lmer(data = means, Freq ~ Infection * Condition + (1|Location.x),
REML = FALSE,
na.action = "na.fail")
## boundary (singular) fit: see help('isSingular')
summary(freq.global.model)
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: Freq ~ Infection * Condition + (1 | Location.x)
## Data: means
##
## AIC BIC logLik deviance df.resid
## 774.8 787.6 -381.4 762.8 56
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -3.03439 -0.39584 0.06989 0.59014 2.01909
##
## Random effects:
## Groups Name Variance Std.Dev.
## Location.x (Intercept) 7.697e-15 8.773e-08
## Residual 1.290e+04 1.136e+02
## Number of obs: 62, groups: Location.x, 2
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 2933.485 21.418 136.965
## Infection -4.462 12.885 -0.346
## Condition -4106.185 8356.222 -0.491
## Infection:Condition -1204.592 4474.830 -0.269
##
## Correlation of Fixed Effects:
## (Intr) Infctn Condtn
## Infection -0.738
## Condition -0.039 0.017
## Infctn:Cndt 0.022 0.017 -0.804
## optimizer (nloptwrap) convergence code: 0 (OK)
## boundary (singular) fit: see help('isSingular')
ggplot(means, aes(x = Infection, y = Freq/1000))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(y = "Dominant Frequency (kHz)",
x = "Log Infection Load")
## `geom_smooth()` using formula = 'y ~ x'
ggplot(cvs, aes(x = Infection, y = Freq))+
geom_point()+
theme_classic()+
stat_smooth(method = 'lm',
se = FALSE)+
theme(text = element_text(family = "Times New Roman"))+
labs(title = "Frequency CVs")
## `geom_smooth()` using formula = 'y ~ x'
Google AI Overview:
Beecher’s information statistic (Hs) is a metric used in animal behavior studies to quantify the amount of individual identity information contained within a specific signal, like an animal’s appearance or markings, allowing researchers to compare how well different signals can be used to distinguish between individuals within a population; essentially, it measures how much information a particular signal carries about an individual’s identity
BIS <- Tdat %>% dplyr::select(c(1,13,14,18))
BIS <- dplyr::rename(BIS, Duration = `Delta Time (s)`)
BIS <- dplyr::rename(BIS, Frequency = `Peak Freq (Hz)`)
calcHSnpergroup(BIS,sumHS=F)
## vars Pr HS
## 1 ID NA NA
## 2 Duration 0 1.43
## 3 Frequency 0 1.61
## 4 Call_Rate_Inst 0 0.39
PCA_2 <- calcPCA(BIS)
calcHS(PCA_2)
## HS for significant vars HS for all vars
## 2.89 2.89
knitr::include_graphics("~/Desktop/UTK/Tanner Lab/2024/Bd Project/Peeper Analysis/Beecher.png")
library(DescTools)
## Warning: package 'DescTools' was built under R version 4.4.1
##
## Attaching package: 'DescTools'
## The following object is masked from 'package:car':
##
## Recode
Tdat <- Tdat %>% mutate(Presence = if_else(Prevalence == "Absent", 0, 1))
Absent <- Tdat$Presence
Duration <- Tdat$`Delta Time (s)`
Dominant_Freq <- Tdat$`Peak Freq (Hz)`
Call_Rate <- Tdat$Call_Rate_Inst
MutInf(Absent, Duration, base = 2)
## [1] 0.8639203
MutInf(Absent, Dominant_Freq, base = 2)
## [1] 0.8639203
MutInf(Absent, Call_Rate, base = 2)
## [1] 0.8639203
Tdat
## ID Date.x Location.x Body Temp SVL Tibia Frog Weight (g)
## 1 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 2 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 3 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 4 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 5 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 6 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 7 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 8 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 9 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 10 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 11 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 12 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 13 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 14 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 15 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 16 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 17 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 18 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 19 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 20 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 21 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 22 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 23 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 24 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 25 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 26 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 27 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 28 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 29 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 30 PC-002-24 030324 FR 12.8 29.36 16.17 2.00
## 31 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 32 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 33 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 34 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 35 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 36 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 37 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 38 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 39 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 40 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 41 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 42 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 43 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 44 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 45 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 46 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 47 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 48 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 49 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 50 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 51 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 52 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 53 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 54 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 55 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 56 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 57 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 58 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 59 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 60 PC-003-24 030324 FR 12.4 27.44 14.45 2.10
## 61 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 62 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 63 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 64 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 65 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 66 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 67 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 68 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 69 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 70 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 71 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 72 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 73 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 74 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 75 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 76 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 77 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 78 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 79 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 80 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 81 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 82 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 83 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 84 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 85 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 86 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 87 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 88 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 89 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 90 PC-004-24 032124 CV 13.1 25.47 14.34 1.20
## 91 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 92 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 93 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 94 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 95 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 96 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 97 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 98 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 99 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 100 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 101 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 102 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 103 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 104 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 105 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 106 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 107 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 108 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 109 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 110 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 111 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 112 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 113 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 114 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 115 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 116 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 117 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 118 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 119 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 120 PC-005-24 032124 CV 13.3 28.82 15.52 1.90
## 121 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 122 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 123 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 124 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 125 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 126 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 127 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 128 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 129 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 130 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 131 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 132 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 133 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 134 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 135 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 136 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 137 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 138 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 139 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 140 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 141 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 142 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 143 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 144 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 145 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 146 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 147 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 148 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 149 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 150 PC-006-24 032124 CV 11.8 28.39 14.42 1.70
## 151 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 152 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 153 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 154 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 155 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 156 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 157 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 158 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 159 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 160 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 161 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 162 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 163 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 164 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 165 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 166 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 167 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 168 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 169 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 170 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 171 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 172 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 173 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 174 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 175 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 176 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 177 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 178 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 179 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 180 PC-007-24 032124 CV 11.9 28.01 14.91 1.85
## 181 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 182 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 183 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 184 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 185 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 186 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 187 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 188 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 189 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 190 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 191 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 192 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 193 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 194 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 195 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 196 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 197 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 198 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 199 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 200 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 201 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 202 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 203 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 204 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 205 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 206 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 207 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 208 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 209 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 210 PC-009-24 032424 FR 7.1 27.34 13.41 1.50
## 211 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 212 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 213 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 214 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 215 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 216 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 217 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 218 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 219 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 220 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 221 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 222 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 223 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 224 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 225 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 226 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 227 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 228 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 229 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 230 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 231 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 232 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 233 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 234 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 235 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 236 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 237 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 238 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 239 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 240 PC-011-24 032824 CV 10.3 28.90 14.37 2.20
## 241 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 242 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 243 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 244 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 245 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 246 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 247 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 248 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 249 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 250 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 251 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 252 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 253 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 254 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 255 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 256 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 257 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 258 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 259 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 260 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 261 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 262 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 263 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 264 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 265 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 266 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 267 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 268 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 269 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 270 PC-012-24 032424 FR 8.3 26.85 13.67 1.50
## 271 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 272 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 273 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 274 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 275 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 276 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 277 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 278 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 279 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 280 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 281 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 282 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 283 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 284 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 285 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 286 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 287 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 288 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 289 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 290 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 291 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 292 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 293 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 294 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 295 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 296 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 297 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 298 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 299 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 300 PC-013-24 032424 FR 9.3 26.86 14.12 1.70
## 301 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 302 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 303 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 304 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 305 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 306 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 307 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 308 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 309 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 310 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 311 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 312 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 313 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 314 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 315 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 316 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 317 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 318 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 319 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 320 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 321 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 322 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 323 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 324 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 325 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 326 PC-014-24 032424 FR 6.9 27.40 14.06 1.60
## 327 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 328 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 329 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 330 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 331 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 332 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 333 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 334 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 335 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 336 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 337 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 338 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 339 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 340 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 341 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 342 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 343 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 344 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 345 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 346 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 347 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 348 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 349 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 350 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 351 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 352 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 353 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 354 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 355 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 356 PC-015-24 032824 CV 14.3 29.20 14.41 1.55
## 357 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 358 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 359 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 360 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 361 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 362 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 363 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 364 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 365 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 366 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 367 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 368 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 369 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 370 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 371 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 372 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 373 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 374 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 375 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 376 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 377 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 378 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 379 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 380 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 381 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 382 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 383 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 384 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 385 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 386 PC-016-24 033124 CV 18.8 24.52 12.83 1.20
## 387 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 388 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 389 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 390 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 391 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 392 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 393 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 394 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 395 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 396 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 397 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 398 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 399 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 400 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 401 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 402 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 403 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 404 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 405 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 406 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 407 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 408 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 409 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 410 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 411 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 412 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 413 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 414 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 415 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 416 PC-017-24 032824 CV 15.2 26.73 14.06 1.75
## 417 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 418 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 419 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 420 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 421 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 422 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 423 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 424 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 425 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 426 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 427 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 428 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 429 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 430 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 431 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 432 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 433 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 434 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 435 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 436 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 437 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 438 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 439 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 440 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 441 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 442 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 443 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 444 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 445 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 446 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 447 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 448 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 449 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 450 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 451 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 452 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 453 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 454 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 455 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 456 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 457 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 458 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 459 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 460 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 461 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 462 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 463 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 464 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 465 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 466 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 467 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 468 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 469 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 470 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 471 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 472 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 473 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 474 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 475 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 476 PC-018-24 032824 CV 12.7 31.91 15.16 1.90
## 477 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 478 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 479 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 480 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 481 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 482 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 483 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 484 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 485 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 486 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 487 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 488 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 489 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 490 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 491 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 492 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 493 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 494 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 495 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 496 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 497 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 498 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 499 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 500 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 501 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 502 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 503 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 504 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 505 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 506 PC-021-24 033124 CV 19.9 24.19 10.69 1.40
## 507 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 508 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 509 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 510 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 511 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 512 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 513 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 514 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 515 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 516 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 517 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 518 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 519 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 520 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 521 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 522 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 523 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 524 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 525 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 526 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 527 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 528 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 529 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 530 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 531 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 532 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 533 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 534 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 535 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 536 PC-022-24 033124 CV 18.3 26.39 14.15 0.90
## 537 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 538 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 539 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 540 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 541 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 542 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 543 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 544 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 545 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 546 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 547 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 548 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 549 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 550 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 551 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 552 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 553 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 554 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 555 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 556 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 557 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 558 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 559 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 560 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 561 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 562 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 563 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 564 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 565 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 566 PC-023-24 033124 CV 17.9 28.85 14.54 1.10
## 567 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 568 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 569 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 570 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 571 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 572 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 573 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 574 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 575 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 576 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 577 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 578 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 579 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 580 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 581 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 582 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 583 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 584 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 585 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 586 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 587 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 588 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 589 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 590 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 591 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 592 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 593 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 594 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 595 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 596 PC-024-24 033124 CV 16.6 22.76 13.00 1.20
## 597 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 598 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 599 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 600 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 601 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 602 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 603 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 604 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 605 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 606 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 607 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 608 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 609 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 610 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 611 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 612 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 613 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 614 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 615 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 616 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 617 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 618 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 619 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 620 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 621 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 622 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 623 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 624 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 625 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 626 PC-026-24 040724 FR 8.9 23.42 11.56 2.50
## 627 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 628 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 629 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 630 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 631 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 632 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 633 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 634 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 635 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 636 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 637 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 638 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 639 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 640 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 641 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 642 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 643 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 644 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 645 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 646 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 647 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 648 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 649 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 650 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 651 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 652 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 653 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 654 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 655 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 656 PC-027-24 040724 FR 9.1 23.17 12.21 1.70
## 657 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 658 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 659 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 660 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 661 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 662 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 663 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 664 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 665 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 666 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 667 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 668 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 669 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 670 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 671 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 672 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 673 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 674 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 675 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 676 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 677 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 678 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 679 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 680 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 681 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 682 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 683 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 684 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 685 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 686 PC-028-24 040724 FR 7.5 29.82 14.02 1.80
## 687 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 688 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 689 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 690 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 691 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 692 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 693 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 694 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 695 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 696 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 697 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 698 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 699 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 700 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 701 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 702 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 703 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 704 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 705 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 706 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 707 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 708 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 709 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 710 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 711 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 712 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 713 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 714 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 715 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 716 PC-029-24 040724 FR 10.5 28.80 15.09 1.70
## 717 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 718 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 719 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 720 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 721 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 722 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 723 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 724 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 725 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 726 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 727 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 728 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 729 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 730 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 731 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 732 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 733 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 734 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 735 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 736 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 737 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 738 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 739 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 740 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 741 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 742 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 743 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 744 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 745 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 746 PC-031-24 040924 FR 14.3 29.01 13.52 1.45
## 747 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 748 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 749 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 750 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 751 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 752 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 753 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 754 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 755 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 756 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 757 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 758 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 759 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 760 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 761 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 762 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 763 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 764 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 765 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 766 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 767 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 768 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 769 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 770 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 771 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 772 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 773 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 774 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 775 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 776 PC-032-24 040924 FR 13.2 25.80 14.31 1.45
## 777 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 778 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 779 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 780 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 781 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 782 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 783 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 784 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 785 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 786 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 787 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 788 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 789 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 790 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 791 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 792 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 793 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 794 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 795 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 796 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 797 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 798 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 799 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 800 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 801 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 802 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 803 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 804 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 805 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 806 PC-033-24 040924 FR 14.9 27.08 13.46 1.40
## 807 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 808 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 809 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 810 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 811 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 812 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 813 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 814 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 815 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 816 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 817 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 818 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 819 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 820 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 821 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 822 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 823 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 824 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 825 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 826 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 827 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 828 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 829 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 830 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 831 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 832 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 833 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 834 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 835 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 836 PC-034-24 040924 FR 13.6 30.12 15.58 1.40
## 837 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 838 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 839 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 840 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 841 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 842 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 843 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 844 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 845 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 846 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 847 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 848 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 849 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 850 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 851 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 852 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 853 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 854 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 855 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 856 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 857 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 858 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 859 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 860 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 861 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 862 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 863 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 864 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 865 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 866 PC-035-24 041024 CV 17.4 25.98 12.61 1.20
## 867 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 868 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 869 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 870 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 871 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 872 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 873 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 874 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 875 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 876 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 877 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 878 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 879 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 880 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 881 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 882 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 883 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 884 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 885 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 886 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 887 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 888 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 889 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 890 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 891 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 892 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 893 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 894 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 895 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 896 PC-037-24 040924 FR 13.5 25.62 13.02 1.25
## 897 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 898 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 899 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 900 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 901 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 902 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 903 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 904 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 905 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 906 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 907 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 908 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 909 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 910 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 911 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 912 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 913 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 914 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 915 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 916 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 917 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 918 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 919 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 920 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 921 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 922 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 923 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 924 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 925 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 926 PC-038-24 040924 FR 13.1 27.80 14.96 1.35
## 927 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 928 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 929 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 930 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 931 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 932 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 933 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 934 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 935 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 936 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 937 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 938 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 939 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 940 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 941 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 942 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 943 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 944 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 945 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 946 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 947 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 948 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 949 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 950 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 951 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 952 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 953 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 954 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 955 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 956 PC-039-24 040924 FR 13.2 28.75 14.37 2.10
## 957 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 958 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 959 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 960 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 961 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 962 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 963 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 964 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 965 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 966 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 967 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 968 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 969 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 970 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 971 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 972 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 973 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 974 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 975 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 976 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 977 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 978 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 979 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 980 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 981 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 982 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 983 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 984 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 985 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 986 PC-040-24 040924 FR 13.6 28.03 15.07 0.90
## 987 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 988 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 989 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 990 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 991 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 992 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 993 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 994 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 995 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 996 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 997 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 998 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 999 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1000 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1001 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1002 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1003 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1004 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1005 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1006 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1007 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1008 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1009 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1010 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1011 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1012 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1013 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1014 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1015 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1016 PC-041-24 041024 CV 17.5 26.77 13.67 1.50
## 1017 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1018 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1019 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1020 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1021 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1022 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1023 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1024 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1025 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1026 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1027 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1028 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1029 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1030 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1031 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1032 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1033 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1034 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1035 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1036 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1037 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1038 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1039 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1040 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1041 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1042 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1043 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1044 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1045 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1046 PC-042-24 041024 CV 16.7 27.96 13.75 1.50
## 1047 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1048 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1049 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1050 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1051 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1052 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1053 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1054 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1055 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1056 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1057 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1058 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1059 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1060 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1061 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1062 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1063 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1064 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1065 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1066 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1067 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1068 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1069 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1070 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1071 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1072 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1073 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1074 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1075 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1076 PC-043-24 041024 CV 17.3 28.59 13.81 1.30
## 1077 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1078 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1079 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1080 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1081 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1082 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1083 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1084 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1085 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1086 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1087 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1088 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1089 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1090 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1091 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1092 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1093 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1094 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1095 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1096 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1097 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1098 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1099 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1100 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1101 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1102 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1103 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1104 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1105 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1106 PC-044-24 041024 CV 17.9 28.42 14.05 1.30
## 1107 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1108 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1109 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1110 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1111 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1112 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1113 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1114 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1115 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1116 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1117 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1118 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1119 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1120 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1121 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1122 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1123 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1124 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1125 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1126 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1127 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1128 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1129 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1130 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1131 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1132 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1133 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1134 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1135 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1136 PC-045-24 041424 FR 18.0 26.47 13.02 1.20
## 1137 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1138 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1139 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1140 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1141 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1142 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1143 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1144 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1145 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1146 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1147 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1148 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1149 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1150 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1151 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1152 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1153 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1154 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1155 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1156 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1157 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1158 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1159 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1160 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1161 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1162 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1163 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1164 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1165 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1166 PC-046-24 041024 CV 16.8 28.74 12.89 1.30
## 1167 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1168 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1169 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1170 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1171 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1172 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1173 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1174 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1175 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1176 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1177 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1178 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1179 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1180 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1181 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1182 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1183 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1184 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1185 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1186 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1187 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1188 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1189 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1190 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1191 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1192 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1193 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1194 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1195 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1196 PC-048-24 041424 FR 18.0 27.66 13.59 1.60
## 1197 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1198 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1199 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1200 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1201 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1202 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1203 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1204 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1205 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1206 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1207 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1208 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1209 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1210 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1211 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1212 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1213 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1214 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1215 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1216 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1217 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1218 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1219 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1220 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1221 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1222 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1223 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1224 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1225 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1226 PC-049-24 041024 CV 19.4 26.32 13.94 1.50
## 1227 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1228 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1229 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1230 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1231 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1232 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1233 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1234 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1235 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1236 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1237 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1238 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1239 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1240 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1241 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1242 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1243 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1244 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1245 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1246 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1247 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1248 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1249 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1250 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1251 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1252 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1253 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1254 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1255 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1256 PC-050-24 041024 CV 17.1 29.09 14.61 2.10
## 1257 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1258 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1259 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1260 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1261 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1262 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1263 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1264 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1265 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1266 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1267 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1268 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1269 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1270 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1271 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1272 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1273 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1274 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1275 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1276 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1277 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1278 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1279 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1280 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1281 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1282 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1283 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1284 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1285 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1286 PC-051-24 041424 FR 19.1 28.51 13.52 1.50
## 1287 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1288 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1289 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1290 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1291 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1292 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1293 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1294 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1295 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1296 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1297 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1298 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1299 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1300 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1301 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1302 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1303 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1304 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1305 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1306 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1307 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1308 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1309 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1310 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1311 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1312 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1313 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1314 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1315 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1316 PC-052-24 041424 FR 16.8 27.97 12.32 1.70
## 1317 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1318 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1319 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1320 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1321 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1322 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1323 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1324 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1325 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1326 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1327 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1328 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1329 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1330 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1331 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1332 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1333 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1334 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1335 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1336 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1337 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1338 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1339 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1340 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1341 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1342 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1343 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1344 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1345 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1346 PC-053-24 041424 FR 17.3 28.87 14.92 2.00
## 1347 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1348 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1349 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1350 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1351 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1352 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1353 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1354 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1355 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1356 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1357 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1358 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1359 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1360 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1361 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1362 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1363 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1364 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1365 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1366 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1367 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1368 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1369 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1370 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1371 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1372 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1373 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1374 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1375 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1376 PC-054-24 041424 FR 19.9 27.60 14.80 1.60
## 1377 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1378 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1379 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1380 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1381 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1382 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1383 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1384 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1385 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1386 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1387 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1388 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1389 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1390 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1391 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1392 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1393 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1394 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1395 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1396 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1397 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1398 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1399 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1400 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1401 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1402 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1403 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1404 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1405 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1406 PC-055-24 041624 CV 18.8 29.08 14.03 1.70
## 1407 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1408 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1409 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1410 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1411 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1412 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1413 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1414 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1415 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1416 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1417 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1418 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1419 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1420 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1421 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1422 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1423 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1424 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1425 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1426 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1427 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1428 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1429 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1430 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1431 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1432 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1433 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1434 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1435 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1436 PC-056-24 041624 CV 16.0 28.20 14.23 1.55
## 1437 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1438 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1439 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1440 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1441 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1442 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1443 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1444 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1445 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1446 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1447 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1448 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1449 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1450 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1451 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1452 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1453 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1454 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1455 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1456 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1457 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1458 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1459 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1460 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1461 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1462 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1463 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1464 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1465 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1466 PC-057-24 041624 CV 19.8 26.02 13.60 1.15
## 1467 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1468 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1469 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1470 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1471 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1472 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1473 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1474 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1475 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1476 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1477 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1478 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1479 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1480 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1481 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1482 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1483 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1484 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1485 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1486 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1487 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1488 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1489 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1490 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1491 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1492 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1493 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1494 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1495 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1496 PC-058-24 041424 FR 18.0 27.61 13.79 1.40
## 1497 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1498 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1499 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1500 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1501 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1502 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1503 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1504 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1505 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1506 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1507 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1508 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1509 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1510 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1511 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1512 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1513 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1514 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1515 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1516 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1517 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1518 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1519 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1520 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1521 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1522 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1523 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1524 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1525 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1526 PC-059-24 041424 FR 16.4 25.08 13.39 1.35
## 1527 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1528 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1529 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1530 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1531 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1532 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1533 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1534 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1535 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1536 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1537 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1538 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1539 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1540 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1541 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1542 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1543 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1544 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1545 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1546 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1547 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1548 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1549 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1550 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1551 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1552 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1553 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1554 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1555 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1556 PC-060-24 041424 FR 17.9 27.88 13.51 1.70
## 1557 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1558 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1559 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1560 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1561 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1562 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1563 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1564 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1565 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1566 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1567 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1568 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1569 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1570 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1571 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1572 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1573 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1574 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1575 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1576 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1577 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1578 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1579 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1580 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1581 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1582 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1583 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1584 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1585 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1586 PC-061-24 041624 CV 16.2 26.34 14.08 1.25
## 1587 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1588 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1589 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1590 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1591 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1592 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1593 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1594 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1595 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1596 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1597 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1598 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1599 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1600 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1601 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1602 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1603 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1604 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1605 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1606 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1607 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1608 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1609 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1610 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1611 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1612 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1613 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1614 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1615 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1616 PC-062-24 041624 CV 18.1 29.07 14.24 1.20
## 1617 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1618 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1619 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1620 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1621 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1622 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1623 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1624 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1625 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1626 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1627 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1628 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1629 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1630 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1631 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1632 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1633 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1634 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1635 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1636 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1637 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1638 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1639 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1640 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1641 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1642 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1643 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1644 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1645 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1646 PC-063-24 041624 CV 19.3 26.70 13.37 1.25
## 1647 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1648 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1649 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1650 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1651 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1652 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1653 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1654 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1655 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1656 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1657 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1658 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1659 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1660 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1661 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1662 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1663 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1664 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1665 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1666 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1667 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1668 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1669 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1670 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1671 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1672 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1673 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1674 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1675 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1676 PC-064-24 041624 CV 15.9 29.32 13.96 1.35
## 1677 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1678 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1679 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1680 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1681 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1682 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1683 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1684 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1685 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1686 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1687 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1688 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1689 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1690 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1691 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1692 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1693 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1694 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1695 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1696 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1697 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1698 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1699 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1700 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1701 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1702 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1703 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1704 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1705 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1706 PC-066-24 041724 FR 14.3 27.82 14.12 1.65
## 1707 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1708 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1709 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1710 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1711 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1712 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1713 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1714 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1715 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1716 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1717 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1718 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1719 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1720 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1721 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1722 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1723 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1724 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1725 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1726 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1727 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1728 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1729 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1730 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1731 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1732 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1733 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1734 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1735 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1736 PC-067-24 041724 FR 14.6 28.31 14.50 1.40
## 1737 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1738 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1739 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1740 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1741 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1742 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1743 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1744 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1745 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1746 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1747 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1748 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1749 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1750 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1751 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1752 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1753 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1754 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1755 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1756 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1757 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1758 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1759 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1760 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1761 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1762 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1763 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1764 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1765 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1766 PC-068-24 041624 CV 15.8 27.15 13.29 1.00
## 1767 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1768 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1769 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1770 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1771 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1772 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1773 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1774 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1775 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1776 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1777 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1778 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1779 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1780 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1781 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1782 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1783 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1784 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1785 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1786 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1787 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1788 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1789 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1790 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1791 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1792 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1793 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1794 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1795 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1796 PC-069-24 041724 FR 16.4 27.71 14.61 1.60
## 1797 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1798 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1799 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1800 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1801 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1802 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1803 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1804 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1805 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1806 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1807 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1808 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1809 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1810 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1811 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1812 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1813 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1814 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1815 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1816 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1817 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1818 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1819 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1820 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1821 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1822 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1823 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1824 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1825 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1826 PC-070-24 041824 CV 18.3 25.51 13.32 1.10
## 1827 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1828 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1829 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1830 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1831 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1832 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1833 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1834 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1835 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1836 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1837 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1838 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1839 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1840 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1841 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1842 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1843 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1844 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1845 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1846 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1847 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1848 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1849 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1850 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1851 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1852 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1853 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1854 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1855 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1856 PC-071-24 041824 CV 16.1 27.47 14.28 1.40
## 1857 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1858 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1859 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1860 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1861 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1862 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1863 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1864 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1865 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1866 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1867 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1868 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1869 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1870 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1871 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1872 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1873 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1874 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1875 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1876 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1877 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1878 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1879 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1880 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1881 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1882 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1883 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1884 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1885 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## 1886 PC-072-24 041824 CV 19.8 26.84 12.85 1.45
## Log Infection Prevalence condition ICI Call_Period
## 1 0.00000000 Absent 3.100263e-03 0.5491845 0.6763456
## 2 0.00000000 Absent 3.100263e-03 0.5956244 0.7285855
## 3 0.00000000 Absent 3.100263e-03 0.5491845 0.6937456
## 4 0.00000000 Absent 3.100263e-03 1.0368035 1.1697646
## 5 0.00000000 Absent 3.100263e-03 0.5665995 0.7053605
## 6 0.00000000 Absent 3.100263e-03 0.5491845 0.6763456
## 7 0.00000000 Absent 3.100263e-03 0.5607945 0.6937555
## 8 0.00000000 Absent 3.100263e-03 0.6536743 0.7866354
## 9 0.00000000 Absent 3.100263e-03 0.4969396 0.6241007
## 10 0.00000000 Absent 3.100263e-03 0.5317695 0.6589306
## 11 0.00000000 Absent 3.100263e-03 0.5782094 0.7053705
## 12 0.00000000 Absent 3.100263e-03 0.5143546 0.6415156
## 13 0.00000000 Absent 3.100263e-03 0.4679146 0.6008757
## 14 0.00000000 Absent 3.100263e-03 0.5201595 0.6473206
## 15 0.00000000 Absent 3.100263e-03 0.4853296 0.6124907
## 16 0.00000000 Absent 3.100263e-03 0.5143546 0.6357156
## 17 0.00000000 Absent 3.100263e-03 0.5259645 0.6531256
## 18 0.00000000 Absent 3.100263e-03 0.4621097 0.5834707
## 19 0.00000000 Absent 3.100263e-03 0.4621097 0.5834707
## 20 0.00000000 Absent 3.100263e-03 0.5259645 0.6415256
## 21 0.00000000 Absent 3.100263e-03 0.5027446 0.6241057
## 22 0.00000000 Absent 3.100263e-03 0.5143546 0.6299156
## 23 0.00000000 Absent 3.100263e-03 0.4504997 0.5660608
## 24 0.00000000 Absent 3.100263e-03 0.5201595 0.6415206
## 25 0.00000000 Absent 3.100263e-03 0.5375745 0.6531356
## 26 0.00000000 Absent 3.100263e-03 0.3982548 0.5196159
## 27 0.00000000 Absent 3.100263e-03 0.5724044 0.6937655
## 28 0.00000000 Absent 3.100263e-03 0.5143546 0.6357156
## 29 0.00000000 Absent 3.100263e-03 0.4330847 0.5544458
## 30 0.00000000 Absent 3.100263e-03 0.4853296 0.6008907
## 31 0.00000000 Absent 4.984177e-03 0.5426164 0.6734645
## 32 0.00000000 Absent 4.984177e-03 1.0418454 1.1726935
## 33 0.00000000 Absent 4.984177e-03 0.9083306 1.0391787
## 34 0.00000000 Absent 4.984177e-03 0.4787615 0.6154096
## 35 0.00000000 Absent 4.984177e-03 0.5658363 0.7082844
## 36 0.00000000 Absent 4.984177e-03 0.4555415 0.5921896
## 37 0.00000000 Absent 4.984177e-03 0.5484213 0.6850694
## 38 0.00000000 Absent 4.984177e-03 0.4613465 0.5921946
## 39 0.00000000 Absent 4.984177e-03 0.4555415 0.5863896
## 40 0.00000000 Absent 4.984177e-03 0.4381266 0.5689747
## 41 0.00000000 Absent 4.984177e-03 0.7399860 0.8766341
## 42 0.00000000 Absent 4.984177e-03 0.4903715 0.6154196
## 43 0.00000000 Absent 4.984177e-03 0.5832513 0.7140994
## 44 0.00000000 Absent 4.984177e-03 0.4845665 0.6096146
## 45 0.00000000 Absent 4.984177e-03 0.4555415 0.5863896
## 46 0.00000000 Absent 4.984177e-03 0.4961764 0.6212245
## 47 0.00000000 Absent 4.984177e-03 0.4729565 0.6038046
## 48 0.00000000 Absent 4.984177e-03 0.6296912 0.7605393
## 49 0.00000000 Absent 4.984177e-03 0.5310064 0.6560545
## 50 0.00000000 Absent 4.984177e-03 0.5252014 0.6444495
## 51 0.00000000 Absent 4.984177e-03 0.5542263 0.6792744
## 52 0.00000000 Absent 4.984177e-03 0.5310064 0.6560545
## 53 0.00000000 Absent 4.984177e-03 0.5019814 0.6212295
## 54 0.00000000 Absent 4.984177e-03 0.5368114 0.6560595
## 55 0.00000000 Absent 4.984177e-03 0.6819361 0.8011842
## 56 0.00000000 Absent 4.984177e-03 0.6238862 0.7431343
## 57 0.00000000 Absent 4.984177e-03 1.6571742 1.7764223
## 58 0.00000000 Absent 4.984177e-03 0.8793057 0.9753538
## 59 0.00000000 Absent 4.984177e-03 0.5368114 0.6386595
## 60 0.00000000 Absent 4.984177e-03 0.6529111 0.7605592
## 61 1.01122566 Present -2.175798e-03 0.5265369 0.6088827
## 62 1.01122566 Present -2.175798e-03 0.6310267 0.7075725
## 63 1.01122566 Present -2.175798e-03 0.5903918 0.6727376
## 64 1.01122566 Present -2.175798e-03 0.5033169 0.5856627
## 65 1.01122566 Present -2.175798e-03 0.7703464 0.8526922
## 66 1.01122566 Present -2.175798e-03 0.5961968 0.6727426
## 67 1.01122566 Present -2.175798e-03 0.6310267 0.7075725
## 68 1.01122566 Present -2.175798e-03 0.6774666 0.7598124
## 69 1.01122566 Present -2.175798e-03 0.6600516 0.7423974
## 70 1.01122566 Present -2.175798e-03 0.5613668 0.6437126
## 71 1.01122566 Present -2.175798e-03 0.6600516 0.7423974
## 72 1.01122566 Present -2.175798e-03 0.6310267 0.7191725
## 73 1.01122566 Present -2.175798e-03 0.6252217 0.7075675
## 74 1.01122566 Present -2.175798e-03 0.4975119 0.5856578
## 75 1.01122566 Present -2.175798e-03 1.2986004 1.3809462
## 76 1.01122566 Present -2.175798e-03 0.7877614 0.8643072
## 77 1.01122566 Present -2.175798e-03 0.6542466 0.7307924
## 78 1.01122566 Present -2.175798e-03 0.5439519 0.6204977
## 79 1.01122566 Present -2.175798e-03 0.5729768 0.6495226
## 80 1.01122566 Present -2.175798e-03 0.5497568 0.6263027
## 81 1.01122566 Present -2.175798e-03 0.6310267 0.7133725
## 82 1.01122566 Present -2.175798e-03 0.6020017 0.6843475
## 83 1.01122566 Present -2.175798e-03 0.8109813 0.8991271
## 84 1.01122566 Present -2.175798e-03 0.5787818 0.6669276
## 85 1.01122566 Present -2.175798e-03 0.9503011 1.0326469
## 86 1.01122566 Present -2.175798e-03 0.5555618 0.6495076
## 87 1.01122566 Present -2.175798e-03 0.4742920 0.5740378
## 88 1.01122566 Present -2.175798e-03 0.6426367 0.7365825
## 89 1.01122566 Present -2.175798e-03 0.6252217 0.7133675
## 90 1.01122566 Present -2.175798e-03 0.5787818 0.6669276
## 91 1.24781154 Present 2.662036e-03 0.4746736 0.5696759
## 92 1.24781154 Present 2.662036e-03 0.4050137 0.5058160
## 93 1.24781154 Present 2.662036e-03 0.4050137 0.5116160
## 94 1.24781154 Present 2.662036e-03 0.4978935 0.5986958
## 95 1.24781154 Present 2.662036e-03 0.6662382 0.7786405
## 96 1.24781154 Present 2.662036e-03 0.3934037 0.5000060
## 97 1.24781154 Present 2.662036e-03 0.5443334 0.6567357
## 98 1.24781154 Present 2.662036e-03 0.3353538 0.4535561
## 99 1.24781154 Present 2.662036e-03 0.4166237 0.5290260
## 100 1.24781154 Present 2.662036e-03 0.3643788 0.4767811
## 101 1.24781154 Present 2.662036e-03 0.3295488 0.4477511
## 102 1.24781154 Present 2.662036e-03 0.3701838 0.4767861
## 103 1.24781154 Present 2.662036e-03 0.5849683 0.6973706
## 104 1.24781154 Present 2.662036e-03 0.4514536 0.5522559
## 105 1.24781154 Present 2.662036e-03 0.5269185 0.6335208
## 106 1.24781154 Present 2.662036e-03 0.3759888 0.4825911
## 107 1.24781154 Present 2.662036e-03 0.4224287 0.5290310
## 108 1.24781154 Present 2.662036e-03 0.3527688 0.4593711
## 109 1.24781154 Present 2.662036e-03 0.4978935 0.6102958
## 110 1.24781154 Present 2.662036e-03 0.4572586 0.5638609
## 111 1.24781154 Present 2.662036e-03 1.1480522 1.2488545
## 112 1.24781154 Present 2.662036e-03 0.5036985 0.6045008
## 113 1.24781154 Present 2.662036e-03 0.5036985 0.6045008
## 114 1.24781154 Present 2.662036e-03 0.4514536 0.5522559
## 115 1.24781154 Present 2.662036e-03 0.3817937 0.4825960
## 116 1.24781154 Present 2.662036e-03 0.7300931 0.8366954
## 117 1.24781154 Present 2.662036e-03 0.3469638 0.4477661
## 118 1.24781154 Present 2.662036e-03 0.5385284 0.6393307
## 119 1.24781154 Present 2.662036e-03 0.5501384 0.6509407
## 120 1.24781154 Present 2.662036e-03 0.4456486 0.5464509
## 121 2.10746436 Present 1.312381e-03 0.4311768 0.5472555
## 122 2.10746436 Present 1.312381e-03 0.5530816 0.6749602
## 123 2.10746436 Present 1.312381e-03 0.4021519 0.5240305
## 124 2.10746436 Present 1.312381e-03 0.7098163 0.8374949
## 125 2.10746436 Present 1.312381e-03 0.3847369 0.5182156
## 126 2.10746436 Present 1.312381e-03 0.3847369 0.5124156
## 127 2.10746436 Present 1.312381e-03 0.4021519 0.5356305
## 128 2.10746436 Present 1.312381e-03 0.4311768 0.5588555
## 129 2.10746436 Present 1.312381e-03 1.0465056 1.1857843
## 130 2.10746436 Present 1.312381e-03 0.7446462 0.8607249
## 131 2.10746436 Present 1.312381e-03 0.5298617 0.6401403
## 132 2.10746436 Present 1.312381e-03 0.4718118 0.5878904
## 133 2.10746436 Present 1.312381e-03 0.5763016 0.6923802
## 134 2.10746436 Present 1.312381e-03 0.5008367 0.6169154
## 135 2.10746436 Present 1.312381e-03 0.6865963 0.8084750
## 136 2.10746436 Present 1.312381e-03 0.7040113 0.8258900
## 137 2.10746436 Present 1.312381e-03 0.5937165 0.7155952
## 138 2.10746436 Present 1.312381e-03 0.3615170 0.4833956
## 139 2.10746436 Present 1.312381e-03 0.5646916 0.6981702
## 140 2.10746436 Present 1.312381e-03 0.7156213 0.8374999
## 141 2.10746436 Present 1.312381e-03 1.0697256 1.1916042
## 142 2.10746436 Present 1.312381e-03 0.9420158 1.0522945
## 143 2.10746436 Present 1.312381e-03 0.9594308 1.0697095
## 144 2.10746436 Present 1.312381e-03 0.4834217 0.5937004
## 145 2.10746436 Present 1.312381e-03 0.5763016 0.6923802
## 146 2.10746436 Present 1.312381e-03 0.6633764 0.7794550
## 147 2.10746436 Present 1.312381e-03 0.6053265 0.7098051
## 148 2.10746436 Present 1.312381e-03 0.4311768 0.5414555
## 149 2.10746436 Present 1.312381e-03 0.9013809 1.0174596
## 150 2.10746436 Present 1.312381e-03 0.5821066 0.6981852
## 151 0.00000000 Absent 2.725486e-03 0.4429776 0.5479845
## 152 0.00000000 Absent 2.725486e-03 0.9189867 1.0181936
## 153 0.00000000 Absent 2.725486e-03 0.3500978 0.4435047
## 154 0.00000000 Absent 2.725486e-03 0.5590774 0.6524843
## 155 0.00000000 Absent 2.725486e-03 0.4952225 0.5944294
## 156 0.00000000 Absent 2.725486e-03 0.4603926 0.5595995
## 157 0.00000000 Absent 2.725486e-03 0.3268778 0.4202847
## 158 0.00000000 Absent 2.725486e-03 0.3617078 0.4609147
## 159 0.00000000 Absent 2.725486e-03 0.5068325 0.6060394
## 160 0.00000000 Absent 2.725486e-03 0.4255626 0.5189695
## 161 0.00000000 Absent 2.725486e-03 0.4545876 0.5537945
## 162 0.00000000 Absent 2.725486e-03 0.2804379 0.3854448
## 163 0.00000000 Absent 2.725486e-03 0.2862429 0.3912498
## 164 0.00000000 Absent 2.725486e-03 0.3442928 0.4492997
## 165 0.00000000 Absent 2.725486e-03 0.3907327 0.4957396
## 166 0.00000000 Absent 2.725486e-03 0.3442928 0.4550997
## 167 0.00000000 Absent 2.725486e-03 0.4081477 0.5131546
## 168 0.00000000 Absent 2.725486e-03 0.5068325 0.6118394
## 169 0.00000000 Absent 2.725486e-03 0.4894175 0.5712244
## 170 0.00000000 Absent 2.725486e-03 0.3559028 0.4493097
## 171 0.00000000 Absent 2.725486e-03 0.5126375 0.6060444
## 172 0.00000000 Absent 2.725486e-03 0.3733177 0.4725246
## 173 0.00000000 Absent 2.725486e-03 0.3791227 0.4667296
## 174 0.00000000 Absent 2.725486e-03 0.4545876 0.5479945
## 175 0.00000000 Absent 2.725486e-03 1.0525014 1.1459083
## 176 0.00000000 Absent 2.725486e-03 0.5126375 0.5944444
## 177 0.00000000 Absent 2.725486e-03 0.3559028 0.4435097
## 178 0.00000000 Absent 2.725486e-03 0.4023427 0.4841496
## 179 0.00000000 Absent 2.725486e-03 0.3268778 0.4202847
## 180 0.00000000 Absent 2.725486e-03 0.5590774 0.6408843
## 181 0.00000000 Absent 8.073698e-05 0.7763142 0.8617654
## 182 0.00000000 Absent 8.073698e-05 0.5847496 0.6760008
## 183 0.00000000 Absent 8.073698e-05 0.7414843 0.8385354
## 184 0.00000000 Absent 8.073698e-05 0.5673346 0.6527858
## 185 0.00000000 Absent 8.073698e-05 0.6311895 0.7282407
## 186 0.00000000 Absent 8.073698e-05 0.7647042 0.8617554
## 187 0.00000000 Absent 8.073698e-05 0.7647042 0.8559554
## 188 0.00000000 Absent 8.073698e-05 0.5673346 0.6643858
## 189 0.00000000 Absent 8.073698e-05 0.5789446 0.6759958
## 190 0.00000000 Absent 8.073698e-05 0.7066543 0.8095055
## 191 0.00000000 Absent 8.073698e-05 0.8575840 0.9604352
## 192 0.00000000 Absent 8.073698e-05 0.6079695 0.7050207
## 193 0.00000000 Absent 8.073698e-05 0.6427994 0.7456506
## 194 0.00000000 Absent 8.073698e-05 0.4686498 0.5657010
## 195 0.00000000 Absent 8.073698e-05 0.6660194 0.7688706
## 196 0.00000000 Absent 8.073698e-05 1.0607586 1.1636098
## 197 0.00000000 Absent 8.073698e-05 0.5963595 0.6876107
## 198 0.00000000 Absent 8.073698e-05 1.0955886 1.1926398
## 199 0.00000000 Absent 8.073698e-05 1.6238425 1.7092937
## 200 0.00000000 Absent 8.073698e-05 0.9330489 1.0243001
## 201 0.00000000 Absent 8.073698e-05 0.9562688 1.0417200
## 202 0.00000000 Absent 8.073698e-05 1.7805772 1.8718284
## 203 0.00000000 Absent 8.073698e-05 0.9330489 1.0243001
## 204 0.00000000 Absent 8.073698e-05 1.0201237 1.1229749
## 205 0.00000000 Absent 8.073698e-05 1.3510081 1.4480593
## 206 0.00000000 Absent 8.073698e-05 0.8575840 0.9430352
## 207 0.00000000 Absent 8.073698e-05 1.3045682 1.3842193
## 208 0.00000000 Absent 8.073698e-05 0.8111441 0.8965953
## 209 0.00000000 Absent 8.073698e-05 0.8459741 0.9314252
## 210 0.00000000 Absent 8.073698e-05 0.9620738 1.0533250
## 211 0.00000000 Absent 4.764838e-03 0.5676348 0.6467898
## 212 0.00000000 Absent 4.764838e-03 0.8230543 0.9022093
## 213 0.00000000 Absent 4.764838e-03 0.4921699 0.5713249
## 214 0.00000000 Absent 4.764838e-03 0.6140747 0.6990297
## 215 0.00000000 Absent 4.764838e-03 0.7069545 0.7861095
## 216 0.00000000 Absent 4.764838e-03 0.5153899 0.5945449
## 217 0.00000000 Absent 4.764838e-03 0.6314897 0.7106446
## 218 0.00000000 Absent 4.764838e-03 0.8056393 0.8847943
## 219 0.00000000 Absent 4.764838e-03 0.7301745 0.8151294
## 220 0.00000000 Absent 4.764838e-03 0.4573400 0.5364950
## 221 0.00000000 Absent 4.764838e-03 0.3760702 0.4552251
## 222 0.00000000 Absent 4.764838e-03 0.4921699 0.5771249
## 223 0.00000000 Absent 4.764838e-03 0.4167051 0.5016601
## 224 0.00000000 Absent 4.764838e-03 0.4805599 0.5597149
## 225 0.00000000 Absent 4.764838e-03 1.0030089 1.0821639
## 226 0.00000000 Absent 4.764838e-03 0.5908547 0.6700097
## 227 0.00000000 Absent 4.764838e-03 1.3106733 1.3956283
## 228 0.00000000 Absent 4.764838e-03 0.5211949 0.6003499
## 229 0.00000000 Absent 4.764838e-03 0.4341200 0.5190750
## 230 0.00000000 Absent 4.764838e-03 0.9217391 1.0008941
## 231 0.00000000 Absent 4.764838e-03 0.5502198 0.6293748
## 232 0.00000000 Absent 4.764838e-03 0.7301745 0.8093294
## 233 0.00000000 Absent 4.764838e-03 1.1829636 1.2621186
## 234 0.00000000 Absent 4.764838e-03 0.4573400 0.5364950
## 235 0.00000000 Absent 4.764838e-03 0.4283150 0.5132700
## 236 0.00000000 Absent 4.764838e-03 0.7417844 0.8209394
## 237 0.00000000 Absent 4.764838e-03 0.6256847 0.7048397
## 238 0.00000000 Absent 4.764838e-03 1.2119885 1.2969435
## 239 0.00000000 Absent 4.764838e-03 0.8230543 0.9022093
## 240 0.00000000 Absent 4.764838e-03 0.5211949 0.6003499
## 241 1.99295030 Present 3.206326e-04 1.1617329 1.2941230
## 242 1.99295030 Present 3.206326e-04 0.8714834 0.9980736
## 243 1.99295030 Present 3.206326e-04 0.5405991 0.6381892
## 244 1.99295030 Present 3.206326e-04 0.5405991 0.6671892
## 245 1.99295030 Present 3.206326e-04 0.6044540 0.7310441
## 246 1.99295030 Present 3.206326e-04 0.6625039 0.7948940
## 247 1.99295030 Present 3.206326e-04 0.5754290 0.7078191
## 248 1.99295030 Present 3.206326e-04 0.4651342 0.5975244
## 249 1.99295030 Present 3.206326e-04 0.6160639 0.7426541
## 250 1.99295030 Present 3.206326e-04 0.4883542 0.6207443
## 251 1.99295030 Present 3.206326e-04 0.5928440 0.7194341
## 252 1.99295030 Present 3.206326e-04 0.6218689 0.7484590
## 253 1.99295030 Present 3.206326e-04 0.6973338 0.8007239
## 254 1.99295030 Present 3.206326e-04 0.5057692 0.6323593
## 255 1.99295030 Present 3.206326e-04 0.6450889 0.7716790
## 256 1.99295030 Present 3.206326e-04 0.5115741 0.6207643
## 257 1.99295030 Present 3.206326e-04 0.7495787 0.8761688
## 258 1.99295030 Present 3.206326e-04 0.5870390 0.7078291
## 259 1.99295030 Present 3.206326e-04 0.5580141 0.6846042
## 260 1.99295030 Present 3.206326e-04 0.6683088 0.7716990
## 261 1.99295030 Present 3.206326e-04 0.9411433 1.0793334
## 262 1.99295030 Present 3.206326e-04 0.5812340 0.7020241
## 263 1.99295030 Present 3.206326e-04 0.5405991 0.6729892
## 264 1.99295030 Present 3.206326e-04 0.4767442 0.6091343
## 265 1.99295030 Present 3.206326e-04 1.1269029 1.2534931
## 266 1.99295030 Present 3.206326e-04 0.5580141 0.6904042
## 267 1.99295030 Present 3.206326e-04 0.5928440 0.7136341
## 268 1.99295030 Present 3.206326e-04 0.5464041 0.6787942
## 269 1.99295030 Present 3.206326e-04 0.8308485 0.9574386
## 270 1.99295030 Present 3.206326e-04 0.7205537 0.8413439
## 271 0.78808518 Present 2.131321e-03 0.4554321 0.5757047
## 272 0.78808518 Present 2.131321e-03 0.4728471 0.6047196
## 273 0.78808518 Present 2.131321e-03 0.4206022 0.5524747
## 274 0.78808518 Present 2.131321e-03 0.4496271 0.5872997
## 275 0.78808518 Present 2.131321e-03 0.5134820 0.6511546
## 276 0.78808518 Present 2.131321e-03 0.4554321 0.5931047
## 277 0.78808518 Present 2.131321e-03 0.4728471 0.6163196
## 278 0.78808518 Present 2.131321e-03 0.4147972 0.5582698
## 279 0.78808518 Present 2.131321e-03 0.4960670 0.6337396
## 280 0.78808518 Present 2.131321e-03 0.6411918 0.7788643
## 281 0.78808518 Present 2.131321e-03 0.4147972 0.5524698
## 282 0.78808518 Present 2.131321e-03 0.4960670 0.6395396
## 283 0.78808518 Present 2.131321e-03 0.4496271 0.5930997
## 284 0.78808518 Present 2.131321e-03 0.5831419 0.7208144
## 285 0.78808518 Present 2.131321e-03 0.5889469 0.7266194
## 286 0.78808518 Present 2.131321e-03 0.5250920 0.6685645
## 287 0.78808518 Present 2.131321e-03 0.6586067 0.7962793
## 288 0.78808518 Present 2.131321e-03 0.7282666 0.8659391
## 289 0.78808518 Present 2.131321e-03 0.5308970 0.6685695
## 290 0.78808518 Present 2.131321e-03 0.5947519 0.7266244
## 291 0.78808518 Present 2.131321e-03 0.5250920 0.6627645
## 292 0.78808518 Present 2.131321e-03 0.6237768 0.7614493
## 293 0.78808518 Present 2.131321e-03 1.2333006 1.3709732
## 294 0.78808518 Present 2.131321e-03 0.8908063 1.0226788
## 295 0.78808518 Present 2.131321e-03 0.9140262 1.0400988
## 296 0.78808518 Present 2.131321e-03 0.8211464 0.9472190
## 297 0.78808518 Present 2.131321e-03 0.7340716 0.8601441
## 298 0.78808518 Present 2.131321e-03 0.6353868 0.7614593
## 299 0.78808518 Present 2.131321e-03 0.7050466 0.8427192
## 300 0.78808518 Present 2.131321e-03 0.5250920 0.6569645
## 301 0.22572425 Present 9.604499e-04 1.1822818 1.2782765
## 302 0.22572425 Present 9.604499e-04 1.0139372 1.0925319
## 303 0.22572425 Present 9.604499e-04 0.9733022 1.0518969
## 304 0.22572425 Present 9.604499e-04 0.9094474 0.9938421
## 305 0.22572425 Present 9.604499e-04 1.0081322 1.0983269
## 306 0.22572425 Present 9.604499e-04 0.6250029 0.7209976
## 307 0.22572425 Present 9.604499e-04 1.1242319 1.2086266
## 308 0.22572425 Present 9.604499e-04 0.6482229 0.7384176
## 309 0.22572425 Present 9.604499e-04 0.6656378 0.7616325
## 310 0.22572425 Present 9.604499e-04 0.7120777 0.8138724
## 311 0.22572425 Present 9.604499e-04 1.0023272 1.0983219
## 312 0.22572425 Present 9.604499e-04 0.6482229 0.7732176
## 313 0.22572425 Present 9.604499e-04 0.8223725 0.9648672
## 314 0.22572425 Present 9.604499e-04 0.8049576 0.9474523
## 315 0.22572425 Present 9.604499e-04 1.1242319 1.2376266
## 316 0.22572425 Present 9.604499e-04 1.1242319 1.2434266
## 317 0.22572425 Present 9.604499e-04 0.8455925 0.9647872
## 318 0.22572425 Present 9.604499e-04 0.7294927 0.8602874
## 319 0.22572425 Present 9.604499e-04 0.7294927 0.8719874
## 320 0.22572425 Present 9.604499e-04 0.5611480 0.7036427
## 321 0.22572425 Present 9.604499e-04 0.7991526 0.9357473
## 322 0.22572425 Present 9.604499e-04 1.7627807 1.9052754
## 323 0.22572425 Present 9.604499e-04 1.4144814 1.5452761
## 324 0.22572425 Present 9.604499e-04 0.8920324 0.9996271
## 325 0.22572425 Present 9.604499e-04 1.7627807 1.8877754
## 326 0.22572425 Present 9.604499e-04 0.7585177 0.8661124
## 327 0.00000000 Absent -3.257692e-04 1.1731801 1.3024648
## 328 0.00000000 Absent -3.257692e-04 1.8755837 2.0164684
## 329 0.00000000 Absent -3.257692e-04 1.1731801 1.3256648
## 330 0.00000000 Absent -3.257692e-04 1.0222504 1.1631351
## 331 0.00000000 Absent -3.257692e-04 0.8829306 1.0296154
## 332 0.00000000 Absent -3.257692e-04 0.8887356 1.0354204
## 333 0.00000000 Absent -3.257692e-04 1.1035202 1.2560049
## 334 0.00000000 Absent -3.257692e-04 0.8539057 1.0063904
## 335 0.00000000 Absent -3.257692e-04 1.0977152 1.2501999
## 336 0.00000000 Absent -3.257692e-04 1.5621143 1.7145990
## 337 0.00000000 Absent -3.257692e-04 5.4282368 5.5749215
## 338 0.00000000 Absent -3.257692e-04 1.5679193 1.6740040
## 339 0.00000000 Absent -3.257692e-04 0.9061506 1.0238353
## 340 0.00000000 Absent -3.257692e-04 5.4456517 5.5807365
## 341 0.00000000 Absent -3.257692e-04 1.6375792 1.7494639
## 342 0.00000000 Absent -3.257692e-04 0.8539057 0.9773904
## 343 0.00000000 Absent -3.257692e-04 1.2022050 1.3314897
## 344 0.00000000 Absent -3.257692e-04 1.9858785 2.1209632
## 345 0.00000000 Absent -3.257692e-04 1.7072390 1.8423238
## 346 0.00000000 Absent -3.257692e-04 1.0628853 1.2037700
## 347 0.00000000 Absent -3.257692e-04 0.7726359 0.9193206
## 348 0.00000000 Absent -3.257692e-04 0.9177606 1.0644453
## 349 0.00000000 Absent -3.257692e-04 1.0164454 1.1457301
## 350 0.00000000 Absent -3.257692e-04 1.2718649 1.4011496
## 351 0.00000000 Absent -3.257692e-04 1.3299148 1.4765995
## 352 0.00000000 Absent -3.257692e-04 0.7552209 0.8961056
## 353 0.00000000 Absent -3.257692e-04 0.8829306 1.0296154
## 354 0.00000000 Absent -3.257692e-04 1.1093252 1.2560099
## 355 0.00000000 Absent -3.257692e-04 0.9700055 1.1108902
## 356 0.00000000 Absent -3.257692e-04 1.8407538 1.9816385
## 357 4.11710418 Present -1.753925e-03 0.6883414 0.7891971
## 358 4.11710418 Present -1.753925e-03 0.8624911 0.9749468
## 359 4.11710418 Present -1.753925e-03 0.7521963 0.8588520
## 360 4.11710418 Present -1.753925e-03 0.7696113 0.8762670
## 361 4.11710418 Present -1.753925e-03 0.7173664 0.8240221
## 362 4.11710418 Present -1.753925e-03 0.6767314 0.7833871
## 363 4.11710418 Present -1.753925e-03 0.7521963 0.8646520
## 364 4.11710418 Present -1.753925e-03 0.7638063 0.8704620
## 365 4.11710418 Present -1.753925e-03 0.7173664 0.8240221
## 366 4.11710418 Present -1.753925e-03 0.6999514 0.8066071
## 367 4.11710418 Present -1.753925e-03 0.7986362 0.9052919
## 368 4.11710418 Present -1.753925e-03 0.6651215 0.7659772
## 369 4.11710418 Present -1.753925e-03 0.7870262 0.8936819
## 370 4.11710418 Present -1.753925e-03 0.7405863 0.8472420
## 371 4.11710418 Present -1.753925e-03 0.7289763 0.8240320
## 372 4.11710418 Present -1.753925e-03 0.7638063 0.8646620
## 373 4.11710418 Present -1.753925e-03 1.0656657 1.1607214
## 374 4.11710418 Present -1.753925e-03 0.8218562 0.9169119
## 375 4.11710418 Present -1.753925e-03 0.6883414 0.7891971
## 376 4.11710418 Present -1.753925e-03 0.8450761 0.9401318
## 377 4.11710418 Present -1.753925e-03 0.7347813 0.8123370
## 378 4.11710418 Present -1.753925e-03 0.8508811 0.9401368
## 379 4.11710418 Present -1.753925e-03 0.7405863 0.8414420
## 380 4.11710418 Present -1.753925e-03 0.8624911 0.9517468
## 381 4.11710418 Present -1.753925e-03 0.7754163 0.8820719
## 382 4.11710418 Present -1.753925e-03 0.7231714 0.8182271
## 383 4.11710418 Present -1.753925e-03 0.8160512 0.9053069
## 384 4.11710418 Present -1.753925e-03 0.7057564 0.7950121
## 385 4.11710418 Present -1.753925e-03 0.8102462 0.9169019
## 386 4.11710418 Present -1.753925e-03 0.7754163 0.8762719
## 387 3.14097979 Present 2.638744e-03 0.9252826 1.0477216
## 388 3.14097979 Present 2.638744e-03 0.6640581 0.7864971
## 389 3.14097979 Present 2.638744e-03 0.8614278 0.9896667
## 390 3.14097979 Present 2.638744e-03 0.7104981 0.8387370
## 391 3.14097979 Present 2.638744e-03 0.6466432 0.7690821
## 392 3.14097979 Present 2.638744e-03 0.8440128 0.9722517
## 393 3.14097979 Present 2.638744e-03 0.6872781 0.8155170
## 394 3.14097979 Present 2.638744e-03 0.7221080 0.8561470
## 395 3.14097979 Present 2.638744e-03 0.7395230 0.8735619
## 396 3.14097979 Present 2.638744e-03 0.6930831 0.8213220
## 397 3.14097979 Present 2.638744e-03 0.7221080 0.8503470
## 398 3.14097979 Present 2.638744e-03 0.6930831 0.8155220
## 399 3.14097979 Present 2.638744e-03 0.7859629 0.9084018
## 400 3.14097979 Present 2.638744e-03 0.7975729 0.9200118
## 401 3.14097979 Present 2.638744e-03 0.9833325 1.1115714
## 402 3.14097979 Present 2.638744e-03 0.6756681 0.7981070
## 403 3.14097979 Present 2.638744e-03 0.8614278 0.9838667
## 404 3.14097979 Present 2.638744e-03 0.9194776 1.0419166
## 405 3.14097979 Present 2.638744e-03 0.9136727 1.0361116
## 406 3.14097979 Present 2.638744e-03 1.2329470 1.3553860
## 407 3.14097979 Present 2.638744e-03 0.6176182 0.7516572
## 408 3.14097979 Present 2.638744e-03 0.7859629 0.9142018
## 409 3.14097979 Present 2.638744e-03 0.7511330 0.8851719
## 410 3.14097979 Present 2.638744e-03 0.9136727 1.0361116
## 411 3.14097979 Present 2.638744e-03 0.5943983 0.7284372
## 412 3.14097979 Present 2.638744e-03 0.7279130 0.8561519
## 413 3.14097979 Present 2.638744e-03 0.8207928 0.9432318
## 414 3.14097979 Present 2.638744e-03 0.8033779 0.9316168
## 415 3.14097979 Present 2.638744e-03 0.7801579 0.9025968
## 416 3.14097979 Present 2.638744e-03 0.8962577 1.0244966
## 417 1.64377324 Present 1.139153e-03 0.7928032 0.9252361
## 418 1.64377324 Present 1.139153e-03 0.6708985 0.8265313
## 419 1.64377324 Present 1.139153e-03 0.7231434 0.8787762
## 420 1.64377324 Present 1.139153e-03 1.1004676 1.2561005
## 421 1.64377324 Present 1.139153e-03 0.8914880 1.0181209
## 422 1.64377324 Present 1.139153e-03 0.8392431 0.9658760
## 423 1.64377324 Present 1.139153e-03 0.8102182 0.9426510
## 424 1.64377324 Present 1.139153e-03 0.8972930 1.0239259
## 425 1.64377324 Present 1.139153e-03 0.7405583 0.8903912
## 426 1.64377324 Present 1.139153e-03 0.7057284 0.8381612
## 427 1.64377324 Present 1.139153e-03 0.8624631 0.9948959
## 428 1.64377324 Present 1.139153e-03 1.7738463 1.9004791
## 429 1.64377324 Present 1.139153e-03 0.8218282 0.9426610
## 430 1.64377324 Present 1.139153e-03 1.0598327 1.1922655
## 431 1.64377324 Present 1.139153e-03 0.6883134 0.8149463
## 432 1.64377324 Present 1.139153e-03 0.8682681 1.0007009
## 433 1.64377324 Present 1.139153e-03 0.9263180 1.0529508
## 434 1.64377324 Present 1.139153e-03 0.8914880 1.0181209
## 435 1.64377324 Present 1.139153e-03 0.6360685 0.7685014
## 436 1.64377324 Present 1.139153e-03 0.7231434 0.8555762
## 437 1.64377324 Present 1.139153e-03 0.8682681 0.9949009
## 438 1.64377324 Present 1.139153e-03 0.8798781 1.0065109
## 439 1.64377324 Present 1.139153e-03 0.8392431 0.9716760
## 440 1.64377324 Present 1.139153e-03 0.8102182 0.9368510
## 441 1.64377324 Present 1.139153e-03 1.2397873 1.3780202
## 442 1.64377324 Present 1.139153e-03 2.2150254 2.3416583
## 443 1.64377324 Present 1.139153e-03 2.3253202 2.4461531
## 444 1.64377324 Present 1.139153e-03 0.8044132 0.9252460
## 445 1.64377324 Present 1.139153e-03 0.7637783 0.8904111
## 446 1.64377324 Present 1.139153e-03 0.9321230 1.0587558
## 447 1.64377324 Present 1.139153e-03 0.7463633 0.8787961
## 448 1.64377324 Present 1.139153e-03 1.0133928 1.1458256
## 449 1.64377324 Present 1.139153e-03 0.6650935 0.7859263
## 450 1.64377324 Present 1.139153e-03 0.7869982 0.9136311
## 451 1.64377324 Present 1.139153e-03 0.9553429 1.0819757
## 452 1.64377324 Present 1.139153e-03 0.8682681 0.9949009
## 453 1.64377324 Present 1.139153e-03 0.6883134 0.8149463
## 454 1.64377324 Present 1.139153e-03 0.7986082 0.9194410
## 455 1.64377324 Present 1.139153e-03 0.8044132 0.9252460
## 456 1.64377324 Present 1.139153e-03 0.7637783 0.8904111
## 457 1.64377324 Present 1.139153e-03 1.0075878 1.1284206
## 458 1.64377324 Present 1.139153e-03 0.9263180 1.0529508
## 459 1.64377324 Present 1.139153e-03 0.8102182 0.9310510
## 460 1.64377324 Present 1.139153e-03 0.9437329 1.0645658
## 461 1.64377324 Present 1.139153e-03 0.7579733 0.8846061
## 462 1.64377324 Present 1.139153e-03 0.7289483 0.8555812
## 463 1.64377324 Present 1.139153e-03 1.0540277 1.1748605
## 464 1.64377324 Present 1.139153e-03 0.6708985 0.7975313
## 465 1.64377324 Present 1.139153e-03 0.7753883 0.9020211
## 466 1.64377324 Present 1.139153e-03 0.9030980 1.0239308
## 467 1.64377324 Present 1.139153e-03 0.7115334 0.8381662
## 468 1.64377324 Present 1.139153e-03 0.8508531 0.9716859
## 469 1.64377324 Present 1.139153e-03 0.8276332 0.9542660
## 470 1.64377324 Present 1.139153e-03 0.9959778 1.1226107
## 471 1.64377324 Present 1.139153e-03 0.8392431 0.9600760
## 472 1.64377324 Present 1.139153e-03 0.9901728 1.1110057
## 473 1.64377324 Present 1.139153e-03 0.7869982 0.9136311
## 474 1.64377324 Present 1.139153e-03 1.0482227 1.1748556
## 475 1.64377324 Present 1.139153e-03 2.0873157 2.2081485
## 476 1.64377324 Present 1.139153e-03 1.4429620 1.5637948
## 477 2.09900278 Present 7.166364e-04 0.9052247 1.0002910
## 478 2.09900278 Present 7.166364e-04 0.8471748 0.9422411
## 479 2.09900278 Present 7.166364e-04 0.7949299 0.8899962
## 480 2.09900278 Present 7.166364e-04 0.7891249 0.8841913
## 481 2.09900278 Present 7.166364e-04 0.8007349 0.8958012
## 482 2.09900278 Present 7.166364e-04 0.7833199 0.8783863
## 483 2.09900278 Present 7.166364e-04 0.7600999 0.8551663
## 484 2.09900278 Present 7.166364e-04 0.7542950 0.8493613
## 485 2.09900278 Present 7.166364e-04 0.7659049 0.8609713
## 486 2.09900278 Present 7.166364e-04 0.7891249 0.8841913
## 487 2.09900278 Present 7.166364e-04 0.8123448 0.9074112
## 488 2.09900278 Present 7.166364e-04 0.8007349 0.8958012
## 489 2.09900278 Present 7.166364e-04 0.7368800 0.8319464
## 490 2.09900278 Present 7.166364e-04 0.8007349 0.9016012
## 491 2.09900278 Present 7.166364e-04 0.7194650 0.8145314
## 492 2.09900278 Present 7.166364e-04 0.7194650 0.8145314
## 493 2.09900278 Present 7.166364e-04 0.6788301 0.7738965
## 494 2.09900278 Present 7.166364e-04 0.8820047 0.9770711
## 495 2.09900278 Present 7.166364e-04 0.8065399 0.9074062
## 496 2.09900278 Present 7.166364e-04 0.8297598 0.9248262
## 497 2.09900278 Present 7.166364e-04 0.7484900 0.8435563
## 498 2.09900278 Present 7.166364e-04 0.8065399 0.9016062
## 499 2.09900278 Present 7.166364e-04 0.8065399 0.9016062
## 500 2.09900278 Present 7.166364e-04 0.7717099 0.8725763
## 501 2.09900278 Present 7.166364e-04 0.8994197 1.0002860
## 502 2.09900278 Present 7.166364e-04 1.0213244 1.1163908
## 503 2.09900278 Present 7.166364e-04 0.7542950 0.8551613
## 504 2.09900278 Present 7.166364e-04 1.1200092 1.2150756
## 505 2.09900278 Present 7.166364e-04 0.7717099 0.8667763
## 506 2.09900278 Present 7.166364e-04 0.8065399 0.9016062
## 507 0.00000000 Absent -6.237445e-03 0.6467526 0.7739670
## 508 0.00000000 Absent -6.237445e-03 0.6583626 0.7913770
## 509 0.00000000 Absent -6.237445e-03 0.7048025 0.8262169
## 510 0.00000000 Absent -6.237445e-03 0.6873875 0.8146020
## 511 0.00000000 Absent -6.237445e-03 0.6757775 0.7971920
## 512 0.00000000 Absent -6.237445e-03 0.7048025 0.8204169
## 513 0.00000000 Absent -6.237445e-03 0.6873875 0.7972020
## 514 0.00000000 Absent -6.237445e-03 0.6177276 0.7333421
## 515 0.00000000 Absent -6.237445e-03 0.6931925 0.8030070
## 516 0.00000000 Absent -6.237445e-03 0.6931925 0.8146070
## 517 0.00000000 Absent -6.237445e-03 0.7048025 0.8262169
## 518 0.00000000 Absent -6.237445e-03 0.6699725 0.7913870
## 519 0.00000000 Absent -6.237445e-03 0.6351426 0.7449571
## 520 0.00000000 Absent -6.237445e-03 0.7106074 0.8204219
## 521 0.00000000 Absent -6.237445e-03 0.7396324 0.8552469
## 522 0.00000000 Absent -6.237445e-03 0.6641675 0.7739820
## 523 0.00000000 Absent -6.237445e-03 0.6525576 0.7739720
## 524 0.00000000 Absent -6.237445e-03 0.6641675 0.7797820
## 525 0.00000000 Absent -6.237445e-03 0.6235326 0.7391471
## 526 0.00000000 Absent -6.237445e-03 0.6351426 0.7507571
## 527 0.00000000 Absent -6.237445e-03 0.6525576 0.7623720
## 528 0.00000000 Absent -6.237445e-03 0.6293376 0.7391521
## 529 0.00000000 Absent -6.237445e-03 0.6351426 0.7449571
## 530 0.00000000 Absent -6.237445e-03 0.6873875 0.7914020
## 531 0.00000000 Absent -6.237445e-03 0.6931925 0.8030070
## 532 0.00000000 Absent -6.237445e-03 0.6641675 0.7855820
## 533 0.00000000 Absent -6.237445e-03 0.6641675 0.7739820
## 534 0.00000000 Absent -6.237445e-03 0.6699725 0.7855870
## 535 0.00000000 Absent -6.237445e-03 0.6467526 0.7623670
## 536 0.00000000 Absent -6.237445e-03 0.6351426 0.7507571
## 537 2.91679893 Present -4.504481e-03 0.9304339 1.0265354
## 538 2.91679893 Present -4.504481e-03 0.6575994 0.7537009
## 539 2.91679893 Present -4.504481e-03 0.7388692 0.8291707
## 540 2.91679893 Present -4.504481e-03 0.7969191 0.8930206
## 541 2.91679893 Present -4.504481e-03 0.7911141 0.8814156
## 542 2.91679893 Present -4.504481e-03 1.1800484 1.2703499
## 543 2.91679893 Present -4.504481e-03 0.7562842 0.8465857
## 544 2.91679893 Present -4.504481e-03 0.6808194 0.7769209
## 545 2.91679893 Present -4.504481e-03 0.7214543 0.8175558
## 546 2.91679893 Present -4.504481e-03 0.7388692 0.8349707
## 547 2.91679893 Present -4.504481e-03 0.6285745 0.7188760
## 548 2.91679893 Present -4.504481e-03 0.6227695 0.7188710
## 549 2.91679893 Present -4.504481e-03 0.6982343 0.7943358
## 550 2.91679893 Present -4.504481e-03 0.6575994 0.7595009
## 551 2.91679893 Present -4.504481e-03 0.6750144 0.7653159
## 552 2.91679893 Present -4.504481e-03 0.6459894 0.7304909
## 553 2.91679893 Present -4.504481e-03 0.7156493 0.8059508
## 554 2.91679893 Present -4.504481e-03 0.8143341 0.9104356
## 555 2.91679893 Present -4.504481e-03 0.7504792 0.8523807
## 556 2.91679893 Present -4.504481e-03 0.6401844 0.7362859
## 557 2.91679893 Present -4.504481e-03 0.6401844 0.7362859
## 558 2.91679893 Present -4.504481e-03 0.6924293 0.7943308
## 559 2.91679893 Present -4.504481e-03 0.7620892 0.8523907
## 560 2.91679893 Present -4.504481e-03 0.7156493 0.8117508
## 561 2.91679893 Present -4.504481e-03 0.7040393 0.8117408
## 562 2.91679893 Present -4.504481e-03 0.6692094 0.7827109
## 563 2.91679893 Present -4.504481e-03 0.6982343 0.8117358
## 564 2.91679893 Present -4.504481e-03 0.7911141 0.8872156
## 565 2.91679893 Present -4.504481e-03 0.7388692 0.8349707
## 566 2.91679893 Present -4.504481e-03 0.7678942 0.8639957
## 567 1.56406237 Present -8.792886e-04 0.4809695 0.5527039
## 568 1.56406237 Present -8.792886e-04 0.5041895 0.5701238
## 569 1.56406237 Present -8.792886e-04 0.4925795 0.5643138
## 570 1.56406237 Present -8.792886e-04 0.5448244 0.6165587
## 571 1.56406237 Present -8.792886e-04 0.4693595 0.5469939
## 572 1.56406237 Present -8.792886e-04 0.5274094 0.6050438
## 573 1.56406237 Present -8.792886e-04 0.5448244 0.6224587
## 574 1.56406237 Present -8.792886e-04 0.6899491 0.7616834
## 575 1.56406237 Present -8.792886e-04 0.8989287 0.9706630
## 576 1.56406237 Present -8.792886e-04 0.6318992 0.7153336
## 577 1.56406237 Present -8.792886e-04 0.6609242 0.7385585
## 578 1.56406237 Present -8.792886e-04 0.4693595 0.5469939
## 579 1.56406237 Present -8.792886e-04 0.8466838 0.9243181
## 580 1.56406237 Present -8.792886e-04 1.8973868 1.9750211
## 581 1.56406237 Present -8.792886e-04 0.6435092 0.7327435
## 582 1.56406237 Present -8.792886e-04 0.5448244 0.6282587
## 583 1.56406237 Present -8.792886e-04 0.4867745 0.5760088
## 584 1.56406237 Present -8.792886e-04 0.4577496 0.5411839
## 585 1.56406237 Present -8.792886e-04 0.5099945 0.5934288
## 586 1.56406237 Present -8.792886e-04 0.4867745 0.5702088
## 587 1.56406237 Present -8.792886e-04 0.4577496 0.5353839
## 588 1.56406237 Present -8.792886e-04 0.5041895 0.5876238
## 589 1.56406237 Present -8.792886e-04 0.4925795 0.5702138
## 590 1.56406237 Present -8.792886e-04 0.5332144 0.6224488
## 591 1.56406237 Present -8.792886e-04 0.4577496 0.5353839
## 592 1.56406237 Present -8.792886e-04 0.5274094 0.6050438
## 593 1.56406237 Present -8.792886e-04 0.5506294 0.6282637
## 594 1.56406237 Present -8.792886e-04 0.5041895 0.5818238
## 595 1.56406237 Present -8.792886e-04 0.5738493 0.6514837
## 596 1.56406237 Present -8.792886e-04 0.4809695 0.5586039
## 597 2.56548205 Present 1.135419e-02 2.0684558 2.2563154
## 598 2.56548205 Present 1.135419e-02 0.5533538 0.7238134
## 599 2.56548205 Present 1.135419e-02 0.6172087 0.7992682
## 600 2.56548205 Present 1.135419e-02 0.8319932 1.0024528
## 601 2.56548205 Present 1.135419e-02 0.4662790 0.6425385
## 602 2.56548205 Present 1.135419e-02 0.4953039 0.6715635
## 603 2.56548205 Present 1.135419e-02 0.5127189 0.6773784
## 604 2.56548205 Present 1.135419e-02 0.5127189 0.6773784
## 605 2.56548205 Present 1.135419e-02 1.1802926 1.3449521
## 606 2.56548205 Present 1.135419e-02 0.6694536 0.8341131
## 607 2.56548205 Present 1.135419e-02 1.6621066 1.8209662
## 608 2.56548205 Present 1.135419e-02 0.5069139 0.6657735
## 609 2.56548205 Present 1.135419e-02 0.6810635 0.8341231
## 610 2.56548205 Present 1.135419e-02 0.4953039 0.6483635
## 611 2.56548205 Present 1.135419e-02 1.2673674 1.4204270
## 612 2.56548205 Present 1.135419e-02 0.4836939 0.6425535
## 613 2.56548205 Present 1.135419e-02 1.3602472 1.5133068
## 614 2.56548205 Present 1.135419e-02 1.0583878 1.2172474
## 615 2.56548205 Present 1.135419e-02 1.8246463 1.9718059
## 616 2.56548205 Present 1.135419e-02 1.1802926 1.3274521
## 617 2.56548205 Present 1.135419e-02 0.5939887 0.7411483
## 618 2.56548205 Present 1.135419e-02 0.6346236 0.7817832
## 619 2.56548205 Present 1.135419e-02 0.3908141 0.5438737
## 620 2.56548205 Present 1.135419e-02 0.4894989 0.6425585
## 621 2.56548205 Present 1.135419e-02 0.5127189 0.6540784
## 622 2.56548205 Present 1.135419e-02 0.5475488 0.6889084
## 623 2.56548205 Present 1.135419e-02 1.1977075 1.3448671
## 624 2.56548205 Present 1.135419e-02 1.3660522 1.5191118
## 625 2.56548205 Present 1.135419e-02 0.6520386 0.8050982
## 626 2.56548205 Present 1.135419e-02 0.6868685 0.8399281
## 627 1.30448816 Present 4.551383e-03 1.7727829 1.8513990
## 628 1.30448816 Present 4.551383e-03 0.7975449 0.8761610
## 629 1.30448816 Present 4.551383e-03 0.6001753 0.6787914
## 630 1.30448816 Present 4.551383e-03 0.8033499 0.8935660
## 631 1.30448816 Present 4.551383e-03 0.5769553 0.6613714
## 632 1.30448816 Present 4.551383e-03 1.0877943 1.1722104
## 633 1.30448816 Present 4.551383e-03 0.5711503 0.6729664
## 634 1.30448816 Present 4.551383e-03 0.4666605 0.5568766
## 635 1.30448816 Present 4.551383e-03 0.5072954 0.5975115
## 636 1.30448816 Present 4.551383e-03 0.7511050 0.8413211
## 637 1.30448816 Present 4.551383e-03 0.5363204 0.6323365
## 638 1.30448816 Present 4.551383e-03 0.5537354 0.6555515
## 639 1.30448816 Present 4.551383e-03 0.8555948 0.9574109
## 640 1.30448816 Present 4.551383e-03 0.5014904 0.5975065
## 641 1.30448816 Present 4.551383e-03 0.5479303 0.6497464
## 642 1.30448816 Present 4.551383e-03 0.8730098 0.9806259
## 643 1.30448816 Present 4.551383e-03 0.9774995 1.0735156
## 644 1.30448816 Present 4.551383e-03 0.7975449 0.8935610
## 645 1.30448816 Present 4.551383e-03 0.7104700 0.8006861
## 646 1.30448816 Present 4.551383e-03 2.4693816 2.5537977
## 647 1.30448816 Present 4.551383e-03 0.7685199 0.8471360
## 648 1.30448816 Present 4.551383e-03 0.7162750 0.8064911
## 649 1.30448816 Present 4.551383e-03 0.4550505 0.5278666
## 650 1.30448816 Present 4.551383e-03 0.5595404 0.6439565
## 651 1.30448816 Present 4.551383e-03 0.5653454 0.6555615
## 652 1.30448816 Present 4.551383e-03 1.0529644 1.1489805
## 653 1.30448816 Present 4.551383e-03 0.7104700 0.8064861
## 654 1.30448816 Present 4.551383e-03 0.3853907 0.4872068
## 655 1.30448816 Present 4.551383e-03 0.3853906 0.4930067
## 656 1.30448816 Present 4.551383e-03 0.4318306 0.5278467
## 657 0.03422405 Present 1.392803e-03 0.6435626 0.7369268
## 658 0.03422405 Present 1.392803e-03 0.7248324 0.8297966
## 659 0.03422405 Present 1.392803e-03 1.1892315 1.2883957
## 660 0.03422405 Present 1.392803e-03 0.8002973 0.8994615
## 661 0.03422405 Present 1.392803e-03 0.9802519 1.0852161
## 662 0.03422405 Present 1.392803e-03 0.7132225 0.8123866
## 663 0.03422405 Present 1.392803e-03 2.5592089 2.6641730
## 664 0.03422405 Present 1.392803e-03 8.6080070 8.7129712
## 665 0.03422405 Present 1.392803e-03 1.6188007 1.7063649
## 666 0.03422405 Present 1.392803e-03 3.5344469 3.6278111
## 667 0.03422405 Present 1.392803e-03 1.2821113 1.3812755
## 668 0.03422405 Present 1.392803e-03 0.9222021 1.0213662
## 669 0.03422405 Present 1.392803e-03 0.7016125 0.8007766
## 670 0.03422405 Present 1.392803e-03 6.9187553 7.0237195
## 671 0.03422405 Present 1.392803e-03 1.7755354 1.8746996
## 672 0.03422405 Present 1.392803e-03 1.2066465 1.3058107
## 673 0.03422405 Present 1.392803e-03 3.9756261 4.0805903
## 674 0.03422405 Present 1.392803e-03 0.7886873 0.8878515
## 675 0.03422405 Present 1.392803e-03 1.0615218 1.1606859
## 676 0.03422405 Present 1.392803e-03 3.8014764 3.9064406
## 677 0.03422405 Present 1.392803e-03 0.7886873 0.8878515
## 678 0.03422405 Present 1.392803e-03 0.7480524 0.8472166
## 679 0.03422405 Present 1.392803e-03 0.8873721 0.9923363
## 680 0.03422405 Present 1.392803e-03 0.6958075 0.8007717
## 681 0.03422405 Present 1.392803e-03 1.0266918 1.1316560
## 682 0.03422405 Present 1.392803e-03 0.6841975 0.7891617
## 683 0.03422405 Present 1.392803e-03 0.7364424 0.8356066
## 684 0.03422405 Present 1.392803e-03 0.7364424 0.8414066
## 685 0.03422405 Present 1.392803e-03 0.5506828 0.6556469
## 686 0.03422405 Present 1.392803e-03 0.7770773 0.8762415
## 687 2.77414302 Present 1.107709e-03 0.8582658 0.9558773
## 688 2.77414302 Present 1.107709e-03 0.8002159 0.8978274
## 689 2.77414302 Present 1.107709e-03 1.2413950 1.3332065
## 690 2.77414302 Present 1.107709e-03 1.0440254 1.1358369
## 691 2.77414302 Present 1.107709e-03 1.1252953 1.2229067
## 692 2.77414302 Present 1.107709e-03 0.9569506 1.0545621
## 693 2.77414302 Present 1.107709e-03 1.0498304 1.1474419
## 694 2.77414302 Present 1.107709e-03 1.0382204 1.1358319
## 695 2.77414302 Present 1.107709e-03 0.8118259 0.9094373
## 696 2.77414302 Present 1.107709e-03 0.6667012 0.7643126
## 697 2.77414302 Present 1.107709e-03 0.8872907 0.9791022
## 698 2.77414302 Present 1.107709e-03 0.5331864 0.6307979
## 699 2.77414302 Present 1.107709e-03 0.5564064 0.6540178
## 700 2.77414302 Present 1.107709e-03 0.8698758 0.9732872
## 701 2.77414302 Present 1.107709e-03 0.4228916 0.5205031
## 702 2.77414302 Present 1.107709e-03 0.6492862 0.7526977
## 703 2.77414302 Present 1.107709e-03 0.7479710 0.8513825
## 704 2.77414302 Present 1.107709e-03 1.2994449 1.4028564
## 705 2.77414302 Present 1.107709e-03 0.5099665 0.6133779
## 706 2.77414302 Present 1.107709e-03 0.6957261 0.7991376
## 707 2.77414302 Present 1.107709e-03 0.4461116 0.5495231
## 708 2.77414302 Present 1.107709e-03 0.7421660 0.8455775
## 709 2.77414302 Present 1.107709e-03 0.5680163 0.6714278
## 710 2.77414302 Present 1.107709e-03 1.0208055 1.1184169
## 711 2.77414302 Present 1.107709e-03 0.7421660 0.8397775
## 712 2.77414302 Present 1.107709e-03 1.8218939 1.9195054
## 713 2.77414302 Present 1.107709e-03 1.1949551 1.2867666
## 714 2.77414302 Present 1.107709e-03 1.4329597 1.5305711
## 715 2.77414302 Present 1.107709e-03 1.0556354 1.1474469
## 716 2.77414302 Present 1.107709e-03 0.9569506 1.0429621
## 717 0.91867626 Present -1.119391e-03 0.5752662 0.7161510
## 718 0.91867626 Present -1.119391e-03 0.6042912 0.7393759
## 719 0.91867626 Present -1.119391e-03 0.5288263 0.6639111
## 720 0.91867626 Present -1.119391e-03 0.8190758 0.9425605
## 721 0.91867626 Present -1.119391e-03 0.6100962 0.7509809
## 722 0.91867626 Present -1.119391e-03 0.6159012 0.7509859
## 723 0.91867626 Present -1.119391e-03 0.5404363 0.6755210
## 724 0.91867626 Present -1.119391e-03 0.5752662 0.6987510
## 725 0.91867626 Present -1.119391e-03 0.5752662 0.6987510
## 726 0.91867626 Present -1.119391e-03 0.7029760 0.8206607
## 727 0.91867626 Present -1.119391e-03 0.5868762 0.7103609
## 728 0.91867626 Present -1.119391e-03 0.5810712 0.7103560
## 729 0.91867626 Present -1.119391e-03 0.5752662 0.7045510
## 730 0.91867626 Present -1.119391e-03 0.6100962 0.7277809
## 731 0.91867626 Present -1.119391e-03 0.7436109 0.8612956
## 732 0.91867626 Present -1.119391e-03 0.6449261 0.7684108
## 733 0.91867626 Present -1.119391e-03 0.7087810 0.8322657
## 734 0.91867626 Present -1.119391e-03 0.6217061 0.7451909
## 735 0.91867626 Present -1.119391e-03 0.7145860 0.8322707
## 736 0.91867626 Present -1.119391e-03 0.6391211 0.7626058
## 737 0.91867626 Present -1.119391e-03 0.6042912 0.7335759
## 738 0.91867626 Present -1.119391e-03 0.6913660 0.8148507
## 739 0.91867626 Present -1.119391e-03 0.6159012 0.7393859
## 740 0.91867626 Present -1.119391e-03 0.5462413 0.6639260
## 741 0.91867626 Present -1.119391e-03 0.5752662 0.6929510
## 742 0.91867626 Present -1.119391e-03 0.7784408 0.8961256
## 743 0.91867626 Present -1.119391e-03 0.6681461 0.7858308
## 744 0.91867626 Present -1.119391e-03 0.5462413 0.6581260
## 745 0.91867626 Present -1.119391e-03 0.6449261 0.7626108
## 746 0.91867626 Present -1.119391e-03 0.4707764 0.5826612
## 747 1.58074221 Present 3.668114e-04 0.8518070 0.9520811
## 748 1.58074221 Present 3.668114e-04 0.7589272 0.8534013
## 749 1.58074221 Present 3.668114e-04 0.7182923 0.8127664
## 750 1.58074221 Present 3.668114e-04 1.4961608 1.6022348
## 751 1.58074221 Present 3.668114e-04 0.6776574 0.7663314
## 752 1.58074221 Present 3.668114e-04 0.6660474 0.7721215
## 753 1.58074221 Present 3.668114e-04 0.6486324 0.7547065
## 754 1.58074221 Present 3.668114e-04 0.6776574 0.7779314
## 755 1.58074221 Present 3.668114e-04 0.8750270 0.9753010
## 756 1.58074221 Present 3.668114e-04 1.1710814 1.2713555
## 757 1.58074221 Present 3.668114e-04 1.7573853 1.8402593
## 758 1.58074221 Present 3.668114e-04 0.7182923 0.8243664
## 759 1.58074221 Present 3.668114e-04 0.6138025 0.7256766
## 760 1.58074221 Present 3.668114e-04 0.5383377 0.6560117
## 761 1.58074221 Present 3.668114e-04 0.6834624 0.8185364
## 762 1.58074221 Present 3.668114e-04 0.6079975 0.7372716
## 763 1.58074221 Present 3.668114e-04 0.6196075 0.7604815
## 764 1.58074221 Present 3.668114e-04 0.5905826 0.7314566
## 765 1.58074221 Present 3.668114e-04 0.6660474 0.8069215
## 766 1.58074221 Present 3.668114e-04 0.7008773 0.8417514
## 767 1.58074221 Present 3.668114e-04 0.6196075 0.7604815
## 768 1.58074221 Present 3.668114e-04 0.6021925 0.7430666
## 769 1.58074221 Present 3.668114e-04 0.6370225 0.7778965
## 770 1.58074221 Present 3.668114e-04 0.4860928 0.6211668
## 771 1.58074221 Present 3.668114e-04 0.6079975 0.7430716
## 772 1.58074221 Present 3.668114e-04 0.5325327 0.6676067
## 773 1.58074221 Present 3.668114e-04 0.6602424 0.7953165
## 774 1.58074221 Present 3.668114e-04 0.6544374 0.7953115
## 775 1.58074221 Present 3.668114e-04 0.7357073 0.8823813
## 776 1.58074221 Present 3.668114e-04 0.6544374 0.8069115
## 777 2.15860551 Present -7.541050e-04 1.0524200 1.1442742
## 778 2.15860551 Present -7.541050e-04 0.6170459 0.7031001
## 779 2.15860551 Present -7.541050e-04 0.5706060 0.6624602
## 780 2.15860551 Present -7.541050e-04 0.6692908 0.7611450
## 781 2.15860551 Present -7.541050e-04 0.8782704 0.9643246
## 782 2.15860551 Present -7.541050e-04 0.7505606 0.8366148
## 783 2.15860551 Present -7.541050e-04 2.8809915 2.9670456
## 784 2.15860551 Present -7.541050e-04 1.1452998 1.2255540
## 785 2.15860551 Present -7.541050e-04 0.8782704 0.9701246
## 786 2.15860551 Present -7.541050e-04 1.2149597 1.3068139
## 787 2.15860551 Present -7.541050e-04 3.7865697 3.8900239
## 788 2.15860551 Present -7.541050e-04 6.8574087 6.9492629
## 789 2.15860551 Present -7.541050e-04 0.9711502 1.0572044
## 790 2.15860551 Present -7.541050e-04 0.7041207 0.8017749
## 791 2.15860551 Present -7.541050e-04 0.6692908 0.7669450
## 792 2.15860551 Present -7.541050e-04 0.5589960 0.6624502
## 793 2.15860551 Present -7.541050e-04 0.7853905 0.8830447
## 794 2.15860551 Present -7.541050e-04 0.7795856 0.8656398
## 795 2.15860551 Present -7.541050e-04 0.7273407 0.8133949
## 796 2.15860551 Present -7.541050e-04 0.6518758 0.7379300
## 797 2.15860551 Present -7.541050e-04 1.1859348 1.2777890
## 798 2.15860551 Present -7.541050e-04 0.9943701 1.0862243
## 799 2.15860551 Present -7.541050e-04 0.6054359 0.7030901
## 800 2.15860551 Present -7.541050e-04 1.1394949 1.2371490
## 801 2.15860551 Present -7.541050e-04 0.7621706 0.8540248
## 802 2.15860551 Present -7.541050e-04 0.6576808 0.7553350
## 803 2.15860551 Present -7.541050e-04 1.1569098 1.2487640
## 804 2.15860551 Present -7.541050e-04 0.6809008 0.7669549
## 805 2.15860551 Present -7.541050e-04 0.6112409 0.7030951
## 806 2.15860551 Present -7.541050e-04 0.6750958 0.7611500
## 807 3.30919395 Present -1.996595e-03 0.7016405 0.7808275
## 808 3.30919395 Present -1.996595e-03 0.7016405 0.7866275
## 809 3.30919395 Present -1.996595e-03 0.4636359 0.5428230
## 810 3.30919395 Present -1.996595e-03 0.6029557 0.6821427
## 811 3.30919395 Present -1.996595e-03 0.5681257 0.6589128
## 812 3.30919395 Present -1.996595e-03 0.4984659 0.5776529
## 813 3.30919395 Present -1.996595e-03 0.6203706 0.6995577
## 814 3.30919395 Present -1.996595e-03 0.6784205 0.7634076
## 815 3.30919395 Present -1.996595e-03 0.4926609 0.5776479
## 816 3.30919395 Present -1.996595e-03 0.6261756 0.7053627
## 817 3.30919395 Present -1.996595e-03 0.8003253 0.8795123
## 818 3.30919395 Present -1.996595e-03 0.7016405 0.7808275
## 819 3.30919395 Present -1.996595e-03 0.4520260 0.5312130
## 820 3.30919395 Present -1.996595e-03 0.6552006 0.7285876
## 821 3.30919395 Present -1.996595e-03 0.5100759 0.5892629
## 822 3.30919395 Present -1.996595e-03 0.6900305 0.7692175
## 823 3.30919395 Present -1.996595e-03 0.4752459 0.5486329
## 824 3.30919395 Present -1.996595e-03 0.4462210 0.5254080
## 825 3.30919395 Present -1.996595e-03 0.6377856 0.7169726
## 826 3.30919395 Present -1.996595e-03 0.6493956 0.7285826
## 827 3.30919395 Present -1.996595e-03 0.5449058 0.6182928
## 828 3.30919395 Present -1.996595e-03 0.6784205 0.7518076
## 829 3.30919395 Present -1.996595e-03 0.4578310 0.5370180
## 830 3.30919395 Present -1.996595e-03 0.5623208 0.6357078
## 831 3.30919395 Present -1.996595e-03 0.5623208 0.6357078
## 832 3.30919395 Present -1.996595e-03 0.7364704 0.8156574
## 833 3.30919395 Present -1.996595e-03 0.4694409 0.5428280
## 834 3.30919395 Present -1.996595e-03 0.7132505 0.7866375
## 835 3.30919395 Present -1.996595e-03 0.4694409 0.5428280
## 836 3.30919395 Present -1.996595e-03 0.4694409 0.5428280
## 837 0.00000000 Absent -2.389550e-03 0.5463507 0.6572110
## 838 0.00000000 Absent -2.389550e-03 0.5405457 0.6514060
## 839 0.00000000 Absent -2.389550e-03 0.5985956 0.7210559
## 840 0.00000000 Absent -2.389550e-03 0.5927906 0.7094509
## 841 0.00000000 Absent -2.389550e-03 0.6972804 0.8255407
## 842 0.00000000 Absent -2.389550e-03 0.8017702 0.9184305
## 843 0.00000000 Absent -2.389550e-03 0.5637657 0.6804259
## 844 0.00000000 Absent -2.389550e-03 0.5115208 0.6397810
## 845 0.00000000 Absent -2.389550e-03 0.5521557 0.6804160
## 846 0.00000000 Absent -2.389550e-03 0.5521557 0.6514160
## 847 0.00000000 Absent -2.389550e-03 0.6044006 0.7036609
## 848 0.00000000 Absent -2.389550e-03 0.5753756 0.6746359
## 849 0.00000000 Absent -2.389550e-03 0.5463507 0.6514110
## 850 0.00000000 Absent -2.389550e-03 0.5173257 0.6107860
## 851 0.00000000 Absent -2.389550e-03 0.5521557 0.6804160
## 852 0.00000000 Absent -2.389550e-03 0.5521557 0.6862160
## 853 0.00000000 Absent -2.389550e-03 0.5405457 0.6746060
## 854 0.00000000 Absent -2.389550e-03 0.5695706 0.6978309
## 855 0.00000000 Absent -2.389550e-03 0.5347407 0.6572010
## 856 0.00000000 Absent -2.389550e-03 0.5869856 0.7152459
## 857 0.00000000 Absent -2.389550e-03 0.5115208 0.6397810
## 858 0.00000000 Absent -2.389550e-03 0.6044006 0.7326609
## 859 0.00000000 Absent -2.389550e-03 1.9685729 2.0910332
## 860 0.00000000 Absent -2.389550e-03 0.6566455 0.7733058
## 861 0.00000000 Absent -2.389550e-03 0.7727452 0.8836055
## 862 0.00000000 Absent -2.389550e-03 0.6044006 0.7210609
## 863 0.00000000 Absent -2.389550e-03 0.5927906 0.7094509
## 864 0.00000000 Absent -2.389550e-03 0.5811806 0.7036409
## 865 0.00000000 Absent -2.389550e-03 0.6856704 0.8081307
## 866 0.00000000 Absent -2.389550e-03 0.6102056 0.7326658
## 867 0.00000000 Absent -1.671292e-03 0.8814043 0.9948631
## 868 0.00000000 Absent -1.671292e-03 0.6375948 0.7510536
## 869 0.00000000 Absent -1.671292e-03 0.5969599 0.7162187
## 870 0.00000000 Absent -1.671292e-03 0.8639894 0.9774482
## 871 0.00000000 Absent -1.671292e-03 0.8175495 0.9368083
## 872 0.00000000 Absent -1.671292e-03 0.5389100 0.6523688
## 873 0.00000000 Absent -1.671292e-03 0.7711096 0.8845683
## 874 0.00000000 Absent -1.671292e-03 1.2006787 1.3083375
## 875 0.00000000 Absent -1.671292e-03 1.3690234 1.4824822
## 876 0.00000000 Absent -1.671292e-03 0.8639894 0.9658482
## 877 0.00000000 Absent -1.671292e-03 0.7885245 0.8845833
## 878 0.00000000 Absent -1.671292e-03 0.7420846 0.8381434
## 879 0.00000000 Absent -1.671292e-03 0.7420846 0.8555434
## 880 0.00000000 Absent -1.671292e-03 0.7072547 0.8207135
## 881 0.00000000 Absent -1.671292e-03 1.6128329 1.7378917
## 882 0.00000000 Absent -1.671292e-03 0.6201799 0.7336386
## 883 0.00000000 Absent -1.671292e-03 0.6085699 0.7278287
## 884 0.00000000 Absent -1.671292e-03 0.6433998 0.7510586
## 885 0.00000000 Absent -1.671292e-03 0.7420846 0.8555434
## 886 0.00000000 Absent -1.671292e-03 0.5563250 0.6813838
## 887 0.00000000 Absent -1.671292e-03 0.7711096 0.8845683
## 888 0.00000000 Absent -1.671292e-03 0.5853499 0.6988087
## 889 0.00000000 Absent -1.671292e-03 0.5505200 0.6581788
## 890 0.00000000 Absent -1.671292e-03 0.6259848 0.7394436
## 891 0.00000000 Absent -1.671292e-03 0.5563250 0.6755838
## 892 0.00000000 Absent -1.671292e-03 0.6608148 0.7800736
## 893 0.00000000 Absent -1.671292e-03 0.7943295 0.9019883
## 894 0.00000000 Absent -1.671292e-03 0.6433998 0.7568586
## 895 0.00000000 Absent -1.671292e-03 0.5621300 0.6697888
## 896 0.00000000 Absent -1.671292e-03 1.1948737 1.3083325
## 897 2.07042616 Present -1.557811e-03 0.6194167 0.6959625
## 898 2.07042616 Present -1.557811e-03 0.5323419 0.6030877
## 899 2.07042616 Present -1.557811e-03 0.7413215 0.8062673
## 900 2.07042616 Present -1.557811e-03 0.6832716 0.7540174
## 901 2.07042616 Present -1.557811e-03 0.6194167 0.6901625
## 902 2.07042616 Present -1.557811e-03 0.7006865 0.7714324
## 903 2.07042616 Present -1.557811e-03 0.8225913 0.8875371
## 904 2.07042616 Present -1.557811e-03 0.6600516 0.7481974
## 905 2.07042616 Present -1.557811e-03 0.5381469 0.6088927
## 906 2.07042616 Present -1.557811e-03 0.5903918 0.6611376
## 907 2.07042616 Present -1.557811e-03 0.7122965 0.7830423
## 908 2.07042616 Present -1.557811e-03 0.5555618 0.6263076
## 909 2.07042616 Present -1.557811e-03 0.7355165 0.8004623
## 910 2.07042616 Present -1.557811e-03 0.5265369 0.5972827
## 911 2.07042616 Present -1.557811e-03 1.0896208 1.1545666
## 912 2.07042616 Present -1.557811e-03 0.5033169 0.5682627
## 913 2.07042616 Present -1.557811e-03 0.6426367 0.7075825
## 914 2.07042616 Present -1.557811e-03 0.6484417 0.7133875
## 915 2.07042616 Present -1.557811e-03 0.5787818 0.6495276
## 916 2.07042616 Present -1.557811e-03 0.5265369 0.5972827
## 917 2.07042616 Present -1.557811e-03 0.9386911 1.0094369
## 918 2.07042616 Present -1.557811e-03 0.6600516 0.7249974
## 919 2.07042616 Present -1.557811e-03 0.8458113 0.9107571
## 920 2.07042616 Present -1.557811e-03 0.5671718 0.6379176
## 921 2.07042616 Present -1.557811e-03 0.7819564 0.8527022
## 922 2.07042616 Present -1.557811e-03 1.0489859 1.1139317
## 923 2.07042616 Present -1.557811e-03 1.4205051 1.4912510
## 924 2.07042616 Present -1.557811e-03 4.6654938 4.7246396
## 925 2.07042616 Present -1.557811e-03 0.9619110 1.0210568
## 926 2.07042616 Present -1.557811e-03 0.6832716 0.7424174
## 927 1.45809975 Present 4.161782e-03 1.1304465 1.2423205
## 928 1.45809975 Present 4.161782e-03 0.6660474 0.7605215
## 929 1.45809975 Present 4.161782e-03 0.5905826 0.7024566
## 930 1.45809975 Present 4.161782e-03 1.5716256 1.6776997
## 931 1.45809975 Present 4.161782e-03 1.1420565 1.2365305
## 932 1.45809975 Present 4.161782e-03 1.0317617 1.1204357
## 933 1.45809975 Present 4.161782e-03 0.5789726 0.6676466
## 934 1.45809975 Present 4.161782e-03 0.8576120 0.9462861
## 935 1.45809975 Present 4.161782e-03 0.5151177 0.6037917
## 936 1.45809975 Present 4.161782e-03 0.6079975 0.6966716
## 937 1.45809975 Present 4.161782e-03 0.8460021 0.9346761
## 938 1.45809975 Present 4.161782e-03 0.7473172 0.8301913
## 939 1.45809975 Present 4.161782e-03 0.9562968 1.0449709
## 940 1.45809975 Present 4.161782e-03 1.2001064 1.2829804
## 941 1.45809975 Present 4.161782e-03 0.5731676 0.6444416
## 942 1.45809975 Present 4.161782e-03 0.5847776 0.6676516
## 943 1.45809975 Present 4.161782e-03 1.3045962 1.3874702
## 944 1.45809975 Present 4.161782e-03 0.7763422 0.8418162
## 945 1.45809975 Present 4.161782e-03 0.6312175 0.7082915
## 946 1.45809975 Present 4.161782e-03 0.9679068 1.0449809
## 947 1.45809975 Present 4.161782e-03 0.6254125 0.7024865
## 948 1.45809975 Present 4.161782e-03 0.5325327 0.6212067
## 949 1.45809975 Present 4.161782e-03 0.7589272 0.8360013
## 950 1.45809975 Present 4.161782e-03 0.8924420 0.9579160
## 951 1.45809975 Present 4.161782e-03 0.7879522 0.8592262
## 952 1.45809975 Present 4.161782e-03 0.5905826 0.6618566
## 953 1.45809975 Present 4.161782e-03 0.7008773 0.7837514
## 954 1.45809975 Present 4.161782e-03 1.6470905 1.7299645
## 955 1.45809975 Present 4.161782e-03 0.8924420 0.9637160
## 956 1.45809975 Present 4.161782e-03 0.9795168 1.0449908
## 957 1.99017430 Present -6.636891e-03 0.5971507 0.6705377
## 958 1.99017430 Present -6.636891e-03 0.5565158 0.6879028
## 959 1.99017430 Present -6.636891e-03 0.4868559 0.6182429
## 960 1.99017430 Present -6.636891e-03 0.5855407 0.7227277
## 961 1.99017430 Present -6.636891e-03 0.6377856 0.7285726
## 962 1.99017430 Present -6.636891e-03 2.2399625 2.3423495
## 963 1.99017430 Present -6.636891e-03 0.6726155 0.8040026
## 964 1.99017430 Present -6.636891e-03 0.7074455 0.8504325
## 965 1.99017430 Present -6.636891e-03 0.5332958 0.6646828
## 966 1.99017430 Present -6.636891e-03 0.9106201 1.0420071
## 967 1.99017430 Present -6.636891e-03 0.6087607 0.7401477
## 968 1.99017430 Present -6.636891e-03 0.5216858 0.6530729
## 969 1.99017430 Present -6.636891e-03 0.5391008 0.6704878
## 970 1.99017430 Present -6.636891e-03 0.5449058 0.6762928
## 971 1.99017430 Present -6.636891e-03 0.6493956 0.7749826
## 972 1.99017430 Present -6.636891e-03 0.6435906 0.7749776
## 973 1.99017430 Present -6.636891e-03 0.6203706 0.7575577
## 974 1.99017430 Present -6.636891e-03 0.8293502 0.9665373
## 975 1.99017430 Present -6.636891e-03 0.4926609 0.6240479
## 976 1.99017430 Present -6.636891e-03 0.6319806 0.7691676
## 977 1.99017430 Present -6.636891e-03 0.5332958 0.6704828
## 978 1.99017430 Present -6.636891e-03 6.9942482 7.1256352
## 979 1.99017430 Present -6.636891e-03 1.1602346 1.2684216
## 980 1.99017430 Present -6.636891e-03 1.9032731 2.0288602
## 981 1.99017430 Present -6.636891e-03 0.7364704 0.8620574
## 982 1.99017430 Present -6.636891e-03 0.9280350 1.0594221
## 983 1.99017430 Present -6.636891e-03 0.9686700 1.1058570
## 984 1.99017430 Present -6.636891e-03 1.5723888 1.7037758
## 985 1.99017430 Present -6.636891e-03 1.0847697 1.2103568
## 986 1.99017430 Present -6.636891e-03 0.7422754 0.8736624
## 987 1.88336533 Present 3.606332e-04 0.6336163 0.7624048
## 988 1.88336533 Present 3.606332e-04 0.7439111 0.8784996
## 989 1.88336533 Present 3.606332e-04 0.6916662 0.8204547
## 990 1.88336533 Present 3.606332e-04 0.6626412 0.7798298
## 991 1.88336533 Present 3.606332e-04 0.8774258 0.9946144
## 992 1.88336533 Present 3.606332e-04 0.7729360 0.9017246
## 993 1.88336533 Present 3.606332e-04 0.7032762 0.8262647
## 994 1.88336533 Present 3.606332e-04 0.9935256 1.1049141
## 995 1.88336533 Present 3.606332e-04 0.6568363 0.7798248
## 996 1.88336533 Present 3.606332e-04 0.6510313 0.7740198
## 997 1.88336533 Present 3.606332e-04 0.7729360 0.8959246
## 998 1.88336533 Present 3.606332e-04 0.6452263 0.7798148
## 999 1.88336533 Present 3.606332e-04 0.7206911 0.8494797
## 1000 1.88336533 Present 3.606332e-04 0.7729360 0.8959246
## 1001 1.88336533 Present 3.606332e-04 0.6510313 0.7740198
## 1002 1.88336533 Present 3.606332e-04 0.6684462 0.7914348
## 1003 1.88336533 Present 3.606332e-04 0.6452263 0.7682148
## 1004 1.88336533 Present 3.606332e-04 0.6568363 0.7798248
## 1005 1.88336533 Present 3.606332e-04 0.6510313 0.7740198
## 1006 1.88336533 Present 3.606332e-04 0.7613261 0.8901146
## 1007 1.88336533 Present 3.606332e-04 1.1850902 1.3138788
## 1008 1.88336533 Present 3.606332e-04 0.6684462 0.7972348
## 1009 1.88336533 Present 3.606332e-04 0.8600109 0.9887994
## 1010 1.88336533 Present 3.606332e-04 0.7206911 0.8436797
## 1011 1.88336533 Present 3.606332e-04 0.8309859 0.9481744
## 1012 1.88336533 Present 3.606332e-04 0.6916662 0.8146547
## 1013 1.88336533 Present 3.606332e-04 0.8716208 1.0004094
## 1014 1.88336533 Present 3.606332e-04 0.8484009 0.9713894
## 1015 1.88336533 Present 3.606332e-04 0.7032762 0.8204647
## 1016 1.88336533 Present 3.606332e-04 0.8193759 0.9365645
## 1017 2.67819504 Present -2.107540e-04 0.6553100 0.7508725
## 1018 2.67819504 Present -2.107540e-04 0.7075549 0.8089174
## 1019 2.67819504 Present -2.107540e-04 0.7539948 0.8553574
## 1020 2.67819504 Present -2.107540e-04 0.8120447 0.9134072
## 1021 2.67819504 Present -2.107540e-04 0.7075549 0.8089174
## 1022 2.67819504 Present -2.107540e-04 0.7249698 0.8263324
## 1023 2.67819504 Present -2.107540e-04 0.8526796 0.9540422
## 1024 2.67819504 Present -2.107540e-04 0.8642896 0.9598521
## 1025 2.67819504 Present -2.107540e-04 0.7249698 0.8205324
## 1026 2.67819504 Present -2.107540e-04 1.0152193 1.1107818
## 1027 2.67819504 Present -2.107540e-04 0.8004347 0.8959973
## 1028 2.67819504 Present -2.107540e-04 0.7772147 0.8785773
## 1029 2.67819504 Present -2.107540e-04 0.8294596 0.9250222
## 1030 2.67819504 Present -2.107540e-04 0.7656048 0.8611673
## 1031 2.67819504 Present -2.107540e-04 0.6727249 0.7682875
## 1032 2.67819504 Present -2.107540e-04 0.6901399 0.7915025
## 1033 2.67819504 Present -2.107540e-04 0.6088701 0.7102326
## 1034 2.67819504 Present -2.107540e-04 0.8468746 0.9482372
## 1035 2.67819504 Present -2.107540e-04 0.7539948 0.8495574
## 1036 2.67819504 Present -2.107540e-04 0.7888247 0.8901873
## 1037 2.67819504 Present -2.107540e-04 0.8294596 0.9250222
## 1038 2.67819504 Present -2.107540e-04 0.7481898 0.8553524
## 1039 2.67819504 Present -2.107540e-04 0.7307748 0.8379374
## 1040 2.67819504 Present -2.107540e-04 0.7656047 0.8669673
## 1041 2.67819504 Present -2.107540e-04 0.7481898 0.8495524
## 1042 2.67819504 Present -2.107540e-04 0.7656048 0.8611673
## 1043 2.67819504 Present -2.107540e-04 0.6843349 0.7856975
## 1044 2.67819504 Present -2.107540e-04 1.1429290 1.2500916
## 1045 2.67819504 Present -2.107540e-04 0.7772147 0.8727773
## 1046 2.67819504 Present -2.107540e-04 0.8584846 0.9598471
## 1047 0.66059021 Present -2.359032e-03 0.7551395 0.8770715
## 1048 0.66059021 Present -2.359032e-03 0.7783594 0.9002915
## 1049 0.66059021 Present -2.359032e-03 0.8712393 0.9931713
## 1050 0.66059021 Present -2.359032e-03 0.8944592 1.0163913
## 1051 0.66059021 Present -2.359032e-03 0.6854796 0.8074117
## 1052 0.66059021 Present -2.359032e-03 0.6506497 0.7783817
## 1053 0.66059021 Present -2.359032e-03 0.7899694 0.9177015
## 1054 0.66059021 Present -2.359032e-03 1.2195386 1.3472706
## 1055 0.66059021 Present -2.359032e-03 0.6970896 0.8132216
## 1056 0.66059021 Present -2.359032e-03 0.8538243 0.9699563
## 1057 0.66059021 Present -2.359032e-03 0.6622597 0.7725917
## 1058 0.66059021 Present -2.359032e-03 0.9467041 1.0628362
## 1059 0.66059021 Present -2.359032e-03 0.6448447 0.7609767
## 1060 0.66059021 Present -2.359032e-03 0.7551395 0.8654715
## 1061 0.66059021 Present -2.359032e-03 0.6796746 0.7958067
## 1062 0.66059021 Present -2.359032e-03 1.2079286 1.3240606
## 1063 0.66059021 Present -2.359032e-03 0.6912846 0.8074167
## 1064 0.66059021 Present -2.359032e-03 0.6680647 0.7841967
## 1065 0.66059021 Present -2.359032e-03 1.1266588 1.2427908
## 1066 0.66059021 Present -2.359032e-03 1.1789037 1.2950357
## 1067 0.66059021 Present -2.359032e-03 0.7261145 0.8422466
## 1068 0.66059021 Present -2.359032e-03 0.7725545 0.8770865
## 1069 0.66059021 Present -2.359032e-03 0.7899694 0.9003015
## 1070 0.66059021 Present -2.359032e-03 1.1034388 1.2137709
## 1071 0.66059021 Present -2.359032e-03 0.6622597 0.7667917
## 1072 0.66059021 Present -2.359032e-03 0.9467041 1.0570362
## 1073 0.66059021 Present -2.359032e-03 0.6738697 0.7842017
## 1074 0.66059021 Present -2.359032e-03 0.9118742 1.0164062
## 1075 0.66059021 Present -2.359032e-03 0.6506497 0.7551817
## 1076 0.66059021 Present -2.359032e-03 0.7261145 0.8422466
## 1077 0.98652680 Present -2.294994e-03 0.6634044 0.7885059
## 1078 0.98652680 Present -2.294994e-03 0.8317491 0.9626506
## 1079 0.98652680 Present -2.294994e-03 0.7620892 0.8987907
## 1080 0.98652680 Present -2.294994e-03 0.8143341 0.9510356
## 1081 0.98652680 Present -2.294994e-03 0.7562842 0.8987857
## 1082 0.98652680 Present -2.294994e-03 0.7678942 0.9045957
## 1083 0.98652680 Present -2.294994e-03 0.7098443 0.8465458
## 1084 0.98652680 Present -2.294994e-03 0.7678942 0.9161957
## 1085 0.98652680 Present -2.294994e-03 0.6808194 0.8291209
## 1086 0.98652680 Present -2.294994e-03 0.7040393 0.8465408
## 1087 0.98652680 Present -2.294994e-03 0.7214543 0.8639558
## 1088 0.98652680 Present -2.294994e-03 0.6517944 0.8000959
## 1089 0.98652680 Present -2.294994e-03 0.6517944 0.7942959
## 1090 0.98652680 Present -2.294994e-03 0.8665790 1.0148805
## 1091 0.98652680 Present -2.294994e-03 0.7736992 0.9104007
## 1092 0.98652680 Present -2.294994e-03 0.6692094 0.8117109
## 1093 0.98652680 Present -2.294994e-03 1.2613182 1.4096197
## 1094 0.98652680 Present -2.294994e-03 0.7040393 0.8523408
## 1095 0.98652680 Present -2.294994e-03 0.6111595 0.7536610
## 1096 0.98652680 Present -2.294994e-03 0.7562842 0.8987857
## 1097 0.98652680 Present -2.294994e-03 0.6982343 0.8465358
## 1098 0.98652680 Present -2.294994e-03 0.7214543 0.8639558
## 1099 0.98652680 Present -2.294994e-03 0.7853092 0.9336107
## 1100 0.98652680 Present -2.294994e-03 0.7098443 0.8581458
## 1101 0.98652680 Present -2.294994e-03 0.6575994 0.8001009
## 1102 0.98652680 Present -2.294994e-03 1.0058987 1.1484002
## 1103 0.98652680 Present -2.294994e-03 0.7272593 0.8697608
## 1104 0.98652680 Present -2.294994e-03 0.6924293 0.8407308
## 1105 0.98652680 Present -2.294994e-03 0.8607740 1.0032755
## 1106 0.98652680 Present -2.294994e-03 3.6878035 3.8303050
## 1107 0.00000000 Absent -2.587161e-03 0.9886745 1.1027043
## 1108 0.00000000 Absent -2.587161e-03 0.8319399 0.9459696
## 1109 0.00000000 Absent -2.587161e-03 0.8087199 0.9227496
## 1110 0.00000000 Absent -2.587161e-03 0.7622800 0.8821097
## 1111 0.00000000 Absent -2.587161e-03 0.9364296 1.0562594
## 1112 0.00000000 Absent -2.587161e-03 0.8957947 1.0098245
## 1113 0.00000000 Absent -2.587161e-03 1.1337993 1.2420290
## 1114 0.00000000 Absent -2.587161e-03 0.8899897 1.0098195
## 1115 0.00000000 Absent -2.587161e-03 1.0002845 1.1143143
## 1116 0.00000000 Absent -2.587161e-03 0.7274501 0.8472798
## 1117 0.00000000 Absent -2.587161e-03 0.8551598 0.9749895
## 1118 0.00000000 Absent -2.587161e-03 0.6461802 0.7660100
## 1119 0.00000000 Absent -2.587161e-03 0.8493548 0.9633846
## 1120 0.00000000 Absent -2.587161e-03 0.7216451 0.8356748
## 1121 0.00000000 Absent -2.587161e-03 0.7796950 0.8937247
## 1122 0.00000000 Absent -2.587161e-03 0.8377448 0.9633746
## 1123 0.00000000 Absent -2.587161e-03 0.7448650 0.8588948
## 1124 0.00000000 Absent -2.587161e-03 0.9132097 1.0330394
## 1125 0.00000000 Absent -2.587161e-03 0.7971099 0.9169397
## 1126 0.00000000 Absent -2.587161e-03 1.0060895 1.1259193
## 1127 0.00000000 Absent -2.587161e-03 0.7100351 0.8240648
## 1128 0.00000000 Absent -2.587161e-03 0.7971099 0.9111397
## 1129 0.00000000 Absent -2.587161e-03 0.8899897 1.0040195
## 1130 0.00000000 Absent -2.587161e-03 0.8319399 0.9459696
## 1131 0.00000000 Absent -2.587161e-03 0.8899897 1.0040195
## 1132 0.00000000 Absent -2.587161e-03 4.3033231 4.4173528
## 1133 0.00000000 Absent -2.587161e-03 1.2208741 1.3291038
## 1134 0.00000000 Absent -2.587161e-03 0.9364296 1.0504594
## 1135 0.00000000 Absent -2.587161e-03 1.2208741 1.3291038
## 1136 0.00000000 Absent -2.587161e-03 1.0873594 1.2013891
## 1137 2.39347868 Present -2.414906e-03 0.5684259 0.6761167
## 1138 2.39347868 Present -2.414906e-03 0.6322808 0.7457716
## 1139 2.39347868 Present -2.414906e-03 0.6438908 0.7573816
## 1140 2.39347868 Present -2.414906e-03 0.6264758 0.7399666
## 1141 2.39347868 Present -2.414906e-03 0.6380858 0.7515766
## 1142 2.39347868 Present -2.414906e-03 0.5277910 0.6412818
## 1143 2.39347868 Present -2.414906e-03 0.6380858 0.7515766
## 1144 2.39347868 Present -2.414906e-03 0.6090608 0.7225517
## 1145 2.39347868 Present -2.414906e-03 0.5510110 0.6645018
## 1146 2.39347868 Present -2.414906e-03 0.5394010 0.6528918
## 1147 2.39347868 Present -2.414906e-03 0.6903307 0.7980215
## 1148 2.39347868 Present -2.414906e-03 0.5974509 0.7051417
## 1149 2.39347868 Present -2.414906e-03 0.5684259 0.6819167
## 1150 2.39347868 Present -2.414906e-03 0.6264758 0.7341666
## 1151 2.39347868 Present -2.414906e-03 0.5335960 0.6412868
## 1152 2.39347868 Present -2.414906e-03 0.5974509 0.7051417
## 1153 2.39347868 Present -2.414906e-03 0.5742309 0.6877217
## 1154 2.39347868 Present -2.414906e-03 0.6090608 0.7225517
## 1155 2.39347868 Present -2.414906e-03 0.5916459 0.7051367
## 1156 2.39347868 Present -2.414906e-03 0.6090608 0.7225517
## 1157 2.39347868 Present -2.414906e-03 0.6438908 0.7573816
## 1158 2.39347868 Present -2.414906e-03 0.6787207 0.7864115
## 1159 2.39347868 Present -2.414906e-03 0.6090608 0.7167517
## 1160 2.39347868 Present -2.414906e-03 0.7251606 0.8386514
## 1161 2.39347868 Present -2.414906e-03 0.5568159 0.6645068
## 1162 2.39347868 Present -2.414906e-03 0.6032559 0.7109467
## 1163 2.39347868 Present -2.414906e-03 0.6032559 0.7051467
## 1164 2.39347868 Present -2.414906e-03 0.6090608 0.7225517
## 1165 2.39347868 Present -2.414906e-03 0.6032559 0.7109467
## 1166 2.39347868 Present -2.414906e-03 0.5626209 0.6761118
## 1167 0.00000000 Absent 8.286168e-04 0.7390600 0.8820898
## 1168 0.00000000 Absent 8.286168e-04 0.7913049 0.9285347
## 1169 0.00000000 Absent 8.286168e-04 0.8029149 0.9459447
## 1170 0.00000000 Absent 8.286168e-04 0.8725748 1.0098045
## 1171 0.00000000 Absent 8.286168e-04 0.8145249 0.9517546
## 1172 0.00000000 Absent 8.286168e-04 0.7158401 0.8588698
## 1173 0.00000000 Absent 8.286168e-04 0.7564750 0.8937047
## 1174 0.00000000 Absent 8.286168e-04 0.8203299 0.9575596
## 1175 0.00000000 Absent 8.286168e-04 0.6694002 0.8066299
## 1176 0.00000000 Absent 8.286168e-04 0.7216451 0.8646748
## 1177 0.00000000 Absent 8.286168e-04 0.7216451 0.8646748
## 1178 0.00000000 Absent 8.286168e-04 0.6810101 0.8240399
## 1179 0.00000000 Absent 8.286168e-04 0.8783798 1.0272095
## 1180 0.00000000 Absent 8.286168e-04 0.8841847 1.0272145
## 1181 0.00000000 Absent 8.286168e-04 0.8145249 0.9517546
## 1182 0.00000000 Absent 8.286168e-04 0.6461802 0.7834100
## 1183 0.00000000 Absent 8.286168e-04 0.8029149 0.9459447
## 1184 0.00000000 Absent 8.286168e-04 1.1744342 1.3116639
## 1185 0.00000000 Absent 8.286168e-04 0.8435498 0.9749796
## 1186 0.00000000 Absent 8.286168e-04 0.8725748 1.0098045
## 1187 0.00000000 Absent 8.286168e-04 1.0641394 1.2013691
## 1188 0.00000000 Absent 8.286168e-04 0.7622800 0.8995097
## 1189 0.00000000 Absent 8.286168e-04 0.8725748 1.0098045
## 1190 0.00000000 Absent 8.286168e-04 1.0525294 1.1955592
## 1191 0.00000000 Absent 8.286168e-04 0.8203299 0.9633596
## 1192 0.00000000 Absent 8.286168e-04 0.8551598 1.0039895
## 1193 0.00000000 Absent 8.286168e-04 1.0873594 1.2303891
## 1194 0.00000000 Absent 8.286168e-04 0.8087199 0.9459496
## 1195 0.00000000 Absent 8.286168e-04 0.6926201 0.8414499
## 1196 0.00000000 Absent 8.286168e-04 0.8377448 0.9865746
## 1197 1.25485442 Present 5.901674e-04 0.8868558 0.9792809
## 1198 1.25485442 Present 5.901674e-04 0.8230009 0.9212260
## 1199 1.25485442 Present 5.901674e-04 0.9971505 1.0953757
## 1200 1.25485442 Present 5.901674e-04 0.7881710 0.8863961
## 1201 1.25485442 Present 5.901674e-04 0.6430462 0.7354714
## 1202 1.25485442 Present 5.901674e-04 0.7765610 0.8747861
## 1203 1.25485442 Present 5.901674e-04 0.8113909 0.9038161
## 1204 1.25485442 Present 5.901674e-04 0.7417310 0.8399562
## 1205 1.25485442 Present 5.901674e-04 0.8171959 0.9212211
## 1206 1.25485442 Present 5.901674e-04 0.7417310 0.8399562
## 1207 1.25485442 Present 5.901674e-04 0.7010961 0.7935213
## 1208 1.25485442 Present 5.901674e-04 0.6894861 0.7877113
## 1209 1.25485442 Present 5.901674e-04 0.9449056 1.0431308
## 1210 1.25485442 Present 5.901674e-04 0.7649510 0.8631762
## 1211 1.25485442 Present 5.901674e-04 0.8346109 0.9386360
## 1212 1.25485442 Present 5.901674e-04 0.8230009 0.9212260
## 1213 1.25485442 Present 5.901674e-04 0.7533410 0.8573662
## 1214 1.25485442 Present 5.901674e-04 0.7881710 0.8805961
## 1215 1.25485442 Present 5.901674e-04 0.7649510 0.8689762
## 1216 1.25485442 Present 5.901674e-04 0.7823660 0.8805911
## 1217 1.25485442 Present 5.901674e-04 0.8810508 0.9792759
## 1218 1.25485442 Present 5.901674e-04 1.1596902 1.2521154
## 1219 1.25485442 Present 5.901674e-04 0.9332957 1.0315208
## 1220 1.25485442 Present 5.901674e-04 0.7359261 0.8341512
## 1221 1.25485442 Present 5.901674e-04 0.9855406 1.0837657
## 1222 1.25485442 Present 5.901674e-04 0.8404159 0.9328410
## 1223 1.25485442 Present 5.901674e-04 0.8636358 0.9618610
## 1224 1.25485442 Present 5.901674e-04 0.7997809 0.8980061
## 1225 1.25485442 Present 5.901674e-04 0.7185111 0.8225362
## 1226 1.25485442 Present 5.901674e-04 0.7823660 0.8747911
## 1227 0.51241875 Present 3.960443e-03 0.6096332 0.7247088
## 1228 0.51241875 Present 3.960443e-03 0.5515833 0.6724589
## 1229 0.51241875 Present 3.960443e-03 0.7025130 0.8175886
## 1230 0.51241875 Present 3.960443e-03 0.9695425 1.0846181
## 1231 0.51241875 Present 3.960443e-03 0.9463225 1.0613981
## 1232 0.51241875 Present 3.960443e-03 0.7837829 0.8930584
## 1233 0.51241875 Present 3.960443e-03 1.3642817 1.4735573
## 1234 0.51241875 Present 3.960443e-03 1.5558464 1.6477219
## 1235 0.51241875 Present 3.960443e-03 0.6444631 0.7363387
## 1236 0.51241875 Present 3.960443e-03 1.0972523 1.1891278
## 1237 0.51241875 Present 3.960443e-03 0.6792931 0.7711686
## 1238 0.51241875 Present 3.960443e-03 0.6096332 0.7015088
## 1239 0.51241875 Present 3.960443e-03 1.4049166 1.4967922
## 1240 0.51241875 Present 3.960443e-03 0.6967080 0.7885836
## 1241 0.51241875 Present 3.960443e-03 0.8186128 0.9104883
## 1242 0.51241875 Present 3.960443e-03 0.6212432 0.7131187
## 1243 0.51241875 Present 3.960443e-03 0.7083180 0.8059936
## 1244 0.51241875 Present 3.960443e-03 0.5922182 0.6898938
## 1245 0.51241875 Present 3.960443e-03 0.8011978 0.9046734
## 1246 0.51241875 Present 3.960443e-03 0.5922182 0.6956938
## 1247 0.51241875 Present 3.960443e-03 0.7953928 0.9046684
## 1248 0.51241875 Present 3.960443e-03 0.6444631 0.7595387
## 1249 0.51241875 Present 3.960443e-03 0.5806083 0.6782838
## 1250 0.51241875 Present 3.960443e-03 0.5922182 0.6956938
## 1251 0.51241875 Present 3.960443e-03 0.6792931 0.7943686
## 1252 0.51241875 Present 3.960443e-03 0.8128078 0.9162834
## 1253 0.51241875 Present 3.960443e-03 0.6502681 0.7479437
## 1254 0.51241875 Present 3.960443e-03 0.5515833 0.6550589
## 1255 0.51241875 Present 3.960443e-03 0.6909030 0.7943786
## 1256 0.51241875 Present 3.960443e-03 0.6096332 0.7131088
## 1257 2.60563059 Present -4.587231e-04 0.7934036 0.9016440
## 1258 2.60563059 Present -4.587231e-04 0.9501383 1.0583787
## 1259 2.60563059 Present -4.587231e-04 0.8514535 0.9596939
## 1260 2.60563059 Present -4.587231e-04 0.6366689 0.7449093
## 1261 2.60563059 Present -4.587231e-04 0.6831088 0.7971492
## 1262 2.60563059 Present -4.587231e-04 0.7934036 0.9016440
## 1263 2.60563059 Present -4.587231e-04 0.7527687 0.8610091
## 1264 2.60563059 Present -4.587231e-04 0.8978934 1.0003338
## 1265 2.60563059 Present -4.587231e-04 0.7817936 0.8958340
## 1266 2.60563059 Present -4.587231e-04 0.7295487 0.8435891
## 1267 2.60563059 Present -4.587231e-04 0.7353537 0.8493941
## 1268 2.60563059 Present -4.587231e-04 0.6714988 0.7855392
## 1269 2.60563059 Present -4.587231e-04 0.7005238 0.8145642
## 1270 2.60563059 Present -4.587231e-04 0.7237437 0.8319841
## 1271 2.60563059 Present -4.587231e-04 0.7817936 0.8958340
## 1272 2.60563059 Present -4.587231e-04 0.8398435 0.9480839
## 1273 2.60563059 Present -4.587231e-04 0.6831088 0.7913492
## 1274 2.60563059 Present -4.587231e-04 0.7063288 0.8145692
## 1275 2.60563059 Present -4.587231e-04 0.7353537 0.8435941
## 1276 2.60563059 Present -4.587231e-04 0.7179387 0.8203792
## 1277 2.60563059 Present -4.587231e-04 0.7469637 0.8494041
## 1278 2.60563059 Present -4.587231e-04 0.6134489 0.7216894
## 1279 2.60563059 Present -4.587231e-04 0.6598888 0.7739293
## 1280 2.60563059 Present -4.587231e-04 0.8456485 0.9596889
## 1281 2.60563059 Present -4.587231e-04 0.8398435 0.9480839
## 1282 2.60563059 Present -4.587231e-04 0.7179387 0.8203792
## 1283 2.60563059 Present -4.587231e-04 0.7353537 0.8435941
## 1284 2.60563059 Present -4.587231e-04 0.7237437 0.8319841
## 1285 2.60563059 Present -4.587231e-04 0.7121337 0.8145742
## 1286 2.60563059 Present -4.587231e-04 0.6947188 0.7971592
## 1287 1.64643029 Present 1.528267e-03 0.6380858 0.7457766
## 1288 1.64643029 Present 1.528267e-03 0.6090608 0.7283517
## 1289 1.64643029 Present 1.528267e-03 0.6090608 0.7283517
## 1290 1.64643029 Present 1.528267e-03 0.6787207 0.7864115
## 1291 1.64643029 Present 1.528267e-03 0.6438908 0.7573816
## 1292 1.64643029 Present 1.528267e-03 0.5626209 0.6819118
## 1293 1.64643029 Present 1.528267e-03 0.6322808 0.7457716
## 1294 1.64643029 Present 1.528267e-03 0.7077457 0.8212365
## 1295 1.64643029 Present 1.528267e-03 0.6555008 0.7747916
## 1296 1.64643029 Present 1.528267e-03 0.7019407 0.8154315
## 1297 1.64643029 Present 1.528267e-03 0.6903307 0.8038215
## 1298 1.64643029 Present 1.528267e-03 0.6845257 0.7980165
## 1299 1.64643029 Present 1.528267e-03 0.7135506 0.8270415
## 1300 1.64643029 Present 1.528267e-03 0.6032559 0.7109467
## 1301 1.64643029 Present 1.528267e-03 0.7541856 0.8560764
## 1302 1.64643029 Present 1.528267e-03 0.6380858 0.7457766
## 1303 1.64643029 Present 1.528267e-03 0.6438908 0.7457816
## 1304 1.64643029 Present 1.528267e-03 0.7657955 0.8676864
## 1305 1.64643029 Present 1.528267e-03 0.7657955 0.8618864
## 1306 1.64643029 Present 1.528267e-03 0.8644803 0.9663712
## 1307 1.64643029 Present 1.528267e-03 0.7657955 0.8676864
## 1308 1.64643029 Present 1.528267e-03 0.6555008 0.7515916
## 1309 1.64643029 Present 1.528267e-03 0.8644803 0.9605712
## 1310 1.64643029 Present 1.528267e-03 0.6380858 0.7283766
## 1311 1.64643029 Present 1.528267e-03 0.6787207 0.7690115
## 1312 1.64643029 Present 1.528267e-03 0.8586754 0.9605662
## 1313 1.64643029 Present 1.528267e-03 0.7716005 0.8676913
## 1314 1.64643029 Present 1.528267e-03 0.7251606 0.8212514
## 1315 1.64643029 Present 1.528267e-03 0.7541856 0.8560764
## 1316 1.64643029 Present 1.528267e-03 0.7077457 0.8038365
## 1317 2.93708077 Present 3.374623e-03 0.7028946 0.8422266
## 1318 2.93708077 Present 3.374623e-03 0.7435295 0.8828616
## 1319 2.93708077 Present 3.374623e-03 0.6564547 0.8015867
## 1320 2.93708077 Present 3.374623e-03 0.7377245 0.8828566
## 1321 2.93708077 Present 3.374623e-03 0.6448447 0.7899767
## 1322 2.93708077 Present 3.374623e-03 0.6332347 0.7841668
## 1323 2.93708077 Present 3.374623e-03 0.6390397 0.7841718
## 1324 2.93708077 Present 3.374623e-03 0.7028946 0.8480266
## 1325 2.93708077 Present 3.374623e-03 0.5809898 0.7203219
## 1326 2.93708077 Present 3.374623e-03 0.6506497 0.7899817
## 1327 2.93708077 Present 3.374623e-03 0.6912846 0.8306167
## 1328 2.93708077 Present 3.374623e-03 0.6564547 0.7957867
## 1329 2.93708077 Present 3.374623e-03 0.6738697 0.8190017
## 1330 2.93708077 Present 3.374623e-03 0.6564547 0.7957867
## 1331 2.93708077 Present 3.374623e-03 0.6506497 0.7957817
## 1332 2.93708077 Present 3.374623e-03 0.5984048 0.7377368
## 1333 2.93708077 Present 3.374623e-03 0.6448447 0.7841767
## 1334 2.93708077 Present 3.374623e-03 0.6912846 0.8248167
## 1335 2.93708077 Present 3.374623e-03 0.6332347 0.7725668
## 1336 2.93708077 Present 3.374623e-03 0.6506497 0.7899817
## 1337 2.93708077 Present 3.374623e-03 0.7086996 0.8480316
## 1338 2.93708077 Present 3.374623e-03 0.5751848 0.7145169
## 1339 2.93708077 Present 3.374623e-03 0.6738697 0.8132017
## 1340 2.93708077 Present 3.374623e-03 0.7377245 0.8828566
## 1341 2.93708077 Present 3.374623e-03 0.7667495 0.9060815
## 1342 2.93708077 Present 3.374623e-03 0.6216248 0.7609568
## 1343 2.93708077 Present 3.374623e-03 0.7493345 0.8886665
## 1344 2.93708077 Present 3.374623e-03 0.6796746 0.8132067
## 1345 2.93708077 Present 3.374623e-03 0.7435295 0.8828616
## 1346 2.93708077 Present 3.374623e-03 0.6506497 0.7899817
## 1347 0.00000000 Absent 8.588194e-04 0.8529798 0.9770461
## 1348 0.00000000 Absent 8.588194e-04 0.8703947 0.9944611
## 1349 0.00000000 Absent 8.588194e-04 0.8471748 0.9712411
## 1350 0.00000000 Absent 8.588194e-04 0.9864945 1.1279609
## 1351 0.00000000 Absent 8.588194e-04 0.9748845 1.1047509
## 1352 0.00000000 Absent 8.588194e-04 0.8297598 0.9770262
## 1353 0.00000000 Absent 8.588194e-04 1.2012791 1.3427455
## 1354 0.00000000 Absent 8.588194e-04 0.9806895 1.1163559
## 1355 0.00000000 Absent 8.588194e-04 1.2651340 1.4066003
## 1356 0.00000000 Absent 8.588194e-04 1.2128891 1.3485554
## 1357 0.00000000 Absent 8.588194e-04 0.9110296 1.0466960
## 1358 0.00000000 Absent 8.588194e-04 1.0329344 1.1512008
## 1359 0.00000000 Absent 8.588194e-04 0.9806895 1.1279559
## 1360 0.00000000 Absent 8.588194e-04 0.9748845 1.1163509
## 1361 0.00000000 Absent 8.588194e-04 0.9400546 1.0815210
## 1362 0.00000000 Absent 8.588194e-04 1.0213244 1.1627908
## 1363 0.00000000 Absent 8.588194e-04 0.9981045 1.1395708
## 1364 0.00000000 Absent 8.588194e-04 1.1142042 1.2382706
## 1365 0.00000000 Absent 8.588194e-04 0.8645897 1.0060561
## 1366 0.00000000 Absent 8.588194e-04 0.8355648 0.9596312
## 1367 0.00000000 Absent 8.588194e-04 0.8820047 1.0176711
## 1368 0.00000000 Absent 8.588194e-04 1.1083993 1.2208656
## 1369 0.00000000 Absent 8.588194e-04 0.9052247 1.0466910
## 1370 0.00000000 Absent 8.588194e-04 0.9864945 1.1279609
## 1371 0.00000000 Absent 8.588194e-04 0.8587847 1.0060511
## 1372 0.00000000 Absent 8.588194e-04 0.8936147 1.0408811
## 1373 0.00000000 Absent 8.588194e-04 1.0561544 1.2034207
## 1374 0.00000000 Absent 8.588194e-04 0.9342496 1.0815160
## 1375 0.00000000 Absent 8.588194e-04 0.9632745 1.0989409
## 1376 0.00000000 Absent 8.588194e-04 0.9168346 1.0583010
## 1377 0.00000000 Absent 9.712501e-04 0.7812212 0.8762769
## 1378 0.00000000 Absent 9.712501e-04 0.6593165 0.7601722
## 1379 0.00000000 Absent 9.712501e-04 0.6941464 0.7892021
## 1380 0.00000000 Absent 9.712501e-04 0.6883414 0.7833971
## 1381 0.00000000 Absent 9.712501e-04 0.6767314 0.7717871
## 1382 0.00000000 Absent 9.712501e-04 0.7928312 0.8878869
## 1383 0.00000000 Absent 9.712501e-04 0.7580013 0.8530570
## 1384 0.00000000 Absent 9.712501e-04 0.7521963 0.8472520
## 1385 0.00000000 Absent 9.712501e-04 0.7754163 0.8704719
## 1386 0.00000000 Absent 9.712501e-04 0.7173664 0.8124221
## 1387 0.00000000 Absent 9.712501e-04 0.6128766 0.7079323
## 1388 0.00000000 Absent 9.712501e-04 0.6535115 0.7485672
## 1389 0.00000000 Absent 9.712501e-04 0.7580013 0.8472570
## 1390 0.00000000 Absent 9.712501e-04 0.7231714 0.8182271
## 1391 0.00000000 Absent 9.712501e-04 0.7405863 0.8356420
## 1392 0.00000000 Absent 9.712501e-04 0.7521963 0.8472520
## 1393 0.00000000 Absent 9.712501e-04 0.7521963 0.8472520
## 1394 0.00000000 Absent 9.712501e-04 0.6012666 0.6963223
## 1395 0.00000000 Absent 9.712501e-04 0.6999514 0.7892071
## 1396 0.00000000 Absent 9.712501e-04 0.7638063 0.8588620
## 1397 0.00000000 Absent 9.712501e-04 0.7231714 0.8124271
## 1398 0.00000000 Absent 9.712501e-04 0.6883414 0.7775971
## 1399 0.00000000 Absent 9.712501e-04 0.6477065 0.7369622
## 1400 0.00000000 Absent 9.712501e-04 0.6477065 0.7369622
## 1401 0.00000000 Absent 9.712501e-04 0.7347813 0.8356370
## 1402 0.00000000 Absent 9.712501e-04 0.6244866 0.7253422
## 1403 0.00000000 Absent 9.712501e-04 0.6360965 0.7311522
## 1404 0.00000000 Absent 9.712501e-04 0.6186816 0.7195373
## 1405 0.00000000 Absent 9.712501e-04 0.6360965 0.7311522
## 1406 0.00000000 Absent 9.712501e-04 0.6419015 0.7485572
## 1407 0.00000000 Absent 1.259612e-04 0.7120243 0.8096892
## 1408 0.00000000 Absent 1.259612e-04 0.5901196 0.6819845
## 1409 0.00000000 Absent 1.259612e-04 0.6017296 0.6935944
## 1410 0.00000000 Absent 1.259612e-04 0.5843146 0.6819795
## 1411 0.00000000 Absent 1.259612e-04 0.6829994 0.7748643
## 1412 0.00000000 Absent 1.259612e-04 0.5901196 0.6877845
## 1413 0.00000000 Absent 1.259612e-04 0.6307545 0.7226194
## 1414 0.00000000 Absent 1.259612e-04 0.5436797 0.6413445
## 1415 0.00000000 Absent 1.259612e-04 0.5959246 0.6935894
## 1416 0.00000000 Absent 1.259612e-04 0.6017296 0.6935944
## 1417 0.00000000 Absent 1.259612e-04 0.6249495 0.7226144
## 1418 0.00000000 Absent 1.259612e-04 0.6249495 0.7226144
## 1419 0.00000000 Absent 1.259612e-04 0.5727046 0.6703695
## 1420 0.00000000 Absent 1.259612e-04 0.5843146 0.6819795
## 1421 0.00000000 Absent 1.259612e-04 0.6946094 0.7864743
## 1422 0.00000000 Absent 1.259612e-04 0.6423645 0.7400294
## 1423 0.00000000 Absent 1.259612e-04 0.5436797 0.6413445
## 1424 0.00000000 Absent 1.259612e-04 0.6771944 0.7690593
## 1425 0.00000000 Absent 1.259612e-04 0.6075346 0.7051994
## 1426 0.00000000 Absent 1.259612e-04 0.6075346 0.6993994
## 1427 0.00000000 Absent 1.259612e-04 0.7004144 0.7922792
## 1428 0.00000000 Absent 1.259612e-04 0.6655844 0.7574493
## 1429 0.00000000 Absent 1.259612e-04 0.5436797 0.6355445
## 1430 0.00000000 Absent 1.259612e-04 0.5843146 0.6819795
## 1431 0.00000000 Absent 1.259612e-04 0.5610946 0.6529595
## 1432 0.00000000 Absent 1.259612e-04 0.6133395 0.7052044
## 1433 0.00000000 Absent 1.259612e-04 0.6481695 0.7458343
## 1434 0.00000000 Absent 1.259612e-04 0.6481695 0.7400343
## 1435 0.00000000 Absent 1.259612e-04 0.6365595 0.7284244
## 1436 0.00000000 Absent 1.259612e-04 0.5785096 0.6703745
## 1437 0.34093049 Present -2.981250e-03 0.8295690 0.9299071
## 1438 0.34093049 Present -2.981250e-03 0.8643990 0.9705371
## 1439 0.34093049 Present -2.981250e-03 0.8411790 0.9589171
## 1440 0.34093049 Present -2.981250e-03 0.8934239 1.0111620
## 1441 0.34093049 Present -2.981250e-03 0.8179590 0.9356972
## 1442 0.34093049 Present -2.981250e-03 0.8469840 0.9647221
## 1443 0.34093049 Present -2.981250e-03 0.8179590 0.9356972
## 1444 0.34093049 Present -2.981250e-03 0.8005441 0.9124822
## 1445 0.34093049 Present -2.981250e-03 0.7773241 0.8950623
## 1446 0.34093049 Present -2.981250e-03 0.7831291 0.8950672
## 1447 0.34093049 Present -2.981250e-03 0.7250792 0.8370174
## 1448 0.34093049 Present -2.981250e-03 0.7482992 0.8602373
## 1449 0.34093049 Present -2.981250e-03 0.8005441 0.9182822
## 1450 0.34093049 Present -2.981250e-03 0.8179590 0.9298972
## 1451 0.34093049 Present -2.981250e-03 0.8295690 0.9473071
## 1452 0.34093049 Present -2.981250e-03 0.8179590 0.9298972
## 1453 0.34093049 Present -2.981250e-03 0.7657141 0.8776523
## 1454 0.34093049 Present -2.981250e-03 0.8005441 0.9124822
## 1455 0.34093049 Present -2.981250e-03 0.7366892 0.8486273
## 1456 0.34093049 Present -2.981250e-03 0.7366892 0.8544273
## 1457 0.34093049 Present -2.981250e-03 0.7482992 0.8660373
## 1458 0.34093049 Present -2.981250e-03 1.5900225 1.6961607
## 1459 0.34093049 Present -2.981250e-03 1.3287980 1.4291362
## 1460 0.34093049 Present -2.981250e-03 0.8992289 1.0053670
## 1461 0.34093049 Present -2.981250e-03 0.9050339 1.0111720
## 1462 0.34093049 Present -2.981250e-03 0.8353740 0.9415121
## 1463 0.34093049 Present -2.981250e-03 0.9979137 1.1098518
## 1464 0.34093049 Present -2.981250e-03 0.8643990 0.9705371
## 1465 0.34093049 Present -2.981250e-03 0.8760089 0.9879471
## 1466 0.34093049 Present -2.981250e-03 0.9456688 1.0576069
## 1467 0.58269820 Present -9.904160e-04 0.9944795 1.1317093
## 1468 0.58269820 Present -9.904160e-04 0.7796950 0.9169247
## 1469 0.58269820 Present -9.904160e-04 0.7274501 0.8646798
## 1470 0.58269820 Present -9.904160e-04 0.7506700 0.8820998
## 1471 0.58269820 Present -9.904160e-04 0.7796950 0.9169247
## 1472 0.58269820 Present -9.904160e-04 0.7042301 0.8414598
## 1473 0.58269820 Present -9.904160e-04 1.0235045 1.1665342
## 1474 0.58269820 Present -9.904160e-04 0.8551598 0.9865895
## 1475 0.58269820 Present -9.904160e-04 0.7506700 0.8878998
## 1476 0.58269820 Present -9.904160e-04 0.8609648 0.9923945
## 1477 0.58269820 Present -9.904160e-04 0.7854999 0.9169297
## 1478 0.58269820 Present -9.904160e-04 0.7506700 0.8878998
## 1479 0.58269820 Present -9.904160e-04 0.7042301 0.8414598
## 1480 0.58269820 Present -9.904160e-04 0.8029149 0.9343447
## 1481 0.58269820 Present -9.904160e-04 1.0583344 1.1955642
## 1482 0.58269820 Present -9.904160e-04 0.7622800 0.8937097
## 1483 0.58269820 Present -9.904160e-04 0.7971099 0.9285397
## 1484 0.58269820 Present -9.904160e-04 0.7390600 0.8704898
## 1485 0.58269820 Present -9.904160e-04 0.7738900 0.9169197
## 1486 0.58269820 Present -9.904160e-04 3.6009194 3.7381492
## 1487 0.58269820 Present -9.904160e-04 0.7042301 0.8066598
## 1488 0.58269820 Present -9.904160e-04 0.8319398 0.9401696
## 1489 0.58269820 Present -9.904160e-04 1.0989693 1.2245991
## 1490 0.58269820 Present -9.904160e-04 0.7913049 0.9169347
## 1491 0.58269820 Present -9.904160e-04 0.7738900 0.9053197
## 1492 0.58269820 Present -9.904160e-04 2.1090374 2.2462671
## 1493 0.58269820 Present -9.904160e-04 0.7680850 0.8937147
## 1494 0.58269820 Present -9.904160e-04 0.8435498 0.9749796
## 1495 0.58269820 Present -9.904160e-04 0.7100351 0.8414648
## 1496 0.58269820 Present -9.904160e-04 0.7564750 0.8879047
## 1497 0.00000000 Absent -3.098693e-04 0.6895675 0.8067454
## 1498 0.00000000 Absent -3.098693e-04 0.6837625 0.8009404
## 1499 0.00000000 Absent -3.098693e-04 0.7243975 0.8415753
## 1500 0.00000000 Absent -3.098693e-04 0.6431276 0.7487055
## 1501 0.00000000 Absent -3.098693e-04 0.7069825 0.8241604
## 1502 0.00000000 Absent -3.098693e-04 0.6489326 0.7603105
## 1503 0.00000000 Absent -3.098693e-04 0.7418124 0.8589903
## 1504 0.00000000 Absent -3.098693e-04 0.7940573 0.9054352
## 1505 0.00000000 Absent -3.098693e-04 0.8811322 0.9983100
## 1506 0.00000000 Absent -3.098693e-04 8.3405426 8.4519204
## 1507 0.00000000 Absent -3.098693e-04 3.0521979 3.1345758
## 1508 0.00000000 Absent -3.098693e-04 1.1829916 1.2653694
## 1509 0.00000000 Absent -3.098693e-04 0.9043521 0.9925300
## 1510 0.00000000 Absent -3.098693e-04 0.8114723 0.8996501
## 1511 0.00000000 Absent -3.098693e-04 0.7940573 0.8938352
## 1512 0.00000000 Absent -3.098693e-04 0.7069825 0.8067604
## 1513 0.00000000 Absent -3.098693e-04 0.7127875 0.8183653
## 1514 0.00000000 Absent -3.098693e-04 0.6953725 0.8009504
## 1515 0.00000000 Absent -3.098693e-04 0.6431276 0.7487055
## 1516 0.00000000 Absent -3.098693e-04 0.7243975 0.8357753
## 1517 0.00000000 Absent -3.098693e-04 0.7243975 0.8299753
## 1518 0.00000000 Absent -3.098693e-04 0.7069825 0.8067604
## 1519 0.00000000 Absent -3.098693e-04 0.7650324 0.8648102
## 1520 0.00000000 Absent -3.098693e-04 0.7766424 0.8764202
## 1521 0.00000000 Absent -3.098693e-04 0.6953725 0.7893504
## 1522 0.00000000 Absent -3.098693e-04 0.6779576 0.7777354
## 1523 0.00000000 Absent -3.098693e-04 0.6953725 0.7893504
## 1524 0.00000000 Absent -3.098693e-04 0.7708374 0.8648152
## 1525 0.00000000 Absent -3.098693e-04 0.7243975 0.8125753
## 1526 0.00000000 Absent -3.098693e-04 0.7011775 0.7893554
## 1527 0.00000000 Absent 1.575374e-03 0.8375541 0.9742556
## 1528 0.00000000 Absent 1.575374e-03 0.7969191 0.9394206
## 1529 0.00000000 Absent 1.575374e-03 0.8027241 0.9394256
## 1530 0.00000000 Absent 1.575374e-03 0.7911141 0.9336156
## 1531 0.00000000 Absent 1.575374e-03 0.8201391 0.9568406
## 1532 0.00000000 Absent 1.575374e-03 0.9536538 1.0845553
## 1533 0.00000000 Absent 1.575374e-03 0.8201391 0.9568406
## 1534 0.00000000 Absent 1.575374e-03 0.8491640 0.9858655
## 1535 0.00000000 Absent 1.575374e-03 0.8491640 0.9742655
## 1536 0.00000000 Absent 1.575374e-03 0.7446742 0.8697757
## 1537 0.00000000 Absent 1.575374e-03 0.9652638 1.0961653
## 1538 0.00000000 Absent 1.575374e-03 0.8607740 0.9858755
## 1539 0.00000000 Absent 1.575374e-03 0.7853092 0.9046107
## 1540 0.00000000 Absent 1.575374e-03 0.9072139 1.0323154
## 1541 0.00000000 Absent 1.575374e-03 0.8781890 0.9916905
## 1542 0.00000000 Absent 1.575374e-03 0.7911141 0.9104156
## 1543 0.00000000 Absent 1.575374e-03 0.8491640 0.9684655
## 1544 0.00000000 Absent 1.575374e-03 0.7678942 0.8929957
## 1545 0.00000000 Absent 1.575374e-03 0.8781890 0.9974905
## 1546 0.00000000 Absent 1.575374e-03 0.8665790 0.9858805
## 1547 0.00000000 Absent 1.575374e-03 1.1219985 1.2413000
## 1548 0.00000000 Absent 1.575374e-03 0.8375541 0.9568556
## 1549 0.00000000 Absent 1.575374e-03 0.8317491 0.9510506
## 1550 0.00000000 Absent 1.575374e-03 0.7795042 0.8988057
## 1551 0.00000000 Absent 1.575374e-03 0.8491640 0.9626655
## 1552 0.00000000 Absent 1.575374e-03 0.8143341 0.9220356
## 1553 0.00000000 Absent 1.575374e-03 0.8607740 0.9742755
## 1554 0.00000000 Absent 1.575374e-03 0.7969191 0.9162206
## 1555 0.00000000 Absent 1.575374e-03 0.8956039 1.0091054
## 1556 0.00000000 Absent 1.575374e-03 0.8143341 0.9278356
## 1557 2.93262341 Present -1.982725e-03 0.5963061 0.6950275
## 1558 2.93262341 Present -1.982725e-03 0.6717710 0.7762924
## 1559 2.93262341 Present -1.982725e-03 0.7298209 0.8343422
## 1560 2.93262341 Present -1.982725e-03 0.7182109 0.8169323
## 1561 2.93262341 Present -1.982725e-03 0.7472359 0.8459572
## 1562 2.93262341 Present -1.982725e-03 0.8575306 0.9562520
## 1563 2.93262341 Present -1.982725e-03 0.9910454 1.0839667
## 1564 2.93262341 Present -1.982725e-03 0.6253311 0.7240525
## 1565 2.93262341 Present -1.982725e-03 0.8110907 0.8924121
## 1566 2.93262341 Present -1.982725e-03 0.7994807 0.8808021
## 1567 2.93262341 Present -1.982725e-03 0.6949910 0.7763123
## 1568 2.93262341 Present -1.982725e-03 0.5672812 0.6428026
## 1569 2.93262341 Present -1.982725e-03 3.8064649 3.8877862
## 1570 2.93262341 Present -1.982725e-03 0.6891860 0.7588073
## 1571 2.93262341 Present -1.982725e-03 0.6195261 0.6950475
## 1572 2.93262341 Present -1.982725e-03 0.9446055 1.0201268
## 1573 2.93262341 Present -1.982725e-03 0.6601610 0.7472824
## 1574 2.93262341 Present -1.982725e-03 0.6137211 0.7008425
## 1575 2.93262341 Present -1.982725e-03 1.0781202 1.1652416
## 1576 2.93262341 Present -1.982725e-03 0.6427461 0.7414674
## 1577 2.93262341 Present -1.982725e-03 1.2348549 1.3277763
## 1578 2.93262341 Present -1.982725e-03 0.8110907 0.8924121
## 1579 2.93262341 Present -1.982725e-03 1.9895034 2.0766248
## 1580 2.93262341 Present -1.982725e-03 0.6369411 0.7065624
## 1581 2.93262341 Present -1.982725e-03 0.7124059 0.7879273
## 1582 2.93262341 Present -1.982725e-03 0.8865556 0.9678769
## 1583 2.93262341 Present -1.982725e-03 0.7414309 0.8169522
## 1584 2.93262341 Present -1.982725e-03 0.7472359 0.8343572
## 1585 2.93262341 Present -1.982725e-03 0.6891860 0.7705073
## 1586 2.93262341 Present -1.982725e-03 0.7530408 0.8285622
## 1587 0.40560536 Present -3.524253e-03 1.0585252 1.1440832
## 1588 0.40560536 Present -3.524253e-03 0.6057361 0.7028941
## 1589 0.40560536 Present -3.524253e-03 0.6637860 0.7551440
## 1590 0.40560536 Present -3.524253e-03 0.6521760 0.7435340
## 1591 0.40560536 Present -3.524253e-03 0.6637860 0.7609440
## 1592 0.40560536 Present -3.524253e-03 4.2628789 4.3600369
## 1593 0.40560536 Present -3.524253e-03 0.9308154 1.0104734
## 1594 0.40560536 Present -3.524253e-03 0.6928109 0.7724689
## 1595 0.40560536 Present -3.524253e-03 0.6347610 0.7203190
## 1596 0.40560536 Present -3.524253e-03 0.9192055 1.0047635
## 1597 0.40560536 Present -3.524253e-03 0.5709061 0.6680641
## 1598 0.40560536 Present -3.524253e-03 0.5534912 0.6506492
## 1599 0.40560536 Present -3.524253e-03 0.6231510 0.7145090
## 1600 0.40560536 Present -3.524253e-03 0.6695910 0.7609489
## 1601 0.40560536 Present -3.524253e-03 0.6115411 0.7086991
## 1602 0.40560536 Present -3.524253e-03 0.7392508 0.8306088
## 1603 0.40560536 Present -3.524253e-03 0.9830603 1.0802183
## 1604 0.40560536 Present -3.524253e-03 0.7682758 0.8654337
## 1605 0.40560536 Present -3.524253e-03 0.6173461 0.7087040
## 1606 0.40560536 Present -3.524253e-03 0.6986159 0.7957739
## 1607 0.40560536 Present -3.524253e-03 0.7276408 0.8189988
## 1608 0.40560536 Present -3.524253e-03 0.7914957 0.8828537
## 1609 0.40560536 Present -3.524253e-03 0.7740808 0.8654387
## 1610 0.40560536 Present -3.524253e-03 1.1456000 1.2311580
## 1611 0.40560536 Present -3.524253e-03 0.6753959 0.7725539
## 1612 0.40560536 Present -3.524253e-03 0.6812009 0.7783589
## 1613 0.40560536 Present -3.524253e-03 0.7276408 0.8189988
## 1614 0.40560536 Present -3.524253e-03 0.8379356 0.9292936
## 1615 0.40560536 Present -3.524253e-03 0.9540354 1.0453934
## 1616 0.40560536 Present -3.524253e-03 0.5651012 0.6564591
## 1617 2.54974682 Present -2.132143e-03 0.8518350 0.9495320
## 1618 2.54974682 Present -2.132143e-03 0.8228101 0.9263070
## 1619 2.54974682 Present -2.132143e-03 0.8228101 0.9205070
## 1620 2.54974682 Present -2.132143e-03 0.7763702 0.8798671
## 1621 2.54974682 Present -2.132143e-03 0.7357353 0.8392322
## 1622 2.54974682 Present -2.132143e-03 0.7589552 0.8566521
## 1623 2.54974682 Present -2.132143e-03 0.7995901 0.9030871
## 1624 2.54974682 Present -2.132143e-03 0.7879802 0.8914771
## 1625 2.54974682 Present -2.132143e-03 0.7763702 0.8914671
## 1626 2.54974682 Present -2.132143e-03 0.7937852 0.9030821
## 1627 2.54974682 Present -2.132143e-03 0.7995901 0.9088871
## 1628 2.54974682 Present -2.132143e-03 0.7995901 0.8972871
## 1629 2.54974682 Present -2.132143e-03 0.6776854 0.7811823
## 1630 2.54974682 Present -2.132143e-03 0.7589552 0.8624521
## 1631 2.54974682 Present -2.132143e-03 0.8518350 0.9495320
## 1632 2.54974682 Present -2.132143e-03 0.8634450 0.9669419
## 1633 2.54974682 Present -2.132143e-03 1.0027647 1.1004617
## 1634 2.54974682 Present -2.132143e-03 0.7995901 0.8972871
## 1635 2.54974682 Present -2.132143e-03 0.8228101 0.9205070
## 1636 2.54974682 Present -2.132143e-03 0.8112001 0.9088970
## 1637 2.54974682 Present -2.132143e-03 0.7995901 0.8972871
## 1638 2.54974682 Present -2.132143e-03 0.6776854 0.7811823
## 1639 2.54974682 Present -2.132143e-03 0.8866650 0.9901619
## 1640 2.54974682 Present -2.132143e-03 0.7531502 0.8566471
## 1641 2.54974682 Present -2.132143e-03 0.8576400 0.9611369
## 1642 2.54974682 Present -2.132143e-03 0.8228101 0.9263070
## 1643 2.54974682 Present -2.132143e-03 0.7531502 0.8682471
## 1644 2.54974682 Present -2.132143e-03 0.8053951 0.9088920
## 1645 2.54974682 Present -2.132143e-03 0.7531502 0.8566471
## 1646 2.54974682 Present -2.132143e-03 0.8576400 0.9553369
## 1647 2.27634805 Present -2.154341e-03 0.7756884 0.8670251
## 1648 2.27634805 Present -2.154341e-03 0.7524685 0.8438051
## 1649 2.27634805 Present -2.154341e-03 0.5609039 0.6522405
## 1650 2.27634805 Present -2.154341e-03 0.9382281 1.0295647
## 1651 2.27634805 Present -2.154341e-03 0.9324231 1.0237598
## 1652 2.27634805 Present -2.154341e-03 0.5841238 0.6696604
## 1653 2.27634805 Present -2.154341e-03 1.0775478 1.1572845
## 1654 2.27634805 Present -2.154341e-03 0.6421737 0.7219103
## 1655 2.27634805 Present -2.154341e-03 7.1089311 7.1944677
## 1656 2.27634805 Present -2.154341e-03 0.5086590 0.5825956
## 1657 2.27634805 Present -2.154341e-03 0.6537837 0.7277203
## 1658 2.27634805 Present -2.154341e-03 0.6770036 0.7567403
## 1659 2.27634805 Present -2.154341e-03 0.6944186 0.7915552
## 1660 2.27634805 Present -2.154341e-03 0.5957338 0.7044704
## 1661 2.27634805 Present -2.154341e-03 0.7292485 0.8263852
## 1662 2.27634805 Present -2.154341e-03 0.8975932 0.9947298
## 1663 2.27634805 Present -2.154341e-03 0.7931034 0.8728400
## 1664 2.27634805 Present -2.154341e-03 0.5086590 0.5883956
## 1665 2.27634805 Present -2.154341e-03 0.7466635 0.8322001
## 1666 2.27634805 Present -2.154341e-03 0.5202689 0.6000056
## 1667 2.27634805 Present -2.154341e-03 0.5957338 0.6812704
## 1668 2.27634805 Present -2.154341e-03 0.5841238 0.6754604
## 1669 2.27634805 Present -2.154341e-03 0.5492939 0.6348305
## 1670 2.27634805 Present -2.154341e-03 0.5434889 0.6290255
## 1671 2.27634805 Present -2.154341e-03 0.6479787 0.7335153
## 1672 2.27634805 Present -2.154341e-03 0.8221283 0.9134650
## 1673 2.27634805 Present -2.154341e-03 0.6770036 0.7625403
## 1674 2.27634805 Present -2.154341e-03 0.6479787 0.7277153
## 1675 2.27634805 Present -2.154341e-03 0.5492939 0.6348305
## 1676 2.27634805 Present -2.154341e-03 0.7060286 0.7857652
## 1677 0.33187169 Present 1.182166e-03 0.8539057 1.0005904
## 1678 0.33187169 Present 1.182166e-03 0.6623411 0.8090258
## 1679 0.33187169 Present 1.182166e-03 0.8132708 0.9541555
## 1680 0.33187169 Present 1.182166e-03 1.1557651 1.2908498
## 1681 0.33187169 Present 1.182166e-03 0.8771256 1.0122104
## 1682 0.33187169 Present 1.182166e-03 0.9061506 1.0470353
## 1683 0.33187169 Present 1.182166e-03 1.1151302 1.2502149
## 1684 0.33187169 Present 1.182166e-03 0.8364907 0.9715755
## 1685 0.33187169 Present 1.182166e-03 1.2602549 1.3895396
## 1686 0.33187169 Present 1.182166e-03 0.7842458 0.9019306
## 1687 0.33187169 Present 1.182166e-03 0.6971710 0.8206557
## 1688 0.33187169 Present 1.182166e-03 1.1093252 1.2386099
## 1689 0.33187169 Present 1.182166e-03 0.8422957 0.9715804
## 1690 0.33187169 Present 1.182166e-03 0.7378059 0.8728907
## 1691 0.33187169 Present 1.182166e-03 0.7494159 0.8787006
## 1692 0.33187169 Present 1.182166e-03 0.8016608 0.9251455
## 1693 0.33187169 Present 1.182166e-03 0.9351755 1.0644603
## 1694 0.33187169 Present 1.182166e-03 0.7610259 0.8903106
## 1695 0.33187169 Present 1.182166e-03 0.9235656 1.0528503
## 1696 0.33187169 Present 1.182166e-03 0.7784408 0.9077256
## 1697 0.33187169 Present 1.182166e-03 1.0106404 1.1341251
## 1698 0.33187169 Present 1.182166e-03 4.0930894 4.2223741
## 1699 0.33187169 Present 1.182166e-03 0.8481007 0.9773854
## 1700 0.33187169 Present 1.182166e-03 0.8945406 1.0238253
## 1701 0.33187169 Present 1.182166e-03 0.8945406 1.0296253
## 1702 0.33187169 Present 1.182166e-03 0.9409805 1.0644653
## 1703 0.33187169 Present 1.182166e-03 1.5330894 1.6623741
## 1704 0.33187169 Present 1.182166e-03 0.8074658 0.9309505
## 1705 0.33187169 Present 1.182166e-03 0.8422957 0.9715804
## 1706 0.33187169 Present 1.182166e-03 0.8016608 0.9309455
## 1707 0.73994320 Present -1.288964e-03 0.4771538 0.5616233
## 1708 0.73994320 Present -1.288964e-03 0.5584236 0.6428931
## 1709 0.73994320 Present -1.288964e-03 0.4887638 0.5674332
## 1710 0.73994320 Present -1.288964e-03 0.5584236 0.6428931
## 1711 0.73994320 Present -1.288964e-03 0.4945688 0.5732382
## 1712 0.73994320 Present -1.288964e-03 0.4539338 0.5326033
## 1713 0.73994320 Present -1.288964e-03 0.4887638 0.5732332
## 1714 0.73994320 Present -1.288964e-03 0.4945688 0.5732382
## 1715 0.73994320 Present -1.288964e-03 0.4829588 0.5616282
## 1716 0.73994320 Present -1.288964e-03 0.4423239 0.5267933
## 1717 0.73994320 Present -1.288964e-03 0.4655438 0.5442133
## 1718 0.73994320 Present -1.288964e-03 0.5293987 0.6080681
## 1719 0.73994320 Present -1.288964e-03 0.5932536 0.6719230
## 1720 0.73994320 Present -1.288964e-03 0.4655438 0.5442133
## 1721 0.73994320 Present -1.288964e-03 0.4887638 0.5674332
## 1722 0.73994320 Present -1.288964e-03 0.4481288 0.5267983
## 1723 0.73994320 Present -1.288964e-03 0.5119837 0.5906532
## 1724 0.73994320 Present -1.288964e-03 0.7035483 0.7880178
## 1725 0.73994320 Present -1.288964e-03 0.5700336 0.6487031
## 1726 0.73994320 Present -1.288964e-03 0.6803284 0.7647979
## 1727 0.73994320 Present -1.288964e-03 0.6396935 0.7183629
## 1728 0.73994320 Present -1.288964e-03 0.5642286 0.6486981
## 1729 0.73994320 Present -1.288964e-03 0.5119837 0.5906532
## 1730 0.73994320 Present -1.288964e-03 0.5177887 0.6022582
## 1731 0.73994320 Present -1.288964e-03 0.5642286 0.6428981
## 1732 0.73994320 Present -1.288964e-03 0.5932536 0.6719230
## 1733 0.73994320 Present -1.288964e-03 0.6513034 0.7299729
## 1734 0.73994320 Present -1.288964e-03 0.7093533 0.7880228
## 1735 0.73994320 Present -1.288964e-03 0.6338885 0.7183579
## 1736 0.73994320 Present -1.288964e-03 0.5352037 0.6138731
## 1737 1.25317657 Present -5.157445e-03 1.2398967 1.3133051
## 1738 1.25317657 Present -5.157445e-03 0.6419829 0.7153913
## 1739 1.25317657 Present -5.157445e-03 1.6694659 1.7428743
## 1740 1.25317657 Present -5.157445e-03 14.6610305 14.7402389
## 1741 1.25317657 Present -5.157445e-03 1.0251122 1.0926205
## 1742 1.25317657 Present -5.157445e-03 1.0309172 1.1043255
## 1743 1.25317657 Present -5.157445e-03 0.9786723 1.0461806
## 1744 1.25317657 Present -5.157445e-03 0.7464727 0.8198811
## 1745 1.25317657 Present -5.157445e-03 0.8451575 0.9185659
## 1746 1.25317657 Present -5.157445e-03 1.8087856 1.8821940
## 1747 1.25317657 Present -5.157445e-03 0.9902822 1.0636906
## 1748 1.25317657 Present -5.157445e-03 0.6477879 0.7269963
## 1749 1.25317657 Present -5.157445e-03 3.2077879 3.2869963
## 1750 1.25317657 Present -5.157445e-03 1.3385815 1.4060899
## 1751 1.25317657 Present -5.157445e-03 1.9016654 1.9750738
## 1752 1.25317657 Present -5.157445e-03 11.0561326 11.1295410
## 1753 1.25317657 Present -5.157445e-03 8.8792618 8.9409702
## 1754 1.25317657 Present -5.157445e-03 0.9728673 1.0345756
## 1755 1.25317657 Present -5.157445e-03 0.8974024 0.9649108
## 1756 1.25317657 Present -5.157445e-03 0.7058378 0.7733462
## 1757 1.25317657 Present -5.157445e-03 0.9032074 0.9766158
## 1758 1.25317657 Present -5.157445e-03 0.5839330 0.6573414
## 1759 1.25317657 Present -5.157445e-03 20.5472890 20.6206974
## 1760 1.25317657 Present -5.157445e-03 0.9786723 1.0461806
## 1761 1.25317657 Present -5.157445e-03 9.1346813 9.2021897
## 1762 1.25317657 Present -5.157445e-03 2.0700101 2.1317185
## 1763 1.25317657 Present -5.157445e-03 8.9489217 9.0164301
## 1764 1.25317657 Present -5.157445e-03 1.7449308 1.8124391
## 1765 1.25317657 Present -5.157445e-03 2.0816201 2.1491285
## 1766 1.25317657 Present -5.157445e-03 1.4198514 1.4873598
## 1767 2.15084881 Present 8.035479e-04 4.2828555 4.3826334
## 1768 2.15084881 Present 8.035479e-04 0.8521072 0.9460851
## 1769 2.15084881 Present 8.035479e-04 0.7592274 0.8474052
## 1770 2.15084881 Present 8.035479e-04 1.1365517 1.2247295
## 1771 2.15084881 Present 8.035479e-04 1.7576855 1.8458633
## 1772 2.15084881 Present 8.035479e-04 1.2062115 1.3001894
## 1773 2.15084881 Present 8.035479e-04 0.7243975 0.8183753
## 1774 2.15084881 Present 8.035479e-04 3.9345562 4.0285340
## 1775 2.15084881 Present 8.035479e-04 4.3118805 4.4000583
## 1776 2.15084881 Present 8.035479e-04 1.1423567 1.2305345
## 1777 2.15084881 Present 8.035479e-04 0.7592274 0.8474052
## 1778 2.15084881 Present 8.035479e-04 0.8521072 0.9402851
## 1779 2.15084881 Present 8.035479e-04 1.2178215 1.3059994
## 1780 2.15084881 Present 8.035479e-04 4.1435358 4.2317136
## 1781 2.15084881 Present 8.035479e-04 0.8811322 0.9635100
## 1782 2.15084881 Present 8.035479e-04 0.9682070 1.0563848
## 1783 2.15084881 Present 8.035479e-04 0.8637172 0.9518950
## 1784 2.15084881 Present 8.035479e-04 1.5080709 1.5962488
## 1785 2.15084881 Present 8.035479e-04 1.1075267 1.1957046
## 1786 2.15084881 Present 8.035479e-04 0.7766424 0.8648202
## 1787 2.15084881 Present 8.035479e-04 0.8463022 0.9344801
## 1788 2.15084881 Present 8.035479e-04 0.6779576 0.7719354
## 1789 2.15084881 Present 8.035479e-04 0.6257127 0.7196905
## 1790 2.15084881 Present 8.035479e-04 1.4558260 1.5498039
## 1791 2.15084881 Present 8.035479e-04 0.9449870 1.0389649
## 1792 2.15084881 Present 8.035479e-04 0.6895675 0.7777454
## 1793 2.15084881 Present 8.035479e-04 0.6315177 0.7254955
## 1794 2.15084881 Present 8.035479e-04 0.6315177 0.7254955
## 1795 2.15084881 Present 8.035479e-04 0.7534224 0.8474003
## 1796 2.15084881 Present 8.035479e-04 0.5038079 0.6093857
## 1797 2.02265433 Present -3.383717e-03 0.7222174 0.8436319
## 1798 2.02265433 Present -3.383717e-03 0.7512424 0.8726568
## 1799 2.02265433 Present -3.383717e-03 0.6931925 0.8146070
## 1800 2.02265433 Present -3.383717e-03 0.7454374 0.8668519
## 1801 2.02265433 Present -3.383717e-03 0.6989975 0.8146119
## 1802 2.02265433 Present -3.383717e-03 0.8209022 0.9365167
## 1803 2.02265433 Present -3.383717e-03 0.7512424 0.8668568
## 1804 2.02265433 Present -3.383717e-03 0.9370020 1.0526165
## 1805 2.02265433 Present -3.383717e-03 0.9311970 1.0468115
## 1806 2.02265433 Present -3.383717e-03 0.7628523 0.8784668
## 1807 2.02265433 Present -3.383717e-03 0.8789521 0.9887666
## 1808 2.02265433 Present -3.383717e-03 1.1633966 1.2848110
## 1809 2.02265433 Present -3.383717e-03 0.8267072 0.9249217
## 1810 2.02265433 Present -3.383717e-03 1.5581358 1.6621503
## 1811 2.02265433 Present -3.383717e-03 1.2272514 1.3312659
## 1812 2.02265433 Present -3.383717e-03 0.7744623 0.8784768
## 1813 2.02265433 Present -3.383717e-03 0.7454374 0.8668519
## 1814 2.02265433 Present -3.383717e-03 0.7454374 0.8668519
## 1815 2.02265433 Present -3.383717e-03 0.7570474 0.8726618
## 1816 2.02265433 Present -3.383717e-03 0.7570474 0.8784618
## 1817 2.02265433 Present -3.383717e-03 0.7512424 0.8668568
## 1818 2.02265433 Present -3.383717e-03 0.7512424 0.8726568
## 1819 2.02265433 Present -3.383717e-03 0.7686573 0.8842718
## 1820 2.02265433 Present -3.383717e-03 0.7338274 0.8494419
## 1821 2.02265433 Present -3.383717e-03 0.9253920 1.0410065
## 1822 2.02265433 Present -3.383717e-03 0.6757775 0.7913920
## 1823 2.02265433 Present -3.383717e-03 0.6873875 0.8030020
## 1824 2.02265433 Present -3.383717e-03 0.7280224 0.8494369
## 1825 2.02265433 Present -3.383717e-03 0.8092923 0.9307067
## 1826 2.02265433 Present -3.383717e-03 0.8673421 0.9887566
## 1827 0.00000000 Absent -9.288804e-04 0.5612854 0.6478785
## 1828 0.00000000 Absent -9.288804e-04 0.6889952 0.7697883
## 1829 0.00000000 Absent -9.288804e-04 0.7122151 0.7872082
## 1830 0.00000000 Absent -9.288804e-04 0.6367503 0.7175434
## 1831 0.00000000 Absent -9.288804e-04 0.5903104 0.6711035
## 1832 0.00000000 Absent -9.288804e-04 0.7644600 0.8452531
## 1833 0.00000000 Absent -9.288804e-04 0.9444147 1.0252078
## 1834 0.00000000 Absent -9.288804e-04 0.7006052 0.7755983
## 1835 0.00000000 Absent -9.288804e-04 0.8805598 0.9613529
## 1836 0.00000000 Absent -9.288804e-04 0.8631448 0.9439380
## 1837 0.00000000 Absent -9.288804e-04 0.8573398 0.9381330
## 1838 0.00000000 Absent -9.288804e-04 0.5728954 0.6536885
## 1839 0.00000000 Absent -9.288804e-04 0.6889952 0.7697883
## 1840 0.00000000 Absent -9.288804e-04 0.6831902 0.7639833
## 1841 0.00000000 Absent -9.288804e-04 0.7354351 0.8104282
## 1842 0.00000000 Absent -9.288804e-04 0.6367503 0.7117434
## 1843 0.00000000 Absent -9.288804e-04 0.6019203 0.6885135
## 1844 0.00000000 Absent -9.288804e-04 0.7180201 0.7988132
## 1845 0.00000000 Absent -9.288804e-04 0.7644600 0.8452531
## 1846 0.00000000 Absent -9.288804e-04 0.6309453 0.7059384
## 1847 0.00000000 Absent -9.288804e-04 0.7586550 0.8394482
## 1848 0.00000000 Absent -9.288804e-04 0.7122151 0.7930082
## 1849 0.00000000 Absent -9.288804e-04 0.5845054 0.6652985
## 1850 0.00000000 Absent -9.288804e-04 0.6077253 0.6885185
## 1851 0.00000000 Absent -9.288804e-04 0.7064101 0.7872033
## 1852 0.00000000 Absent -9.288804e-04 0.9560247 1.0310178
## 1853 0.00000000 Absent -9.288804e-04 0.6309453 0.7117384
## 1854 0.00000000 Absent -9.288804e-04 0.7122151 0.7930082
## 1855 0.00000000 Absent -9.288804e-04 0.6483603 0.7291534
## 1856 0.00000000 Absent -9.288804e-04 0.7064101 0.7872033
## 1857 0.00000000 Absent -1.536294e-04 0.9108389 1.0285770
## 1858 0.00000000 Absent -1.536294e-04 0.9979137 1.1156518
## 1859 0.00000000 Absent -1.536294e-04 1.0211336 1.1330718
## 1860 0.00000000 Absent -1.536294e-04 0.8992289 1.0111670
## 1861 0.00000000 Absent -1.536294e-04 0.9514738 1.0634119
## 1862 0.00000000 Absent -1.536294e-04 0.9630838 1.0750219
## 1863 0.00000000 Absent -1.536294e-04 0.8063491 0.9240872
## 1864 0.00000000 Absent -1.536294e-04 0.7134692 0.8312074
## 1865 0.00000000 Absent -1.536294e-04 0.7657141 0.8892523
## 1866 0.00000000 Absent -1.536294e-04 0.9746937 1.0982319
## 1867 0.00000000 Absent -1.536294e-04 0.9746937 1.0924319
## 1868 0.00000000 Absent -1.536294e-04 0.9688887 1.0808269
## 1869 0.00000000 Absent -1.536294e-04 0.9630838 1.0692219
## 1870 0.00000000 Absent -1.536294e-04 0.9921087 1.1040468
## 1871 0.00000000 Absent -1.536294e-04 1.0849885 1.1969267
## 1872 0.00000000 Absent -1.536294e-04 0.8585940 0.9705321
## 1873 0.00000000 Absent -1.536294e-04 0.7773241 0.8892623
## 1874 0.00000000 Absent -1.536294e-04 0.7134692 0.8196074
## 1875 0.00000000 Absent -1.536294e-04 0.7657141 0.8892523
## 1876 0.00000000 Absent -1.536294e-04 0.8818139 0.9995520
## 1877 0.00000000 Absent -1.536294e-04 1.7061223 1.8238604
## 1878 0.00000000 Absent -1.536294e-04 3.2502493 3.3505874
## 1879 0.00000000 Absent -1.536294e-04 0.8121541 0.9124922
## 1880 0.00000000 Absent -1.536294e-04 0.7715191 0.8776573
## 1881 0.00000000 Absent -1.536294e-04 0.7366892 0.8544273
## 1882 0.00000000 Absent -1.536294e-04 0.9514738 1.0692119
## 1883 0.00000000 Absent -1.536294e-04 0.9630838 1.0750219
## 1884 0.00000000 Absent -1.536294e-04 0.7715191 0.8834573
## 1885 0.00000000 Absent -1.536294e-04 0.7657141 0.8892523
## 1886 0.00000000 Absent -1.536294e-04 0.7715191 0.8950573
## Delta Time (s) Peak Freq (Hz) Freq 5% (Hz) Freq 95% (Hz) BW 90% (Hz)
## 1 0.12571409 2670.973 2583.019 2926.199 343.1801
## 2 0.13151409 2670.973 2583.019 2926.199 343.1801
## 3 0.14311409 2670.973 2583.019 2926.199 343.1801
## 4 0.13151409 2670.973 2583.019 2926.199 343.1801
## 5 0.13731409 2843.239 2669.151 2926.199 257.0471
## 6 0.12571409 2843.239 2669.151 2926.199 257.0471
## 7 0.13151409 2843.239 2669.151 2926.199 257.0471
## 8 0.13151409 2843.239 2669.151 2926.199 257.0471
## 9 0.12571409 2843.239 2669.151 2926.199 257.0471
## 10 0.12571409 2757.106 2669.151 2926.199 257.0471
## 11 0.12571409 2757.106 2669.151 2926.199 257.0471
## 12 0.12571409 2843.239 2669.151 2926.199 257.0471
## 13 0.13151409 2843.239 2669.151 2926.199 257.0471
## 14 0.12571409 2843.239 2669.151 2926.199 257.0471
## 15 0.12571409 2843.239 2669.151 2926.199 257.0471
## 16 0.11991409 2843.239 2669.151 2926.199 257.0471
## 17 0.12571409 2843.239 2669.151 2926.199 257.0471
## 18 0.11991409 2843.239 2669.151 2926.199 257.0471
## 19 0.11991409 2843.239 2669.151 2926.199 257.0471
## 20 0.11411409 2843.239 2669.151 2926.199 257.0471
## 21 0.11991409 2843.239 2669.151 2926.199 257.0471
## 22 0.11411409 2843.239 2669.151 2926.199 257.0471
## 23 0.11411409 2843.239 2669.151 2926.199 257.0471
## 24 0.11991409 2843.239 2669.151 2926.199 257.0471
## 25 0.11411409 2843.239 2669.151 2926.199 257.0471
## 26 0.11991409 2843.239 2669.151 2926.199 257.0471
## 27 0.11991409 2843.239 2669.151 2926.199 257.0471
## 28 0.11991409 2843.239 2669.151 2926.199 257.0471
## 29 0.11991409 2843.239 2669.151 2926.199 257.0471
## 30 0.11411409 2843.239 2669.151 2926.199 257.0471
## 31 0.13057833 2880.716 2711.695 3139.327 427.6317
## 32 0.13057833 2880.716 2711.695 3139.327 427.6317
## 33 0.13057833 2880.716 2797.828 3139.327 341.4987
## 34 0.13637833 2966.849 2797.828 3139.327 341.4987
## 35 0.14217833 2966.849 2797.828 3225.460 427.6317
## 36 0.13637833 2966.849 2797.828 3225.460 427.6317
## 37 0.13637833 2966.849 2797.828 3225.460 427.6317
## 38 0.13057833 2966.849 2883.961 3225.460 341.4987
## 39 0.13057833 2966.849 2883.961 3225.460 341.4987
## 40 0.13057833 2966.849 2883.961 3225.460 341.4987
## 41 0.13637833 2966.849 2883.961 3225.460 341.4987
## 42 0.12477833 2966.849 2883.961 3225.460 341.4987
## 43 0.13057833 2966.849 2883.961 3225.460 341.4987
## 44 0.12477833 2966.849 2883.961 3225.460 341.4987
## 45 0.13057833 2966.849 2883.961 3225.460 341.4987
## 46 0.12477833 2966.849 2883.961 3225.460 341.4987
## 47 0.13057833 2966.849 2883.961 3225.460 341.4987
## 48 0.13057833 2966.849 2883.961 3225.460 341.4987
## 49 0.12477833 2966.849 2883.961 3225.460 341.4987
## 50 0.11897833 2966.849 2883.961 3225.460 341.4987
## 51 0.12477833 2966.849 2883.961 3225.460 341.4987
## 52 0.12477833 2966.849 2883.961 3225.460 341.4987
## 53 0.11897833 2966.849 2883.961 3225.460 341.4987
## 54 0.11897833 2966.849 2883.961 3225.460 341.4987
## 55 0.11897833 2966.849 2883.961 3225.460 341.4987
## 56 0.11897833 2966.849 2883.961 3225.460 341.4987
## 57 0.11897833 2966.849 2883.961 3225.460 341.4987
## 58 0.09577833 2880.716 2797.828 3053.194 255.3657
## 59 0.10157833 2880.716 2797.828 3139.327 341.4987
## 60 0.10737833 2880.716 2797.828 3139.327 341.4987
## 61 0.08328390 2985.215 2904.635 3074.386 169.7519
## 62 0.07748390 2985.215 2904.635 3074.386 169.7519
## 63 0.08328390 2985.215 2904.635 3074.386 169.7519
## 64 0.08328390 2985.215 2904.635 3074.386 169.7519
## 65 0.08328390 2985.215 2904.635 3074.386 169.7519
## 66 0.07748390 2985.215 2904.635 3074.386 169.7519
## 67 0.07748390 2985.215 2904.635 3074.386 169.7519
## 68 0.08328390 2985.215 2904.635 3074.386 169.7519
## 69 0.08328390 2985.215 2904.635 3074.386 169.7519
## 70 0.08328390 2985.215 2904.635 3074.386 169.7519
## 71 0.08328390 2985.215 2904.635 3074.386 169.7519
## 72 0.08908390 2985.215 2904.635 3074.386 169.7519
## 73 0.08328390 2985.215 2904.635 3074.386 169.7519
## 74 0.08908390 2985.215 2904.635 3074.386 169.7519
## 75 0.08328390 2985.215 2904.635 3074.386 169.7519
## 76 0.07748390 2985.215 2904.635 3074.386 169.7519
## 77 0.07748390 2985.215 2904.635 3074.386 169.7519
## 78 0.07748390 2985.215 2904.635 3074.386 169.7519
## 79 0.07748390 2985.215 2904.635 3074.386 169.7519
## 80 0.07748390 2985.215 2904.635 3074.386 169.7519
## 81 0.08328390 2985.215 2904.635 3074.386 169.7519
## 82 0.08328390 2985.215 2904.635 3074.386 169.7519
## 83 0.08908390 2985.215 2904.635 3074.386 169.7519
## 84 0.08908390 2985.215 2904.635 3074.386 169.7519
## 85 0.08328390 2985.215 2904.635 3074.386 169.7519
## 86 0.09488390 2899.083 2904.635 3074.386 169.7519
## 87 0.10068390 2899.083 2818.502 3074.386 255.8839
## 88 0.09488390 2985.215 2904.635 3074.386 169.7519
## 89 0.08908390 2985.215 2904.635 3074.386 169.7519
## 90 0.08908390 2899.083 2904.635 3074.386 169.7519
## 91 0.09388640 2819.713 2645.454 2903.267 257.8116
## 92 0.09968640 2819.713 2645.454 2903.267 257.8116
## 93 0.10548640 2819.713 2645.454 2903.267 257.8116
## 94 0.09968640 2819.713 2645.454 2903.267 257.8116
## 95 0.11128640 2819.713 2645.454 2903.267 257.8116
## 96 0.10548640 2819.713 2645.454 2903.267 257.8116
## 97 0.11128640 2819.713 2731.587 2989.400 257.8116
## 98 0.11708640 2819.713 2731.587 2989.400 257.8116
## 99 0.11128640 2819.713 2731.587 2989.400 257.8116
## 100 0.11128640 2819.713 2731.587 2989.400 257.8116
## 101 0.11708640 2819.713 2645.454 2989.400 343.9446
## 102 0.10548640 2819.713 2731.587 2989.400 257.8116
## 103 0.11128640 2819.713 2731.587 2989.400 257.8116
## 104 0.09968640 2819.713 2731.587 2989.400 257.8116
## 105 0.10548640 2819.713 2731.587 2989.400 257.8116
## 106 0.10548640 2819.713 2731.587 2989.400 257.8116
## 107 0.10548640 2819.713 2731.587 2989.400 257.8116
## 108 0.10548640 2819.713 2731.587 2989.400 257.8116
## 109 0.11128640 2819.713 2731.587 2989.400 257.8116
## 110 0.10548640 2819.713 2731.587 2989.400 257.8116
## 111 0.09968640 2819.713 2731.587 2989.400 257.8116
## 112 0.09968640 2819.713 2731.587 2989.400 257.8116
## 113 0.09968640 2819.713 2731.587 2989.400 257.8116
## 114 0.09968640 2819.713 2731.587 2989.400 257.8116
## 115 0.09968640 2819.713 2731.587 2989.400 257.8116
## 116 0.10548640 2819.713 2731.587 2989.400 257.8116
## 117 0.09968640 2905.846 2731.587 2989.400 257.8116
## 118 0.09968640 2819.713 2731.587 2989.400 257.8116
## 119 0.09968640 2819.713 2731.587 2989.400 257.8116
## 120 0.09968640 2819.713 2731.587 2989.400 257.8116
## 121 0.11522639 2659.213 2662.030 2830.483 168.4537
## 122 0.12102639 2659.213 2662.030 2916.616 254.5857
## 123 0.12102639 2831.479 2662.030 2916.616 254.5857
## 124 0.12682639 2831.479 2662.030 2916.616 254.5857
## 125 0.13262639 2831.479 2662.030 2916.616 254.5857
## 126 0.12682639 2831.479 2662.030 2916.616 254.5857
## 127 0.13262639 2831.479 2662.030 2916.616 254.5857
## 128 0.12682639 2831.479 2662.030 2916.616 254.5857
## 129 0.13842639 2831.479 2662.030 2916.616 254.5857
## 130 0.11522639 2745.346 2662.030 2916.616 254.5857
## 131 0.10942639 2745.346 2662.030 2916.616 254.5857
## 132 0.11522639 2745.346 2662.030 2916.616 254.5857
## 133 0.11522639 2745.346 2662.030 2916.616 254.5857
## 134 0.11522639 2745.346 2662.030 2916.616 254.5857
## 135 0.12102639 2831.479 2662.030 2916.616 254.5857
## 136 0.12102639 2745.346 2662.030 2916.616 254.5857
## 137 0.12102639 2745.346 2662.030 2916.616 254.5857
## 138 0.12102639 2745.346 2662.030 2916.616 254.5857
## 139 0.13262639 2745.346 2662.030 2916.616 254.5857
## 140 0.12102639 2831.479 2662.030 2916.616 254.5857
## 141 0.12102639 2745.346 2662.030 2916.616 254.5857
## 142 0.10942639 2831.479 2662.030 2916.616 254.5857
## 143 0.10942639 2745.346 2662.030 2916.616 254.5857
## 144 0.10942639 2745.346 2662.030 2916.616 254.5857
## 145 0.11522639 2745.346 2662.030 2916.616 254.5857
## 146 0.11522639 2745.346 2662.030 2916.616 254.5857
## 147 0.10362639 2745.346 2662.030 2916.616 254.5857
## 148 0.10942639 2745.346 2662.030 2916.616 254.5857
## 149 0.11522639 2745.346 2662.030 2916.616 254.5857
## 150 0.11522639 2745.346 2662.030 2916.616 254.5857
## 151 0.10438762 2818.970 2650.057 2904.673 254.6149
## 152 0.09858762 2818.970 2650.057 2904.673 254.6149
## 153 0.09278762 2732.837 2650.057 2818.540 168.4829
## 154 0.09278762 2646.704 2650.057 2818.540 168.4829
## 155 0.09858762 2732.837 2650.057 2818.540 168.4829
## 156 0.09858762 2732.837 2650.057 2904.673 254.6149
## 157 0.09278762 2732.837 2650.057 2818.540 168.4829
## 158 0.09858762 2732.837 2650.057 2818.540 168.4829
## 159 0.09858762 2732.837 2650.057 2818.540 168.4829
## 160 0.09278762 2732.837 2650.057 2818.540 168.4829
## 161 0.09858762 2732.837 2650.057 2818.540 168.4829
## 162 0.10438762 2732.837 2650.057 2818.540 168.4829
## 163 0.10438762 2732.837 2650.057 2818.540 168.4829
## 164 0.10438762 2732.837 2650.057 2818.540 168.4829
## 165 0.10438762 2732.837 2563.925 2818.540 254.6149
## 166 0.11018762 2732.837 2650.057 2818.540 168.4829
## 167 0.10438762 2732.837 2563.925 2818.540 254.6149
## 168 0.10438762 2732.837 2650.057 2818.540 168.4829
## 169 0.08118762 2646.704 2563.925 2818.540 254.6149
## 170 0.09278762 2732.837 2563.925 2818.540 254.6149
## 171 0.09278762 2732.837 2563.925 2818.540 254.6149
## 172 0.09858762 2732.837 2563.925 2818.540 254.6149
## 173 0.08698762 2732.837 2563.925 2818.540 254.6149
## 174 0.09278762 2732.837 2563.925 2818.540 254.6149
## 175 0.09278762 2732.837 2563.925 2818.540 254.6149
## 176 0.08118762 2732.837 2563.925 2818.540 254.6149
## 177 0.08698762 2732.837 2650.057 2818.540 168.4829
## 178 0.08118762 2732.837 2650.057 2818.540 168.4829
## 179 0.09278762 2732.837 2650.057 2818.540 168.4829
## 180 0.08118762 2732.837 2650.057 2818.540 168.4829
## 181 0.08524273 3049.143 2808.006 3138.752 330.7459
## 182 0.09104273 3049.143 2808.006 3138.752 330.7459
## 183 0.09684273 3049.143 2808.006 3138.752 330.7459
## 184 0.08524273 3049.143 2808.006 3138.752 330.7459
## 185 0.09684273 3049.143 2808.006 3138.752 330.7459
## 186 0.09684273 3049.143 2808.006 3138.752 330.7459
## 187 0.09104273 3049.143 2808.006 3138.752 330.7459
## 188 0.09684273 2963.010 2808.006 3138.752 330.7459
## 189 0.09684273 3049.143 2808.006 3138.752 330.7459
## 190 0.10264273 3049.143 2894.139 3224.885 330.7459
## 191 0.10264273 3049.143 2808.006 3138.752 330.7459
## 192 0.09684273 3049.143 2808.006 3138.752 330.7459
## 193 0.10264273 3049.143 2808.006 3138.752 330.7459
## 194 0.09684273 3049.143 2808.006 3138.752 330.7459
## 195 0.10264273 3049.143 2808.006 3138.752 330.7459
## 196 0.10264273 3049.143 2808.006 3138.752 330.7459
## 197 0.09104273 3049.143 2808.006 3138.752 330.7459
## 198 0.09684273 3049.143 2808.006 3138.752 330.7459
## 199 0.08524273 3049.143 2894.139 3138.752 244.6129
## 200 0.09104273 3049.143 2894.139 3138.752 244.6129
## 201 0.08524273 3049.143 2894.139 3138.752 244.6129
## 202 0.09104273 3049.143 2894.139 3138.752 244.6129
## 203 0.09104273 3049.143 2894.139 3138.752 244.6129
## 204 0.10264273 3049.143 2894.139 3138.752 244.6129
## 205 0.09684273 3049.143 2894.139 3224.885 330.7459
## 206 0.08524273 2963.010 2808.006 3138.752 330.7459
## 207 0.07944273 2963.010 2808.006 3138.752 330.7459
## 208 0.08524273 3049.143 2808.006 3138.752 330.7459
## 209 0.08524273 2876.877 2808.006 3138.752 330.7459
## 210 0.09104273 3049.143 2894.139 3138.752 244.6129
## 211 0.07799004 3042.479 2962.001 3127.655 165.6553
## 212 0.07799004 3042.479 2962.001 3127.655 165.6553
## 213 0.07799004 3042.479 2962.001 3127.655 165.6553
## 214 0.08379004 3042.479 2962.001 3213.788 251.7873
## 215 0.07799004 3042.479 2962.001 3127.655 165.6553
## 216 0.07799004 3042.479 2962.001 3127.655 165.6553
## 217 0.07799004 3042.479 2962.001 3213.788 251.7873
## 218 0.07799004 3042.479 2962.001 3213.788 251.7873
## 219 0.08379004 3042.479 2962.001 3127.655 165.6553
## 220 0.07799004 3042.479 2962.001 3213.788 251.7873
## 221 0.07799004 3042.479 2962.001 3213.788 251.7873
## 222 0.08379004 3042.479 2962.001 3213.788 251.7873
## 223 0.08379004 3042.479 2962.001 3213.788 251.7873
## 224 0.07799004 3042.479 2962.001 3213.788 251.7873
## 225 0.07799004 3042.479 2962.001 3213.788 251.7873
## 226 0.07799004 3042.479 2962.001 3213.788 251.7873
## 227 0.08379004 3042.479 2962.001 3213.788 251.7873
## 228 0.07799004 3042.479 2962.001 3213.788 251.7873
## 229 0.08379004 3042.479 2962.001 3213.788 251.7873
## 230 0.07799004 3042.479 2962.001 3213.788 251.7873
## 231 0.07799004 3042.479 2962.001 3213.788 251.7873
## 232 0.07799004 3128.611 2962.001 3213.788 251.7873
## 233 0.07799004 3042.479 2962.001 3213.788 251.7873
## 234 0.07799004 3042.479 2962.001 3213.788 251.7873
## 235 0.08379004 3128.611 2962.001 3213.788 251.7873
## 236 0.07799004 3042.479 2962.001 3213.788 251.7873
## 237 0.07799004 3042.479 2962.001 3213.788 251.7873
## 238 0.08379004 3128.611 2962.001 3213.788 251.7873
## 239 0.07799004 3128.611 2962.001 3213.788 251.7873
## 240 0.07799004 3128.611 2962.001 3213.788 251.7873
## 241 0.13248208 2929.670 2772.567 3105.514 332.9474
## 242 0.12668208 2929.670 2772.567 3019.382 246.8144
## 243 0.09768208 2929.670 2772.567 3019.382 246.8144
## 244 0.12668208 2929.670 2772.567 3019.382 246.8144
## 245 0.12668208 2929.670 2772.567 3019.382 246.8144
## 246 0.13248208 2929.670 2772.567 3019.382 246.8144
## 247 0.13248208 2929.670 2772.567 3019.382 246.8144
## 248 0.13248208 2929.670 2772.567 3019.382 246.8144
## 249 0.12668208 2929.670 2772.567 3019.382 246.8144
## 250 0.13248208 2929.670 2772.567 3019.382 246.8144
## 251 0.12668208 2929.670 2772.567 3019.382 246.8144
## 252 0.12668208 2929.670 2772.567 3019.382 246.8144
## 253 0.10348208 2929.670 2772.567 3019.382 246.8144
## 254 0.12668208 2929.670 2772.567 3019.382 246.8144
## 255 0.12668208 2929.670 2772.567 3019.382 246.8144
## 256 0.10928208 2929.670 2772.567 3019.382 246.8144
## 257 0.12668208 2929.670 2772.567 3019.382 246.8144
## 258 0.12088208 2929.670 2772.567 3019.382 246.8144
## 259 0.12668208 2929.670 2772.567 3019.382 246.8144
## 260 0.10348208 2929.670 2772.567 3019.382 246.8144
## 261 0.13828208 2929.670 2772.567 3019.382 246.8144
## 262 0.12088208 2929.670 2772.567 3019.382 246.8144
## 263 0.13248208 2929.670 2772.567 3019.382 246.8144
## 264 0.13248208 2929.670 2772.567 3019.382 246.8144
## 265 0.12668208 2929.670 2772.567 3019.382 246.8144
## 266 0.13248208 2929.670 2772.567 3019.382 246.8144
## 267 0.12088208 2929.670 2772.567 3019.382 246.8144
## 268 0.13248208 2929.670 2772.567 3019.382 246.8144
## 269 0.12668208 2929.670 2772.567 3019.382 246.8144
## 270 0.12088208 2929.670 2772.567 3019.382 246.8144
## 271 0.12035839 3000.021 2840.293 3175.265 334.9722
## 272 0.13195839 3086.153 2840.293 3175.265 334.9722
## 273 0.13195839 3000.021 2840.293 3175.265 334.9722
## 274 0.13775839 3086.153 2840.293 3175.265 334.9722
## 275 0.13775839 3086.153 2840.293 3175.265 334.9722
## 276 0.13775839 3086.153 2840.293 3175.265 334.9722
## 277 0.14355839 3086.153 2840.293 3175.265 334.9722
## 278 0.14355839 3086.153 2840.293 3175.265 334.9722
## 279 0.13775839 3086.153 2840.293 3175.265 334.9722
## 280 0.13775839 3086.153 2840.293 3175.265 334.9722
## 281 0.13775839 3086.153 2840.293 3175.265 334.9722
## 282 0.14355839 3086.153 2840.293 3175.265 334.9722
## 283 0.14355839 3086.153 2840.293 3175.265 334.9722
## 284 0.13775839 3086.153 2840.293 3175.265 334.9722
## 285 0.13775839 3086.153 2840.293 3175.265 334.9722
## 286 0.14355839 3086.153 2840.293 3175.265 334.9722
## 287 0.13775839 3000.021 2840.293 3175.265 334.9722
## 288 0.13775839 3086.153 2840.293 3175.265 334.9722
## 289 0.13775839 3086.153 2840.293 3175.265 334.9722
## 290 0.13195839 3000.021 2840.293 3175.265 334.9722
## 291 0.13775839 3000.021 2840.293 3175.265 334.9722
## 292 0.13775839 3000.021 2840.293 3175.265 334.9722
## 293 0.13775839 3000.021 2840.293 3175.265 334.9722
## 294 0.13195839 3000.021 2840.293 3175.265 334.9722
## 295 0.12615839 3000.021 2840.293 3175.265 334.9722
## 296 0.12615839 3000.021 2840.293 3175.265 334.9722
## 297 0.12615839 3000.021 2840.293 3175.265 334.9722
## 298 0.12615839 3000.021 2840.293 3175.265 334.9722
## 299 0.13775839 3000.021 2840.293 3175.265 334.9722
## 300 0.13195839 3000.021 2840.293 3175.265 334.9722
## 301 0.09574945 2881.812 2899.469 3057.573 158.1042
## 302 0.07834945 2967.945 2899.469 3057.573 158.1042
## 303 0.07834945 2881.812 2899.469 3057.573 158.1042
## 304 0.08414945 2881.812 2899.469 3057.573 158.1042
## 305 0.08994945 2881.812 2899.469 3057.573 158.1042
## 306 0.09574945 2881.812 2899.469 3057.573 158.1042
## 307 0.08414945 2881.812 2899.469 3057.573 158.1042
## 308 0.08994945 2881.812 2899.469 3057.573 158.1042
## 309 0.09574945 2881.812 2899.469 3057.573 158.1042
## 310 0.10154945 2881.812 2899.469 3057.573 158.1042
## 311 0.09574945 2881.812 2899.469 3057.573 158.1042
## 312 0.12474945 2881.812 2899.469 3057.573 158.1042
## 313 0.14224945 2881.812 2899.469 3057.573 158.1042
## 314 0.14224945 2881.812 2899.469 3057.573 158.1042
## 315 0.11314945 2881.812 2899.469 3057.573 158.1042
## 316 0.11894945 2881.812 2899.469 3057.573 158.1042
## 317 0.11894945 2967.945 2899.469 3057.573 158.1042
## 318 0.13054945 2881.812 2899.469 3057.573 158.1042
## 319 0.14224945 2881.812 2899.469 3057.573 158.1042
## 320 0.14224945 2881.812 2899.469 3057.573 158.1042
## 321 0.13634945 2881.812 2899.469 3057.573 158.1042
## 322 0.14224945 2881.812 2899.469 3057.573 158.1042
## 323 0.13054945 2881.812 2899.469 3057.573 158.1042
## 324 0.10734945 2881.812 2899.469 3057.573 158.1042
## 325 0.12474945 2881.812 2899.469 3057.573 158.1042
## 326 0.10734945 2967.945 2899.469 3057.573 158.1042
## 327 0.12793585 2642.280 2550.754 2724.625 173.8727
## 328 0.13953585 2642.280 2550.754 2724.625 173.8727
## 329 0.15113585 2642.280 2550.754 2810.758 260.0047
## 330 0.13953585 2642.280 2550.754 2810.758 260.0047
## 331 0.14533585 2642.280 2550.754 2810.758 260.0047
## 332 0.14533585 2642.280 2550.754 2810.758 260.0047
## 333 0.15113585 2642.280 2550.754 2810.758 260.0047
## 334 0.15113585 2642.280 2550.754 2810.758 260.0047
## 335 0.15113585 2642.280 2550.754 2810.758 260.0047
## 336 0.15113585 2642.280 2550.754 2810.758 260.0047
## 337 0.14533585 2642.280 2550.754 2810.758 260.0047
## 338 0.10473585 2642.280 2550.754 2724.625 173.8727
## 339 0.11633585 2642.280 2550.754 2810.758 260.0047
## 340 0.13373585 2642.280 2550.754 2810.758 260.0047
## 341 0.11053585 2642.280 2550.754 2810.758 260.0047
## 342 0.12213585 2642.280 2550.754 2810.758 260.0047
## 343 0.12793585 2642.280 2550.754 2810.758 260.0047
## 344 0.13373585 2642.280 2550.754 2810.758 260.0047
## 345 0.13373585 2642.280 2550.754 2810.758 260.0047
## 346 0.13953585 2642.280 2550.754 2810.758 260.0047
## 347 0.14533585 2642.280 2550.754 2810.758 260.0047
## 348 0.14533585 2642.280 2550.754 2810.758 260.0047
## 349 0.12793585 2642.280 2550.754 2810.758 260.0047
## 350 0.12793585 2642.280 2550.754 2810.758 260.0047
## 351 0.14533585 2642.280 2550.754 2810.758 260.0047
## 352 0.13953585 2642.280 2550.754 2810.758 260.0047
## 353 0.14533585 2642.280 2550.754 2810.758 260.0047
## 354 0.14533585 2642.280 2550.754 2810.758 260.0047
## 355 0.13953585 2728.413 2550.754 2810.758 260.0047
## 356 0.13953585 2642.280 2550.754 2810.758 260.0047
## 357 0.10237625 2952.503 2772.933 3039.901 266.9672
## 358 0.11397625 2866.370 2772.933 3039.901 266.9672
## 359 0.10817625 2866.370 2772.933 3039.901 266.9672
## 360 0.10817625 2952.503 2772.933 3039.901 266.9672
## 361 0.10817625 2952.503 2772.933 3039.901 266.9672
## 362 0.10817625 2952.503 2772.933 3039.901 266.9672
## 363 0.11397625 2866.370 2772.933 3039.901 266.9672
## 364 0.10817625 2952.503 2772.933 3039.901 266.9672
## 365 0.10817625 2952.503 2772.933 3039.901 266.9672
## 366 0.10817625 2952.503 2772.933 3039.901 266.9672
## 367 0.10817625 2952.503 2772.933 3039.901 266.9672
## 368 0.10237625 2866.370 2772.933 3039.901 266.9672
## 369 0.10817625 2952.503 2772.933 3039.901 266.9672
## 370 0.10817625 2952.503 2772.933 3039.901 266.9672
## 371 0.09657625 2866.370 2772.933 3039.901 266.9672
## 372 0.10237625 2952.503 2772.933 3039.901 266.9672
## 373 0.09657625 2952.503 2772.933 3039.901 266.9672
## 374 0.09657625 2952.503 2772.933 3039.901 266.9672
## 375 0.10237625 2952.503 2772.933 3039.901 266.9672
## 376 0.09657625 2952.503 2772.933 3039.901 266.9672
## 377 0.07907625 2952.503 2772.933 2953.768 180.8352
## 378 0.09077625 2866.370 2772.933 2953.768 180.8352
## 379 0.10237625 2952.503 2772.933 3039.901 266.9672
## 380 0.09077625 2952.503 2772.933 2953.768 180.8352
## 381 0.10817625 2952.503 2772.933 3039.901 266.9672
## 382 0.09657625 2952.503 2772.933 3039.901 266.9672
## 383 0.09077625 2952.503 2772.933 3039.901 266.9672
## 384 0.09077625 2952.503 2772.933 3039.901 266.9672
## 385 0.10817625 2952.503 2772.933 3039.901 266.9672
## 386 0.10237625 2952.503 2772.933 3039.901 266.9672
## 387 0.12260447 2729.222 2554.396 2815.096 260.6995
## 388 0.12260447 2815.355 2640.529 2901.229 260.6995
## 389 0.12840447 2815.355 2640.529 2901.229 260.6995
## 390 0.12840447 2729.222 2640.529 2901.229 260.6995
## 391 0.12260447 2901.488 2640.529 2987.361 346.8325
## 392 0.12840447 2815.355 2640.529 2987.361 346.8325
## 393 0.12840447 2901.488 2640.529 2987.361 346.8325
## 394 0.13420447 2901.488 2726.662 3073.494 346.8325
## 395 0.13420447 2901.488 2726.662 3073.494 346.8325
## 396 0.12840447 2901.488 2726.662 3073.494 346.8325
## 397 0.12840447 2901.488 2726.662 3073.494 346.8325
## 398 0.12260447 2901.488 2726.662 3073.494 346.8325
## 399 0.12260447 2901.488 2726.662 3073.494 346.8325
## 400 0.12260447 2901.488 2812.795 3073.494 260.6995
## 401 0.12840447 2987.620 2812.795 3073.494 260.6995
## 402 0.12260447 2901.488 2812.795 3073.494 260.6995
## 403 0.12260447 2901.488 2812.795 3073.494 260.6995
## 404 0.12260447 2901.488 2812.795 3073.494 260.6995
## 405 0.12260447 2901.488 2812.795 3073.494 260.6995
## 406 0.12260447 2901.488 2812.795 3073.494 260.6995
## 407 0.13420447 2901.488 2812.795 3159.627 346.8325
## 408 0.12840447 2901.488 2812.795 3073.494 260.6995
## 409 0.13420447 2987.620 2812.795 3159.627 346.8325
## 410 0.12260447 2901.488 2812.795 3073.494 260.6995
## 411 0.13420447 2901.488 2812.795 3159.627 346.8325
## 412 0.12840447 2987.620 2812.795 3159.627 346.8325
## 413 0.12260447 2901.488 2812.795 3073.494 260.6995
## 414 0.12840447 2901.488 2812.795 3159.627 346.8325
## 415 0.12260447 2901.488 2812.795 3159.627 346.8325
## 416 0.12840447 2901.488 2812.795 3159.627 346.8325
## 417 0.12942237 2918.004 2738.830 2996.835 258.0050
## 418 0.15262237 2918.004 2824.963 3082.968 258.0050
## 419 0.15262237 2918.004 2824.963 3082.968 258.0050
## 420 0.15262237 2918.004 2824.963 3082.968 258.0050
## 421 0.12362237 2918.004 2824.963 3082.968 258.0050
## 422 0.12362237 2918.004 2824.963 3082.968 258.0050
## 423 0.12942237 2918.004 2824.963 3082.968 258.0050
## 424 0.12362237 2918.004 2824.963 3082.968 258.0050
## 425 0.14682237 2918.004 2824.963 3082.968 258.0050
## 426 0.12942237 2918.004 2824.963 3082.968 258.0050
## 427 0.12942237 3004.137 2824.963 3082.968 258.0050
## 428 0.12362237 2918.004 2824.963 3082.968 258.0050
## 429 0.11782237 2918.004 2824.963 3082.968 258.0050
## 430 0.12942237 2918.004 2824.963 3082.968 258.0050
## 431 0.12362237 2918.004 2824.963 3082.968 258.0050
## 432 0.12942237 2918.004 2824.963 3082.968 258.0050
## 433 0.12362237 2918.004 2824.963 3082.968 258.0050
## 434 0.12362237 2918.004 2824.963 3082.968 258.0050
## 435 0.12942237 2918.004 2824.963 3082.968 258.0050
## 436 0.12942237 2918.004 2824.963 3082.968 258.0050
## 437 0.12362237 2918.004 2824.963 3082.968 258.0050
## 438 0.12362237 2918.004 2824.963 3082.968 258.0050
## 439 0.12942237 3004.137 2824.963 3082.968 258.0050
## 440 0.12362237 3004.137 2824.963 3082.968 258.0050
## 441 0.13522237 3004.137 2824.963 3082.968 258.0050
## 442 0.12362237 2918.004 2824.963 3082.968 258.0050
## 443 0.11782237 2918.004 2738.830 3082.968 344.1380
## 444 0.11782237 3004.137 2824.963 3082.968 258.0050
## 445 0.12362237 3004.137 2824.963 3082.968 258.0050
## 446 0.12362237 3004.137 2824.963 3082.968 258.0050
## 447 0.12942237 2918.004 2824.963 3082.968 258.0050
## 448 0.12942237 3004.137 2824.963 3082.968 258.0050
## 449 0.11782237 2918.004 2824.963 3082.968 258.0050
## 450 0.12362237 2918.004 2824.963 3082.968 258.0050
## 451 0.12362237 2918.004 2824.963 3082.968 258.0050
## 452 0.12362237 2918.004 2824.963 3082.968 258.0050
## 453 0.12362237 2918.004 2824.963 3082.968 258.0050
## 454 0.11782237 2918.004 2824.963 3082.968 258.0050
## 455 0.11782237 2918.004 2824.963 3082.968 258.0050
## 456 0.12362237 2918.004 2824.963 3082.968 258.0050
## 457 0.11782237 2918.004 2824.963 3082.968 258.0050
## 458 0.12362237 3004.137 2824.963 3082.968 258.0050
## 459 0.11782237 2918.004 2824.963 3082.968 258.0050
## 460 0.11782237 3004.137 2824.963 3082.968 258.0050
## 461 0.12362237 2918.004 2824.963 3082.968 258.0050
## 462 0.12362237 3004.137 2824.963 3082.968 258.0050
## 463 0.11782237 3004.137 2824.963 3082.968 258.0050
## 464 0.12362237 2918.004 2824.963 3082.968 258.0050
## 465 0.12362237 3004.137 2824.963 3082.968 258.0050
## 466 0.11782237 3004.137 2824.963 3082.968 258.0050
## 467 0.12362237 3004.137 2824.963 3082.968 258.0050
## 468 0.11782237 3004.137 2824.963 3082.968 258.0050
## 469 0.12362237 3004.137 2824.963 3082.968 258.0050
## 470 0.12362237 2918.004 2824.963 3082.968 258.0050
## 471 0.11782237 3004.137 2824.963 3082.968 258.0050
## 472 0.11782237 3004.137 2824.963 3082.968 258.0050
## 473 0.12362237 2918.004 2824.963 3082.968 258.0050
## 474 0.12362237 3004.137 2824.963 3082.968 258.0050
## 475 0.11782237 2918.004 2824.963 3082.968 258.0050
## 476 0.11782237 2918.004 2824.963 3082.968 258.0050
## 477 0.09678927 2839.227 2743.617 3012.657 269.0393
## 478 0.09678927 2839.227 2743.617 3012.657 269.0393
## 479 0.09678927 2839.227 2743.617 3012.657 269.0393
## 480 0.09678927 2839.227 2743.617 3012.657 269.0393
## 481 0.09678927 2839.227 2743.617 3012.657 269.0393
## 482 0.09678927 2925.360 2743.617 3012.657 269.0393
## 483 0.09678927 2925.360 2743.617 3012.657 269.0393
## 484 0.09678927 2839.227 2743.617 3012.657 269.0393
## 485 0.09678927 2839.227 2743.617 3012.657 269.0393
## 486 0.09678927 2839.227 2743.617 3012.657 269.0393
## 487 0.09678927 2839.227 2743.617 3012.657 269.0393
## 488 0.09678927 2839.227 2743.617 3012.657 269.0393
## 489 0.09678927 2839.227 2743.617 3012.657 269.0393
## 490 0.10258927 2839.227 2829.749 3012.657 182.9073
## 491 0.09678927 2925.360 2829.749 3012.657 182.9073
## 492 0.09678927 2839.227 2829.749 3012.657 182.9073
## 493 0.09678927 2839.227 2829.749 3012.657 182.9073
## 494 0.09678927 2839.227 2829.749 3012.657 182.9073
## 495 0.10258927 2839.227 2829.749 3012.657 182.9073
## 496 0.09678927 2925.360 2829.749 3012.657 182.9073
## 497 0.09678927 2925.360 2829.749 3012.657 182.9073
## 498 0.09678927 2839.227 2829.749 3012.657 182.9073
## 499 0.09678927 2925.360 2743.617 3012.657 269.0393
## 500 0.10258927 2925.360 2829.749 3012.657 182.9073
## 501 0.10258927 2925.360 2829.749 3012.657 182.9073
## 502 0.09678927 2839.227 2829.749 3012.657 182.9073
## 503 0.10258927 2925.360 2829.749 3012.657 182.9073
## 504 0.09678927 2925.360 2829.749 3012.657 182.9073
## 505 0.09678927 2925.360 2829.749 3012.657 182.9073
## 506 0.09678927 2925.360 2829.749 3012.657 182.9073
## 507 0.12758848 2841.921 2659.732 2926.540 266.8076
## 508 0.13338848 2841.921 2659.732 2926.540 266.8076
## 509 0.12178848 2841.921 2659.732 2926.540 266.8076
## 510 0.12758848 2841.921 2659.732 2926.540 266.8076
## 511 0.12178848 2841.921 2659.732 2926.540 266.8076
## 512 0.11598848 2841.921 2659.732 2926.540 266.8076
## 513 0.11018848 2841.921 2659.732 2926.540 266.8076
## 514 0.11598848 2841.921 2659.732 2926.540 266.8076
## 515 0.11018848 2841.921 2745.865 2926.540 180.6756
## 516 0.12178848 2928.053 2745.865 3012.673 266.8076
## 517 0.12178848 2928.053 2745.865 3012.673 266.8076
## 518 0.12178848 2928.053 2745.865 3012.673 266.8076
## 519 0.11018848 2841.921 2745.865 2926.540 180.6756
## 520 0.11018848 2841.921 2745.865 2926.540 180.6756
## 521 0.11598848 2928.053 2745.865 3012.673 266.8076
## 522 0.11018848 2841.921 2745.865 2926.540 180.6756
## 523 0.12178848 2928.053 2745.865 3012.673 266.8076
## 524 0.11598848 2928.053 2745.865 3012.673 266.8076
## 525 0.11598848 2928.053 2745.865 3012.673 266.8076
## 526 0.11598848 2928.053 2745.865 3012.673 266.8076
## 527 0.11018848 2928.053 2745.865 3012.673 266.8076
## 528 0.11018848 2928.053 2745.865 3012.673 266.8076
## 529 0.11018848 2928.053 2745.865 3012.673 266.8076
## 530 0.10438848 2928.053 2745.865 3012.673 266.8076
## 531 0.11018848 2928.053 2745.865 3012.673 266.8076
## 532 0.12178848 2928.053 2745.865 3012.673 266.8076
## 533 0.11018848 2928.053 2745.865 3012.673 266.8076
## 534 0.11598848 2928.053 2745.865 3012.673 266.8076
## 535 0.11598848 2928.053 2745.865 3012.673 266.8076
## 536 0.11598848 2928.053 2745.865 3012.673 266.8076
## 537 0.09496721 2918.924 2818.753 2999.738 180.9864
## 538 0.09496721 2918.924 2818.753 2999.738 180.9864
## 539 0.08916721 2918.924 2818.753 2999.738 180.9864
## 540 0.09496721 2918.924 2818.753 2999.738 180.9864
## 541 0.08916721 2918.924 2818.753 2999.738 180.9864
## 542 0.08916721 2918.924 2818.753 2999.738 180.9864
## 543 0.08916721 2918.924 2818.753 2999.738 180.9864
## 544 0.09496721 2918.924 2818.753 2999.738 180.9864
## 545 0.09496721 2918.924 2818.753 2999.738 180.9864
## 546 0.09496721 2918.924 2818.753 2999.738 180.9864
## 547 0.08916721 2918.924 2818.753 2999.738 180.9864
## 548 0.09496721 2918.924 2818.753 2999.738 180.9864
## 549 0.09496721 2918.924 2818.753 2999.738 180.9864
## 550 0.10076721 2918.924 2818.753 2999.738 180.9864
## 551 0.08916721 2918.924 2818.753 2999.738 180.9864
## 552 0.08336721 2918.924 2818.753 2999.738 180.9864
## 553 0.08916721 2918.924 2818.753 2999.738 180.9864
## 554 0.09496721 2918.924 2818.753 2999.738 180.9864
## 555 0.10076721 2918.924 2818.753 2999.738 180.9864
## 556 0.09496721 2918.924 2818.753 2999.738 180.9864
## 557 0.09496721 2918.924 2818.753 2999.738 180.9864
## 558 0.10076721 2918.924 2818.753 2999.738 180.9864
## 559 0.08916721 2918.924 2818.753 2999.738 180.9864
## 560 0.09496721 2918.924 2818.753 2999.738 180.9864
## 561 0.10656721 2918.924 2818.753 2999.738 180.9864
## 562 0.11236721 2918.924 2818.753 3085.871 267.1184
## 563 0.11236721 2918.924 2818.753 2999.738 180.9864
## 564 0.09496721 2918.924 2818.753 2999.738 180.9864
## 565 0.09496721 2918.924 2818.753 2999.738 180.9864
## 566 0.09496721 2918.924 2818.753 2999.738 180.9864
## 567 0.07433400 2592.829 2508.813 2684.403 175.5901
## 568 0.06853400 2592.829 2508.813 2684.403 175.5901
## 569 0.07433400 2592.829 2508.813 2684.403 175.5901
## 570 0.07433400 2592.829 2508.813 2684.403 175.5901
## 571 0.08023400 2506.696 2508.813 2684.403 175.5901
## 572 0.08023400 2592.829 2508.813 2684.403 175.5901
## 573 0.08023400 2592.829 2508.813 2684.403 175.5901
## 574 0.07433400 2592.829 2508.813 2684.403 175.5901
## 575 0.07433400 2592.829 2508.813 2684.403 175.5901
## 576 0.08603400 2592.829 2508.813 2770.536 261.7221
## 577 0.08023400 2592.829 2508.813 2684.403 175.5901
## 578 0.08023400 2592.829 2508.813 2684.403 175.5901
## 579 0.08023400 2592.829 2508.813 2684.403 175.5901
## 580 0.08023400 2592.829 2508.813 2684.403 175.5901
## 581 0.09183400 2592.829 2508.813 2684.403 175.5901
## 582 0.08603400 2592.829 2508.813 2684.403 175.5901
## 583 0.09183400 2592.829 2508.813 2770.536 261.7221
## 584 0.08603400 2592.829 2508.813 2684.403 175.5901
## 585 0.08603400 2592.829 2508.813 2684.403 175.5901
## 586 0.08603400 2506.696 2508.813 2684.403 175.5901
## 587 0.08023400 2592.829 2508.813 2684.403 175.5901
## 588 0.08603400 2592.829 2508.813 2684.403 175.5901
## 589 0.08023400 2592.829 2508.813 2684.403 175.5901
## 590 0.09183400 2592.829 2508.813 2684.403 175.5901
## 591 0.08023400 2592.829 2508.813 2684.403 175.5901
## 592 0.08023400 2592.829 2508.813 2684.403 175.5901
## 593 0.08023400 2592.829 2508.813 2684.403 175.5901
## 594 0.08023400 2592.829 2508.813 2684.403 175.5901
## 595 0.08023400 2592.829 2508.813 2684.403 175.5901
## 596 0.08023400 2592.829 2508.813 2684.403 175.5901
## 597 0.19005458 2907.757 2670.150 3002.750 332.5994
## 598 0.17265458 2907.757 2670.150 3002.750 332.5994
## 599 0.18425458 2907.757 2670.150 3002.750 332.5994
## 600 0.17265458 2907.757 2670.150 3002.750 332.5994
## 601 0.17845458 2907.757 2670.150 3002.750 332.5994
## 602 0.17845458 2907.757 2670.150 3002.750 332.5994
## 603 0.16685458 2907.757 2670.150 3002.750 332.5994
## 604 0.16685458 2907.757 2670.150 3002.750 332.5994
## 605 0.16685458 2907.757 2670.150 3002.750 332.5994
## 606 0.16685458 2907.757 2670.150 3002.750 332.5994
## 607 0.16105458 2907.757 2670.150 3002.750 332.5994
## 608 0.16105458 2907.757 2670.150 3002.750 332.5994
## 609 0.15525458 2907.757 2670.150 3002.750 332.5994
## 610 0.15525458 2907.757 2670.150 3002.750 332.5994
## 611 0.15525458 2907.757 2670.150 3002.750 332.5994
## 612 0.16105458 2907.757 2670.150 3002.750 332.5994
## 613 0.15525458 2907.757 2670.150 3002.750 332.5994
## 614 0.16105458 2907.757 2756.283 3002.750 246.4664
## 615 0.14935458 2907.757 2670.150 3002.750 332.5994
## 616 0.14935458 2907.757 2670.150 3002.750 332.5994
## 617 0.14935458 2907.757 2670.150 3002.750 332.5994
## 618 0.14935458 2907.757 2670.150 3002.750 332.5994
## 619 0.15525458 2907.757 2670.150 3002.750 332.5994
## 620 0.15525458 2907.757 2756.283 3002.750 246.4664
## 621 0.14355458 2907.757 2756.283 3002.750 246.4664
## 622 0.14355458 2907.757 2756.283 3002.750 246.4664
## 623 0.14935458 2907.757 2756.283 3002.750 246.4664
## 624 0.15525458 2907.757 2756.283 3002.750 246.4664
## 625 0.15525458 2907.757 2756.283 3002.750 246.4664
## 626 0.15525458 2907.757 2756.283 3002.750 246.4664
## 627 0.08096435 2897.371 2832.033 3078.790 246.7567
## 628 0.08096435 2897.371 2832.033 2992.657 160.6247
## 629 0.08096435 2897.371 2832.033 3078.790 246.7567
## 630 0.09256435 2983.503 2832.033 3078.790 246.7567
## 631 0.08676435 2897.371 2745.900 3078.790 332.8897
## 632 0.08676435 2897.371 2745.900 3078.790 332.8897
## 633 0.10416435 2983.503 2832.033 3078.790 246.7567
## 634 0.09256435 2983.503 2832.033 3078.790 246.7567
## 635 0.09256435 2897.371 2745.900 3078.790 332.8897
## 636 0.09256435 2897.371 2745.900 3078.790 332.8897
## 637 0.09836435 2983.503 2745.900 3078.790 332.8897
## 638 0.10416435 2983.503 2745.900 3078.790 332.8897
## 639 0.10416435 2983.503 2745.900 3078.790 332.8897
## 640 0.09836435 2983.503 2832.033 3078.790 246.7567
## 641 0.10416435 2983.503 2832.033 3078.790 246.7567
## 642 0.10996435 2983.503 2745.900 3078.790 332.8897
## 643 0.09836435 2983.503 2745.900 3078.790 332.8897
## 644 0.09836435 2897.371 2745.900 3078.790 332.8897
## 645 0.09256435 2897.371 2832.033 3078.790 246.7567
## 646 0.08676435 2897.371 2745.900 3078.790 332.8897
## 647 0.08096435 2897.371 2832.033 3078.790 246.7567
## 648 0.09256435 2897.371 2832.033 3078.790 246.7567
## 649 0.07516435 2897.371 2832.033 3078.790 246.7567
## 650 0.08676435 2897.371 2832.033 3078.790 246.7567
## 651 0.09256435 2897.371 2745.900 3078.790 332.8897
## 652 0.09836435 2897.371 2745.900 3078.790 332.8897
## 653 0.09836435 2897.371 2832.033 3078.790 246.7567
## 654 0.10416435 2983.503 2832.033 3078.790 246.7567
## 655 0.10996435 2897.371 2832.033 3078.790 246.7567
## 656 0.09836435 2897.371 2832.033 3078.790 246.7567
## 657 0.09163514 3027.732 2952.619 3113.036 160.4171
## 658 0.10323514 3027.732 2952.619 3113.036 160.4171
## 659 0.09743514 3027.732 2952.619 3113.036 160.4171
## 660 0.09743514 3027.732 2952.619 3113.036 160.4171
## 661 0.10323514 3027.732 2952.619 3113.036 160.4171
## 662 0.09743514 3027.732 2952.619 3113.036 160.4171
## 663 0.10323514 3027.732 2952.619 3113.036 160.4171
## 664 0.10323514 3027.732 2952.619 3113.036 160.4171
## 665 0.08583514 3027.732 2952.619 3113.036 160.4171
## 666 0.09163514 3027.732 2952.619 3113.036 160.4171
## 667 0.09743514 3027.732 2952.619 3113.036 160.4171
## 668 0.09743514 3027.732 2952.619 3113.036 160.4171
## 669 0.09743514 3027.732 2952.619 3113.036 160.4171
## 670 0.10323514 3027.732 2952.619 3113.036 160.4171
## 671 0.09743514 3027.732 2952.619 3113.036 160.4171
## 672 0.09743514 3027.732 2952.619 3113.036 160.4171
## 673 0.10323514 3027.732 2952.619 3113.036 160.4171
## 674 0.09743514 3027.732 2952.619 3113.036 160.4171
## 675 0.09743514 3027.732 2952.619 3113.036 160.4171
## 676 0.10323514 3027.732 2952.619 3113.036 160.4171
## 677 0.09743514 3027.732 2952.619 3113.036 160.4171
## 678 0.09743514 3027.732 2952.619 3113.036 160.4171
## 679 0.10323514 3027.732 2952.619 3113.036 160.4171
## 680 0.10323514 3027.732 2952.619 3113.036 160.4171
## 681 0.10323514 3027.732 2952.619 3113.036 160.4171
## 682 0.10323514 3027.732 2952.619 3199.168 246.5491
## 683 0.09743514 3027.732 2952.619 3113.036 160.4171
## 684 0.10323514 3027.732 2952.619 3113.036 160.4171
## 685 0.10323514 3027.732 2952.619 3199.168 246.5491
## 686 0.09743514 3027.732 2952.619 3113.036 160.4171
## 687 0.09650784 2777.997 2697.208 2863.222 166.0139
## 688 0.09650784 2777.997 2697.208 2949.355 252.1459
## 689 0.09070784 2777.997 2697.208 2949.355 252.1459
## 690 0.09070784 2777.997 2697.208 2949.355 252.1459
## 691 0.09650784 2864.130 2697.208 2949.355 252.1459
## 692 0.09650784 2864.130 2783.341 2949.355 166.0139
## 693 0.09650784 2864.130 2697.208 2949.355 252.1459
## 694 0.09650784 2864.130 2697.208 2949.355 252.1459
## 695 0.09650784 2864.130 2697.208 3035.488 338.2789
## 696 0.09650784 2864.130 2697.208 2949.355 252.1459
## 697 0.09070784 2864.130 2697.208 2949.355 252.1459
## 698 0.09650784 2864.130 2697.208 2949.355 252.1459
## 699 0.09650784 2864.130 2697.208 2949.355 252.1459
## 700 0.10230784 2864.130 2697.208 3035.488 338.2789
## 701 0.09650784 2864.130 2783.341 3035.488 252.1459
## 702 0.10230784 2864.130 2697.208 2949.355 252.1459
## 703 0.10230784 2864.130 2697.208 3035.488 338.2789
## 704 0.10230784 2864.130 2697.208 3035.488 338.2789
## 705 0.10230784 2864.130 2697.208 3035.488 338.2789
## 706 0.10230784 2864.130 2697.208 3035.488 338.2789
## 707 0.10230784 2864.130 2783.341 3035.488 252.1459
## 708 0.10230784 2864.130 2697.208 3035.488 338.2789
## 709 0.10230784 2864.130 2783.341 3035.488 252.1459
## 710 0.09650784 2864.130 2697.208 3035.488 338.2789
## 711 0.09650784 2864.130 2783.341 3035.488 252.1459
## 712 0.09650784 2864.130 2697.208 3035.488 338.2789
## 713 0.09070784 2864.130 2697.208 2949.355 252.1459
## 714 0.09650784 2864.130 2697.208 3035.488 338.2789
## 715 0.09070784 2864.130 2697.208 2949.355 252.1459
## 716 0.08490784 2864.130 2697.208 2949.355 252.1459
## 717 0.13965234 2981.361 2890.232 3150.150 259.9183
## 718 0.13385234 2981.361 2890.232 3150.150 259.9183
## 719 0.13385234 2981.361 2890.232 3150.150 259.9183
## 720 0.12225234 2981.361 2890.232 3150.150 259.9183
## 721 0.13965234 2981.361 2890.232 3150.150 259.9183
## 722 0.13385234 2981.361 2890.232 3150.150 259.9183
## 723 0.13385234 2981.361 2890.232 3150.150 259.9183
## 724 0.12225234 2981.361 2890.232 3150.150 259.9183
## 725 0.12225234 2981.361 2890.232 3150.150 259.9183
## 726 0.11645234 2981.361 2890.232 3150.150 259.9183
## 727 0.12225234 2981.361 2890.232 3150.150 259.9183
## 728 0.12805234 2981.361 2890.232 3150.150 259.9183
## 729 0.12805234 2981.361 2890.232 3150.150 259.9183
## 730 0.11645234 2981.361 2890.232 3150.150 259.9183
## 731 0.11645234 2981.361 2890.232 3150.150 259.9183
## 732 0.12225234 2981.361 2890.232 3150.150 259.9183
## 733 0.12225234 2981.361 2890.232 3150.150 259.9183
## 734 0.12225234 2981.361 2890.232 3150.150 259.9183
## 735 0.11645234 2981.361 2890.232 3150.150 259.9183
## 736 0.12225234 2981.361 2890.232 3150.150 259.9183
## 737 0.12805234 2981.361 2890.232 3150.150 259.9183
## 738 0.12225234 2981.361 2890.232 3150.150 259.9183
## 739 0.12225234 2981.361 2890.232 3150.150 259.9183
## 740 0.11645234 2981.361 2890.232 3150.150 259.9183
## 741 0.11645234 2981.361 2890.232 3150.150 259.9183
## 742 0.11645234 2981.361 2890.232 3150.150 259.9183
## 743 0.11645234 2981.361 2890.232 3150.150 259.9183
## 744 0.11065234 2981.361 2890.232 3150.150 259.9183
## 745 0.11645234 2981.361 2890.232 3150.150 259.9183
## 746 0.11065234 2981.361 2890.232 3150.150 259.9183
## 747 0.10100981 2820.811 2739.278 2995.514 256.2360
## 748 0.09520981 2820.811 2739.278 2995.514 256.2360
## 749 0.09520981 2820.811 2739.278 2995.514 256.2360
## 750 0.10680981 2906.944 2825.411 2995.514 170.1040
## 751 0.08940981 2906.944 2825.411 2995.514 170.1040
## 752 0.10680981 2906.944 2825.411 2995.514 170.1040
## 753 0.10680981 2993.076 2825.411 2995.514 170.1040
## 754 0.10100981 2906.944 2825.411 2995.514 170.1040
## 755 0.10100981 2906.944 2825.411 2995.514 170.1040
## 756 0.10100981 2906.944 2825.411 2995.514 170.1040
## 757 0.08360981 2906.944 2825.411 2995.514 170.1040
## 758 0.10680981 2906.944 2825.411 2995.514 170.1040
## 759 0.11260981 2906.944 2825.411 2995.514 170.1040
## 760 0.11840981 2993.076 2825.411 2995.514 170.1040
## 761 0.13580981 2993.076 2825.411 2995.514 170.1040
## 762 0.13000981 2993.076 2825.411 2995.514 170.1040
## 763 0.14160981 2993.076 2825.411 2995.514 170.1040
## 764 0.14160981 2906.944 2739.278 2995.514 256.2360
## 765 0.14160981 2993.076 2825.411 2995.514 170.1040
## 766 0.14160981 2906.944 2739.278 2995.514 256.2360
## 767 0.14160981 2906.944 2739.278 2995.514 256.2360
## 768 0.14160981 2993.076 2825.411 2995.514 170.1040
## 769 0.14160981 2906.944 2739.278 2995.514 256.2360
## 770 0.13580981 2906.944 2739.278 2995.514 256.2360
## 771 0.13580981 2906.944 2739.278 2995.514 256.2360
## 772 0.13580981 2906.944 2739.278 2995.514 256.2360
## 773 0.13580981 2906.944 2739.278 2995.514 256.2360
## 774 0.14160981 2906.944 2739.278 2995.514 256.2360
## 775 0.14740981 2906.944 2739.278 2995.514 256.2360
## 776 0.15320981 2993.076 2739.278 2995.514 256.2360
## 777 0.09180514 2916.350 2827.704 3087.957 260.2526
## 778 0.08600514 3002.482 2913.837 3174.090 260.2526
## 779 0.09180514 3002.482 2913.837 3174.090 260.2526
## 780 0.09180514 3002.482 2913.837 3174.090 260.2526
## 781 0.08600514 3002.482 2913.837 3174.090 260.2526
## 782 0.08600514 3002.482 2827.704 3174.090 346.3856
## 783 0.08600514 3002.482 2913.837 3174.090 260.2526
## 784 0.08020514 3002.482 2913.837 3174.090 260.2526
## 785 0.09180514 3002.482 2827.704 3174.090 346.3856
## 786 0.09180514 3002.482 2913.837 3174.090 260.2526
## 787 0.10340514 2916.350 2827.704 3174.090 346.3856
## 788 0.09180514 3002.482 2827.704 3174.090 346.3856
## 789 0.08600514 3002.482 2827.704 3174.090 346.3856
## 790 0.09760514 3002.482 2827.704 3174.090 346.3856
## 791 0.09760514 3002.482 2913.837 3174.090 260.2526
## 792 0.10340514 3002.482 2913.837 3174.090 260.2526
## 793 0.09760514 3002.482 2913.837 3174.090 260.2526
## 794 0.08600514 3002.482 2913.837 3174.090 260.2526
## 795 0.08600514 3002.482 2913.837 3174.090 260.2526
## 796 0.08600514 3002.482 2913.837 3174.090 260.2526
## 797 0.09180514 2916.350 2913.837 3174.090 260.2526
## 798 0.09180514 3002.482 2913.837 3174.090 260.2526
## 799 0.09760514 3002.482 2827.704 3174.090 346.3856
## 800 0.09760514 3002.482 2913.837 3174.090 260.2526
## 801 0.09180514 3002.482 2913.837 3174.090 260.2526
## 802 0.09760514 3002.482 2913.837 3174.090 260.2526
## 803 0.09180514 3002.482 2913.837 3174.090 260.2526
## 804 0.08600514 3002.482 2913.837 3174.090 260.2526
## 805 0.09180514 3002.482 2913.837 3174.090 260.2526
## 806 0.08600514 3002.482 2913.837 3174.090 260.2526
## 807 0.07727406 2938.321 2846.689 3105.697 259.0090
## 808 0.08307406 2938.321 2846.689 3105.697 259.0090
## 809 0.07727406 3024.454 2846.689 3105.697 259.0090
## 810 0.07727406 3024.454 2846.689 3105.697 259.0090
## 811 0.08887406 3024.454 2846.689 3105.697 259.0090
## 812 0.07727406 3024.454 2846.689 3105.697 259.0090
## 813 0.07727406 3024.454 2846.689 3105.697 259.0090
## 814 0.08307406 3024.454 2846.689 3105.697 259.0090
## 815 0.08307406 2938.321 2846.689 3105.697 259.0090
## 816 0.07727406 3024.454 2846.689 3105.697 259.0090
## 817 0.07727406 3024.454 2846.689 3105.697 259.0090
## 818 0.07727406 3024.454 2846.689 3105.697 259.0090
## 819 0.07727406 3024.454 2846.689 3105.697 259.0090
## 820 0.07147406 3024.454 2846.689 3105.697 259.0090
## 821 0.07727406 3024.454 2846.689 3105.697 259.0090
## 822 0.07727406 3024.454 2846.689 3105.697 259.0090
## 823 0.07147406 3024.454 2846.689 3105.697 259.0090
## 824 0.07727406 3024.454 2846.689 3105.697 259.0090
## 825 0.07727406 3024.454 2846.689 3105.697 259.0090
## 826 0.07727406 3024.454 2846.689 3105.697 259.0090
## 827 0.07147406 3024.454 2846.689 3105.697 259.0090
## 828 0.07147406 3024.454 2846.689 3105.697 259.0090
## 829 0.07727406 3024.454 2846.689 3105.697 259.0090
## 830 0.07147406 3024.454 2846.689 3105.697 259.0090
## 831 0.07147406 3024.454 2846.689 3105.697 259.0090
## 832 0.07727406 2938.321 2846.689 3105.697 259.0090
## 833 0.07147406 3024.454 2846.689 3105.697 259.0090
## 834 0.07147406 3024.454 2846.689 3105.697 259.0090
## 835 0.07147406 3024.454 2846.689 3105.697 259.0090
## 836 0.07147406 3024.454 2846.689 3105.697 259.0090
## 837 0.11148567 2930.752 2751.769 3102.705 350.9359
## 838 0.11148567 2930.752 2751.769 3102.705 350.9359
## 839 0.12308567 2930.752 2751.769 3102.705 350.9359
## 840 0.11728567 2930.752 2751.769 3102.705 350.9359
## 841 0.12888567 3016.885 2751.769 3102.705 350.9359
## 842 0.11728567 2930.752 2751.769 3102.705 350.9359
## 843 0.11728567 3016.885 2751.769 3102.705 350.9359
## 844 0.12888567 3016.885 2751.769 3102.705 350.9359
## 845 0.12888567 3016.885 2751.769 3102.705 350.9359
## 846 0.09988567 3016.885 2837.902 3102.705 264.8029
## 847 0.09988567 3016.885 2837.902 3102.705 264.8029
## 848 0.09988567 3016.885 2837.902 3102.705 264.8029
## 849 0.10568567 3016.885 2837.902 3102.705 264.8029
## 850 0.09408567 3016.885 2837.902 3102.705 264.8029
## 851 0.12888567 3016.885 2751.769 3102.705 350.9359
## 852 0.13468567 3016.885 2751.769 3188.838 437.0689
## 853 0.13468567 3016.885 2751.769 3188.838 437.0689
## 854 0.12888567 3016.885 2751.769 3102.705 350.9359
## 855 0.12308567 3016.885 2751.769 3102.705 350.9359
## 856 0.12888567 3016.885 2837.902 3102.705 264.8029
## 857 0.12888567 3016.885 2837.902 3102.705 264.8029
## 858 0.12888567 3016.885 2837.902 3102.705 264.8029
## 859 0.12308567 3016.885 2751.769 3102.705 350.9359
## 860 0.11728567 3016.885 2837.902 3102.705 264.8029
## 861 0.11148567 3016.885 2751.769 3102.705 350.9359
## 862 0.11728567 3016.885 2751.769 3102.705 350.9359
## 863 0.11728567 3016.885 2751.769 3102.705 350.9359
## 864 0.12308567 3016.885 2751.769 3102.705 350.9359
## 865 0.12308567 3016.885 2751.769 3102.705 350.9359
## 866 0.12308567 3016.885 2751.769 3102.705 350.9359
## 867 0.11430490 3069.224 2901.155 3157.915 256.7602
## 868 0.11430490 3069.224 2901.155 3157.915 256.7602
## 869 0.12010490 3069.224 2901.155 3157.915 256.7602
## 870 0.11430490 3069.224 2901.155 3157.915 256.7602
## 871 0.12010490 3069.224 2901.155 3157.915 256.7602
## 872 0.11430490 3069.224 2901.155 3157.915 256.7602
## 873 0.11430490 3069.224 2901.155 3157.915 256.7602
## 874 0.10850490 3069.224 2815.022 3071.782 256.7602
## 875 0.11430490 3069.224 2901.155 3157.915 256.7602
## 876 0.10270490 3069.224 2901.155 3071.782 170.6282
## 877 0.09690490 2896.959 2901.155 3071.782 170.6282
## 878 0.09690490 2983.091 2815.022 3071.782 256.7602
## 879 0.11430490 2983.091 2901.155 3157.915 256.7602
## 880 0.11430490 2983.091 2901.155 3157.915 256.7602
## 881 0.12590490 3069.224 2901.155 3157.915 256.7602
## 882 0.11430490 3069.224 2901.155 3157.915 256.7602
## 883 0.12010490 2896.959 2901.155 3071.782 170.6282
## 884 0.10850490 2983.091 2901.155 3071.782 170.6282
## 885 0.11430490 3069.224 2901.155 3157.915 256.7602
## 886 0.12590490 3069.224 2901.155 3157.915 256.7602
## 887 0.11430490 2983.091 2901.155 3157.915 256.7602
## 888 0.11430490 3069.224 2901.155 3157.915 256.7602
## 889 0.10850490 3069.224 2901.155 3157.915 256.7602
## 890 0.11430490 2983.091 2901.155 3157.915 256.7602
## 891 0.12010490 3069.224 2901.155 3157.915 256.7602
## 892 0.12010490 3069.224 2901.155 3157.915 256.7602
## 893 0.10850490 3069.224 2901.155 3157.915 256.7602
## 894 0.11430490 3069.224 2901.155 3157.915 256.7602
## 895 0.10850490 3069.224 2901.155 3157.915 256.7602
## 896 0.11430490 3069.224 2901.155 3157.915 256.7602
## 897 0.07605530 2965.929 2880.463 3051.274 170.8117
## 898 0.07025530 2965.929 2880.463 3051.274 170.8117
## 899 0.06445530 2965.929 2880.463 3051.274 170.8117
## 900 0.07025530 2965.929 2880.463 3051.274 170.8117
## 901 0.07025530 2965.929 2880.463 3051.274 170.8117
## 902 0.07025530 2965.929 2880.463 3051.274 170.8117
## 903 0.06445530 2965.929 2880.463 3051.274 170.8117
## 904 0.08765530 2965.929 2880.463 3051.274 170.8117
## 905 0.07025530 2965.929 2880.463 3051.274 170.8117
## 906 0.07025530 2965.929 2880.463 3051.274 170.8117
## 907 0.07025530 2965.929 2880.463 3051.274 170.8117
## 908 0.07025530 2965.929 2880.463 3051.274 170.8117
## 909 0.06445530 2965.929 2880.463 3051.274 170.8117
## 910 0.07025530 2965.929 2880.463 3137.407 256.9437
## 911 0.06445530 2965.929 2880.463 3051.274 170.8117
## 912 0.06445530 3052.061 2880.463 3137.407 256.9437
## 913 0.06445530 3052.061 2880.463 3051.274 170.8117
## 914 0.06445530 3052.061 2880.463 3051.274 170.8117
## 915 0.07025530 3052.061 2880.463 3137.407 256.9437
## 916 0.07025530 3052.061 2880.463 3137.407 256.9437
## 917 0.07025530 3052.061 2880.463 3137.407 256.9437
## 918 0.06445530 3052.061 2880.463 3051.274 170.8117
## 919 0.06445530 3052.061 2880.463 3051.274 170.8117
## 920 0.07025530 3052.061 2880.463 3051.274 170.8117
## 921 0.07025530 3052.061 2880.463 3051.274 170.8117
## 922 0.06445530 3052.061 2880.463 3051.274 170.8117
## 923 0.07025530 2965.929 2880.463 3051.274 170.8117
## 924 0.05865530 3052.061 2880.463 3051.274 170.8117
## 925 0.05865530 2965.929 2880.463 3051.274 170.8117
## 926 0.05865530 2965.929 2880.463 3051.274 170.8117
## 927 0.11080107 2905.444 2731.593 2989.172 257.5778
## 928 0.09340107 2819.311 2731.593 2903.039 171.4458
## 929 0.11080107 2905.444 2731.593 2989.172 257.5778
## 930 0.10500107 2905.444 2731.593 2989.172 257.5778
## 931 0.09340107 2819.311 2731.593 2903.039 171.4458
## 932 0.08760107 2819.311 2645.460 2903.039 257.5778
## 933 0.08760107 2819.311 2731.593 2903.039 171.4458
## 934 0.08760107 2819.311 2731.593 2903.039 171.4458
## 935 0.08760107 2819.311 2731.593 2903.039 171.4458
## 936 0.08760107 2819.311 2731.593 2989.172 257.5778
## 937 0.08760107 2819.311 2731.593 2989.172 257.5778
## 938 0.08180107 2819.311 2731.593 2903.039 171.4458
## 939 0.08760107 2819.311 2731.593 2989.172 257.5778
## 940 0.08180107 2819.311 2731.593 2989.172 257.5778
## 941 0.07020107 2819.311 2731.593 2989.172 257.5778
## 942 0.08180107 2819.311 2731.593 2989.172 257.5778
## 943 0.08180107 2819.311 2731.593 2989.172 257.5778
## 944 0.06440107 2905.444 2731.593 2989.172 257.5778
## 945 0.07600107 2905.444 2731.593 2989.172 257.5778
## 946 0.07600107 2819.311 2731.593 2989.172 257.5778
## 947 0.07600107 2905.444 2731.593 2989.172 257.5778
## 948 0.08760107 2905.444 2731.593 2989.172 257.5778
## 949 0.07600107 2819.311 2731.593 2989.172 257.5778
## 950 0.06440107 2819.311 2731.593 2989.172 257.5778
## 951 0.07020107 2819.311 2731.593 2989.172 257.5778
## 952 0.07020107 2819.311 2731.593 2989.172 257.5778
## 953 0.08180107 2819.311 2731.593 2989.172 257.5778
## 954 0.08180107 2819.311 2731.593 2989.172 257.5778
## 955 0.07020107 2819.311 2731.593 2903.039 171.4458
## 956 0.06440107 2819.311 2731.593 2903.039 171.4458
## 957 0.07275550 2878.360 2791.110 2963.036 171.9264
## 958 0.13075550 2878.360 2704.977 2963.036 258.0584
## 959 0.13075550 2878.360 2704.977 3049.168 344.1914
## 960 0.13655550 2878.360 2704.977 3049.168 344.1914
## 961 0.09015550 2878.360 2704.977 2963.036 258.0584
## 962 0.10175550 2964.493 2704.977 2963.036 258.0584
## 963 0.13075550 2964.493 2704.977 3049.168 344.1914
## 964 0.14235550 2878.360 2704.977 3049.168 344.1914
## 965 0.13075550 2878.360 2704.977 3049.168 344.1914
## 966 0.13075550 2878.360 2704.977 3049.168 344.1914
## 967 0.13075550 2878.360 2704.977 3049.168 344.1914
## 968 0.13075550 2878.360 2704.977 3049.168 344.1914
## 969 0.13075550 2878.360 2704.977 3049.168 344.1914
## 970 0.13075550 2878.360 2704.977 3049.168 344.1914
## 971 0.12495550 2706.094 2704.977 3049.168 344.1914
## 972 0.13075550 2964.493 2704.977 3049.168 344.1914
## 973 0.13655550 2964.493 2704.977 3049.168 344.1914
## 974 0.13655550 2964.493 2704.977 3049.168 344.1914
## 975 0.13075550 2964.493 2704.977 3049.168 344.1914
## 976 0.13655550 2706.094 2704.977 3049.168 344.1914
## 977 0.13655550 2964.493 2704.977 3049.168 344.1914
## 978 0.13075550 2878.360 2704.977 3049.168 344.1914
## 979 0.10755550 2792.227 2704.977 2963.036 258.0584
## 980 0.12495550 2878.360 2704.977 2963.036 258.0584
## 981 0.12495550 2706.094 2704.977 2963.036 258.0584
## 982 0.13075550 2878.360 2618.844 2963.036 344.1914
## 983 0.13655550 2878.360 2704.977 2963.036 258.0584
## 984 0.13075550 2878.360 2704.977 3049.168 344.1914
## 985 0.12495550 2706.094 2704.977 2963.036 258.0584
## 986 0.13075550 2878.360 2704.977 3049.168 344.1914
## 987 0.12892955 2951.810 2770.909 3036.274 265.3642
## 988 0.13472955 2951.810 2684.776 3036.274 351.4972
## 989 0.12892955 2951.810 2684.776 3036.274 351.4972
## 990 0.11732955 2951.810 2684.776 3036.274 351.4972
## 991 0.11732955 2951.810 2684.776 3036.274 351.4972
## 992 0.12892955 2951.810 2770.909 3036.274 265.3642
## 993 0.12312955 2951.810 2770.909 3036.274 265.3642
## 994 0.11152955 2951.810 2770.909 3036.274 265.3642
## 995 0.12312955 2951.810 2770.909 3036.274 265.3642
## 996 0.12312955 2865.678 2770.909 3036.274 265.3642
## 997 0.12312955 2951.810 2770.909 3036.274 265.3642
## 998 0.13472955 2865.678 2770.909 3036.274 265.3642
## 999 0.12892955 2865.678 2770.909 3036.274 265.3642
## 1000 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1001 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1002 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1003 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1004 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1005 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1006 0.12892955 2865.678 2770.909 3036.274 265.3642
## 1007 0.12892955 2865.678 2770.909 3036.274 265.3642
## 1008 0.12892955 2865.678 2770.909 3122.407 351.4972
## 1009 0.12892955 2865.678 2770.909 3036.274 265.3642
## 1010 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1011 0.11732955 2865.678 2770.909 3036.274 265.3642
## 1012 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1013 0.12892955 2865.678 2770.909 3036.274 265.3642
## 1014 0.12312955 2865.678 2770.909 3036.274 265.3642
## 1015 0.11732955 2865.678 2770.909 3036.274 265.3642
## 1016 0.11732955 2865.678 2770.909 3036.274 265.3642
## 1017 0.09497397 2826.540 2731.360 2909.518 178.1573
## 1018 0.10077397 2912.673 2731.360 2995.650 264.2893
## 1019 0.10077397 2912.673 2731.360 2995.650 264.2893
## 1020 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1021 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1022 0.10077397 2912.673 2731.360 2995.650 264.2893
## 1023 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1024 0.09497397 2826.540 2731.360 2909.518 178.1573
## 1025 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1026 0.09497397 2826.540 2731.360 2909.518 178.1573
## 1027 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1028 0.10077397 2912.673 2731.360 2995.650 264.2893
## 1029 0.09497397 2912.673 2731.360 2995.650 264.2893
## 1030 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1031 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1032 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1033 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1034 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1035 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1036 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1037 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1038 0.10657397 2912.673 2817.493 2995.650 178.1573
## 1039 0.10657397 2912.673 2817.493 2995.650 178.1573
## 1040 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1041 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1042 0.09497397 2912.673 2817.493 2995.650 178.1573
## 1043 0.10077397 2912.673 2817.493 2995.650 178.1573
## 1044 0.10657397 2912.673 2817.493 2995.650 178.1573
## 1045 0.09497397 2912.673 2731.360 2909.518 178.1573
## 1046 0.10077397 2912.673 2731.360 2995.650 264.2893
## 1047 0.12095716 3007.238 2736.910 3088.831 351.9210
## 1048 0.12095716 3007.238 2736.910 3088.831 351.9210
## 1049 0.12095716 3007.238 2736.910 3088.831 351.9210
## 1050 0.12095716 3007.238 2736.910 3088.831 351.9210
## 1051 0.12095716 3007.238 2736.910 3088.831 351.9210
## 1052 0.12675716 3007.238 2736.910 3088.831 351.9210
## 1053 0.12675716 3007.238 2736.910 3088.831 351.9210
## 1054 0.12675716 3007.238 2736.910 3002.698 265.7880
## 1055 0.11515716 2921.106 2736.910 3002.698 265.7880
## 1056 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1057 0.10935716 2834.973 2650.777 2916.566 265.7880
## 1058 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1059 0.11515716 2834.973 2650.777 2916.566 265.7880
## 1060 0.10935716 2921.106 2650.777 3002.698 351.9210
## 1061 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1062 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1063 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1064 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1065 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1066 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1067 0.11515716 2921.106 2650.777 2916.566 265.7880
## 1068 0.10355716 2921.106 2650.777 2916.566 265.7880
## 1069 0.10935716 2921.106 2650.777 3002.698 351.9210
## 1070 0.10935716 2921.106 2650.777 3002.698 351.9210
## 1071 0.10355716 2921.106 2650.777 3002.698 351.9210
## 1072 0.10935716 2921.106 2650.777 3002.698 351.9210
## 1073 0.10935716 2921.106 2736.910 3002.698 265.7880
## 1074 0.10355716 2921.106 2736.910 3002.698 265.7880
## 1075 0.10355716 2921.106 2650.777 3002.698 351.9210
## 1076 0.11515716 2921.106 2650.777 3002.698 351.9210
## 1077 0.12423086 2648.189 2548.919 2729.710 180.7908
## 1078 0.13003086 2648.189 2548.919 2729.710 180.7908
## 1079 0.13583086 2648.189 2548.919 2815.843 266.9228
## 1080 0.13583086 2648.189 2548.919 2815.843 266.9228
## 1081 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1082 0.13583086 2648.189 2548.919 2815.843 266.9228
## 1083 0.13583086 2648.189 2548.919 2815.843 266.9228
## 1084 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1085 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1086 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1087 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1088 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1089 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1090 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1091 0.13583086 2648.189 2548.919 2815.843 266.9228
## 1092 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1093 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1094 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1095 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1096 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1097 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1098 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1099 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1100 0.14743086 2820.455 2548.919 2901.976 353.0558
## 1101 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1102 0.14163086 2648.189 2548.919 2901.976 353.0558
## 1103 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1104 0.14743086 2648.189 2548.919 2815.843 266.9228
## 1105 0.14163086 2648.189 2548.919 2901.976 353.0558
## 1106 0.14163086 2648.189 2548.919 2815.843 266.9228
## 1107 0.11435470 2935.169 2839.728 3105.966 266.2379
## 1108 0.11435470 2935.169 2839.728 3192.099 352.3709
## 1109 0.11435470 2935.169 2839.728 3192.099 352.3709
## 1110 0.12015470 2935.169 2925.860 3192.099 266.2379
## 1111 0.12015470 2935.169 2925.860 3192.099 266.2379
## 1112 0.11435470 3021.302 2925.860 3192.099 266.2379
## 1113 0.10855470 3021.302 2925.860 3192.099 266.2379
## 1114 0.12015470 3107.435 2925.860 3192.099 266.2379
## 1115 0.11435470 3021.302 2925.860 3192.099 266.2379
## 1116 0.12015470 3021.302 2925.860 3192.099 266.2379
## 1117 0.12015470 3021.302 2925.860 3192.099 266.2379
## 1118 0.12015470 3107.435 2925.860 3192.099 266.2379
## 1119 0.11435470 3107.435 2925.860 3192.099 266.2379
## 1120 0.11435470 3107.435 2925.860 3192.099 266.2379
## 1121 0.11435470 3107.435 2925.860 3192.099 266.2379
## 1122 0.12595470 3107.435 2925.860 3192.099 266.2379
## 1123 0.11435470 3107.435 2925.860 3192.099 266.2379
## 1124 0.12015470 3107.435 2925.860 3278.232 352.3709
## 1125 0.12015470 3107.435 3011.993 3192.099 180.1059
## 1126 0.12015470 3107.435 3011.993 3192.099 180.1059
## 1127 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1128 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1129 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1130 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1131 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1132 0.11435470 3107.435 3011.993 3278.232 266.2379
## 1133 0.10855470 3107.435 3011.993 3192.099 180.1059
## 1134 0.11435470 3107.435 2925.860 3278.232 352.3709
## 1135 0.10855470 3107.435 2925.860 3192.099 266.2379
## 1136 0.11435470 3107.435 2925.860 3192.099 266.2379
## 1137 0.10662398 2933.444 2750.235 3015.081 264.8461
## 1138 0.11242398 2933.444 2750.235 3015.081 264.8461
## 1139 0.11242398 2933.444 2750.235 3015.081 264.8461
## 1140 0.11242398 2933.444 2750.235 3015.081 264.8461
## 1141 0.11242398 2933.444 2750.235 3015.081 264.8461
## 1142 0.11242398 2933.444 2750.235 3015.081 264.8461
## 1143 0.11242398 2933.444 2836.368 3015.081 178.7141
## 1144 0.11242398 2933.444 2836.368 3015.081 178.7141
## 1145 0.11242398 2933.444 2836.368 3015.081 178.7141
## 1146 0.11242398 2933.444 2836.368 3015.081 178.7141
## 1147 0.10662398 2933.444 2836.368 3015.081 178.7141
## 1148 0.10662398 2933.444 2836.368 3015.081 178.7141
## 1149 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1150 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1151 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1152 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1153 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1154 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1155 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1156 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1157 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1158 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1159 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1160 0.11242398 3019.576 2836.368 3101.214 264.8461
## 1161 0.10662398 3019.576 2836.368 3101.214 264.8461
## 1162 0.10662398 3019.576 2922.501 3101.214 178.7141
## 1163 0.10082398 3019.576 2922.501 3101.214 178.7141
## 1164 0.11242398 3019.576 2922.501 3101.214 178.7141
## 1165 0.10662398 3019.576 2922.501 3101.214 178.7141
## 1166 0.11242398 3019.576 2922.501 3101.214 178.7141
## 1167 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1168 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1169 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1170 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1171 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1172 0.14262508 2797.044 2785.240 2965.886 180.6472
## 1173 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1174 0.13682508 2797.044 2785.240 2965.886 180.6472
## 1175 0.13682508 2797.044 2785.240 3052.019 266.7792
## 1176 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1177 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1178 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1179 0.14842508 2797.044 2699.107 2965.886 266.7792
## 1180 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1181 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1182 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1183 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1184 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1185 0.13102508 2797.044 2699.107 2965.886 266.7792
## 1186 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1187 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1188 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1189 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1190 0.14262508 2797.044 2785.240 3052.019 266.7792
## 1191 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1192 0.14842508 2797.044 2699.107 2965.886 266.7792
## 1193 0.14262508 2797.044 2699.107 2965.886 266.7792
## 1194 0.13682508 2797.044 2699.107 2965.886 266.7792
## 1195 0.14842508 2797.044 2699.107 2965.886 266.7792
## 1196 0.14842508 2797.044 2699.107 2965.886 266.7792
## 1197 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1198 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1199 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1200 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1201 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1202 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1203 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1204 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1205 0.10444208 2994.503 2809.596 3078.594 268.9980
## 1206 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1207 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1208 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1209 0.09864208 2994.503 2809.596 3078.594 268.9980
## 1210 0.09864208 2994.503 2809.596 3078.594 268.9980
## 1211 0.10444208 2994.503 2809.596 3078.594 268.9980
## 1212 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1213 0.10444208 2994.503 2809.596 3078.594 268.9980
## 1214 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1215 0.10444208 2994.503 2809.596 2992.461 182.8660
## 1216 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1217 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1218 0.09284208 2908.370 2809.596 2992.461 182.8660
## 1219 0.09864208 2908.370 2809.596 2992.461 182.8660
## 1220 0.09864208 2994.503 2809.596 3078.594 268.9980
## 1221 0.09864208 2994.503 2809.596 2992.461 182.8660
## 1222 0.09284208 2994.503 2809.596 2992.461 182.8660
## 1223 0.09864208 2994.503 2809.596 2992.461 182.8660
## 1224 0.09864208 2994.503 2809.596 3078.594 268.9980
## 1225 0.10444208 2994.503 2809.596 3078.594 268.9980
## 1226 0.09284208 2994.503 2809.596 3078.594 268.9980
## 1227 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1228 0.11959411 2938.665 2753.941 3105.685 351.7444
## 1229 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1230 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1231 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1232 0.10799411 2938.665 2753.941 3019.552 265.6114
## 1233 0.10799411 2938.665 2753.941 3019.552 265.6114
## 1234 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1235 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1236 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1237 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1238 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1239 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1240 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1241 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1242 0.09059411 2938.665 2753.941 3019.552 265.6114
## 1243 0.09639411 2938.665 2753.941 3019.552 265.6114
## 1244 0.09639411 2938.665 2753.941 3019.552 265.6114
## 1245 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1246 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1247 0.10799411 2938.665 2753.941 3019.552 265.6114
## 1248 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1249 0.09639411 2938.665 2753.941 3019.552 265.6114
## 1250 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1251 0.11379411 2938.665 2753.941 3019.552 265.6114
## 1252 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1253 0.09639411 2938.665 2753.941 3019.552 265.6114
## 1254 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1255 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1256 0.10219411 2938.665 2753.941 3019.552 265.6114
## 1257 0.10731460 2889.888 2787.303 3056.691 269.3881
## 1258 0.10731460 2889.888 2787.303 3056.691 269.3881
## 1259 0.10731460 2889.888 2787.303 3056.691 269.3881
## 1260 0.10731460 2889.888 2787.303 3142.824 355.5211
## 1261 0.11311460 3062.153 2873.436 3142.824 269.3881
## 1262 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1263 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1264 0.10151460 2976.020 2873.436 3142.824 269.3881
## 1265 0.11311460 2976.020 2873.436 3142.824 269.3881
## 1266 0.11311460 3062.153 2873.436 3142.824 269.3881
## 1267 0.11311460 2976.020 2873.436 3142.824 269.3881
## 1268 0.11311460 3062.153 2873.436 3142.824 269.3881
## 1269 0.11311460 2976.020 2873.436 3142.824 269.3881
## 1270 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1271 0.11311460 3062.153 2873.436 3142.824 269.3881
## 1272 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1273 0.10731460 3062.153 2873.436 3142.824 269.3881
## 1274 0.10731460 3062.153 2873.436 3142.824 269.3881
## 1275 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1276 0.10151460 2976.020 2873.436 3142.824 269.3881
## 1277 0.10151460 2976.020 2873.436 3142.824 269.3881
## 1278 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1279 0.11311460 2976.020 2873.436 3142.824 269.3881
## 1280 0.11311460 3062.153 2873.436 3142.824 269.3881
## 1281 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1282 0.10151460 2976.020 2873.436 3142.824 269.3881
## 1283 0.10731460 3062.153 2873.436 3142.824 269.3881
## 1284 0.10731460 2976.020 2873.436 3142.824 269.3881
## 1285 0.10151460 3062.153 2873.436 3142.824 269.3881
## 1286 0.10151460 3062.153 2873.436 3142.824 269.3881
## 1287 0.10709609 2825.220 2729.759 2994.255 264.4959
## 1288 0.11869609 2825.220 2815.892 2994.255 178.3639
## 1289 0.11869609 2825.220 2815.892 3080.388 264.4959
## 1290 0.10709609 2825.220 2729.759 2994.255 264.4959
## 1291 0.11289609 2911.353 2815.892 3080.388 264.4959
## 1292 0.11869609 2825.220 2729.759 3080.388 350.6289
## 1293 0.11289609 2911.353 2815.892 3080.388 264.4959
## 1294 0.11289609 2825.220 2815.892 2994.255 178.3639
## 1295 0.11869609 2825.220 2729.759 2994.255 264.4959
## 1296 0.11289609 2825.220 2815.892 2994.255 178.3639
## 1297 0.11289609 2911.353 2815.892 2994.255 178.3639
## 1298 0.11289609 2911.353 2815.892 3080.388 264.4959
## 1299 0.11289609 2825.220 2729.759 2994.255 264.4959
## 1300 0.10709609 2911.353 2815.892 2994.255 178.3639
## 1301 0.10129609 2911.353 2815.892 2994.255 178.3639
## 1302 0.10709609 2911.353 2815.892 2994.255 178.3639
## 1303 0.10129609 2825.220 2729.759 2994.255 264.4959
## 1304 0.10129609 2911.353 2815.892 2994.255 178.3639
## 1305 0.09549609 2911.353 2815.892 2994.255 178.3639
## 1306 0.10129609 2825.220 2729.759 2994.255 264.4959
## 1307 0.10129609 2911.353 2815.892 2994.255 178.3639
## 1308 0.09549609 2825.220 2729.759 2994.255 264.4959
## 1309 0.09549609 2911.353 2815.892 2994.255 178.3639
## 1310 0.08969609 2911.353 2815.892 2994.255 178.3639
## 1311 0.08969609 2911.353 2815.892 2994.255 178.3639
## 1312 0.10129609 2911.353 2815.892 3080.388 264.4959
## 1313 0.09549609 2911.353 2815.892 2994.255 178.3639
## 1314 0.09549609 2825.220 2729.759 2994.255 264.4959
## 1315 0.10129609 2911.353 2815.892 3080.388 264.4959
## 1316 0.09549609 2911.353 2815.892 2994.255 178.3639
## 1317 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1318 0.13818549 2756.873 2744.356 3010.271 265.9154
## 1319 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1320 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1321 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1322 0.14978549 2929.139 2744.356 3010.271 265.9154
## 1323 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1324 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1325 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1326 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1327 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1328 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1329 0.14398549 2843.006 2744.356 3010.271 265.9154
## 1330 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1331 0.14398549 2929.139 2744.356 3010.271 265.9154
## 1332 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1333 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1334 0.13238549 2929.139 2744.356 3010.271 265.9154
## 1335 0.13818549 2843.006 2744.356 3010.271 265.9154
## 1336 0.13818549 2843.006 2744.356 3010.271 265.9154
## 1337 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1338 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1339 0.13818549 2843.006 2744.356 3010.271 265.9154
## 1340 0.14398549 2843.006 2744.356 3010.271 265.9154
## 1341 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1342 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1343 0.13818549 2843.006 2744.356 3010.271 265.9154
## 1344 0.13238549 2929.139 2744.356 3010.271 265.9154
## 1345 0.13818549 2929.139 2744.356 3010.271 265.9154
## 1346 0.13818549 2843.006 2744.356 3010.271 265.9154
## 1347 0.12369850 2850.926 2748.165 2932.622 184.4584
## 1348 0.12369850 2850.926 2748.165 2932.622 184.4584
## 1349 0.12369850 2850.926 2748.165 2932.622 184.4584
## 1350 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1351 0.12949850 2937.058 2748.165 3018.755 270.5904
## 1352 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1353 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1354 0.13529850 2937.058 2748.165 3018.755 270.5904
## 1355 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1356 0.13529850 2937.058 2748.165 3018.755 270.5904
## 1357 0.13529850 2937.058 2748.165 3018.755 270.5904
## 1358 0.11789850 2850.926 2748.165 2932.622 184.4584
## 1359 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1360 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1361 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1362 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1363 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1364 0.12369850 2850.926 2748.165 2932.622 184.4584
## 1365 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1366 0.12369850 2850.926 2748.165 2932.622 184.4584
## 1367 0.13529850 2937.058 2748.165 3018.755 270.5904
## 1368 0.11209850 2850.926 2748.165 2932.622 184.4584
## 1369 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1370 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1371 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1372 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1373 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1374 0.14689850 2937.058 2748.165 3018.755 270.5904
## 1375 0.13529850 2937.058 2748.165 3018.755 270.5904
## 1376 0.14109850 2937.058 2748.165 3018.755 270.5904
## 1377 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1378 0.09958038 2911.061 2721.930 2990.971 269.0413
## 1379 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1380 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1381 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1382 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1383 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1384 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1385 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1386 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1387 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1388 0.09378038 2911.061 2721.930 2990.971 269.0413
## 1389 0.08798038 2911.061 2808.063 2990.971 182.9093
## 1390 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1391 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1392 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1393 0.09378038 2911.061 2721.930 3077.104 355.1743
## 1394 0.09378038 2911.061 2721.930 3077.104 355.1743
## 1395 0.08798038 2824.928 2721.930 2990.971 269.0413
## 1396 0.09378038 2824.928 2721.930 3077.104 355.1743
## 1397 0.08798038 2824.928 2721.930 3077.104 355.1743
## 1398 0.08798038 2997.193 2721.930 3077.104 355.1743
## 1399 0.08798038 2997.193 2721.930 3077.104 355.1743
## 1400 0.08798038 2824.928 2721.930 2990.971 269.0413
## 1401 0.09958038 2997.193 2721.930 2990.971 269.0413
## 1402 0.09958038 2824.928 2721.930 3077.104 355.1743
## 1403 0.09378038 2911.061 2808.063 2990.971 182.9093
## 1404 0.09958038 2911.061 2721.930 2990.971 269.0413
## 1405 0.09378038 2824.928 2721.930 2990.971 269.0413
## 1406 0.10538038 2997.193 2721.930 3077.104 355.1743
## 1407 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1408 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1409 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1410 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1411 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1412 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1413 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1414 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1415 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1416 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1417 0.09692912 3016.938 3009.212 3272.197 262.9843
## 1418 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1419 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1420 0.09692912 3016.938 2923.080 3186.064 262.9843
## 1421 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1422 0.09692912 3016.938 2923.080 3186.064 262.9843
## 1423 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1424 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1425 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1426 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1427 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1428 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1429 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1430 0.09692912 3016.938 3009.212 3272.197 262.9843
## 1431 0.09112912 3016.938 2923.080 3186.064 262.9843
## 1432 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1433 0.09692912 3016.938 2923.080 3272.197 349.1173
## 1434 0.09112912 3016.938 3009.212 3186.064 176.8523
## 1435 0.09112912 3016.938 2923.080 3272.197 349.1173
## 1436 0.09112912 3016.938 3009.212 3272.197 262.9843
## 1437 0.10093900 3065.601 2966.414 3236.085 269.6697
## 1438 0.10673900 3065.601 2966.414 3236.085 269.6697
## 1439 0.11833900 3065.601 3052.547 3236.085 183.5377
## 1440 0.11833900 3065.601 2966.414 3236.085 269.6697
## 1441 0.11833900 3065.601 3052.547 3322.217 269.6697
## 1442 0.11833900 3065.601 3052.547 3322.217 269.6697
## 1443 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1444 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1445 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1446 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1447 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1448 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1449 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1450 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1451 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1452 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1453 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1454 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1455 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1456 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1457 0.11833900 3151.734 3052.547 3322.217 269.6697
## 1458 0.10673900 3151.734 3052.547 3322.217 269.6697
## 1459 0.10093900 3151.734 3052.547 3322.217 269.6697
## 1460 0.10673900 3151.734 3052.547 3322.217 269.6697
## 1461 0.10673900 3151.734 3052.547 3322.217 269.6697
## 1462 0.10673900 3151.734 3052.547 3322.217 269.6697
## 1463 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1464 0.10673900 3151.734 3052.547 3322.217 269.6697
## 1465 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1466 0.11253900 3151.734 3052.547 3322.217 269.6697
## 1467 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1468 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1469 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1470 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1471 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1472 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1473 0.14265574 2881.743 2611.644 2964.534 352.8894
## 1474 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1475 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1476 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1477 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1478 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1479 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1480 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1481 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1482 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1483 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1484 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1485 0.14265574 2881.743 2611.644 2964.534 352.8894
## 1486 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1487 0.10205574 2709.477 2611.644 2878.402 266.7564
## 1488 0.10785574 2709.477 2611.644 2878.402 266.7564
## 1489 0.12525574 2709.477 2611.644 2964.534 352.8894
## 1490 0.12525574 2709.477 2611.644 2878.402 266.7564
## 1491 0.13105574 2709.477 2611.644 2964.534 352.8894
## 1492 0.13685574 2881.743 2611.644 2964.534 352.8894
## 1493 0.12525574 2709.477 2611.644 2878.402 266.7564
## 1494 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1495 0.13105574 2795.610 2611.644 2964.534 352.8894
## 1496 0.13105574 2881.743 2611.644 2964.534 352.8894
## 1497 0.11835505 2834.868 2832.642 3095.015 262.3733
## 1498 0.11835505 3007.133 2832.642 3095.015 262.3733
## 1499 0.11835505 2834.868 2832.642 3095.015 262.3733
## 1500 0.10675505 2834.868 2832.642 3095.015 262.3733
## 1501 0.11835505 3007.133 2832.642 3095.015 262.3733
## 1502 0.11255505 2921.000 2832.642 3095.015 262.3733
## 1503 0.11835505 2921.000 2832.642 3095.015 262.3733
## 1504 0.11255505 2834.868 2832.642 3095.015 262.3733
## 1505 0.11835505 3007.133 2832.642 3095.015 262.3733
## 1506 0.11255505 2834.868 2832.642 3095.015 262.3733
## 1507 0.08355505 2921.000 2832.642 3008.882 176.2413
## 1508 0.08355505 2921.000 2832.642 3008.882 176.2413
## 1509 0.08935505 2921.000 2832.642 3008.882 176.2413
## 1510 0.08935505 2834.868 2832.642 3008.882 176.2413
## 1511 0.10095505 2834.868 2832.642 3008.882 176.2413
## 1512 0.10095505 2921.000 2832.642 3095.015 262.3733
## 1513 0.10675505 2921.000 2832.642 3095.015 262.3733
## 1514 0.10675505 2834.868 2832.642 3095.015 262.3733
## 1515 0.10675505 3007.133 2832.642 3095.015 262.3733
## 1516 0.11255505 3007.133 2832.642 3095.015 262.3733
## 1517 0.10675505 2834.868 2832.642 3095.015 262.3733
## 1518 0.10095505 2834.868 2832.642 3095.015 262.3733
## 1519 0.10095505 2921.000 2832.642 3095.015 262.3733
## 1520 0.10095505 2921.000 2832.642 3095.015 262.3733
## 1521 0.09515505 2921.000 2832.642 3008.882 176.2413
## 1522 0.10095505 2921.000 2832.642 3095.015 262.3733
## 1523 0.09515505 2921.000 2832.642 3008.882 176.2413
## 1524 0.09515505 2921.000 2832.642 3008.882 176.2413
## 1525 0.08935505 2921.000 2832.642 3008.882 176.2413
## 1526 0.08935505 2921.000 2832.642 3008.882 176.2413
## 1527 0.13616195 3063.361 2792.958 3145.768 352.8102
## 1528 0.14196195 3063.361 2792.958 3145.768 352.8102
## 1529 0.13616195 3063.361 2792.958 3145.768 352.8102
## 1530 0.14196195 3063.361 2792.958 3145.768 352.8102
## 1531 0.13616195 3063.361 2792.958 3145.768 352.8102
## 1532 0.13036195 2977.228 2792.958 3145.768 352.8102
## 1533 0.13616195 3063.361 2792.958 3145.768 352.8102
## 1534 0.13616195 3063.361 2792.958 3145.768 352.8102
## 1535 0.12456195 2977.228 2792.958 3145.768 352.8102
## 1536 0.12456195 2977.228 2792.958 3145.768 352.8102
## 1537 0.13036195 2804.963 2792.958 3145.768 352.8102
## 1538 0.12456195 2977.228 2792.958 3145.768 352.8102
## 1539 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1540 0.12456195 2977.228 2792.958 3145.768 352.8102
## 1541 0.11296195 2977.228 2792.958 3059.635 266.6772
## 1542 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1543 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1544 0.12456195 2977.228 2792.958 3145.768 352.8102
## 1545 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1546 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1547 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1548 0.11876195 2804.963 2792.958 3059.635 266.6772
## 1549 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1550 0.11876195 2977.228 2792.958 3145.768 352.8102
## 1551 0.11296195 2891.096 2792.958 3059.635 266.6772
## 1552 0.10716195 2891.096 2792.958 3059.635 266.6772
## 1553 0.11296195 2891.096 2792.958 3145.768 352.8102
## 1554 0.11876195 2891.096 2792.958 3145.768 352.8102
## 1555 0.11296195 2891.096 2792.958 3059.635 266.6772
## 1556 0.11296195 2891.096 2792.958 3059.635 266.6772
## 1557 0.09912602 2874.230 2783.750 3046.293 262.5423
## 1558 0.10492602 2874.230 2783.750 3046.293 262.5423
## 1559 0.10492602 2960.362 2783.750 3046.293 262.5423
## 1560 0.09912602 2960.362 2783.750 3046.293 262.5423
## 1561 0.09912602 2960.362 2783.750 3046.293 262.5423
## 1562 0.09912602 2960.362 2783.750 3046.293 262.5423
## 1563 0.09332602 2874.230 2783.750 3046.293 262.5423
## 1564 0.09912602 2874.230 2783.750 3046.293 262.5423
## 1565 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1566 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1567 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1568 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1569 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1570 0.07002602 2874.230 2783.750 3046.293 262.5423
## 1571 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1572 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1573 0.08752602 2874.230 2783.750 3046.293 262.5423
## 1574 0.08752602 2874.230 2783.750 3046.293 262.5423
## 1575 0.08752602 2874.230 2783.750 3046.293 262.5423
## 1576 0.09912602 2874.230 2783.750 3046.293 262.5423
## 1577 0.09332602 2874.230 2783.750 3046.293 262.5423
## 1578 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1579 0.08752602 2874.230 2783.750 3046.293 262.5423
## 1580 0.07002602 2874.230 2783.750 3046.293 262.5423
## 1581 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1582 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1583 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1584 0.08752602 2874.230 2783.750 3046.293 262.5423
## 1585 0.08172602 2874.230 2783.750 3046.293 262.5423
## 1586 0.07592602 2874.230 2783.750 3046.293 262.5423
## 1587 0.08428881 2663.623 2648.602 2830.093 181.4905
## 1588 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1589 0.09008881 2663.623 2648.602 2830.093 181.4905
## 1590 0.09008881 2663.623 2648.602 2830.093 181.4905
## 1591 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1592 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1593 0.07838881 2749.756 2648.602 2830.093 181.4905
## 1594 0.07838881 2749.756 2648.602 2830.093 181.4905
## 1595 0.08428881 2663.623 2648.602 2830.093 181.4905
## 1596 0.08428881 2749.756 2648.602 2830.093 181.4905
## 1597 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1598 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1599 0.09008881 2663.623 2648.602 2830.093 181.4905
## 1600 0.09008881 2663.623 2648.602 2830.093 181.4905
## 1601 0.09588881 2663.623 2648.602 2830.093 181.4905
## 1602 0.09008881 2663.623 2648.602 2830.093 181.4905
## 1603 0.09588881 2749.756 2648.602 2830.093 181.4905
## 1604 0.09588881 2749.756 2648.602 2830.093 181.4905
## 1605 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1606 0.09588881 2749.756 2648.602 2830.093 181.4905
## 1607 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1608 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1609 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1610 0.08428881 2749.756 2648.602 2830.093 181.4905
## 1611 0.09588881 2749.756 2648.602 2830.093 181.4905
## 1612 0.09588881 2749.756 2648.602 2830.093 181.4905
## 1613 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1614 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1615 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1616 0.09008881 2749.756 2648.602 2830.093 181.4905
## 1617 0.09788085 2748.613 2649.303 2832.140 182.8369
## 1618 0.10368085 2834.746 2735.436 2918.272 182.8369
## 1619 0.09788085 2834.746 2735.436 2918.272 182.8369
## 1620 0.10368085 2834.746 2735.436 3004.405 268.9689
## 1621 0.10368085 2834.746 2821.569 3004.405 182.8369
## 1622 0.09788085 2920.878 2821.569 3004.405 182.8369
## 1623 0.10368085 2920.878 2821.569 3004.405 182.8369
## 1624 0.10368085 2920.878 2821.569 3004.405 182.8369
## 1625 0.11528085 2920.878 2907.701 3090.538 182.8369
## 1626 0.10948085 2920.878 2907.701 3090.538 182.8369
## 1627 0.10948085 3007.011 2907.701 3090.538 182.8369
## 1628 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1629 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1630 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1631 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1632 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1633 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1634 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1635 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1636 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1637 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1638 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1639 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1640 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1641 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1642 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1643 0.11528085 3007.011 2907.701 3090.538 182.8369
## 1644 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1645 0.10368085 3007.011 2907.701 3090.538 182.8369
## 1646 0.09788085 3007.011 2907.701 3090.538 182.8369
## 1647 0.08991417 3050.677 2954.731 3218.023 263.2917
## 1648 0.08991417 3050.677 2954.731 3131.890 177.1597
## 1649 0.08991417 3050.677 2954.731 3131.890 177.1597
## 1650 0.08991417 3050.677 2954.731 3131.890 177.1597
## 1651 0.08991417 3050.677 2954.731 3131.890 177.1597
## 1652 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1653 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1654 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1655 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1656 0.07251417 3050.677 2954.731 3131.890 177.1597
## 1657 0.07251417 3050.677 2954.731 3131.890 177.1597
## 1658 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1659 0.09571417 3050.677 2954.731 3218.023 263.2917
## 1660 0.10731417 3050.677 2954.731 3218.023 263.2917
## 1661 0.09571417 3050.677 2954.731 3218.023 263.2917
## 1662 0.09571417 3050.677 2954.731 3218.023 263.2917
## 1663 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1664 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1665 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1666 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1667 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1668 0.08991417 3050.677 2954.731 3218.023 263.2917
## 1669 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1670 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1671 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1672 0.08991417 3050.677 2954.731 3218.023 263.2917
## 1673 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1674 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1675 0.08411417 3050.677 2954.731 3131.890 177.1597
## 1676 0.07831417 3050.677 2954.731 3131.890 177.1597
## 1677 0.14618196 2947.221 2686.321 3031.831 345.5100
## 1678 0.14618196 2947.221 2686.321 3031.831 345.5100
## 1679 0.14038196 2947.221 2686.321 3031.831 345.5100
## 1680 0.13458196 2947.221 2686.321 3031.831 345.5100
## 1681 0.13458196 2947.221 2686.321 3031.831 345.5100
## 1682 0.14038196 2947.221 2686.321 3031.831 345.5100
## 1683 0.13458196 2947.221 2686.321 3117.964 431.6430
## 1684 0.13458196 2947.221 2772.454 3117.964 345.5100
## 1685 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1686 0.11718196 2947.221 2686.321 3031.831 345.5100
## 1687 0.12298196 2947.221 2686.321 3031.831 345.5100
## 1688 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1689 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1690 0.13458196 2947.221 2686.321 3117.964 431.6430
## 1691 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1692 0.12298196 2947.221 2686.321 3031.831 345.5100
## 1693 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1694 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1695 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1696 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1697 0.12298196 2947.221 2600.188 3031.831 431.6430
## 1698 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1699 0.12878196 2947.221 2686.321 3031.831 345.5100
## 1700 0.12878196 2947.221 2686.321 3117.964 431.6430
## 1701 0.13458196 3033.353 2772.454 3117.964 345.5100
## 1702 0.12298196 2947.221 2772.454 3031.831 259.3770
## 1703 0.12878196 3033.353 2772.454 3117.964 345.5100
## 1704 0.12298196 2947.221 2772.454 3117.964 345.5100
## 1705 0.12878196 3033.353 2772.454 3117.964 345.5100
## 1706 0.12878196 3033.353 2772.454 3117.964 345.5100
## 1707 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1708 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1709 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1710 0.08366626 3128.723 2952.148 3298.487 346.3390
## 1711 0.07786626 3128.723 2952.148 3298.487 346.3390
## 1712 0.07786626 3128.723 2952.148 3298.487 346.3390
## 1713 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1714 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1715 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1716 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1717 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1718 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1719 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1720 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1721 0.07786626 3128.723 2952.148 3298.487 346.3390
## 1722 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1723 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1724 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1725 0.07786626 3128.723 2952.148 3298.487 346.3390
## 1726 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1727 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1728 0.08366626 3128.723 2952.148 3298.487 346.3390
## 1729 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1730 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1731 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1732 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1733 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1734 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1735 0.08366626 3128.723 3038.280 3298.487 260.2060
## 1736 0.07786626 3128.723 3038.280 3298.487 260.2060
## 1737 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1738 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1739 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1740 0.07911642 3076.161 2898.893 3160.995 262.1027
## 1741 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1742 0.07331642 3076.161 2985.025 3160.995 175.9707
## 1743 0.06741642 3076.161 2985.025 3160.995 175.9707
## 1744 0.07331642 3076.161 2985.025 3160.995 175.9707
## 1745 0.07331642 3076.161 2985.025 3160.995 175.9707
## 1746 0.07331642 3076.161 2985.025 3160.995 175.9707
## 1747 0.07331642 3076.161 2985.025 3160.995 175.9707
## 1748 0.07911642 3076.161 2898.893 3160.995 262.1027
## 1749 0.07911642 3076.161 2985.025 3160.995 175.9707
## 1750 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1751 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1752 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1753 0.06161642 3076.161 2898.893 3074.862 175.9707
## 1754 0.06161642 3076.161 2898.893 3160.995 262.1027
## 1755 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1756 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1757 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1758 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1759 0.07331642 3076.161 2898.893 3160.995 262.1027
## 1760 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1761 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1762 0.06161642 3076.161 2898.893 3160.995 262.1027
## 1763 0.06741642 3076.161 2898.893 3160.995 262.1027
## 1764 0.06741642 3076.161 2985.025 3160.995 175.9707
## 1765 0.06741642 3076.161 2985.025 3160.995 175.9707
## 1766 0.06741642 3076.161 2985.025 3160.995 175.9707
## 1767 0.09934252 2910.321 2730.314 2993.884 263.5695
## 1768 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1769 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1770 0.08774252 2910.321 2816.447 2993.884 177.4375
## 1771 0.08774252 2910.321 2816.447 2993.884 177.4375
## 1772 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1773 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1774 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1775 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1776 0.08774252 2910.321 2816.447 2993.884 177.4375
## 1777 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1778 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1779 0.08774252 2824.188 2730.314 2993.884 263.5695
## 1780 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1781 0.08194252 2910.321 2730.314 2993.884 263.5695
## 1782 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1783 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1784 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1785 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1786 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1787 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1788 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1789 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1790 0.09354252 2824.188 2730.314 2993.884 263.5695
## 1791 0.09354252 2910.321 2816.447 2993.884 177.4375
## 1792 0.08774252 2910.321 2730.314 2993.884 263.5695
## 1793 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1794 0.09354252 2910.321 2730.314 2993.884 263.5695
## 1795 0.09354252 2910.321 2816.447 2993.884 177.4375
## 1796 0.10514252 2824.188 2730.314 2993.884 263.5695
## 1797 0.12232804 3075.072 3066.995 3333.402 266.4073
## 1798 0.12232804 3075.072 3066.995 3333.402 266.4073
## 1799 0.12232804 3075.072 3066.995 3333.402 266.4073
## 1800 0.12232804 3075.072 3066.995 3333.402 266.4073
## 1801 0.11652804 3075.072 3066.995 3333.402 266.4073
## 1802 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1803 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1804 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1805 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1806 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1807 0.11072804 3161.205 3066.995 3333.402 266.4073
## 1808 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1809 0.09912804 3161.205 3066.995 3333.402 266.4073
## 1810 0.10492804 3161.205 3066.995 3333.402 266.4073
## 1811 0.10492804 3161.205 3066.995 3333.402 266.4073
## 1812 0.10492804 3161.205 3066.995 3333.402 266.4073
## 1813 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1814 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1815 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1816 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1817 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1818 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1819 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1820 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1821 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1822 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1823 0.11652804 3161.205 3066.995 3333.402 266.4073
## 1824 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1825 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1826 0.12232804 3161.205 3066.995 3333.402 266.4073
## 1827 0.08630494 3166.654 3074.065 3250.787 176.7223
## 1828 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1829 0.07470494 3166.654 2987.932 3250.787 262.8543
## 1830 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1831 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1832 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1833 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1834 0.07470494 3166.654 3074.065 3250.787 176.7223
## 1835 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1836 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1837 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1838 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1839 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1840 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1841 0.07470494 3166.654 3074.065 3250.787 176.7223
## 1842 0.07470494 3166.654 3074.065 3250.787 176.7223
## 1843 0.08630494 3166.654 3074.065 3250.787 176.7223
## 1844 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1845 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1846 0.07470494 3166.654 3074.065 3250.787 176.7223
## 1847 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1848 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1849 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1850 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1851 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1852 0.07470494 3166.654 3074.065 3250.787 176.7223
## 1853 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1854 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1855 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1856 0.08050494 3166.654 3074.065 3250.787 176.7223
## 1857 0.11783623 2830.729 2815.955 3085.998 270.0427
## 1858 0.11783623 2830.729 2815.955 3085.998 270.0427
## 1859 0.11203623 2830.729 2815.955 3085.998 270.0427
## 1860 0.11203623 2830.729 2815.955 3085.998 270.0427
## 1861 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1862 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1863 0.11783623 2830.729 2815.955 3085.998 270.0427
## 1864 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1865 0.12363623 2916.861 2815.955 3085.998 270.0427
## 1866 0.12363623 2916.861 2815.955 3085.998 270.0427
## 1867 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1868 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1869 0.10623623 2916.861 2815.955 3085.998 270.0427
## 1870 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1871 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1872 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1873 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1874 0.10623623 2916.861 2815.955 3085.998 270.0427
## 1875 0.12363623 2916.861 2815.955 3085.998 270.0427
## 1876 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1877 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1878 0.10043623 2916.861 2815.955 3085.998 270.0427
## 1879 0.10043623 2916.861 2815.955 3085.998 270.0427
## 1880 0.10623623 2830.729 2815.955 3085.998 270.0427
## 1881 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1882 0.11783623 2916.861 2815.955 3085.998 270.0427
## 1883 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1884 0.11203623 2916.861 2815.955 3085.998 270.0427
## 1885 0.12363623 2916.861 2815.955 3085.998 270.0427
## 1886 0.12363623 2916.861 2815.955 3085.998 270.0427
## Call_Rate_Inst Date Presence
## 1 88.395217 03/03/2024 0
## 2 83.247533 03/03/2024 0
## 3 86.603259 03/03/2024 0
## 4 56.961340 03/03/2024 0
## 5 85.451367 03/03/2024 0
## 6 88.395217 03/03/2024 0
## 7 86.602254 03/03/2024 0
## 8 78.256743 03/03/2024 0
## 9 94.309216 03/03/2024 0
## 10 90.273414 03/03/2024 0
## 11 85.450393 03/03/2024 0
## 12 92.242494 03/03/2024 0
## 13 97.230365 03/03/2024 0
## 14 91.575632 03/03/2024 0
## 15 95.744924 03/03/2024 0
## 16 92.919612 03/03/2024 0
## 17 90.919356 03/03/2024 0
## 18 99.553907 03/03/2024 0
## 19 99.553907 03/03/2024 0
## 20 92.241339 03/03/2024 0
## 21 94.308610 03/03/2024 0
## 22 93.607821 03/03/2024 0
## 23 102.003695 03/03/2024 0
## 24 92.241916 03/03/2024 0
## 25 90.918237 03/03/2024 0
## 26 109.236997 03/03/2024 0
## 27 86.601250 03/03/2024 0
## 28 92.919612 03/03/2024 0
## 29 103.713029 03/03/2024 0
## 30 97.228418 03/03/2024 0
## 31 85.981383 03/03/2024 0
## 32 55.827825 03/03/2024 0
## 33 61.313158 03/03/2024 0
## 34 92.202762 03/03/2024 0
## 35 82.676389 03/03/2024 0
## 36 94.981434 03/03/2024 0
## 37 84.847485 03/03/2024 0
## 38 94.980817 03/03/2024 0
## 39 95.704663 03/03/2024 0
## 40 97.951085 03/03/2024 0
## 41 70.006499 03/03/2024 0
## 42 92.201607 03/03/2024 0
## 43 82.151853 03/03/2024 0
## 44 92.879312 03/03/2024 0
## 45 95.704663 03/03/2024 0
## 46 91.534745 03/03/2024 0
## 47 93.568724 03/03/2024 0
## 48 78.215855 03/03/2024 0
## 49 87.747380 03/03/2024 0
## 50 88.970155 03/03/2024 0
## 51 85.409505 03/03/2024 0
## 52 87.747381 03/03/2024 0
## 53 91.534176 03/03/2024 0
## 54 87.746863 03/03/2024 0
## 55 75.102288 03/03/2024 0
## 56 79.640472 03/03/2024 0
## 57 40.746772 03/03/2024 0
## 58 64.414596 03/03/2024 0
## 59 89.594510 03/03/2024 0
## 60 78.214255 03/03/2024 0
## 61 92.877828 03/21/2024 1
## 62 81.302974 03/21/2024 1
## 63 85.031927 03/21/2024 1
## 64 96.116416 03/21/2024 1
## 65 68.835678 03/21/2024 1
## 66 85.031367 03/21/2024 1
## 67 81.302975 03/21/2024 1
## 68 76.305767 03/21/2024 1
## 69 77.899244 03/21/2024 1
## 70 88.421410 03/21/2024 1
## 71 77.899244 03/21/2024 1
## 72 80.135360 03/21/2024 1
## 73 81.303484 03/21/2024 1
## 74 96.117137 03/21/2024 1
## 75 44.679938 03/21/2024 1
## 76 68.007272 03/21/2024 1
## 77 79.000137 03/21/2024 1
## 78 91.340923 03/21/2024 1
## 79 87.720691 03/21/2024 1
## 80 90.592334 03/21/2024 1
## 81 80.714782 03/21/2024 1
## 82 83.750276 03/21/2024 1
## 83 65.644225 03/21/2024 1
## 84 85.688700 03/21/2024 1
## 85 57.980622 03/21/2024 1
## 86 87.722481 03/21/2024 1
## 87 97.827085 03/21/2024 1
## 88 78.446858 03/21/2024 1
## 89 80.715284 03/21/2024 1
## 90 85.688700 03/21/2024 1
## 91 103.182078 03/21/2024 1
## 92 114.472970 03/21/2024 1
## 93 113.340649 03/21/2024 1
## 94 98.790720 03/21/2024 1
## 95 78.463913 03/21/2024 1
## 96 115.631372 03/21/2024 1
## 97 91.096584 03/21/2024 1
## 98 125.862107 03/21/2024 1
## 99 110.079009 03/21/2024 1
## 100 120.519341 03/21/2024 1
## 101 127.276079 03/21/2024 1
## 102 120.518245 03/21/2024 1
## 103 86.425128 03/21/2024 1
## 104 106.022836 03/21/2024 1
## 105 94.016309 03/21/2024 1
## 106 119.256250 03/21/2024 1
## 107 110.078103 03/21/2024 1
## 108 124.478293 03/21/2024 1
## 109 97.144083 03/21/2024 1
## 110 104.112299 03/21/2024 1
## 111 52.024771 03/21/2024 1
## 112 97.959349 03/21/2024 1
## 113 97.959349 03/21/2024 1
## 114 106.022836 03/21/2024 1
## 115 119.255178 03/21/2024 1
## 116 73.674828 03/21/2024 1
## 117 127.272391 03/21/2024 1
## 118 93.267027 03/21/2024 1
## 119 91.807192 03/21/2024 1
## 120 107.006615 03/21/2024 1
## 121 99.891451 03/21/2024 1
## 122 86.339448 03/21/2024 1
## 123 102.913309 03/21/2024 1
## 124 74.194230 03/21/2024 1
## 125 103.703112 03/21/2024 1
## 126 104.504831 03/21/2024 1
## 127 101.378168 03/21/2024 1
## 128 98.456977 03/21/2024 1
## 129 58.169714 03/21/2024 1
## 130 72.779491 03/21/2024 1
## 131 89.596572 03/21/2024 1
## 132 95.065951 03/21/2024 1
## 133 84.811788 03/21/2024 1
## 134 91.934905 03/21/2024 1
## 135 76.058592 03/21/2024 1
## 136 74.926389 03/21/2024 1
## 137 82.872221 03/21/2024 1
## 138 108.738982 03/21/2024 1
## 139 84.318028 03/21/2024 1
## 140 74.193919 03/21/2024 1
## 141 57.972962 03/21/2024 1
## 142 63.208261 03/21/2024 1
## 143 62.488048 03/21/2024 1
## 144 94.419467 03/21/2024 1
## 145 84.811788 03/21/2024 1
## 146 78.040190 03/21/2024 1
## 147 83.346088 03/21/2024 1
## 148 100.626907 03/21/2024 1
## 149 64.713728 03/21/2024 1
## 150 84.316760 03/21/2024 1
## 151 99.682323 03/21/2024 0
## 152 64.028811 03/21/2024 0
## 153 115.447220 03/21/2024 0
## 154 88.088220 03/21/2024 0
## 155 94.120327 03/21/2024 0
## 156 98.221829 03/21/2024 0
## 157 119.753706 03/21/2024 0
## 158 112.437694 03/21/2024 0
## 159 92.838606 03/21/2024 0
## 160 103.556712 03/21/2024 0
## 161 98.945623 03/21/2024 0
## 162 126.933362 03/21/2024 0
## 163 125.671343 03/21/2024 0
## 164 114.425637 03/21/2024 0
## 165 106.914742 03/21/2024 0
## 166 113.423197 03/21/2024 0
## 167 104.374786 03/21/2024 0
## 168 92.213184 03/21/2024 0
## 169 96.808047 03/21/2024 0
## 170 114.423895 03/21/2024 0
## 171 92.838064 03/21/2024 0
## 172 110.526319 03/21/2024 0
## 173 111.471175 03/21/2024 0
## 174 99.681047 03/21/2024 0
## 175 58.858237 03/21/2024 0
## 176 94.118648 03/21/2024 0
## 177 115.446331 03/21/2024 0
## 178 108.684070 03/21/2024 0
## 179 119.753706 03/21/2024 0
## 180 89.221522 03/21/2024 0
## 181 82.152860 03/24/2024 0
## 182 89.696947 03/24/2024 0
## 183 82.977267 03/24/2024 0
## 184 90.818363 03/24/2024 0
## 185 87.335043 03/24/2024 0
## 186 82.153208 03/24/2024 0
## 187 82.356300 03/24/2024 0
## 188 90.252177 03/24/2024 0
## 189 89.697183 03/24/2024 0
## 190 84.050252 03/24/2024 0
## 191 78.953775 03/24/2024 0
## 192 88.358505 03/24/2024 0
## 193 86.593739 03/24/2024 0
## 194 95.481814 03/24/2024 0
## 195 85.638004 03/24/2024 0
## 196 73.598543 03/24/2024 0
## 197 89.153284 03/24/2024 0
## 198 72.941532 03/24/2024 0
## 199 64.203297 03/24/2024 0
## 200 77.111394 03/24/2024 0
## 201 76.636241 03/24/2024 0
## 202 62.258410 03/24/2024 0
## 203 77.111394 03/24/2024 0
## 204 74.558926 03/24/2024 0
## 205 68.027074 03/24/2024 0
## 206 79.485011 03/24/2024 0
## 207 69.127116 03/24/2024 0
## 208 80.970070 03/24/2024 0
## 209 79.846916 03/24/2024 0
## 210 76.325811 03/24/2024 0
## 211 88.988492 03/28/2024 0
## 212 73.900491 03/28/2024 0
## 213 95.261245 03/28/2024 0
## 214 85.235891 03/28/2024 0
## 215 79.828764 03/28/2024 0
## 216 93.210539 03/28/2024 0
## 217 84.457503 03/28/2024 0
## 218 74.711810 03/28/2024 0
## 219 78.224817 03/28/2024 0
## 220 98.566856 03/28/2024 0
## 221 107.565434 03/28/2024 0
## 222 94.738108 03/28/2024 0
## 223 102.182903 03/28/2024 0
## 224 96.331177 03/28/2024 0
## 225 66.767039 03/28/2024 0
## 226 87.267400 03/28/2024 0
## 227 58.086532 03/28/2024 0
## 228 92.715541 03/28/2024 0
## 229 100.333728 03/28/2024 0
## 230 69.732683 03/28/2024 0
## 231 90.339548 03/28/2024 0
## 232 78.538301 03/28/2024 0
## 233 61.341191 03/28/2024 0
## 234 98.566855 03/28/2024 0
## 235 100.940637 03/28/2024 0
## 236 77.914225 03/28/2024 0
## 237 84.844141 03/28/2024 0
## 238 60.437779 03/28/2024 0
## 239 73.900491 03/28/2024 0
## 240 92.715541 03/28/2024 0
## 241 65.621342 03/24/2024 1
## 242 73.404219 03/24/2024 1
## 243 89.009277 03/24/2024 1
## 244 87.351360 03/24/2024 1
## 245 84.008146 03/24/2024 1
## 246 81.031088 03/24/2024 1
## 247 85.178363 03/24/2024 1
## 248 91.501139 03/24/2024 1
## 249 83.441448 03/24/2024 1
## 250 90.053260 03/24/2024 1
## 251 84.586903 03/24/2024 1
## 252 83.162503 03/24/2024 1
## 253 80.775415 03/24/2024 1
## 254 89.354132 03/24/2024 1
## 255 82.075044 03/24/2024 1
## 256 90.052044 03/24/2024 1
## 257 77.682228 03/24/2024 1
## 258 85.177849 03/24/2024 1
## 259 86.399495 03/24/2024 1
## 260 82.074128 03/24/2024 1
## 261 70.951787 03/24/2024 1
## 262 85.478242 03/24/2024 1
## 263 87.030820 03/24/2024 1
## 264 90.768632 03/24/2024 1
## 265 66.521615 03/24/2024 1
## 266 86.089407 03/24/2024 1
## 267 84.880670 03/24/2024 1
## 268 86.713548 03/24/2024 1
## 269 74.743040 03/24/2024 1
## 270 79.062221 03/24/2024 1
## 271 92.395986 03/24/2024 1
## 272 90.230996 03/24/2024 1
## 273 94.234729 03/24/2024 1
## 274 91.513949 03/24/2024 1
## 275 87.039134 03/24/2024 1
## 276 91.080902 03/24/2024 1
## 277 89.403535 03/24/2024 1
## 278 93.766784 03/24/2024 1
## 279 88.199268 03/24/2024 1
## 280 79.668906 03/24/2024 1
## 281 94.235134 03/24/2024 1
## 282 87.808146 03/24/2024 1
## 283 91.081271 03/24/2024 1
## 284 82.791875 03/24/2024 1
## 285 82.463787 03/24/2024 1
## 286 85.920748 03/24/2024 1
## 287 78.796121 03/24/2024 1
## 288 75.564232 03/24/2024 1
## 289 85.920434 03/24/2024 1
## 290 82.463507 03/24/2024 1
## 291 86.288868 03/24/2024 1
## 292 80.570153 03/24/2024 1
## 293 60.159828 03/24/2024 1
## 294 69.530769 03/24/2024 1
## 295 68.946930 03/24/2024 1
## 296 72.247189 03/24/2024 1
## 297 75.818377 03/24/2024 1
## 298 80.569628 03/24/2024 1
## 299 76.598000 03/24/2024 1
## 300 86.661418 03/24/2024 1
## 301 71.983117 03/24/2024 1
## 302 76.096626 03/24/2024 1
## 303 77.130988 03/24/2024 1
## 304 78.708869 03/24/2024 1
## 305 75.953500 03/24/2024 1
## 306 88.196691 03/24/2024 1
## 307 73.418475 03/24/2024 1
## 308 87.462171 03/24/2024 1
## 309 86.515776 03/24/2024 1
## 310 84.511961 03/24/2024 1
## 311 75.953623 03/24/2024 1
## 312 86.056786 03/24/2024 1
## 313 79.544372 03/24/2024 1
## 314 80.063055 03/24/2024 1
## 315 72.806554 03/24/2024 1
## 316 72.686665 03/24/2024 1
## 317 79.546727 03/24/2024 1
## 318 82.864290 03/24/2024 1
## 319 82.467033 03/24/2024 1
## 320 88.950277 03/24/2024 1
## 321 80.418930 03/24/2024 1
## 322 62.862396 03/24/2024 1
## 323 67.403017 03/24/2024 1
## 324 78.546018 03/24/2024 1
## 325 63.050965 03/24/2024 1
## 326 82.665638 03/24/2024 1
## 327 47.643187 03/28/2024 0
## 328 30.920510 03/28/2024 0
## 329 46.812428 03/28/2024 0
## 330 53.341476 03/28/2024 0
## 331 60.277277 03/28/2024 0
## 332 59.937820 03/28/2024 0
## 333 49.400577 03/28/2024 0
## 334 61.675346 03/28/2024 0
## 335 49.629482 03/28/2024 0
## 336 36.271550 03/28/2024 0
## 337 11.674284 03/28/2024 0
## 338 37.140107 03/28/2024 0
## 339 60.619173 03/28/2024 0
## 340 11.662991 03/28/2024 0
## 341 35.558133 03/28/2024 0
## 342 63.516240 03/28/2024 0
## 343 46.608460 03/28/2024 0
## 344 29.426397 03/28/2024 0
## 345 33.791148 03/28/2024 0
## 346 51.541088 03/28/2024 0
## 347 67.559183 03/28/2024 0
## 348 58.297117 03/28/2024 0
## 349 54.152373 03/28/2024 0
## 350 44.302499 03/28/2024 0
## 351 42.053616 03/28/2024 0
## 352 69.325341 03/28/2024 0
## 353 60.277277 03/28/2024 0
## 354 49.400382 03/28/2024 0
## 355 55.853268 03/28/2024 0
## 356 31.453888 03/28/2024 0
## 357 98.215000 03/31/2024 1
## 358 62.838959 03/31/2024 1
## 359 82.126994 03/31/2024 1
## 360 78.726638 03/31/2024 1
## 361 89.623190 03/31/2024 1
## 362 99.772271 03/31/2024 1
## 363 80.970665 03/31/2024 1
## 364 79.836478 03/31/2024 1
## 365 89.623190 03/31/2024 1
## 366 93.768121 03/31/2024 1
## 367 73.503848 03/31/2024 1
## 368 104.678022 03/31/2024 1
## 369 75.530294 03/31/2024 1
## 370 84.517091 03/31/2024 1
## 371 89.620896 03/31/2024 1
## 372 80.968697 03/31/2024 1
## 373 42.967029 03/31/2024 1
## 374 71.553696 03/31/2024 1
## 375 98.215000 03/31/2024 1
## 376 67.873287 03/31/2024 1
## 377 92.372418 03/31/2024 1
## 378 67.872526 03/31/2024 1
## 379 85.750463 03/31/2024 1
## 380 66.132717 03/31/2024 1
## 381 77.639448 03/31/2024 1
## 382 90.970727 03/31/2024 1
## 383 73.501287 03/31/2024 1
## 384 96.693994 03/31/2024 1
## 385 71.555338 03/31/2024 1
## 386 78.725695 03/31/2024 1
## 387 55.324223 03/28/2024 1
## 388 78.153168 03/28/2024 1
## 389 59.266737 03/28/2024 1
## 390 72.333176 03/28/2024 1
## 391 80.288985 03/28/2024 1
## 392 60.549231 03/28/2024 1
## 393 74.818256 03/28/2024 1
## 394 70.567225 03/28/2024 1
## 395 68.878120 03/28/2024 1
## 396 74.182425 03/28/2024 1
## 397 71.146691 03/28/2024 1
## 398 74.817706 03/28/2024 1
## 399 65.711660 03/28/2024 1
## 400 64.714704 03/28/2024 1
## 401 51.499728 03/28/2024 1
## 402 76.786704 03/28/2024 1
## 403 59.688389 03/28/2024 1
## 404 55.697065 03/28/2024 1
## 405 56.074427 03/28/2024 1
## 406 40.413922 03/28/2024 1
## 407 82.536596 03/28/2024 1
## 408 65.210149 03/28/2024 1
## 409 67.792557 03/28/2024 1
## 410 56.074427 03/28/2024 1
## 411 85.718936 03/28/2024 1
## 412 70.566730 03/28/2024 1
## 413 62.801086 03/28/2024 1
## 414 63.745288 03/28/2024 1
## 415 66.220668 03/28/2024 1
## 416 56.843375 03/28/2024 1
## 417 71.641106 03/28/2024 1
## 418 78.074870 03/28/2024 1
## 419 74.505254 03/28/2024 1
## 420 56.983649 03/28/2024 1
## 421 66.638405 03/28/2024 1
## 422 69.343435 03/28/2024 1
## 423 70.634255 03/28/2024 1
## 424 66.353582 03/28/2024 1
## 425 73.763633 03/28/2024 1
## 426 77.245292 03/28/2024 1
## 427 67.808578 03/28/2024 1
## 428 42.460270 03/28/2024 1
## 429 70.633688 03/28/2024 1
## 430 59.220266 03/28/2024 1
## 431 78.922567 03/28/2024 1
## 432 67.511404 03/28/2024 1
## 433 64.973065 03/28/2024 1
## 434 66.638405 03/28/2024 1
## 435 82.552132 03/28/2024 1
## 436 76.041428 03/28/2024 1
## 437 67.808322 03/28/2024 1
## 438 67.217140 03/28/2024 1
## 439 69.029932 03/28/2024 1
## 440 70.965771 03/28/2024 1
## 441 53.254325 03/28/2024 1
## 442 36.965280 03/28/2024 1
## 443 35.944377 03/28/2024 1
## 444 71.640520 03/28/2024 1
## 445 73.762374 03/28/2024 1
## 446 64.705371 03/28/2024 1
## 447 74.503965 03/28/2024 1
## 448 60.993210 03/28/2024 1
## 449 81.145028 03/28/2024 1
## 450 72.331553 03/28/2024 1
## 451 63.661231 03/28/2024 1
## 452 67.808322 03/28/2024 1
## 453 78.922567 03/28/2024 1
## 454 71.983890 03/28/2024 1
## 455 71.640520 03/28/2024 1
## 456 73.762374 03/28/2024 1
## 457 61.692650 03/28/2024 1
## 458 64.973065 03/28/2024 1
## 459 71.301073 03/28/2024 1
## 460 64.440154 03/28/2024 1
## 461 74.130789 03/28/2024 1
## 462 76.041090 03/28/2024 1
## 463 59.869424 03/28/2024 1
## 464 80.238731 03/28/2024 1
## 465 73.038547 03/28/2024 1
## 466 66.353338 03/28/2024 1
## 467 77.244941 03/28/2024 1
## 468 69.029396 03/28/2024 1
## 469 69.981493 03/28/2024 1
## 470 61.930620 03/28/2024 1
## 471 69.660417 03/28/2024 1
## 472 62.412869 03/28/2024 1
## 473 72.331553 03/28/2024 1
## 474 59.869612 03/28/2024 1
## 475 38.405048 03/28/2024 1
## 476 48.632368 03/28/2024 1
## 477 63.566146 03/31/2024 1
## 478 73.721750 03/31/2024 1
## 479 84.857717 03/31/2024 1
## 480 86.238909 03/31/2024 1
## 481 83.507912 03/31/2024 1
## 482 87.652597 03/31/2024 1
## 483 93.656373 03/31/2024 1
## 484 95.251117 03/31/2024 1
## 485 92.100522 03/31/2024 1
## 486 86.238909 03/31/2024 1
## 487 80.898283 03/31/2024 1
## 488 83.507912 03/31/2024 1
## 489 100.283856 03/31/2024 1
## 490 82.189559 03/31/2024 1
## 491 105.724612 03/31/2024 1
## 492 105.724612 03/31/2024 1
## 493 120.314279 03/31/2024 1
## 494 67.389450 03/31/2024 1
## 495 80.899379 03/31/2024 1
## 496 77.194275 03/31/2024 1
## 497 96.886231 03/31/2024 1
## 498 82.188438 03/31/2024 1
## 499 82.188438 03/31/2024 1
## 500 89.101199 03/31/2024 1
## 501 63.566936 03/31/2024 1
## 502 48.090641 03/31/2024 1
## 503 93.657727 03/31/2024 1
## 504 38.339806 03/31/2024 1
## 505 90.582157 03/31/2024 1
## 506 82.188438 03/31/2024 1
## 507 98.459481 03/31/2024 0
## 508 94.315367 03/31/2024 0
## 509 86.816452 03/31/2024 0
## 510 89.207731 03/31/2024 0
## 511 92.993445 03/31/2024 0
## 512 87.997690 03/31/2024 0
## 513 92.991203 03/31/2024 0
## 514 109.368844 03/31/2024 0
## 515 91.700949 03/31/2024 0
## 516 89.206682 03/31/2024 0
## 517 86.816452 03/31/2024 0
## 518 94.313073 03/31/2024 0
## 519 106.054948 03/31/2024 0
## 520 87.996663 03/31/2024 0
## 521 81.262474 03/31/2024 0
## 522 98.455793 03/31/2024 0
## 523 98.458252 03/31/2024 0
## 524 97.043192 03/31/2024 0
## 525 107.691626 03/31/2024 0
## 526 104.461421 03/31/2024 0
## 527 101.385594 03/31/2024 0
## 528 107.690202 03/31/2024 0
## 529 106.054948 03/31/2024 0
## 530 94.309633 03/31/2024 0
## 531 91.700949 03/31/2024 0
## 532 95.663037 03/31/2024 0
## 533 98.455793 03/31/2024 0
## 534 95.661863 03/31/2024 0
## 535 101.386883 03/31/2024 0
## 536 104.461421 03/31/2024 0
## 537 59.391718 03/31/2024 1
## 538 101.858299 03/31/2024 1
## 539 86.077559 03/31/2024 1
## 540 75.639337 03/31/2024 1
## 541 77.378439 03/31/2024 1
## 542 40.741607 03/31/2024 1
## 543 83.007293 03/31/2024 1
## 544 96.517465 03/31/2024 1
## 545 88.230846 03/31/2024 1
## 546 85.034558 03/31/2024 1
## 547 110.869494 03/31/2024 1
## 548 110.870882 03/31/2024 1
## 549 92.813318 03/31/2024 1
## 550 100.478226 03/31/2024 1
## 551 99.126048 03/31/2024 1
## 552 107.717511 03/31/2024 1
## 553 90.472865 03/31/2024 1
## 554 73.145013 03/31/2024 1
## 555 82.025287 03/31/2024 1
## 556 106.201724 03/31/2024 1
## 557 106.201724 03/31/2024 1
## 558 92.814345 03/31/2024 1
## 559 82.023612 03/31/2024 1
## 560 89.340666 03/31/2024 1
## 561 89.342593 03/31/2024 1
## 562 95.258832 03/31/2024 1
## 563 89.343557 03/31/2024 1
## 564 76.501288 03/31/2024 1
## 565 85.034557 03/31/2024 1
## 566 80.113264 03/31/2024 1
## 567 138.340488 03/31/2024 1
## 568 131.527969 03/31/2024 1
## 569 133.733273 03/31/2024 1
## 570 115.962918 03/31/2024 1
## 571 140.710389 03/31/2024 1
## 572 119.513198 03/31/2024 1
## 573 114.213794 03/31/2024 1
## 574 83.056239 03/31/2024 1
## 575 56.617742 03/31/2024 1
## 576 91.663675 03/31/2024 1
## 577 87.175365 03/31/2024 1
## 578 140.710389 03/31/2024 1
## 579 61.217438 03/31/2024 1
## 580 14.948675 03/31/2024 1
## 581 88.264386 03/31/2024 1
## 582 112.538182 03/31/2024 1
## 583 129.358459 03/31/2024 1
## 584 143.196558 03/31/2024 1
## 585 123.289756 03/31/2024 1
## 586 131.496167 03/31/2024 1
## 587 145.757239 03/31/2024 1
## 588 125.255883 03/31/2024 1
## 589 131.494302 03/31/2024 1
## 590 114.216714 03/31/2024 1
## 591 145.757239 03/31/2024 1
## 592 119.513198 03/31/2024 1
## 593 112.536759 03/31/2024 1
## 594 127.275628 03/31/2024 1
## 595 106.232686 03/31/2024 1
## 596 135.964808 03/31/2024 1
## 597 45.841779 04/07/2024 1
## 598 79.456402 04/07/2024 1
## 599 75.671022 04/07/2024 1
## 600 67.605006 04/07/2024 1
## 601 84.189005 04/07/2024 1
## 602 82.410962 04/07/2024 1
## 603 82.067029 04/07/2024 1
## 604 82.067029 04/07/2024 1
## 605 58.430905 04/07/2024 1
## 606 74.088185 04/07/2024 1
## 607 50.526317 04/07/2024 1
## 608 82.757400 04/07/2024 1
## 609 74.087746 04/07/2024 1
## 610 83.823736 04/07/2024 1
## 611 56.891243 04/07/2024 1
## 612 84.188061 04/07/2024 1
## 613 55.169319 04/07/2024 1
## 614 61.377538 04/07/2024 1
## 615 48.702838 04/07/2024 1
## 616 58.807892 04/07/2024 1
## 617 78.539686 04/07/2024 1
## 618 76.502576 04/07/2024 1
## 619 91.113546 04/07/2024 1
## 620 84.187746 04/07/2024 1
## 621 83.469554 04/07/2024 1
## 622 81.396655 04/07/2024 1
## 623 58.432718 04/07/2024 1
## 624 55.067434 04/07/2024 1
## 625 75.399443 04/07/2024 1
## 626 73.833198 04/07/2024 1
## 627 48.981190 04/07/2024 1
## 628 71.519147 04/07/2024 1
## 629 81.437165 04/07/2024 1
## 630 70.799358 04/07/2024 1
## 631 82.504190 04/07/2024 1
## 632 61.562637 04/07/2024 1
## 633 81.789796 04/07/2024 1
## 634 89.795023 04/07/2024 1
## 635 86.762434 04/07/2024 1
## 636 73.024798 04/07/2024 1
## 637 84.369445 04/07/2024 1
## 638 82.869171 04/07/2024 1
## 639 68.327013 04/07/2024 1
## 640 86.762791 04/07/2024 1
## 641 83.237590 04/07/2024 1
## 642 67.488221 04/07/2024 1
## 643 64.411676 04/07/2024 1
## 644 70.799561 04/07/2024 1
## 645 74.899193 04/07/2024 1
## 646 42.225766 04/07/2024 1
## 647 72.767248 04/07/2024 1
## 648 74.623141 04/07/2024 1
## 649 92.137949 04/07/2024 1
## 650 83.609465 04/07/2024 1
## 651 82.868540 04/07/2024 1
## 652 62.198762 04/07/2024 1
## 653 74.623378 04/07/2024 1
## 654 95.705281 04/07/2024 1
## 655 95.174593 04/07/2024 1
## 656 92.139611 04/07/2024 1
## 657 88.760785 04/07/2024 1
## 658 84.932979 04/07/2024 1
## 659 72.118041 04/07/2024 1
## 660 82.414227 04/07/2024 1
## 661 76.834789 04/07/2024 1
## 662 85.606770 04/07/2024 1
## 663 56.509241 04/07/2024 1
## 664 43.647347 04/07/2024 1
## 665 65.244044 04/07/2024 1
## 666 51.888632 04/07/2024 1
## 667 70.315460 04/07/2024 1
## 668 78.590876 04/07/2024 1
## 669 86.066739 04/07/2024 1
## 670 45.136754 04/07/2024 1
## 671 63.181683 04/07/2024 1
## 672 71.765313 04/07/2024 1
## 673 50.400229 04/07/2024 1
## 674 82.815414 04/07/2024 1
## 675 74.941592 04/07/2024 1
## 676 50.935871 04/07/2024 1
## 677 82.815414 04/07/2024 1
## 678 84.277272 04/07/2024 1
## 679 79.441653 04/07/2024 1
## 680 86.066938 04/07/2024 1
## 681 75.648083 04/07/2024 1
## 682 86.535714 04/07/2024 1
## 683 84.712269 04/07/2024 1
## 684 84.493960 04/07/2024 1
## 685 92.651235 04/07/2024 1
## 686 83.223764 04/07/2024 1
## 687 70.945228 04/07/2024 1
## 688 73.556895 04/07/2024 1
## 689 58.702308 04/07/2024 1
## 690 64.261422 04/07/2024 1
## 691 61.622621 04/07/2024 1
## 692 67.047817 04/07/2024 1
## 693 63.890421 04/07/2024 1
## 694 64.261583 04/07/2024 1
## 695 73.013242 04/07/2024 1
## 696 80.722942 04/07/2024 1
## 697 69.970670 04/07/2024 1
## 698 90.116274 04/07/2024 1
## 699 88.278448 04/07/2024 1
## 700 70.211140 04/07/2024 1
## 701 100.402399 04/07/2024 1
## 702 81.438567 04/07/2024 1
## 703 75.848679 04/07/2024 1
## 704 57.061680 04/07/2024 1
## 705 91.561608 04/07/2024 1
## 706 78.674275 04/07/2024 1
## 707 97.413211 04/07/2024 1
## 708 76.149057 04/07/2024 1
## 709 86.962698 04/07/2024 1
## 710 64.830324 04/07/2024 1
## 711 76.452439 04/07/2024 1
## 712 48.213840 04/07/2024 1
## 713 59.880034 04/07/2024 1
## 714 54.390878 04/07/2024 1
## 715 63.890262 04/07/2024 1
## 716 67.474560 04/07/2024 1
## 717 86.798331 04/09/2024 1
## 718 84.019120 04/09/2024 1
## 719 93.781763 04/09/2024 1
## 720 65.669311 04/09/2024 1
## 721 82.696542 04/09/2024 1
## 722 82.695982 04/09/2024 1
## 723 92.133608 04/09/2024 1
## 724 89.005044 04/09/2024 1
## 725 89.005045 04/09/2024 1
## 726 75.561156 04/09/2024 1
## 727 87.520295 04/09/2024 1
## 728 87.520923 04/09/2024 1
## 729 88.257016 04/09/2024 1
## 730 85.383851 04/09/2024 1
## 731 71.945387 04/09/2024 1
## 732 80.787135 04/09/2024 1
## 733 74.491637 04/09/2024 1
## 734 83.351122 04/09/2024 1
## 735 74.491183 04/09/2024 1
## 736 81.413108 04/09/2024 1
## 737 84.696239 04/09/2024 1
## 738 76.108330 04/09/2024 1
## 739 84.017965 04/09/2024 1
## 740 93.779600 04/09/2024 1
## 741 89.765959 04/09/2024 1
## 742 69.112978 04/09/2024 1
## 743 78.965613 04/09/2024 1
## 744 94.625380 04/09/2024 1
## 745 81.412566 04/09/2024 1
## 746 107.218149 04/09/2024 1
## 747 62.591993 04/09/2024 1
## 748 69.102195 04/09/2024 1
## 749 72.214786 04/09/2024 1
## 750 39.113630 04/09/2024 1
## 751 76.150011 04/09/2024 1
## 752 75.635129 04/09/2024 1
## 753 77.206079 04/09/2024 1
## 754 75.125692 04/09/2024 1
## 755 61.241844 04/09/2024 1
## 756 48.180006 04/09/2024 1
## 757 34.552205 04/09/2024 1
## 758 71.296807 04/09/2024 1
## 759 79.981136 04/09/2024 1
## 760 87.568666 04/09/2024 1
## 761 71.755108 04/09/2024 1
## 762 78.848256 04/09/2024 1
## 763 76.677667 04/09/2024 1
## 764 79.412212 04/09/2024 1
## 765 72.686722 04/09/2024 1
## 766 69.965630 04/09/2024 1
## 767 76.677667 04/09/2024 1
## 768 78.294441 04/09/2024 1
## 769 75.128732 04/09/2024 1
## 770 91.952817 04/09/2024 1
## 771 78.293968 04/09/2024 1
## 772 86.203916 04/09/2024 1
## 773 73.643037 04/09/2024 1
## 774 73.643454 04/09/2024 1
## 775 67.047707 04/09/2024 1
## 776 72.687533 04/09/2024 1
## 777 50.658841 04/09/2024 1
## 778 88.499926 04/09/2024 1
## 779 94.767601 04/09/2024 1
## 780 80.805640 04/09/2024 1
## 781 61.641533 04/09/2024 1
## 782 72.518602 04/09/2024 1
## 783 16.018130 04/09/2024 1
## 784 46.808756 04/09/2024 1
## 785 61.219909 04/09/2024 1
## 786 43.460888 04/09/2024 1
## 787 11.048179 04/09/2024 1
## 788 4.095312 04/09/2024 1
## 789 55.478575 04/09/2024 1
## 790 76.135048 04/09/2024 1
## 791 80.106115 04/09/2024 1
## 792 94.769244 04/09/2024 1
## 793 68.174240 04/09/2024 1
## 794 69.744213 04/09/2024 1
## 795 74.891764 04/09/2024 1
## 796 83.725154 04/09/2024 1
## 797 44.605464 04/09/2024 1
## 798 53.781427 04/09/2024 1
## 799 88.501368 04/09/2024 1
## 800 46.302806 04/09/2024 1
## 801 70.830142 04/09/2024 1
## 802 81.518047 04/09/2024 1
## 803 45.805871 04/09/2024 1
## 804 80.104922 04/09/2024 1
## 805 88.500647 04/09/2024 1
## 806 80.805033 04/09/2024 1
## 807 79.907461 04/09/2024 1
## 808 79.376816 04/09/2024 1
## 809 111.014136 04/09/2024 1
## 810 90.268169 04/09/2024 1
## 811 93.141087 04/09/2024 1
## 812 104.930027 04/09/2024 1
## 813 88.235041 04/09/2024 1
## 814 81.548095 04/09/2024 1
## 815 104.930848 04/09/2024 1
## 816 87.578845 04/09/2024 1
## 817 71.804780 04/09/2024 1
## 818 79.907461 04/09/2024 1
## 819 113.211166 04/09/2024 1
## 820 85.054486 04/09/2024 1
## 821 103.055043 04/09/2024 1
## 822 80.992915 04/09/2024 1
## 823 109.948001 04/09/2024 1
## 824 114.344370 04/09/2024 1
## 825 86.297211 04/09/2024 1
## 826 85.055011 04/09/2024 1
## 827 98.662452 04/09/2024 1
## 828 82.681354 04/09/2024 1
## 829 112.101327 04/09/2024 1
## 830 96.212280 04/09/2024 1
## 831 96.212281 04/09/2024 1
## 832 76.830751 04/09/2024 1
## 833 111.013211 04/09/2024 1
## 834 79.375909 04/09/2024 1
## 835 111.013211 04/09/2024 1
## 836 111.013211 04/09/2024 1
## 837 118.914979 04/10/2024 0
## 838 120.777137 04/10/2024 0
## 839 101.291730 04/10/2024 0
## 840 104.151909 04/10/2024 0
## 841 80.492023 04/10/2024 0
## 842 67.239801 04/10/2024 0
## 843 111.939185 04/10/2024 0
## 844 124.661763 04/10/2024 0
## 845 111.942031 04/10/2024 0
## 846 120.773893 04/10/2024 0
## 847 105.630440 04/10/2024 0
## 848 113.612061 04/10/2024 0
## 849 120.775515 04/10/2024 0
## 850 135.362652 04/10/2024 0
## 851 111.942031 04/10/2024 0
## 852 110.308023 04/10/2024 0
## 853 113.620820 04/10/2024 0
## 854 107.155504 04/10/2024 0
## 855 118.918137 04/10/2024 0
## 856 102.706847 04/10/2024 0
## 857 124.661763 04/10/2024 0
## 858 98.561503 04/10/2024 0
## 859 13.207877 04/10/2024 0
## 860 89.905212 04/10/2024 0
## 861 71.772221 04/10/2024 0
## 862 101.290529 04/10/2024 0
## 863 104.151908 04/10/2024 0
## 864 105.635597 04/10/2024 0
## 865 83.443101 04/10/2024 0
## 866 98.560356 04/10/2024 0
## 867 59.475692 04/09/2024 0
## 868 77.643055 04/09/2024 0
## 869 81.204633 04/09/2024 0
## 870 60.482504 04/09/2024 0
## 871 62.972723 04/09/2024 0
## 872 88.673239 04/09/2024 0
## 873 66.497887 04/09/2024 0
## 874 45.824722 04/09/2024 0
## 875 40.681865 04/09/2024 0
## 876 61.172623 04/09/2024 0
## 877 66.496820 04/09/2024 0
## 878 69.985625 04/09/2024 0
## 879 68.635707 04/09/2024 0
## 880 71.393059 04/09/2024 0
## 881 34.969084 04/09/2024 0
## 882 79.383111 04/09/2024 0
## 883 79.981358 04/09/2024 0
## 884 77.642568 04/09/2024 0
## 885 68.635707 04/09/2024 0
## 886 85.113737 04/09/2024 0
## 887 66.497887 04/09/2024 0
## 888 83.111802 04/09/2024 0
## 889 87.936539 04/09/2024 0
## 890 78.794370 04/09/2024 0
## 891 85.801946 04/09/2024 0
## 892 74.909135 04/09/2024 0
## 893 65.278589 04/09/2024 0
## 894 77.080096 04/09/2024 0
## 895 86.500914 04/09/2024 0
## 896 45.824888 04/09/2024 0
## 897 85.092662 04/09/2024 1
## 898 96.249931 04/09/2024 1
## 899 74.954117 04/09/2024 1
## 900 79.413560 04/09/2024 1
## 901 85.708413 04/09/2024 1
## 902 77.864850 04/09/2024 1
## 903 68.996597 04/09/2024 1
## 904 79.946030 04/09/2024 1
## 905 95.461613 04/09/2024 1
## 906 88.938892 04/09/2024 1
## 907 76.867979 04/09/2024 1
## 908 93.176824 04/09/2024 1
## 909 75.422781 04/09/2024 1
## 910 97.052200 04/09/2024 1
## 911 55.041238 04/09/2024 1
## 912 101.285626 04/09/2024 1
## 913 83.887083 04/09/2024 1
## 914 83.298403 04/09/2024 1
## 915 90.305222 04/09/2024 1
## 916 97.052200 04/09/2024 1
## 917 61.760352 04/09/2024 1
## 918 82.147206 04/09/2024 1
## 919 67.477906 04/09/2024 1
## 920 91.717094 04/09/2024 1
## 921 71.420085 04/09/2024 1
## 922 56.754884 04/09/2024 1
## 923 44.299126 04/09/2024 1
## 924 18.132123 04/09/2024 1
## 925 61.155862 04/09/2024 1
## 926 80.482506 04/09/2024 1
## 927 52.469800 04/09/2024 1
## 928 79.947058 04/09/2024 1
## 929 85.627500 04/09/2024 1
## 930 40.804562 04/09/2024 1
## 931 52.678041 04/09/2024 1
## 932 57.287440 04/09/2024 1
## 933 89.472311 04/09/2024 1
## 934 66.211758 04/09/2024 1
## 935 97.585972 04/09/2024 1
## 936 86.241700 04/09/2024 1
## 937 66.918702 04/09/2024 1
## 938 74.117962 04/09/2024 1
## 939 60.806807 04/09/2024 1
## 940 51.058324 04/09/2024 1
## 941 92.248780 04/09/2024 1
## 942 89.471733 04/09/2024 1
## 943 47.796752 04/09/2024 1
## 944 73.233777 04/09/2024 1
## 945 85.017470 04/09/2024 1
## 946 60.806310 04/09/2024 1
## 947 85.624347 04/09/2024 1
## 948 95.220552 04/09/2024 1
## 949 73.673166 04/09/2024 1
## 950 65.519892 04/09/2024 1
## 951 71.951771 04/09/2024 1
## 952 90.148189 04/09/2024 1
## 953 77.895495 04/09/2024 1
## 954 39.787386 04/09/2024 1
## 955 65.180769 04/09/2024 1
## 956 60.805812 04/09/2024 1
## 957 89.360595 04/09/2024 1
## 958 87.265875 04/09/2024 1
## 959 96.350812 04/09/2024 1
## 960 83.357786 04/09/2024 1
## 961 82.737214 04/09/2024 1
## 962 28.565199 04/09/2024 1
## 963 75.512695 04/09/2024 1
## 964 71.683976 04/09/2024 1
## 965 90.090599 04/09/2024 1
## 966 59.406477 04/09/2024 1
## 967 81.536191 04/09/2024 1
## 968 91.575392 04/09/2024 1
## 969 89.366763 04/09/2024 1
## 970 88.654892 04/09/2024 1
## 971 78.131138 04/09/2024 1
## 972 78.131604 04/09/2024 1
## 973 79.796556 04/09/2024 1
## 974 63.677409 04/09/2024 1
## 975 95.519377 04/09/2024 1
## 976 78.678799 04/09/2024 1
## 977 89.367380 04/09/2024 1
## 978 11.621705 04/09/2024 1
## 979 49.581437 04/09/2024 1
## 980 32.429831 04/09/2024 1
## 981 70.788017 04/09/2024 1
## 982 58.505272 04/09/2024 1
## 983 56.237860 04/09/2024 1
## 984 37.916778 04/09/2024 1
## 985 51.758039 04/09/2024 1
## 986 69.916689 04/09/2024 1
## 987 93.809083 04/10/2024 1
## 988 73.748157 04/10/2024 1
## 989 82.794861 04/10/2024 1
## 990 90.259378 04/10/2024 1
## 991 59.764037 04/10/2024 1
## 992 70.565253 04/10/2024 1
## 993 81.810228 04/10/2024 1
## 994 49.911374 04/10/2024 1
## 995 90.260362 04/10/2024 1
## 996 91.417759 04/10/2024 1
## 997 71.339377 04/10/2024 1
## 998 90.262331 04/10/2024 1
## 999 78.059769 04/10/2024 1
## 1000 71.339377 04/10/2024 1
## 1001 91.417759 04/10/2024 1
## 1002 88.017159 04/10/2024 1
## 1003 92.600046 04/10/2024 1
## 1004 90.260362 04/10/2024 1
## 1005 91.417759 04/10/2024 1
## 1006 72.128437 04/10/2024 1
## 1007 36.735161 04/10/2024 1
## 1008 86.930816 04/10/2024 1
## 1009 60.362778 04/10/2024 1
## 1010 78.970260 04/10/2024 1
## 1011 64.815609 04/10/2024 1
## 1012 83.797267 04/10/2024 1
## 1013 59.176324 04/10/2024 1
## 1014 62.211436 04/10/2024 1
## 1015 82.793154 04/10/2024 1
## 1016 66.182015 04/10/2024 1
## 1017 91.359958 04/10/2024 1
## 1018 81.783370 04/10/2024 1
## 1019 75.300100 04/10/2024 1
## 1020 68.344584 04/10/2024 1
## 1021 81.783370 04/10/2024 1
## 1022 79.243611 04/10/2024 1
## 1023 64.093394 04/10/2024 1
## 1024 63.521581 04/10/2024 1
## 1025 80.074224 04/10/2024 1
## 1026 51.158326 04/10/2024 1
## 1027 70.312870 04/10/2024 1
## 1028 72.379938 04/10/2024 1
## 1029 67.082347 04/10/2024 1
## 1030 74.550862 04/10/2024 1
## 1031 88.289587 04/10/2024 1
## 1032 84.466884 04/10/2024 1
## 1033 99.303880 04/10/2024 1
## 1034 64.673310 04/10/2024 1
## 1035 76.060947 04/10/2024 1
## 1036 70.991078 04/10/2024 1
## 1037 67.082347 04/10/2024 1
## 1038 75.300749 04/10/2024 1
## 1039 77.625381 04/10/2024 1
## 1040 73.815481 04/10/2024 1
## 1041 76.061607 04/10/2024 1
## 1042 74.550862 04/10/2024 1
## 1043 85.395463 04/10/2024 1
## 1044 42.830910 04/10/2024 1
## 1045 73.091111 04/10/2024 1
## 1046 63.522069 04/10/2024 1
## 1047 75.191711 04/10/2024 1
## 1048 72.118377 04/10/2024 1
## 1049 61.659841 04/10/2024 1
## 1050 59.424135 04/10/2024 1
## 1051 85.857965 04/10/2024 1
## 1052 91.082061 04/10/2024 1
## 1053 69.947328 04/10/2024 1
## 1054 37.531554 04/10/2024 1
## 1055 84.873349 04/10/2024 1
## 1056 64.032602 04/10/2024 1
## 1057 92.189108 04/10/2024 1
## 1058 55.319814 04/10/2024 1
## 1059 94.480711 04/10/2024 1
## 1060 76.809283 04/10/2024 1
## 1061 87.883661 04/10/2024 1
## 1062 38.641105 04/10/2024 1
## 1063 85.857112 04/10/2024 1
## 1064 89.992924 04/10/2024 1
## 1065 42.921255 04/10/2024 1
## 1066 40.095765 04/10/2024 1
## 1067 80.227797 04/10/2024 1
## 1068 75.189661 04/10/2024 1
## 1069 72.117101 04/10/2024 1
## 1070 44.618436 04/10/2024 1
## 1071 93.321368 04/10/2024 1
## 1072 55.807609 04/10/2024 1
## 1073 89.991999 04/10/2024 1
## 1074 59.422735 04/10/2024 1
## 1075 95.660923 04/10/2024 1
## 1076 80.227797 04/10/2024 1
## 1077 93.549357 04/10/2024 1
## 1078 65.924532 04/10/2024 1
## 1079 74.320878 04/10/2024 1
## 1080 67.337141 04/10/2024 1
## 1081 74.321599 04/10/2024 1
## 1082 73.489481 04/10/2024 1
## 1083 82.537038 04/10/2024 1
## 1084 71.871811 04/10/2024 1
## 1085 85.609537 04/10/2024 1
## 1086 82.537892 04/10/2024 1
## 1087 79.642626 04/10/2024 1
## 1088 91.163103 04/10/2024 1
## 1089 92.344450 04/10/2024 1
## 1090 60.105655 04/10/2024 1
## 1091 72.672798 04/10/2024 1
## 1092 88.871292 04/10/2024 1
## 1093 33.144179 04/10/2024 1
## 1094 81.554901 04/10/2024 1
## 1095 101.390823 04/10/2024 1
## 1096 74.321599 04/10/2024 1
## 1097 82.538746 04/10/2024 1
## 1098 79.642626 04/10/2024 1
## 1099 69.546971 04/10/2024 1
## 1100 80.589976 04/10/2024 1
## 1101 91.162098 04/10/2024 1
## 1102 48.321191 04/10/2024 1
## 1103 78.713956 04/10/2024 1
## 1104 83.542073 04/10/2024 1
## 1105 61.328413 04/10/2024 1
## 1106 -2.016502 04/10/2024 1
## 1107 49.799119 04/14/2024 0
## 1108 66.108611 04/14/2024 0
## 1109 69.181854 04/14/2024 0
## 1110 75.113685 04/14/2024 0
## 1111 53.961859 04/14/2024 0
## 1112 58.639888 04/14/2024 0
## 1113 39.676325 04/14/2024 0
## 1114 58.640422 04/14/2024 0
## 1115 48.829338 04/14/2024 0
## 1116 80.851864 04/14/2024 0
## 1117 62.548725 04/14/2024 0
## 1118 97.318806 04/14/2024 0
## 1119 63.937018 04/14/2024 0
## 1120 82.918244 04/14/2024 0
## 1121 73.340591 04/14/2024 0
## 1122 63.938231 04/14/2024 0
## 1123 78.864022 04/14/2024 0
## 1124 56.230787 04/14/2024 0
## 1125 69.984856 04/14/2024 0
## 1126 47.885990 04/14/2024 0
## 1127 85.070739 04/14/2024 0
## 1128 70.800793 04/14/2024 0
## 1129 59.265819 04/14/2024 0
## 1130 66.108611 04/14/2024 0
## 1131 59.265819 04/14/2024 0
## 1132 -7.045902 04/14/2024 0
## 1133 34.690751 04/14/2024 0
## 1134 54.516099 04/14/2024 0
## 1135 34.690751 04/14/2024 0
## 1136 42.319215 04/14/2024 0
## 1137 108.899390 04/10/2024 1
## 1138 93.858280 04/10/2024 1
## 1139 91.705748 04/10/2024 1
## 1140 94.968179 04/10/2024 1
## 1141 92.771032 04/10/2024 1
## 1142 118.135416 04/10/2024 1
## 1143 92.771032 04/10/2024 1
## 1144 98.441084 04/10/2024 1
## 1145 111.830539 04/10/2024 1
## 1146 114.905143 04/10/2024 1
## 1147 84.810745 04/10/2024 1
## 1148 102.144413 04/10/2024 1
## 1149 107.486761 04/10/2024 1
## 1150 96.100459 04/10/2024 1
## 1151 118.133993 04/10/2024 1
## 1152 102.144413 04/10/2024 1
## 1153 106.105404 04/10/2024 1
## 1154 98.441084 04/10/2024 1
## 1155 102.145509 04/10/2024 1
## 1156 98.441084 04/10/2024 1
## 1157 91.705748 04/10/2024 1
## 1158 86.685791 04/10/2024 1
## 1159 99.648000 04/10/2024 1
## 1160 78.771454 04/10/2024 1
## 1161 111.829250 04/10/2024 1
## 1162 100.882490 04/10/2024 1
## 1163 102.143316 04/10/2024 1
## 1164 98.441084 04/10/2024 1
## 1165 100.882490 04/10/2024 1
## 1166 108.900619 04/10/2024 1
## 1167 76.437090 04/14/2024 0
## 1168 69.716489 04/14/2024 0
## 1169 67.432102 04/14/2024 0
## 1170 59.962324 04/14/2024 0
## 1171 66.695391 04/14/2024 0
## 1172 80.188509 04/14/2024 0
## 1173 74.663883 04/14/2024 0
## 1174 65.971587 04/14/2024 0
## 1175 89.795538 04/14/2024 0
## 1176 79.223601 04/14/2024 0
## 1177 79.223601 04/14/2024 0
## 1178 86.395760 04/14/2024 0
## 1179 58.142355 04/14/2024 0
## 1180 58.141846 04/14/2024 0
## 1181 66.695391 04/14/2024 0
## 1182 94.682502 04/14/2024 0
## 1183 67.432102 04/14/2024 0
## 1184 36.943417 04/14/2024 0
## 1185 63.870201 04/14/2024 0
## 1186 59.962324 04/14/2024 0
## 1187 43.640870 04/14/2024 0
## 1188 73.801837 04/14/2024 0
## 1189 59.962324 04/14/2024 0
## 1190 44.037499 04/14/2024 0
## 1191 65.260352 04/14/2024 0
## 1192 60.589374 04/14/2024 0
## 1193 41.730948 04/14/2024 0
## 1194 67.431464 04/14/2024 0
## 1195 83.199913 04/14/2024 0
## 1196 62.527413 04/14/2024 0
## 1197 66.735600 04/10/2024 1
## 1198 76.500673 04/10/2024 1
## 1199 51.784514 04/10/2024 1
## 1200 83.378067 04/10/2024 1
## 1201 127.626034 04/10/2024 1
## 1202 85.874291 04/10/2024 1
## 1203 79.829804 04/10/2024 1
## 1204 94.076111 04/10/2024 1
## 1205 76.501598 04/10/2024 1
## 1206 94.076111 04/10/2024 1
## 1207 107.024632 04/10/2024 1
## 1208 108.839160 04/10/2024 1
## 1209 57.890935 04/10/2024 1
## 1210 88.483971 04/10/2024 1
## 1211 73.369244 04/10/2024 1
## 1212 76.500673 04/10/2024 1
## 1213 89.834975 04/10/2024 1
## 1214 84.611392 04/10/2024 1
## 1215 87.165592 04/10/2024 1
## 1216 84.612465 04/10/2024 1
## 1217 66.736362 04/10/2024 1
## 1218 37.719487 04/10/2024 1
## 1219 59.375489 04/10/2024 1
## 1220 95.558358 04/10/2024 1
## 1221 53.066112 04/10/2024 1
## 1222 74.390704 04/10/2024 1
## 1223 69.470382 04/10/2024 1
## 1224 80.988058 04/10/2024 1
## 1225 98.633992 04/10/2024 1
## 1226 85.873195 04/10/2024 1
## 1227 100.966823 04/10/2024 1
## 1228 113.727810 04/10/2024 1
## 1229 83.632850 04/10/2024 1
## 1230 54.124831 04/10/2024 1
## 1231 55.962593 04/10/2024 1
## 1232 72.980493 04/10/2024 1
## 1233 33.321725 04/10/2024 1
## 1234 27.635193 04/10/2024 1
## 1235 98.466166 04/10/2024 1
## 1236 46.923880 04/10/2024 1
## 1237 91.588647 04/10/2024 1
## 1238 106.303271 04/10/2024 1
## 1239 32.474650 04/10/2024 1
## 1240 88.456293 04/10/2024 1
## 1241 70.843008 04/10/2024 1
## 1242 103.572167 04/10/2024 1
## 1243 85.505463 04/10/2024 1
## 1244 109.165678 04/10/2024 1
## 1245 71.544323 04/10/2024 1
## 1246 107.719475 04/10/2024 1
## 1247 71.544930 04/10/2024 1
## 1248 93.789493 04/10/2024 1
## 1249 112.166445 04/10/2024 1
## 1250 107.719475 04/10/2024 1
## 1251 87.456533 04/10/2024 1
## 1252 70.155463 04/10/2024 1
## 1253 96.077118 04/10/2024 1
## 1254 118.631066 04/10/2024 1
## 1255 87.454826 04/10/2024 1
## 1256 103.574461 04/10/2024 1
## 1257 80.499331 04/14/2024 1
## 1258 57.720235 04/14/2024 1
## 1259 70.734693 04/14/2024 1
## 1260 120.602104 04/14/2024 1
## 1261 104.228388 04/14/2024 1
## 1262 80.499331 04/14/2024 1
## 1263 88.611418 04/14/2024 1
## 1264 64.909157 04/14/2024 1
## 1265 81.587465 04/14/2024 1
## 1266 92.484220 04/14/2024 1
## 1267 91.164643 04/14/2024 1
## 1268 107.540825 04/14/2024 1
## 1269 99.559034 04/14/2024 1
## 1270 95.214231 04/14/2024 1
## 1271 81.587465 04/14/2024 1
## 1272 72.540237 04/14/2024 1
## 1273 105.862220 04/14/2024 1
## 1274 99.557745 04/14/2024 1
## 1275 92.483073 04/14/2024 1
## 1276 98.074178 04/14/2024 1
## 1277 91.162401 04/14/2024 1
## 1278 129.291934 04/14/2024 1
## 1279 111.027591 04/14/2024 1
## 1280 70.735454 04/14/2024 1
## 1281 72.540237 04/14/2024 1
## 1282 98.074178 04/14/2024 1
## 1283 92.483073 04/14/2024 1
## 1284 95.214231 04/14/2024 1
## 1285 99.556456 04/14/2024 1
## 1286 104.225613 04/14/2024 1
## 1287 93.003024 04/14/2024 1
## 1288 96.405512 04/14/2024 1
## 1289 96.405512 04/14/2024 1
## 1290 85.831478 04/14/2024 1
## 1291 90.851435 04/14/2024 1
## 1292 106.633649 04/14/2024 1
## 1293 93.003968 04/14/2024 1
## 1294 80.411619 04/14/2024 1
## 1295 87.781760 04/14/2024 1
## 1296 81.273624 04/14/2024 1
## 1297 83.045970 04/14/2024 1
## 1298 83.957223 04/14/2024 1
## 1299 79.565145 04/14/2024 1
## 1300 100.028178 04/14/2024 1
## 1301 75.550365 04/14/2024 1
## 1302 93.003024 04/14/2024 1
## 1303 93.002080 04/14/2024 1
## 1304 74.040258 04/14/2024 1
## 1305 74.788210 04/14/2024 1
## 1306 63.010827 04/14/2024 1
## 1307 74.040258 04/14/2024 1
## 1308 91.913945 04/14/2024 1
## 1309 63.581658 04/14/2024 1
## 1310 96.400486 04/14/2024 1
## 1311 88.780667 04/14/2024 1
## 1312 63.582152 04/14/2024 1
## 1313 74.039620 04/14/2024 1
## 1314 80.409416 04/14/2024 1
## 1315 75.550365 04/14/2024 1
## 1316 83.043643 04/14/2024 1
## 1317 80.541502 04/14/2024 1
## 1318 74.716009 04/14/2024 1
## 1319 87.175367 04/14/2024 1
## 1320 74.716680 04/14/2024 1
## 1321 89.242831 04/14/2024 1
## 1322 90.309133 04/14/2024 1
## 1323 90.308208 04/14/2024 1
## 1324 79.664226 04/14/2024 1
## 1325 103.642650 04/14/2024 1
## 1326 89.241924 04/14/2024 1
## 1327 82.347249 04/14/2024 1
## 1328 88.197873 04/14/2024 1
## 1329 84.223270 04/14/2024 1
## 1330 88.197873 04/14/2024 1
## 1331 88.198761 04/14/2024 1
## 1332 99.682447 04/14/2024 1
## 1333 90.307283 04/14/2024 1
## 1334 83.275113 04/14/2024 1
## 1335 92.504586 04/14/2024 1
## 1336 89.241924 04/14/2024 1
## 1337 79.663478 04/14/2024 1
## 1338 105.024116 04/14/2024 1
## 1339 85.187357 04/14/2024 1
## 1340 74.716680 04/14/2024 1
## 1341 71.694866 04/14/2024 1
## 1342 94.795392 04/14/2024 1
## 1343 73.941190 04/14/2024 1
## 1344 85.186520 04/14/2024 1
## 1345 74.716009 04/14/2024 1
## 1346 89.241924 04/14/2024 1
## 1347 71.177103 04/14/2024 0
## 1348 68.282077 04/14/2024 0
## 1349 72.180329 04/14/2024 0
## 1350 50.596781 04/14/2024 0
## 1351 53.200412 04/14/2024 0
## 1352 71.180518 04/14/2024 0
## 1353 32.489541 04/14/2024 0
## 1354 51.877942 04/14/2024 0
## 1355 28.574454 04/14/2024 0
## 1356 32.111861 04/14/2024 0
## 1357 60.512557 04/14/2024 0
## 1358 48.147821 04/14/2024 0
## 1359 50.597323 04/14/2024 0
## 1360 51.878501 04/14/2024 0
## 1361 55.980004 04/14/2024 0
## 1362 46.981181 04/14/2024 0
## 1363 49.354498 04/14/2024 0
## 1364 40.158673 04/14/2024 0
## 1365 66.444572 04/14/2024 0
## 1366 74.247579 04/14/2024 0
## 1367 64.671422 04/14/2024 0
## 1368 41.622590 04/14/2024 0
## 1369 60.513240 04/14/2024 0
## 1370 50.596781 04/14/2024 0
## 1371 66.445348 04/14/2024 0
## 1372 61.316278 04/14/2024 0
## 1373 43.152337 04/14/2024 0
## 1374 55.980621 04/14/2024 0
## 1375 53.878648 04/14/2024 0
## 1376 58.950056 04/14/2024 0
## 1377 83.784057 04/16/2024 0
## 1378 111.457995 04/16/2024 0
## 1379 103.272986 04/16/2024 0
## 1380 104.828870 04/16/2024 0
## 1381 108.058797 04/16/2024 0
## 1382 81.631713 04/16/2024 0
## 1383 88.366446 04/16/2024 0
## 1384 89.574299 04/16/2024 0
## 1385 84.893857 04/16/2024 0
## 1386 97.411253 04/16/2024 0
## 1387 129.219222 04/16/2024 0
## 1388 115.035391 04/16/2024 0
## 1389 89.573250 04/16/2024 0
## 1390 96.030033 04/16/2024 0
## 1391 92.070523 04/16/2024 0
## 1392 89.574299 04/16/2024 0
## 1393 89.574299 04/16/2024 0
## 1394 133.824304 04/16/2024 0
## 1395 103.271665 04/16/2024 0
## 1396 87.184290 04/16/2024 0
## 1397 97.410052 04/16/2024 0
## 1398 106.422261 04/16/2024 0
## 1399 118.808704 04/16/2024 0
## 1400 118.808704 04/16/2024 0
## 1401 92.071619 04/16/2024 0
## 1402 122.799766 04/16/2024 0
## 1403 120.776498 04/16/2024 0
## 1404 124.879074 04/16/2024 0
## 1405 120.776498 04/16/2024 0
## 1406 115.038549 04/16/2024 0
## 1407 79.222736 04/16/2024 0
## 1408 99.678056 04/16/2024 0
## 1409 97.435013 04/16/2024 0
## 1410 99.679040 04/16/2024 0
## 1411 83.996859 04/16/2024 0
## 1412 98.545817 04/16/2024 0
## 1413 92.212223 04/16/2024 0
## 1414 108.332712 04/16/2024 0
## 1415 97.435957 04/16/2024 0
## 1416 97.435013 04/16/2024 0
## 1417 92.213077 04/16/2024 0
## 1418 92.213077 04/16/2024 0
## 1419 102.018595 04/16/2024 0
## 1420 99.679040 04/16/2024 0
## 1421 82.348932 04/16/2024 0
## 1422 89.318099 04/16/2024 0
## 1423 108.332712 04/16/2024 0
## 1424 84.843294 04/16/2024 0
## 1425 95.283500 04/16/2024 0
## 1426 96.347822 04/16/2024 0
## 1427 81.546650 04/16/2024 0
## 1428 86.583185 04/16/2024 0
## 1429 109.681449 04/16/2024 0
## 1430 99.679040 04/16/2024 0
## 1431 105.721784 04/16/2024 0
## 1432 95.282594 04/16/2024 0
## 1433 88.389519 04/16/2024 0
## 1434 89.317293 04/16/2024 0
## 1435 91.228510 04/16/2024 0
## 1436 102.017568 04/16/2024 0
## 1437 77.408592 04/16/2024 1
## 1438 69.943873 04/16/2024 1
## 1439 71.972061 04/16/2024 1
## 1440 63.438510 04/16/2024 1
## 1441 76.278321 04/16/2024 1
## 1442 70.948789 04/16/2024 1
## 1443 76.278320 04/16/2024 1
## 1444 80.957970 04/16/2024 1
## 1445 84.745639 04/16/2024 1
## 1446 84.744518 04/16/2024 1
## 1447 99.443216 04/16/2024 1
## 1448 93.138741 04/16/2024 1
## 1449 79.751099 04/16/2024 1
## 1450 77.410560 04/16/2024 1
## 1451 74.081251 04/16/2024 1
## 1452 77.410560 04/16/2024 1
## 1453 88.795227 04/16/2024 1
## 1454 80.957970 04/16/2024 1
## 1455 96.213150 04/16/2024 1
## 1456 94.658521 04/16/2024 1
## 1457 91.657692 04/16/2024 1
## 1458 14.148717 04/16/2024 1
## 1459 25.719613 04/16/2024 1
## 1460 64.314928 04/16/2024 1
## 1461 63.437015 04/16/2024 1
## 1462 75.166574 04/16/2024 1
## 1463 50.645035 04/16/2024 1
## 1464 69.943873 04/16/2024 1
## 1465 67.049797 04/16/2024 1
## 1466 56.954591 04/16/2024 1
## 1467 48.689559 04/14/2024 1
## 1468 71.251769 04/14/2024 1
## 1469 79.167305 04/14/2024 1
## 1470 76.380063 04/14/2024 1
## 1471 71.251769 04/14/2024 1
## 1472 83.142662 04/14/2024 1
## 1473 46.039685 04/14/2024 1
## 1474 62.470233 04/14/2024 1
## 1475 75.486418 04/14/2024 1
## 1476 61.813992 04/14/2024 1
## 1477 71.251074 04/14/2024 1
## 1478 75.486418 04/14/2024 1
## 1479 83.142662 04/14/2024 1
## 1480 68.885547 04/14/2024 1
## 1481 43.981681 04/14/2024 1
## 1482 74.607661 04/14/2024 1
## 1483 69.660343 04/14/2024 1
## 1484 78.219985 04/14/2024 1
## 1485 71.252465 04/14/2024 1
## 1486 -2.961352 04/14/2024 1
## 1487 89.734032 04/14/2024 1
## 1488 68.121400 04/14/2024 1
## 1489 42.047352 04/14/2024 1
## 1490 71.250378 04/14/2024 1
## 1491 72.899128 04/14/2024 1
## 1492 10.005363 04/14/2024 1
## 1493 74.606913 04/14/2024 1
## 1494 63.814726 04/14/2024 1
## 1495 83.141774 04/14/2024 1
## 1496 75.485656 04/14/2024 1
## 1497 77.617394 04/14/2024 0
## 1498 78.448766 04/14/2024 0
## 1499 72.925072 04/14/2024 0
## 1500 86.662953 04/14/2024 0
## 1501 75.210030 04/14/2024 0
## 1502 84.715200 04/14/2024 0
## 1503 70.753417 04/14/2024 0
## 1504 65.455607 04/14/2024 0
## 1505 56.615150 04/14/2024 0
## 1506 -7.433341 04/14/2024 0
## 1507 5.481441 04/14/2024 0
## 1508 39.446584 04/14/2024 0
## 1509 57.108012 04/14/2024 0
## 1510 66.079379 04/14/2024 0
## 1511 66.716243 04/14/2024 0
## 1512 77.615270 04/14/2024 0
## 1513 75.997040 04/14/2024 0
## 1514 78.447324 04/14/2024 0
## 1515 86.662953 04/14/2024 0
## 1516 73.673056 04/14/2024 0
## 1517 74.433925 04/14/2024 0
## 1518 77.615270 04/14/2024 0
## 1519 70.051475 04/14/2024 0
## 1520 68.685106 04/14/2024 0
## 1521 80.154282 04/14/2024 0
## 1522 81.927319 04/14/2024 0
## 1523 80.154282 04/14/2024 0
## 1524 70.050878 04/14/2024 0
## 1525 76.797259 04/14/2024 0
## 1526 80.153534 04/14/2024 0
## 1527 63.959537 04/14/2024 0
## 1528 68.198528 04/14/2024 0
## 1529 68.197890 04/14/2024 0
## 1530 68.947194 04/14/2024 0
## 1531 66.026172 04/14/2024 0
## 1532 52.884057 04/14/2024 0
## 1533 66.026172 04/14/2024 0
## 1534 62.636453 04/14/2024 0
## 1535 63.958381 04/14/2024 0
## 1536 78.112456 04/14/2024 0
## 1537 51.887114 04/14/2024 0
## 1538 62.635334 04/14/2024 0
## 1539 72.888228 04/14/2024 0
## 1540 57.738078 04/14/2024 0
## 1541 61.988335 04/14/2024 0
## 1542 72.071583 04/14/2024 0
## 1543 64.635452 04/14/2024 0
## 1544 74.566795 04/14/2024 0
## 1545 61.353089 04/14/2024 0
## 1546 62.634774 04/14/2024 0
## 1547 41.403925 04/14/2024 0
## 1548 66.024352 04/14/2024 0
## 1549 66.736162 04/14/2024 0
## 1550 73.719587 04/14/2024 0
## 1551 65.323613 04/14/2024 0
## 1552 70.479557 04/14/2024 0
## 1553 63.957226 04/14/2024 0
## 1554 71.269265 04/14/2024 0
## 1555 60.110314 04/14/2024 0
## 1556 69.705467 04/14/2024 0
## 1557 96.570703 04/16/2024 1
## 1558 82.598416 04/16/2024 1
## 1559 74.630406 04/16/2024 1
## 1560 76.875905 04/16/2024 1
## 1561 73.194236 04/16/2024 1
## 1562 61.602164 04/16/2024 1
## 1563 51.576363 04/16/2024 1
## 1564 91.131219 04/16/2024 1
## 1565 67.895578 04/16/2024 1
## 1566 69.157230 04/16/2024 1
## 1567 82.595426 04/16/2024 1
## 1568 107.950783 04/16/2024 1
## 1569 3.800863 04/16/2024 1
## 1570 85.293076 04/16/2024 1
## 1571 96.566766 04/16/2024 1
## 1572 56.222719 04/16/2024 1
## 1573 87.154555 04/16/2024 1
## 1574 95.435551 04/16/2024 1
## 1575 46.501223 04/16/2024 1
## 1576 88.121010 04/16/2024 1
## 1577 38.441396 04/16/2024 1
## 1578 67.895578 04/16/2024 1
## 1579 18.814613 04/16/2024 1
## 1580 94.341824 04/16/2024 1
## 1581 80.886359 04/16/2024 1
## 1582 60.561074 04/16/2024 1
## 1583 76.873265 04/16/2024 1
## 1584 74.628524 04/16/2024 1
## 1585 83.473324 04/16/2024 1
## 1586 75.363247 04/16/2024 1
## 1587 49.327250 04/16/2024 1
## 1588 118.682232 04/16/2024 1
## 1589 103.917604 04/16/2024 1
## 1590 106.918248 04/16/2024 1
## 1591 102.471460 04/16/2024 1
## 1592 -4.458365 04/16/2024 1
## 1593 61.635790 04/16/2024 1
## 1594 99.696472 04/16/2024 1
## 1595 113.379671 04/16/2024 1
## 1596 62.261210 04/16/2024 1
## 1597 130.663909 04/16/2024 1
## 1598 137.471605 04/16/2024 1
## 1599 115.101759 04/16/2024 1
## 1600 102.470231 04/16/2024 1
## 1601 116.869200 04/16/2024 1
## 1602 87.429318 04/16/2024 1
## 1603 54.705789 04/16/2024 1
## 1604 81.223866 04/16/2024 1
## 1605 116.867662 04/16/2024 1
## 1606 94.455030 04/16/2024 1
## 1607 89.672281 04/16/2024 1
## 1608 78.383341 04/16/2024 1
## 1609 81.223029 04/16/2024 1
## 1610 43.142624 04/16/2024 1
## 1611 99.676468 04/16/2024 1
## 1612 98.326611 04/16/2024 1
## 1613 89.672281 04/16/2024 1
## 1614 71.541476 04/16/2024 1
## 1615 58.010739 04/16/2024 1
## 1616 135.132662 04/16/2024 1
## 1617 71.360716 04/16/2024 1
## 1618 75.336426 04/16/2024 1
## 1619 76.379427 04/16/2024 1
## 1620 84.323062 04/16/2024 1
## 1621 93.573913 04/16/2024 1
## 1622 89.427916 04/16/2024 1
## 1623 79.642534 04/16/2024 1
## 1624 81.933009 04/16/2024 1
## 1625 81.935019 04/16/2024 1
## 1626 79.643498 04/16/2024 1
## 1627 78.533659 04/16/2024 1
## 1628 80.774733 04/16/2024 1
## 1629 109.784684 04/16/2024 1
## 1630 88.109538 04/16/2024 1
## 1631 71.360716 04/16/2024 1
## 1632 68.575390 04/16/2024 1
## 1633 51.486292 04/16/2024 1
## 1634 80.774733 04/16/2024 1
## 1635 76.379427 04/16/2024 1
## 1636 78.531771 04/16/2024 1
## 1637 80.774733 04/16/2024 1
## 1638 109.784684 04/16/2024 1
## 1639 65.094784 04/16/2024 1
## 1640 89.429063 04/16/2024 1
## 1641 69.486584 04/16/2024 1
## 1642 75.336426 04/16/2024 1
## 1643 86.821526 04/16/2024 1
## 1644 78.532715 04/16/2024 1
## 1645 89.429063 04/16/2024 1
## 1646 70.414327 04/16/2024 1
## 1647 73.395871 04/16/2024 1
## 1648 76.000479 04/16/2024 1
## 1649 106.224883 04/16/2024 1
## 1650 58.903440 04/16/2024 1
## 1651 59.330869 04/16/2024 1
## 1652 102.599337 04/16/2024 1
## 1653 50.714446 04/16/2024 1
## 1654 92.991809 04/16/2024 1
## 1655 1.135586 04/16/2024 1
## 1656 123.471416 04/16/2024 1
## 1657 92.026223 04/16/2024 1
## 1658 87.468737 04/16/2024 1
## 1659 82.523966 04/16/2024 1
## 1660 96.006307 04/16/2024 1
## 1661 78.067547 04/16/2024 1
## 1662 61.553895 04/16/2024 1
## 1663 72.768889 04/16/2024 1
## 1664 121.837690 04/16/2024 1
## 1665 77.366232 04/16/2024 1
## 1666 118.687028 04/16/2024 1
## 1667 100.308862 04/16/2024 1
## 1668 101.443029 04/16/2024 1
## 1669 110.095391 04/16/2024 1
## 1670 111.445249 04/16/2024 1
## 1671 91.081461 04/16/2024 1
## 1672 68.646274 04/16/2024 1
## 1673 86.607533 04/16/2024 1
## 1674 92.027044 04/16/2024 1
## 1675 110.095391 04/16/2024 1
## 1676 83.310257 04/16/2024 1
## 1677 60.503712 04/17/2024 1
## 1678 75.344697 04/17/2024 1
## 1679 63.542502 04/17/2024 1
## 1680 46.539386 04/17/2024 1
## 1681 59.787754 04/17/2024 1
## 1682 57.739026 04/17/2024 1
## 1683 48.097784 04/17/2024 1
## 1684 62.367763 04/17/2024 1
## 1685 43.139435 04/17/2024 1
## 1686 67.342349 04/17/2024 1
## 1687 74.241321 04/17/2024 1
## 1688 48.561921 04/17/2024 1
## 1689 62.367432 04/17/2024 1
## 1690 69.656492 04/17/2024 1
## 1691 69.180986 04/17/2024 1
## 1692 65.599136 04/17/2024 1
## 1693 56.765188 04/17/2024 1
## 1694 68.249799 04/17/2024 1
## 1695 57.410390 04/17/2024 1
## 1696 66.898666 04/17/2024 1
## 1697 53.176015 04/17/2024 1
## 1698 13.618967 04/17/2024 1
## 1699 61.985461 04/17/2024 1
## 1700 59.088661 04/17/2024 1
## 1701 58.745584 04/17/2024 1
## 1702 56.764914 04/17/2024 1
## 1703 35.865742 04/17/2024 1
## 1704 65.177118 04/17/2024 1
## 1705 62.367432 04/17/2024 1
## 1706 65.177479 04/17/2024 1
## 1707 113.156542 04/17/2024 1
## 1708 97.698471 04/17/2024 1
## 1709 111.893595 04/17/2024 1
## 1710 97.698471 04/17/2024 1
## 1711 110.659174 04/17/2024 1
## 1712 119.910025 04/17/2024 1
## 1713 110.660224 04/17/2024 1
## 1714 110.659175 04/17/2024 1
## 1715 113.155446 04/17/2024 1
## 1716 121.358686 04/17/2024 1
## 1717 117.115033 04/17/2024 1
## 1718 103.781655 04/17/2024 1
## 1719 93.139269 04/17/2024 1
## 1720 117.115033 04/17/2024 1
## 1721 111.893595 04/17/2024 1
## 1722 121.357428 04/17/2024 1
## 1723 107.111830 04/17/2024 1
## 1724 78.439741 04/17/2024 1
## 1725 96.751245 04/17/2024 1
## 1726 81.003485 04/17/2024 1
## 1727 86.656196 04/17/2024 1
## 1728 96.752051 04/17/2024 1
## 1729 107.111829 04/17/2024 1
## 1730 104.869771 04/17/2024 1
## 1731 97.697650 04/17/2024 1
## 1732 93.139269 04/17/2024 1
## 1733 85.171620 04/17/2024 1
## 1734 78.439207 04/17/2024 1
## 1735 86.656845 04/17/2024 1
## 1736 102.716445 04/17/2024 1
## 1737 40.936926 04/16/2024 1
## 1738 91.105700 04/16/2024 1
## 1739 27.677403 04/16/2024 1
## 1740 -5.132456 04/16/2024 1
## 1741 52.290950 04/16/2024 1
## 1742 51.561217 04/16/2024 1
## 1743 55.367444 04/16/2024 1
## 1744 76.179849 04/16/2024 1
## 1745 65.658244 04/16/2024 1
## 1746 24.763290 04/16/2024 1
## 1747 54.172001 04/16/2024 1
## 1748 89.195383 04/16/2024 1
## 1749 9.694414 04/16/2024 1
## 1750 37.324444 04/16/2024 1
## 1751 23.063385 04/16/2024 1
## 1752 -3.787087 04/16/2024 1
## 1753 -2.435642 04/16/2024 1
## 1754 56.184893 04/16/2024 1
## 1755 61.562625 04/16/2024 1
## 1756 82.239795 04/16/2024 1
## 1757 60.598113 04/16/2024 1
## 1758 101.894189 04/16/2024 1
## 1759 -6.309272 04/16/2024 1
## 1760 55.367444 04/16/2024 1
## 1761 -2.631166 04/16/2024 1
## 1762 20.551592 04/16/2024 1
## 1763 -2.493303 04/16/2024 1
## 1764 26.162453 04/16/2024 1
## 1765 20.296340 04/16/2024 1
## 1766 34.562305 04/16/2024 1
## 1767 2.449295 04/17/2024 1
## 1768 64.248301 04/17/2024 1
## 1769 75.103862 04/17/2024 1
## 1770 44.423388 04/17/2024 1
## 1771 23.769610 04/17/2024 1
## 1772 40.716968 04/17/2024 1
## 1773 78.913650 04/17/2024 1
## 1774 3.747701 04/17/2024 1
## 1775 2.390996 04/17/2024 1
## 1776 44.119767 04/17/2024 1
## 1777 75.103862 04/17/2024 1
## 1778 64.810730 04/17/2024 1
## 1779 40.451772 04/17/2024 1
## 1780 2.975094 04/17/2024 1
## 1781 62.607227 04/17/2024 1
## 1782 54.932526 04/17/2024 1
## 1783 63.693129 04/17/2024 1
## 1784 29.927813 04/17/2024 1
## 1785 45.992378 04/17/2024 1
## 1786 72.968258 04/17/2024 1
## 1787 65.382040 04/17/2024 1
## 1788 85.755729 04/17/2024 1
## 1789 94.802013 04/17/2024 1
## 1790 31.317137 04/17/2024 1
## 1791 56.248928 04/17/2024 1
## 1792 84.843744 04/17/2024 1
## 1793 93.714822 04/17/2024 1
## 1794 93.714823 04/17/2024 1
## 1795 75.104489 04/17/2024 1
## 1796 120.757777 04/17/2024 1
## 1797 82.439556 04/18/2024 1
## 1798 77.216494 04/18/2024 1
## 1799 88.230325 04/18/2024 1
## 1800 78.219737 04/18/2024 1
## 1801 88.229275 04/18/2024 1
## 1802 67.352033 04/18/2024 1
## 1803 78.218866 04/18/2024 1
## 1804 53.598158 04/18/2024 1
## 1805 54.186868 04/18/2024 1
## 1806 76.231895 04/18/2024 1
## 1807 60.604162 04/18/2024 1
## 1808 35.630773 04/18/2024 1
## 1809 68.997849 04/18/2024 1
## 1810 19.313735 04/18/2024 1
## 1811 32.989362 04/18/2024 1
## 1812 76.230220 04/18/2024 1
## 1813 78.219737 04/18/2024 1
## 1814 78.219737 04/18/2024 1
## 1815 77.215641 04/18/2024 1
## 1816 76.232732 04/18/2024 1
## 1817 78.218866 04/18/2024 1
## 1818 77.216494 04/18/2024 1
## 1819 75.267066 04/18/2024 1
## 1820 81.351383 04/18/2024 1
## 1821 54.784566 04/18/2024 1
## 1822 93.335569 04/18/2024 1
## 1823 90.725688 04/18/2024 1
## 1824 81.352307 04/18/2024 1
## 1825 68.169374 04/18/2024 1
## 1826 60.605356 04/18/2024 1
## 1827 106.998149 04/18/2024 0
## 1828 84.371494 04/18/2024 0
## 1829 81.831146 04/18/2024 0
## 1830 92.904623 04/18/2024 0
## 1831 101.891098 04/18/2024 0
## 1832 74.268392 04/18/2024 0
## 1833 57.104488 04/18/2024 0
## 1834 83.508822 04/18/2024 0
## 1835 62.337142 04/18/2024 0
## 1836 63.907958 04/18/2024 0
## 1837 64.446740 04/18/2024 0
## 1838 105.677502 04/18/2024 0
## 1839 84.371494 04/18/2024 0
## 1840 85.249393 04/18/2024 0
## 1841 78.649333 04/18/2024 0
## 1842 93.947606 04/18/2024 0
## 1843 98.344802 04/18/2024 0
## 1844 80.213014 04/18/2024 0
## 1845 74.268392 04/18/2024 0
## 1846 95.012779 04/18/2024 0
## 1847 74.968484 04/18/2024 0
## 1848 81.015271 04/18/2024 0
## 1849 103.125496 04/18/2024 0
## 1850 98.343818 04/18/2024 0
## 1851 81.831854 04/18/2024 0
## 1852 56.665484 04/18/2024 0
## 1853 93.948512 04/18/2024 0
## 1854 81.015271 04/18/2024 0
## 1855 90.878246 04/18/2024 0
## 1856 81.831854 04/18/2024 0
## 1857 61.808539 04/18/2024 0
## 1858 50.909511 04/18/2024 0
## 1859 49.030989 04/18/2024 0
## 1860 64.347550 04/18/2024 0
## 1861 57.115789 04/18/2024 0
## 1862 55.656039 04/18/2024 0
## 1863 79.478665 04/18/2024 0
## 1864 102.031609 04/18/2024 0
## 1865 86.976150 04/18/2024 0
## 1866 52.878953 04/18/2024 0
## 1867 53.556005 04/18/2024 0
## 1868 54.944259 04/18/2024 0
## 1869 56.379154 04/18/2024 0
## 1870 52.211019 04/18/2024 0
## 1871 42.828775 04/18/2024 0
## 1872 70.854515 04/18/2024 0
## 1873 86.973857 04/18/2024 0
## 1874 105.515299 04/18/2024 0
## 1875 86.976150 04/18/2024 0
## 1876 66.120588 04/18/2024 0
## 1877 11.036021 04/18/2024 0
## 1878 -10.285940 04/18/2024 0
## 1879 81.865659 04/18/2024 0
## 1880 89.703814 04/18/2024 0
## 1881 95.568309 04/18/2024 0
## 1882 56.380408 04/18/2024 0
## 1883 55.656039 04/18/2024 0
## 1884 88.323740 04/18/2024 0
## 1885 86.976150 04/18/2024 0
## 1886 85.656548 04/18/2024 0
cormat2 <- cor(Tdat[ , c(8,13, 14, 18)])
melted_cormat <- melt(cormat2)
upper_tri2 <- get_upper_tri(cormat2)
upper_cormat2 <- melt(upper_tri2, na.rm = TRUE)
ggplot(data = upper_cormat2, aes(Var2, Var1, fill = value))+
geom_tile(color = "white")+
scale_fill_gradient2(low = "blue", high = "red", mid = "white",
midpoint = 0, limit = c(-1,1), space = "Lab",
name="Pearson\nCorrelation") +
theme_minimal()+
theme(axis.text.x = element_text(angle = 45, vjust = 1,
size = 12, hjust = 1))+
coord_fixed()+
geom_text(aes(Var2, Var1, label = round(value,4)), color = "black", size = 3)
cor.test(means$Infection,means$Duration)
##
## Pearson's product-moment correlation
##
## data: means$Infection and means$Duration
## t = -0.92608, df = 60, p-value = 0.3581
## alternative hypothesis: true correlation is not equal to 0
## 95 percent confidence interval:
## -0.3578681 0.1350621
## sample estimates:
## cor
## -0.1187108
cor.test(means$Infection,means$Freq)
##
## Pearson's product-moment correlation
##
## data: means$Infection and means$Freq
## t = -0.27266, df = 60, p-value = 0.7861
## alternative hypothesis: true correlation is not equal to 0
## 95 percent confidence interval:
## -0.2824649 0.2164919
## sample estimates:
## cor
## -0.03517855
cor.test(means$Infection,means$Call_Rate_Inst)
##
## Pearson's product-moment correlation
##
## data: means$Infection and means$Call_Rate_Inst
## t = 0.28808, df = 60, p-value = 0.7743
## alternative hypothesis: true correlation is not equal to 0
## 95 percent confidence interval:
## -0.2145950 0.2842944
## sample estimates:
## cor
## 0.03716526