The code below runs the complete data set and created the appropriate model matrix incorporating the interactions terms as well as main effects. The code was first created for a smaller toy data set, and then generalized to work with the much larger case.
We begin by setting up our working directory. Note that to avoid co-linearity in the actual model fitting we must eliminate some countries. Eliminations were determined by removing countries with the least-number of dives one by one. After seven countries were eliminated, the output of lsfit
showed abnormal values for Finland, so this country was also removed.
setwd("C:/Users/Corey/Documents/Yale/S3/625/Week5")
# x <- read.csv('ToyDiving.csv', header=TRUE, as.is=TRUE)
x <- read.csv("Diving2000.csv", header = TRUE, as.is = TRUE)
sort(table(x$Country))
##
## ARG GEO ARM AZE CZE HKG ZIM PHI SUI FIN PER THA PUR SWE BLR INA COL KOR
## 35 35 42 42 42 42 42 77 77 84 84 84 98 105 112 112 119 154
## ROM VEN AUT TPE BRA GRE MAS FRA HUN JPN ESP ITA CUB KAZ MEX PRK GBR UKR
## 154 161 175 175 189 189 196 224 231 231 259 294 301 399 420 427 448 476
## CAN GER AUS RUS USA CHN
## 560 672 728 791 833 868
x <- subset(x, x$Country != "ARG" & x$Country != "GEO" & x$Country != "ARM" &
x$Country != "AZE" & x$Country != "CZE" & x$Country != "HKG" & x$Country !=
"ZIM" & x$Country != "FIN")
We then create the code for the contrasts corresponding to the interaction terms. The base template for this code was provided by Jay Emerson. Please see the inline comments for the explanations:
getcontrasts <- function(x, verbose = FALSE) {
var1 <- names(x)[1]
var2 <- names(x)[2]
levels1 <- levels(x[, 1])
levels2 <- levels(x[, 2])
if (verbose) {
cat("Variables:", var1, var2, "\n")
cat("Levels of", var1, ":", levels1, "\n")
cat("Levels of", var2, ":", levels2, "\n")
}
# Step 1. Create a coefficient matrix indicating where the missing
# interactions are.
xmis <- table(x[, 1], x[, 2]) == 0
if (verbose)
print(xmis)
# Step 2. Create a coefficient matrix indicating which cells need to
# involve the contr.sum constraints (instead of introducing a new
# coefficient): 'c' indicates a column constraint, 'r' indicates a row
# constraint. The last position can be either a row or column constraint,
# without loss of generality.
xcon <- xmis
for (i in 1:nrow(xmis)) xcon[i, max(which(!xmis[i, ]))] <- "r"
for (i in 1:ncol(xmis)) xcon[max(which(!xmis[, i])), i] <- "c"
xcon[xcon != "c" & xcon != "r"] <- ""
if (verbose)
print(xcon)
# My stragegy is to create a list of lists. Thus each list contains the
# contrasts corresponding to a specific Jude and Country pair. Thus when we
# later parse the rows of the data, we simply extract the already made list
# that is the correct row for the judge/country pair in the model matrix.
# This way, we do not have to keep recalculating the contrasts as we parse
# the data
# I work on the transposes for slightly easier indexing:
rows <- list()
# mapmatrix will (later) take a judge,country pair and the element
# corresponding to that location is the row number that has the
# corresponding contrast-row from our list of lists
mapmatrix <- matrix(1:(nrow(xmis) * ncol(xmis)), nrow = nrow(xmis), byrow = T)
# Make transposes:
txcon <- t(xcon)
txmis <- t(xmis)
myseq <- seq(1, nrow(xmis) * ncol(xmis))
# We already have where data is missing and where row and column contraints
# are located, so using both of these we can figure out what locations
# correspond to quantities our model will estimate.
toest <- matrix(txcon[myseq] == "" & !txmis[myseq], nrow = nrow(xmis), byrow = T)
ttoest <- t(toest)
# Next we find the total number of actual coefficients our model will
# esimate:
toests <- sum(toest)
# ...And we keep track of how many we have already estimated:
haveEst <- 0
# Now we come to the `workhorse' code Because the contrasts are created
# before parsing the data, and because some row and column contrasts depend
# on others (for instance, some -1's will become positive 1's), we must
# create them in the correct order. First, we create dummy conrasts for the
# cases where there is no judge/country data. Don't worry, these will never
# actually be used when parasing the data, but we need them for the next
# step.
for (i in 1:(nrow(xmis) * ncol(xmis))) {
if (txmis[[i]]) {
rows[[i]] <- rep(0, toests)
}
}
# Now we create the 'real' interaction contrasts. We consider three cases:
# Either (1) we have actual data and there is no constraint, (2) we have
# data and there is a row constraint, or (3) we have data and there is a
# column constraint.
# In the first case, we just insert the correct sequence of 0's and -1's,
# keeping track of how many coefficients we have estimate (which gives the
# location of the -1.) In the other cases, we add the rows or columns to
# give the constrained contrasts. By construction, we will always have
# already created the data when we need to calculate a constraint condition:
for (i in 1:(nrow(xmis) * ncol(xmis))) {
if (ttoest[i]) {
rows[[i]] <- c(rep(0, haveEst), 1, rep(0, toests - haveEst - 1))
haveEst = haveEst + 1
} else if (txcon[[i]] == "r") {
myrow <- which(mapmatrix == i, arr.ind = T)[1]
otherRowElements <- mapmatrix[myrow, ]
otherRowElements <- otherRowElements[otherRowElements != i]
rows[[i]] <- -1 * Reduce("+", rows[otherRowElements])
} else if (txcon[[i]] == "c") {
mycol <- which(mapmatrix == i, arr.ind = T)[2]
otherColElements <- mapmatrix[, mycol]
otherColElements <- otherColElements[otherColElements != i]
rows[[i]] <- -1 * Reduce("+", rows[otherColElements])
}
}
# We now have a list of lists, where each inner list corresponds to a row of
# the final contraint matrix for the interaction terms. Let us actually
# make the matrix object:
ans <- matrix(0, nrow(x), toests)
# Next, we make the column names corresponding to the judge/country pairs:
colnames(ans) <- rep("NA", toests)
for (i in 1:toests) {
myrow <- which(ttoest == T, arr.ind = T)[i, ][1]
mycol <- which(ttoest == T, arr.ind = T)[i, ][2]
colnames(ans)[i] <- paste(levels(x$Judge)[mycol], levels(x$Country)[myrow],
sep = "")
}
# Finally, we actually parse the data row by row. We use the mapmatrix to
# simply insert into our answer matrix the correct contrast matrix row:
for (i in 1:nrow(x)) {
maprow <- match(x$Judge[[i]], levels(x$Judge))
mapcol <- match(x$Country[[i]], levels(x$Country))
ans[i, ] <- rows[[mapmatrix[maprow, mapcol]]]
}
return(ans)
}
Now, we still need to consider the main effects, which includes judge and dive number. However, the full diving data does not include the dive number, so let's create it:
if (!("diveno" %in% colnames(x))) {
scoresperdive <- 7
x$diveno <- rep(1:(nrow(x)/scoresperdive), 1, each = scoresperdive)
}
We make the input and get the contrast matrix for the interactions:
theinput <- data.frame(Judge = factor(x$Judge), Country = factor(x$Country))
res <- getcontrasts(theinput, verbose = FALSE)
# write.csv(res, file = 'cb644_toy_diving.csv')
Now we move on to the main effects. Note that the judge main effect is constrained to sum to zero (signally an overall 0 bias), but the lambda values for the dives are unconstrained.
# First we consider the 'lambda_i' values as described in the paper: ,
# estimating the quality for each dive.
# This seems silly, but it remaps possible skipped dive numbers away:
x$diveno <- factor(x$diveno)
# Find number of dive coefficients to estimate and create matrix:
divetoEst <- length(levels(x$diveno))
divemat <- matrix(0, nrow(x), divetoEst)
# No constraints to worry about, and we have data, so we can just use rows
# of the identity matrix. Computationally, it's best to make the identity
# of the correct size before-hand:
myident <- diag(divetoEst)
for (i in 1:nrow(x)) {
diverow <- match(x$diveno[[i]], levels(x$diveno))
divemat[i, ] <- myident[diverow, ]
}
# Make Column names:
colnames(divemat) <- paste("dive", levels(x$diveno), sep = "")
# Now we consider the mu_j values: the overall tendancy of judge j to give
# higher or lower scores.
x$Judge <- factor(x$Judge)
# judgerows <- list()
judgetoEst <- length(levels(x$Judge)) - 1
judgemat <- matrix(0, nrow(x), judgetoEst)
judgehaveEst <- 0
colnames(judgemat) <- levels(x$Judge)[-length(levels(x$Judge))]
myjudgeident <- diag(judgetoEst)
# Similar to before, each judge corresponds to a sequence of zeros with one
# '1' , except for the last judge, due to the constraint
for (i in 1:nrow(x)) {
judgerow <- match(x$Judge[[i]], levels(x$Judge))
if (!(judgerow == length(levels(x$Judge)))) {
judgemat[i, ] <- myjudgeident[judgerow, ]
} else {
judgemat[i, ] <- rep(-1, judgetoEst)
}
}
# Finally, we bind together the main and interaction effects and fit the
# model:
fullmodel <- cbind(divemat, judgemat, res)
ls1 <- lsfit(fullmodel, x$JScore, intercept = FALSE)
ls.print(ls1)
## Residual Standard Error=0.4218
## R-Square=0.9972
## F-statistic (df=2238, 8185)=1289
## p-value=0
##
## Estimate Std.Err t-value Pr(>|t|)
## dive1 8.5216 0.1621 52.5843 0.0000
## dive2 8.2359 0.1621 50.8212 0.0000
## dive3 9.0931 0.1621 56.1104 0.0000
## dive4 8.0931 0.1621 49.9397 0.0000
## dive5 8.3788 0.1621 51.7028 0.0000
## dive6 8.0931 0.1621 49.9397 0.0000
## dive7 8.8680 0.1654 53.6194 0.0000
## dive8 8.2966 0.1654 50.1643 0.0000
## dive9 8.7966 0.1654 53.1875 0.0000
## dive10 8.3680 0.1654 50.5962 0.0000
## dive11 8.4395 0.1654 51.0281 0.0000
## dive12 8.1537 0.1654 49.3006 0.0000
## dive13 9.1227 0.1623 56.2226 0.0000
## dive14 8.9799 0.1623 55.3421 0.0000
## dive15 7.5513 0.1623 46.5380 0.0000
## dive16 9.0513 0.1623 55.7824 0.0000
## dive17 7.6942 0.1623 47.4184 0.0000
## dive18 6.1942 0.1623 38.1740 0.0000
## dive19 8.3074 0.1621 51.2620 0.0000
## dive20 8.6645 0.1621 53.4658 0.0000
## dive21 6.3074 0.1621 38.9206 0.0000
## dive22 6.7359 0.1621 41.5652 0.0000
## dive23 7.4502 0.1621 45.9728 0.0000
## dive24 8.5931 0.1621 53.0250 0.0000
## dive25 6.4247 0.1625 39.5427 0.0000
## dive26 7.7819 0.1625 47.8956 0.0000
## dive27 7.7819 0.1625 47.8956 0.0000
## dive28 7.4247 0.1625 45.6975 0.0000
## dive29 7.7105 0.1625 47.4560 0.0000
## dive30 7.9962 0.1625 49.2145 0.0000
## dive31 8.2950 0.1622 51.1448 0.0000
## dive32 8.1521 0.1622 50.2640 0.0000
## dive33 5.4379 0.1622 33.5284 0.0000
## dive34 6.1521 0.1622 37.9325 0.0000
## dive35 8.2236 0.1622 50.7044 0.0000
## dive36 8.1521 0.1622 50.2640 0.0000
## dive37 7.4379 0.1622 45.8599 0.0000
## dive38 7.0093 0.1622 43.2174 0.0000
## dive39 7.5093 0.1622 46.3003 0.0000
## dive40 7.1521 0.1622 44.0983 0.0000
## dive41 7.7236 0.1622 47.6215 0.0000
## dive42 6.0093 0.1622 37.0517 0.0000
## dive43 7.1131 0.1660 42.8412 0.0000
## dive44 8.0417 0.1660 48.4338 0.0000
## dive45 6.8274 0.1660 41.1203 0.0000
## dive46 5.4702 0.1660 32.9464 0.0000
## dive47 7.6131 0.1660 45.8526 0.0000
## dive48 7.7559 0.1660 46.7130 0.0000
## dive49 7.3324 0.1629 45.0239 0.0000
## dive50 7.7610 0.1629 47.6555 0.0000
## dive51 7.5467 0.1629 46.3397 0.0000
## dive52 7.2610 0.1629 44.5853 0.0000
## dive53 7.2610 0.1629 44.5853 0.0000
## dive54 7.1181 0.1629 43.7081 0.0000
## dive55 7.6895 0.1629 47.2169 0.0000
## dive56 8.2610 0.1629 50.7258 0.0000
## dive57 6.9753 0.1629 42.8309 0.0000
## dive58 7.1181 0.1629 43.7081 0.0000
## dive59 5.4753 0.1629 33.6203 0.0000
## dive60 7.4753 0.1629 45.9011 0.0000
## dive61 7.2987 0.1708 42.7443 0.0000
## dive62 7.7987 0.1708 45.6725 0.0000
## dive63 7.0844 0.1708 41.4893 0.0000
## dive64 6.6558 0.1708 38.9794 0.0000
## dive65 6.2272 0.1708 36.4695 0.0000
## dive66 5.9415 0.1708 34.7962 0.0000
## dive67 7.5576 0.1648 45.8717 0.0000
## dive68 5.1291 0.1648 31.1313 0.0000
## dive69 7.4862 0.1648 45.4382 0.0000
## dive70 5.9862 0.1648 36.3338 0.0000
## dive71 6.9148 0.1648 41.9698 0.0000
## dive72 7.4862 0.1648 45.4382 0.0000
## dive73 8.1516 0.1624 50.1835 0.0000
## dive74 7.7945 0.1624 47.9849 0.0000
## dive75 8.3659 0.1624 51.5027 0.0000
## dive76 7.9186 0.1620 48.8827 0.0000
## dive77 7.8472 0.1620 48.4417 0.0000
## dive78 7.5615 0.1620 46.6780 0.0000
## dive79 8.6644 0.1668 51.9343 0.0000
## dive80 6.5930 0.1668 39.5182 0.0000
## dive81 8.3072 0.1668 49.7936 0.0000
## dive82 7.2850 0.1656 43.9820 0.0000
## dive83 8.3564 0.1656 50.4505 0.0000
## dive84 8.4278 0.1656 50.8818 0.0000
## dive85 8.2711 0.1629 50.7742 0.0000
## dive86 8.2711 0.1629 50.7742 0.0000
## dive87 7.9854 0.1629 49.0203 0.0000
## dive88 7.1674 0.1623 44.1727 0.0000
## dive89 7.9531 0.1623 49.0150 0.0000
## dive90 8.5960 0.1623 52.9770 0.0000
## dive91 7.8534 0.1626 48.3056 0.0000
## dive92 6.8534 0.1626 42.1547 0.0000
## dive93 8.1391 0.1626 50.0630 0.0000
## dive94 6.6357 0.1620 40.9525 0.0000
## dive95 6.8499 0.1620 42.2750 0.0000
## dive96 8.0642 0.1620 49.7691 0.0000
## dive97 8.3659 0.1624 51.5027 0.0000
## dive98 8.2945 0.1624 51.0630 0.0000
## dive99 6.2945 0.1624 38.7504 0.0000
## dive100 7.2043 0.1620 44.4733 0.0000
## dive101 6.4186 0.1620 39.6229 0.0000
## dive102 8.4186 0.1620 51.9692 0.0000
## dive103 7.6458 0.1633 46.8076 0.0000
## dive104 8.2887 0.1633 50.7432 0.0000
## dive105 7.6458 0.1633 46.8076 0.0000
## dive106 7.8515 0.1628 48.2285 0.0000
## dive107 7.1372 0.1628 43.8410 0.0000
## dive108 6.2800 0.1628 38.5759 0.0000
## dive109 7.0677 0.1626 43.4727 0.0000
## dive110 8.2105 0.1626 50.5024 0.0000
## dive111 7.4962 0.1626 46.1088 0.0000
## dive112 6.2785 0.1620 38.7484 0.0000
## dive113 7.8499 0.1620 48.4466 0.0000
## dive114 7.4214 0.1620 45.8016 0.0000
## dive115 6.8562 0.1632 42.0176 0.0000
## dive116 7.8562 0.1632 48.1460 0.0000
## dive117 7.9277 0.1632 48.5837 0.0000
## dive118 5.0432 0.1625 31.0402 0.0000
## dive119 7.6861 0.1625 47.3067 0.0000
## dive120 7.9003 0.1625 48.6256 0.0000
## dive121 7.0705 0.1632 43.3308 0.0000
## dive122 7.7848 0.1632 47.7082 0.0000
## dive123 7.9277 0.1632 48.5837 0.0000
## dive124 6.6861 0.1625 41.1518 0.0000
## dive125 7.4003 0.1625 45.5481 0.0000
## dive126 4.7575 0.1625 29.2817 0.0000
## dive127 6.8808 0.1657 41.5332 0.0000
## dive128 6.3094 0.1657 38.0840 0.0000
## dive129 7.3808 0.1657 44.5512 0.0000
## dive130 7.6718 0.1645 46.6447 0.0000
## dive131 6.9575 0.1645 42.3018 0.0000
## dive132 6.6003 0.1645 40.1303 0.0000
## dive133 7.7681 0.1684 46.1285 0.0000
## dive134 7.9824 0.1684 47.4009 0.0000
## dive135 6.9110 0.1684 41.0386 0.0000
## dive136 4.2035 0.1672 25.1480 0.0000
## dive137 7.4178 0.1672 44.3778 0.0000
## dive138 7.1321 0.1672 42.6685 0.0000
## dive139 6.3601 0.1633 38.9365 0.0000
## dive140 7.5744 0.1633 46.3703 0.0000
## dive141 7.3601 0.1633 45.0585 0.0000
## dive142 7.3515 0.1628 45.1572 0.0000
## dive143 7.0658 0.1628 43.4022 0.0000
## dive144 6.4943 0.1628 39.8922 0.0000
## dive145 7.5848 0.1746 43.4369 0.0000
## dive146 7.5848 0.1746 43.4369 0.0000
## dive147 5.0848 0.1746 29.1198 0.0000
## dive148 6.8347 0.1698 40.2548 0.0000
## dive149 6.9062 0.1698 40.6755 0.0000
## dive150 7.6205 0.1698 44.8825 0.0000
## dive151 7.4540 0.1780 41.8810 0.0000
## dive152 7.0969 0.1780 39.8743 0.0000
## dive153 6.2398 0.1780 35.0584 0.0000
## dive154 6.1216 0.1744 35.0977 0.0000
## dive155 6.9787 0.1744 40.0121 0.0000
## dive156 7.3359 0.1744 42.0597 0.0000
## dive157 7.0078 0.1717 40.8257 0.0000
## dive158 7.5793 0.1717 44.1547 0.0000
## dive159 7.2221 0.1717 42.0741 0.0000
## dive160 5.9761 0.1688 35.4013 0.0000
## dive161 6.8333 0.1688 40.4788 0.0000
## dive162 6.4761 0.1688 38.3632 0.0000
## dive163 7.2689 0.1739 41.8093 0.0000
## dive164 7.4118 0.1739 42.6310 0.0000
## dive165 6.7689 0.1739 38.9334 0.0000
## dive166 6.6480 0.1734 38.3353 0.0000
## dive167 6.5766 0.1734 37.9234 0.0000
## dive168 6.1480 0.1734 35.4521 0.0000
## dive169 7.8426 0.1629 48.1433 0.0000
## dive170 6.1997 0.1629 38.0582 0.0000
## dive171 5.8426 0.1629 35.8658 0.0000
## dive172 7.3817 0.1623 45.4933 0.0000
## dive173 7.3817 0.1623 45.4933 0.0000
## dive174 5.4531 0.1623 33.6075 0.0000
## dive175 7.3383 0.1765 41.5855 0.0000
## dive176 7.1955 0.1765 40.7759 0.0000
## dive177 5.9812 0.1765 33.8947 0.0000
## dive178 7.6592 0.1691 45.3065 0.0000
## dive179 6.1592 0.1691 36.4335 0.0000
## dive180 7.5163 0.1691 44.4614 0.0000
## dive181 6.9347 0.1657 41.8575 0.0000
## dive182 6.5776 0.1657 39.7018 0.0000
## dive183 7.1490 0.1657 43.1509 0.0000
## dive184 7.1367 0.1637 43.5842 0.0000
## dive185 6.3510 0.1637 38.7858 0.0000
## dive186 7.4224 0.1637 45.3291 0.0000
## dive187 7.1985 0.1911 37.6672 0.0000
## dive188 3.6985 0.1911 19.3529 0.0000
## dive189 7.2699 0.1911 38.0410 0.0000
## dive190 6.8840 0.1782 38.6327 0.0000
## dive191 6.5983 0.1782 37.0293 0.0000
## dive192 7.0268 0.1782 39.4344 0.0000
## dive193 6.5085 0.1755 37.0827 0.0000
## dive194 7.1514 0.1755 40.7455 0.0000
## dive195 6.9371 0.1755 39.5245 0.0000
## dive196 6.9549 0.1711 40.6512 0.0000
## dive197 6.3835 0.1711 37.3112 0.0000
## dive198 7.0978 0.1711 41.4862 0.0000
## dive199 7.2848 0.2501 29.1316 0.0000
## dive200 6.7848 0.2501 27.1321 0.0000
## dive201 6.6419 0.2501 26.5608 0.0000
## dive202 6.1864 0.2179 28.3932 0.0000
## dive203 4.1150 0.2179 18.8861 0.0000
## dive204 7.0435 0.2179 32.3271 0.0000
## dive205 6.9819 0.1951 35.7922 0.0000
## dive206 7.4105 0.1951 37.9893 0.0000
## dive207 5.4819 0.1951 28.1026 0.0000
## dive208 7.0533 0.1854 38.0490 0.0000
## dive209 6.2676 0.1854 33.8105 0.0000
## dive210 7.0533 0.1854 38.0490 0.0000
## dive211 6.4465 0.1661 38.7994 0.0000
## dive212 5.8036 0.1661 34.9302 0.0000
## dive213 7.0893 0.1661 42.6685 0.0000
## dive214 5.8781 0.1651 35.6018 0.0000
## dive215 6.6638 0.1651 40.3606 0.0000
## dive216 6.5210 0.1651 39.4954 0.0000
## dive217 5.8383 0.1765 33.0852 0.0000
## dive218 6.9812 0.1765 39.5616 0.0000
## dive219 6.7669 0.1765 38.3473 0.0000
## dive220 4.5878 0.1691 27.1381 0.0000
## dive221 6.6592 0.1691 39.3912 0.0000
## dive222 7.2306 0.1691 42.7714 0.0000
## dive223 6.9465 0.1661 41.8087 0.0000
## dive224 7.2322 0.1661 43.5283 0.0000
## dive225 4.8036 0.1661 28.9115 0.0000
## dive226 5.1638 0.1651 31.2756 0.0000
## dive227 7.1638 0.1651 43.3890 0.0000
## dive228 6.5210 0.1651 39.4954 0.0000
## dive229 7.8413 0.1911 41.0311 0.0000
## dive230 7.8413 0.1911 41.0311 0.0000
## dive231 6.7699 0.1911 35.4246 0.0000
## dive232 6.1697 0.1782 34.6242 0.0000
## dive233 7.0268 0.1782 39.4344 0.0000
## dive234 2.6697 0.1782 14.9823 0.0000
## dive235 7.2358 0.1668 43.3715 0.0000
## dive236 4.0215 0.1668 24.1051 0.0000
## dive237 5.3787 0.1668 32.2398 0.0000
## dive238 5.8564 0.1656 35.3572 0.0000
## dive239 6.8564 0.1656 41.3945 0.0000
## dive240 6.7850 0.1656 40.9633 0.0000
## dive241 7.5420 0.1828 41.2562 0.0000
## dive242 7.5420 0.1828 41.2562 0.0000
## dive243 3.4706 0.1828 18.9847 0.0000
## dive244 4.6934 0.1878 24.9951 0.0000
## dive245 5.7648 0.1878 30.7011 0.0000
## dive246 7.4791 0.1878 39.8308 0.0000
## dive247 7.0703 0.1799 39.2959 0.0000
## dive248 6.4274 0.1799 35.7230 0.0000
## dive249 6.1417 0.1799 34.1350 0.0000
## dive250 5.0329 0.1811 27.7975 0.0000
## dive251 4.4615 0.1811 24.6415 0.0000
## dive252 6.3187 0.1811 34.8987 0.0000
## dive253 7.4118 0.1739 42.6310 0.0000
## dive254 4.4118 0.1739 25.3756 0.0000
## dive255 6.2689 0.1739 36.0575 0.0000
## dive256 5.0051 0.1734 28.8618 0.0000
## dive257 4.3623 0.1734 25.1548 0.0000
## dive258 5.6480 0.1734 32.5688 0.0000
## dive259 7.3344 0.1840 39.8705 0.0000
## dive260 6.8344 0.1840 37.1525 0.0000
## dive261 2.1202 0.1840 11.5253 0.0000
## dive262 6.3797 0.1830 34.8648 0.0000
## dive263 7.0940 0.1830 38.7684 0.0000
## dive264 5.0226 0.1830 27.4482 0.0000
## dive265 7.2643 0.1790 40.5769 0.0000
## dive266 7.7643 0.1790 43.3699 0.0000
## dive267 5.4786 0.1790 30.6023 0.0000
## dive268 5.3509 0.1785 29.9745 0.0000
## dive269 6.5652 0.1785 36.7766 0.0000
## dive270 2.2795 0.1785 12.7691 0.0000
## dive271 6.9274 0.1799 38.5019 0.0000
## dive272 7.1417 0.1799 39.6929 0.0000
## dive273 7.2132 0.1799 40.0899 0.0000
## dive274 4.8901 0.1811 27.0085 0.0000
## dive275 6.5329 0.1811 36.0822 0.0000
## dive276 1.2472 0.1811 6.8886 0.0000
## dive277 6.7221 0.1717 39.1612 0.0000
## dive278 3.9364 0.1717 22.9325 0.0000
## dive279 4.4364 0.1717 25.8453 0.0000
## dive280 3.5476 0.1688 21.0150 0.0000
## dive281 6.7618 0.1688 40.0557 0.0000
## dive282 7.5476 0.1688 44.7101 0.0000
## dive283 6.8545 0.1739 39.4128 0.0000
## dive284 4.9260 0.1739 28.3237 0.0000
## dive285 6.2117 0.1739 35.7164 0.0000
## dive286 5.8179 0.1711 34.0058 0.0000
## dive287 6.3893 0.1711 37.3458 0.0000
## dive288 6.8179 0.1711 39.8508 0.0000
## dive289 5.7667 0.1951 29.5503 0.0000
## dive290 5.1953 0.1951 26.6222 0.0000
## dive291 6.0525 0.1951 31.0144 0.0000
## dive292 6.9109 0.1792 38.5747 0.0000
## dive293 5.7680 0.1792 32.1956 0.0000
## dive294 4.6966 0.1792 26.2151 0.0000
## dive295 6.3471 0.1685 37.6587 0.0000
## dive296 6.7042 0.1685 39.7777 0.0000
## dive297 3.6328 0.1685 21.5542 0.0000
## dive298 4.9793 0.1673 29.7631 0.0000
## dive299 5.4079 0.1673 32.3248 0.0000
## dive300 6.5507 0.1673 39.1561 0.0000
## dive301 6.9079 0.1951 35.4128 0.0000
## dive302 5.1936 0.1951 26.6246 0.0000
## dive303 6.7650 0.1951 34.6804 0.0000
## dive304 3.9012 0.1854 21.0449 0.0000
## dive305 5.9726 0.1854 32.2192 0.0000
## dive306 4.4726 0.1854 24.1275 0.0000
## dive307 6.3192 0.2932 21.5545 0.0000
## dive308 5.9620 0.2932 20.3363 0.0000
## dive309 4.4620 0.2932 15.2199 0.0000
## dive310 7.0533 0.2498 28.2315 0.0000
## dive311 5.2676 0.2498 21.0840 0.0000
## dive312 3.8390 0.2498 15.3660 0.0000
## dive313 6.6181 0.2932 22.5742 0.0000
## dive314 2.9753 0.2932 10.1485 0.0000
## dive315 7.5467 0.2932 25.7415 0.0000
## dive316 5.4237 0.2498 21.7088 0.0000
## dive317 6.1380 0.2498 24.5678 0.0000
## dive318 4.4951 0.2498 17.9921 0.0000
## dive319 4.8094 0.1657 29.0298 0.0000
## dive320 1.3808 0.1657 8.3346 0.0000
## dive321 6.5951 0.1657 39.8086 0.0000
## dive322 5.5289 0.1645 33.6160 0.0000
## dive323 6.6003 0.1645 40.1303 0.0000
## dive324 6.3146 0.1645 38.3932 0.0000
## dive325 4.6834 0.1669 28.0586 0.0000
## dive326 6.7549 0.1669 40.4686 0.0000
## dive327 6.3263 0.1669 37.9010 0.0000
## dive328 3.1435 0.1649 19.0609 0.0000
## dive329 6.6435 0.1649 40.2832 0.0000
## dive330 5.8578 0.1649 35.5190 0.0000
## dive331 2.4340 0.1813 13.4241 0.0000
## dive332 2.0769 0.1813 11.4544 0.0000
## dive333 3.3626 0.1813 18.5453 0.0000
## dive334 2.7983 0.1828 15.3085 0.0000
## dive335 6.3697 0.1828 34.8466 0.0000
## dive336 4.3697 0.1828 23.9052 0.0000
## dive337 7.8659 0.1624 48.4246 0.0000
## dive338 7.7230 0.1624 47.5451 0.0000
## dive339 8.4373 0.1624 51.9425 0.0000
## dive340 8.2043 0.1620 50.6464 0.0000
## dive341 8.4900 0.1620 52.4102 0.0000
## dive342 8.6283 0.1629 52.9666 0.0000
## dive343 8.6997 0.1629 53.4051 0.0000
## dive344 8.4854 0.1629 52.0896 0.0000
## dive345 8.3817 0.1623 51.6563 0.0000
## dive346 8.3817 0.1623 51.6563 0.0000
## dive347 8.5930 0.1668 51.5062 0.0000
## dive348 7.8787 0.1668 47.2248 0.0000
## dive349 7.5930 0.1668 45.5122 0.0000
## dive350 8.1421 0.1656 49.1568 0.0000
## dive351 8.9278 0.1656 53.9004 0.0000
## dive352 8.1391 0.1626 50.0630 0.0000
## dive353 7.6391 0.1626 46.9875 0.0000
## dive354 8.3534 0.1626 51.3811 0.0000
## dive355 7.7071 0.1620 47.5649 0.0000
## dive356 8.1357 0.1620 50.2099 0.0000
## dive357 8.4373 0.1624 51.9425 0.0000
## dive358 8.2230 0.1624 50.6233 0.0000
## dive359 8.1516 0.1624 50.1835 0.0000
## dive360 8.2757 0.1620 51.0874 0.0000
## dive361 8.4186 0.1620 51.9692 0.0000
## dive362 8.2887 0.1633 50.7432 0.0000
## dive363 8.2172 0.1633 50.3059 0.0000
## dive364 8.2172 0.1633 50.3059 0.0000
## dive365 7.4943 0.1628 46.0348 0.0000
## dive366 7.9229 0.1628 48.6673 0.0000
## dive367 8.2820 0.1626 50.9417 0.0000
## dive368 7.7820 0.1626 47.8663 0.0000
## dive369 8.1391 0.1626 50.0630 0.0000
## dive370 6.9928 0.1620 43.1566 0.0000
## dive371 7.9928 0.1620 49.3282 0.0000
## dive372 8.1419 0.1632 49.8969 0.0000
## dive373 8.2134 0.1632 50.3347 0.0000
## dive374 7.9991 0.1632 49.0215 0.0000
## dive375 7.5432 0.1625 46.4274 0.0000
## dive376 7.4718 0.1625 45.9878 0.0000
## dive377 7.9824 0.1684 47.4009 0.0000
## dive378 7.7681 0.1684 46.1285 0.0000
## dive379 7.9824 0.1684 47.4009 0.0000
## dive380 7.9892 0.1672 47.7965 0.0000
## dive381 8.0607 0.1672 48.2238 0.0000
## dive382 8.0848 0.1746 46.3003 0.0000
## dive383 7.7991 0.1746 44.6641 0.0000
## dive384 8.0134 0.1746 45.8912 0.0000
## dive385 7.4776 0.1698 44.0411 0.0000
## dive386 8.1205 0.1698 47.8273 0.0000
## dive387 7.5030 0.1633 45.9330 0.0000
## dive388 8.1458 0.1633 49.8686 0.0000
## dive389 8.1458 0.1633 49.8686 0.0000
## dive390 7.4943 0.1628 46.0348 0.0000
## dive391 7.5658 0.1628 46.4735 0.0000
## dive392 7.1665 0.1657 43.2578 0.0000
## dive393 7.6665 0.1657 46.2758 0.0000
## dive394 7.1665 0.1657 43.2578 0.0000
## dive395 7.4575 0.1645 45.3418 0.0000
## dive396 6.9575 0.1645 42.3018 0.0000
## dive397 7.5568 0.1629 46.3894 0.0000
## dive398 8.7711 0.1629 53.8435 0.0000
## dive399 8.1283 0.1629 49.8972 0.0000
## dive400 7.2388 0.1623 44.6129 0.0000
## dive401 7.5245 0.1623 46.3737 0.0000
## dive402 7.9540 0.1780 44.6902 0.0000
## dive403 8.0255 0.1780 45.0916 0.0000
## dive404 7.5255 0.1780 42.2823 0.0000
## dive405 7.1216 0.1744 40.8311 0.0000
## dive406 7.2645 0.1744 41.6502 0.0000
## dive407 7.5705 0.1632 46.3950 0.0000
## dive408 8.2134 0.1632 50.3347 0.0000
## dive409 3.5705 0.1632 21.8815 0.0000
## dive410 7.4718 0.1625 45.9878 0.0000
## dive411 7.1861 0.1625 44.2292 0.0000
## dive412 6.8383 0.1765 38.7520 0.0000
## dive413 6.6955 0.1765 37.9425 0.0000
## dive414 6.9812 0.1765 39.5616 0.0000
## dive415 7.3735 0.1691 43.6164 0.0000
## dive416 7.8735 0.1691 46.5741 0.0000
## dive417 7.4118 0.1739 42.6310 0.0000
## dive418 7.1975 0.1739 41.3984 0.0000
## dive419 7.1975 0.1739 41.3984 0.0000
## dive420 6.4337 0.1734 37.0996 0.0000
## dive421 7.0766 0.1734 40.8066 0.0000
## dive422 7.0078 0.1717 40.8257 0.0000
## dive423 6.6507 0.1717 38.7451 0.0000
## dive424 6.2936 0.1717 36.6645 0.0000
## dive425 7.1190 0.1688 42.1713 0.0000
## dive426 6.9761 0.1688 41.3251 0.0000
## dive427 9.7138 0.1615 60.1492 0.0000
## dive428 8.4281 0.1615 52.1879 0.0000
## dive429 7.4995 0.1615 46.4380 0.0000
## dive430 9.4281 0.1615 58.3800 0.0000
## dive431 9.2138 0.1615 57.0531 0.0000
## dive432 8.3566 0.1615 51.7456 0.0000
## dive433 9.4281 0.1615 58.3800 0.0000
## dive434 9.4281 0.1615 58.3800 0.0000
## dive435 9.9281 0.1615 61.4761 0.0000
## dive436 5.2852 0.1615 32.7268 0.0000
## dive437 9.2138 0.1615 57.0531 0.0000
## dive438 8.9995 0.1615 55.7263 0.0000
## dive439 9.1746 0.1617 56.7352 0.0000
## dive440 8.6031 0.1617 53.2015 0.0000
## dive441 6.9603 0.1617 43.0421 0.0000
## dive442 7.8174 0.1617 48.3427 0.0000
## dive443 9.3889 0.1617 58.0603 0.0000
## dive444 8.7460 0.1617 54.0849 0.0000
## dive445 8.2751 0.1629 50.8016 0.0000
## dive446 8.1323 0.1629 49.9246 0.0000
## dive447 8.7037 0.1629 53.4326 0.0000
## dive448 6.6323 0.1629 40.7160 0.0000
## dive449 8.7751 0.1629 53.8711 0.0000
## dive450 7.7751 0.1629 47.7321 0.0000
## dive451 7.3244 0.1650 44.3808 0.0000
## dive452 7.1101 0.1650 43.0824 0.0000
## dive453 8.6815 0.1650 52.6042 0.0000
## dive454 8.2530 0.1650 50.0073 0.0000
## dive455 5.7530 0.1650 34.8591 0.0000
## dive456 8.3244 0.1650 50.4402 0.0000
## dive457 7.6709 0.1616 47.4697 0.0000
## dive458 8.3138 0.1616 51.4478 0.0000
## dive459 7.7423 0.1616 47.9117 0.0000
## dive460 7.6709 0.1616 47.4697 0.0000
## dive461 5.5281 0.1616 34.2091 0.0000
## dive462 9.0281 0.1616 55.8680 0.0000
## dive463 7.8174 0.1617 48.3427 0.0000
## dive464 5.9603 0.1617 36.8582 0.0000
## dive465 8.3889 0.1617 51.8764 0.0000
## dive466 9.0317 0.1617 55.8518 0.0000
## dive467 7.0317 0.1617 43.4839 0.0000
## dive468 8.0317 0.1617 49.6678 0.0000
## dive469 8.4237 0.1619 52.0240 0.0000
## dive470 8.4237 0.1619 52.0240 0.0000
## dive471 8.4237 0.1619 52.0240 0.0000
## dive472 6.5665 0.1619 40.5544 0.0000
## dive473 5.4237 0.1619 33.4962 0.0000
## dive474 8.1379 0.1619 50.2595 0.0000
## dive475 8.1709 0.1616 50.5638 0.0000
## dive476 7.5281 0.1616 46.5856 0.0000
## dive477 6.5995 0.1616 40.8394 0.0000
## dive478 7.5281 0.1616 46.5856 0.0000
## dive479 7.0281 0.1616 43.4915 0.0000
## dive480 7.2423 0.1616 44.8176 0.0000
## dive481 7.7094 0.1619 47.6126 0.0000
## dive482 7.0665 0.1619 43.6424 0.0000
## dive483 7.9951 0.1619 49.3772 0.0000
## dive484 6.2094 0.1619 38.3487 0.0000
## dive485 7.4237 0.1619 45.8481 0.0000
## dive486 7.9951 0.1619 49.3772 0.0000
## dive487 8.3109 0.1621 51.2692 0.0000
## dive488 6.3823 0.1621 39.3720 0.0000
## dive489 7.1680 0.1621 44.2190 0.0000
## dive490 8.0966 0.1621 49.9473 0.0000
## dive491 4.8823 0.1621 30.1186 0.0000
## dive492 8.3109 0.1621 51.2692 0.0000
## dive493 8.1381 0.1641 49.6051 0.0000
## dive494 3.2095 0.1641 19.5635 0.0000
## dive495 7.8524 0.1641 47.8636 0.0000
## dive496 7.0667 0.1641 43.0743 0.0000
## dive497 7.7810 0.1641 47.4282 0.0000
## dive498 5.0667 0.1641 30.8835 0.0000
## dive499 9.2785 0.1636 56.7155 0.0000
## dive500 9.4213 0.1636 57.5888 0.0000
## dive501 8.1356 0.1636 49.7297 0.0000
## dive502 8.3102 0.1623 51.2087 0.0000
## dive503 9.1673 0.1623 56.4906 0.0000
## dive504 6.4530 0.1623 39.7647 0.0000
## dive505 7.0642 0.1636 43.1805 0.0000
## dive506 9.4213 0.1636 57.5888 0.0000
## dive507 8.2070 0.1636 50.1663 0.0000
## dive508 7.8102 0.1623 48.1277 0.0000
## dive509 9.0245 0.1623 55.6103 0.0000
## dive510 8.8102 0.1623 54.2898 0.0000
## dive511 8.4488 0.1639 51.5528 0.0000
## dive512 8.5202 0.1639 51.9886 0.0000
## dive513 7.6631 0.1639 46.7585 0.0000
## dive514 8.5697 0.1625 52.7344 0.0000
## dive515 6.7125 0.1625 41.3063 0.0000
## dive516 8.9982 0.1625 55.3717 0.0000
## dive517 8.0411 0.1707 47.0942 0.0000
## dive518 7.3268 0.1707 42.9108 0.0000
## dive519 8.5411 0.1707 50.0225 0.0000
## dive520 8.0162 0.1670 47.9902 0.0000
## dive521 6.6591 0.1670 39.8655 0.0000
## dive522 8.3734 0.1670 50.1283 0.0000
## dive523 8.3441 0.1642 50.8174 0.0000
## dive524 8.5584 0.1642 52.1224 0.0000
## dive525 9.2012 0.1642 56.0376 0.0000
## dive526 8.3660 0.1627 51.4228 0.0000
## dive527 7.3660 0.1627 45.2762 0.0000
## dive528 6.8660 0.1627 42.2028 0.0000
## dive529 7.9595 0.1677 47.4590 0.0000
## dive530 6.8880 0.1677 41.0706 0.0000
## dive531 8.1023 0.1677 48.3108 0.0000
## dive532 8.2400 0.1664 49.5098 0.0000
## dive533 8.3114 0.1664 49.9389 0.0000
## dive534 6.5971 0.1664 39.6387 0.0000
## dive535 8.4687 0.1637 51.7198 0.0000
## dive536 8.0401 0.1637 49.1024 0.0000
## dive537 7.4687 0.1637 45.6126 0.0000
## dive538 5.6624 0.1623 34.8792 0.0000
## dive539 7.6624 0.1623 47.1987 0.0000
## dive540 8.0910 0.1623 49.8386 0.0000
## dive541 8.3662 0.1659 50.4381 0.0000
## dive542 8.7948 0.1659 53.0218 0.0000
## dive543 7.1520 0.1659 43.1175 0.0000
## dive544 5.8146 0.1651 35.2227 0.0000
## dive545 8.2432 0.1651 49.9341 0.0000
## dive546 6.7432 0.1651 40.8476 0.0000
## dive547 7.8441 0.1642 47.7723 0.0000
## dive548 6.9155 0.1642 42.1170 0.0000
## dive549 8.0584 0.1642 49.0773 0.0000
## dive550 8.4374 0.1627 51.8619 0.0000
## dive551 6.6517 0.1627 40.8857 0.0000
## dive552 6.6517 0.1627 40.8857 0.0000
## dive553 7.4687 0.1637 45.6126 0.0000
## dive554 6.6830 0.1637 40.8141 0.0000
## dive555 7.3258 0.1637 44.7401 0.0000
## dive556 7.9482 0.1623 48.9586 0.0000
## dive557 7.0910 0.1623 43.6789 0.0000
## dive558 7.6624 0.1623 47.1987 0.0000
## dive559 8.2345 0.1639 50.2453 0.0000
## dive560 7.0917 0.1639 43.2718 0.0000
## dive561 6.5917 0.1639 40.2209 0.0000
## dive562 7.9268 0.1625 48.7785 0.0000
## dive563 6.7839 0.1625 41.7458 0.0000
## dive564 8.3554 0.1625 51.4158 0.0000
## dive565 7.1672 0.1648 43.5020 0.0000
## dive566 4.6672 0.1648 28.3280 0.0000
## dive567 7.8100 0.1648 47.4039 0.0000
## dive568 7.9062 0.1632 48.4586 0.0000
## dive569 6.9062 0.1632 42.3294 0.0000
## dive570 7.8347 0.1632 48.0208 0.0000
## dive571 7.0412 0.1735 40.5848 0.0000
## dive572 7.7555 0.1735 44.7019 0.0000
## dive573 7.3269 0.1735 42.2316 0.0000
## dive574 6.4336 0.1690 38.0672 0.0000
## dive575 7.0051 0.1690 41.4483 0.0000
## dive576 6.0051 0.1690 35.5314 0.0000
## dive577 7.5957 0.1648 46.1033 0.0000
## dive578 6.5957 0.1648 40.0337 0.0000
## dive579 4.5243 0.1648 27.4609 0.0000
## dive580 7.8347 0.1632 48.0208 0.0000
## dive581 7.2633 0.1632 44.5184 0.0000
## dive582 8.1205 0.1632 49.7720 0.0000
## dive583 7.8880 0.1677 47.0331 0.0000
## dive584 4.0309 0.1677 24.0346 0.0000
## dive585 7.8880 0.1677 47.0331 0.0000
## dive586 7.4543 0.1664 44.7888 0.0000
## dive587 6.9543 0.1664 41.7846 0.0000
## dive588 7.2400 0.1664 43.5013 0.0000
## dive589 7.3518 0.1680 43.7653 0.0000
## dive590 5.8518 0.1680 34.8358 0.0000
## dive591 6.7803 0.1680 40.3636 0.0000
## dive592 5.9339 0.1651 35.9439 0.0000
## dive593 6.6482 0.1651 40.2706 0.0000
## dive594 6.7910 0.1651 41.1359 0.0000
## dive595 7.0091 0.1659 42.2562 0.0000
## dive596 6.7234 0.1659 40.5337 0.0000
## dive597 4.5091 0.1659 27.1843 0.0000
## dive598 7.8146 0.1651 47.3379 0.0000
## dive599 7.3146 0.1651 44.3091 0.0000
## dive600 7.3860 0.1651 44.7418 0.0000
## dive601 7.4397 0.1740 42.7637 0.0000
## dive602 7.4397 0.1740 42.7637 0.0000
## dive603 6.0111 0.1740 34.5522 0.0000
## dive604 7.1916 0.1677 42.8713 0.0000
## dive605 7.1202 0.1677 42.4455 0.0000
## dive606 7.5487 0.1677 45.0004 0.0000
## dive607 7.6824 0.1697 45.2679 0.0000
## dive608 7.1110 0.1697 41.9008 0.0000
## dive609 7.5396 0.1697 44.4261 0.0000
## dive610 4.9268 0.1653 29.8112 0.0000
## dive611 5.2125 0.1653 31.5400 0.0000
## dive612 7.4268 0.1653 44.9383 0.0000
## dive613 6.1535 0.1771 34.7362 0.0000
## dive614 6.7249 0.1771 37.9619 0.0000
## dive615 7.0106 0.1771 39.5747 0.0000
## dive616 6.4666 0.1718 37.6344 0.0000
## dive617 7.7523 0.1718 45.1170 0.0000
## dive618 7.3237 0.1718 42.6228 0.0000
## dive619 7.6096 0.1675 45.4215 0.0000
## dive620 7.3239 0.1675 43.7160 0.0000
## dive621 5.3239 0.1675 31.7781 0.0000
## dive622 6.3465 0.1654 38.3754 0.0000
## dive623 4.1322 0.1654 24.9863 0.0000
## dive624 8.7751 0.1654 53.0602 0.0000
## dive625 7.4698 0.1735 43.0550 0.0000
## dive626 5.4698 0.1735 31.5272 0.0000
## dive627 7.8269 0.1735 45.1136 0.0000
## dive628 8.0765 0.1690 47.7879 0.0000
## dive629 5.5051 0.1690 32.5730 0.0000
## dive630 5.2194 0.1690 30.8824 0.0000
## dive631 6.8239 0.1675 40.7316 0.0000
## dive632 6.1810 0.1675 36.8944 0.0000
## dive633 7.2525 0.1675 43.2897 0.0000
## dive634 7.5608 0.1654 45.7178 0.0000
## dive635 6.4894 0.1654 39.2392 0.0000
## dive636 6.1322 0.1654 37.0796 0.0000
## dive637 8.6069 0.1797 47.8906 0.0000
## dive638 6.4640 0.1797 35.9672 0.0000
## dive639 7.1069 0.1797 39.5442 0.0000
## dive640 5.3985 0.1748 30.8782 0.0000
## dive641 7.3985 0.1748 42.3177 0.0000
## dive642 4.6128 0.1748 26.3841 0.0000
## dive643 6.8926 0.1797 38.3519 0.0000
## dive644 6.7497 0.1797 37.5570 0.0000
## dive645 6.7497 0.1797 37.5570 0.0000
## dive646 5.6842 0.1748 32.5124 0.0000
## dive647 6.4699 0.1748 37.0065 0.0000
## dive648 5.2557 0.1748 30.0611 0.0000
## dive649 6.4254 0.1924 33.3988 0.0000
## dive650 6.7826 0.1924 35.2552 0.0000
## dive651 7.4254 0.1924 38.5967 0.0000
## dive652 7.1409 0.1809 39.4650 0.0000
## dive653 4.9266 0.1809 27.2275 0.0000
## dive654 6.4980 0.1809 35.9122 0.0000
## dive655 5.5090 0.1802 30.5683 0.0000
## dive656 6.0090 0.1802 33.3427 0.0000
## dive657 4.0090 0.1802 22.2451 0.0000
## dive658 7.0412 0.1723 40.8690 0.0000
## dive659 6.0412 0.1723 35.0647 0.0000
## dive660 6.6841 0.1723 38.7960 0.0000
## dive661 5.8396 0.1927 30.3099 0.0000
## dive662 6.1967 0.1927 32.1636 0.0000
## dive663 3.3396 0.1927 17.3338 0.0000
## dive664 7.6876 0.1858 41.3772 0.0000
## dive665 6.8305 0.1858 36.7638 0.0000
## dive666 7.0448 0.1858 37.9171 0.0000
## dive667 6.5601 0.1852 35.4144 0.0000
## dive668 6.4172 0.1852 34.6432 0.0000
## dive669 6.3458 0.1852 34.2576 0.0000
## dive670 2.6474 0.1775 14.9161 0.0000
## dive671 5.1474 0.1775 29.0015 0.0000
## dive672 7.1474 0.1775 40.2699 0.0000
## dive673 5.7248 0.1696 33.7522 0.0000
## dive674 6.5820 0.1696 38.8057 0.0000
## dive675 5.9391 0.1696 35.0156 0.0000
## dive676 8.3623 0.1682 49.7127 0.0000
## dive677 5.5052 0.1682 32.7274 0.0000
## dive678 2.5052 0.1682 14.8929 0.0000
## dive679 7.1253 0.1927 36.9833 0.0000
## dive680 5.5539 0.1927 28.8269 0.0000
## dive681 5.3396 0.1927 27.7146 0.0000
## dive682 4.8305 0.1858 25.9991 0.0000
## dive683 6.0448 0.1858 32.5348 0.0000
## dive684 4.6162 0.1858 24.8458 0.0000
## dive685 6.2089 0.1680 36.9619 0.0000
## dive686 4.5661 0.1680 27.1819 0.0000
## dive687 1.9946 0.1680 11.8741 0.0000
## dive688 5.7910 0.1651 35.0785 0.0000
## dive689 7.5767 0.1651 45.8953 0.0000
## dive690 5.4339 0.1651 32.9152 0.0000
## dive691 4.1729 0.1799 23.1954 0.0000
## dive692 7.0300 0.1799 39.0773 0.0000
## dive693 2.7443 0.1799 15.2545 0.0000
## dive694 5.6474 0.1703 33.1576 0.0000
## dive695 6.6474 0.1703 39.0288 0.0000
## dive696 6.8617 0.1703 40.2870 0.0000
## dive697 7.3060 0.1862 39.2366 0.0000
## dive698 5.5203 0.1862 29.6465 0.0000
## dive699 6.3060 0.1862 33.8661 0.0000
## dive700 1.9251 0.1749 11.0054 0.0000
## dive701 6.7823 0.1749 38.7725 0.0000
## dive702 5.7108 0.1749 32.6474 0.0000
## dive703 4.8858 0.1778 27.4794 0.0000
## dive704 3.8144 0.1778 21.4533 0.0000
## dive705 6.8858 0.1778 38.7280 0.0000
## dive706 4.4594 0.1697 26.2794 0.0000
## dive707 5.4594 0.1697 32.1724 0.0000
## dive708 7.6023 0.1697 44.8003 0.0000
## dive709 7.4343 0.1998 37.2096 0.0000
## dive710 6.7200 0.1998 33.6345 0.0000
## dive711 4.7200 0.1998 23.6242 0.0000
## dive712 2.3390 0.1847 12.6672 0.0000
## dive713 5.7676 0.1847 31.2348 0.0000
## dive714 5.2676 0.1847 28.5270 0.0000
## dive715 4.9431 0.1998 24.7410 0.0000
## dive716 3.0860 0.1998 15.4457 0.0000
## dive717 1.6574 0.1998 8.2955 0.0000
## dive718 6.4517 0.1847 34.9395 0.0000
## dive719 4.3802 0.1847 23.7215 0.0000
## dive720 7.0945 0.1847 38.4209 0.0000
## dive721 6.9287 0.1952 35.4882 0.0000
## dive722 2.8572 0.1952 14.6346 0.0000
## dive723 6.7858 0.1952 34.7565 0.0000
## dive724 5.3829 0.1954 27.5513 0.0000
## dive725 3.4543 0.1954 17.6803 0.0000
## dive726 3.2400 0.1954 16.5835 0.0000
## dive727 5.4391 0.1696 32.0677 0.0000
## dive728 3.2248 0.1696 19.0128 0.0000
## dive729 6.5396 0.1697 38.5337 0.0000
## dive730 8.6356 0.1636 52.7860 0.0000
## dive731 8.5642 0.1636 52.3494 0.0000
## dive732 9.0959 0.1623 56.0505 0.0000
## dive733 9.0245 0.1623 55.6103 0.0000
## dive734 8.6356 0.1636 52.7860 0.0000
## dive735 8.7070 0.1636 53.2226 0.0000
## dive736 9.5959 0.1623 59.1315 0.0000
## dive737 9.1673 0.1623 56.4906 0.0000
## dive738 8.5917 0.1639 52.4245 0.0000
## dive739 7.1631 0.1639 43.7077 0.0000
## dive740 8.9268 0.1625 54.9322 0.0000
## dive741 9.2125 0.1625 56.6903 0.0000
## dive742 8.8441 0.1642 53.8625 0.0000
## dive743 8.1298 0.1642 49.5123 0.0000
## dive744 9.0088 0.1627 55.3742 0.0000
## dive745 8.7231 0.1627 53.6181 0.0000
## dive746 8.9697 0.1707 52.5325 0.0000
## dive747 8.7554 0.1707 51.2775 0.0000
## dive748 7.7305 0.1670 46.2797 0.0000
## dive749 8.0877 0.1670 48.4178 0.0000
## dive750 7.8880 0.1677 47.0331 0.0000
## dive751 7.8880 0.1677 47.0331 0.0000
## dive752 7.8829 0.1664 47.3639 0.0000
## dive753 8.8829 0.1664 53.3723 0.0000
## dive754 8.1830 0.1637 49.9749 0.0000
## dive755 7.7544 0.1637 47.3575 0.0000
## dive756 8.4482 0.1623 52.0385 0.0000
## dive757 8.3053 0.1623 51.1585 0.0000
## dive758 8.4377 0.1659 50.8687 0.0000
## dive759 8.1520 0.1659 49.1462 0.0000
## dive760 8.8146 0.1651 53.3956 0.0000
## dive761 8.0289 0.1651 48.6360 0.0000
## dive762 8.1298 0.1642 49.5123 0.0000
## dive763 7.9869 0.1642 48.6423 0.0000
## dive764 8.0088 0.1627 49.2276 0.0000
## dive765 8.7945 0.1627 54.0571 0.0000
## dive766 8.1830 0.1637 49.9749 0.0000
## dive767 7.8972 0.1637 48.2300 0.0000
## dive768 7.5196 0.1623 46.3187 0.0000
## dive769 8.0196 0.1623 49.3986 0.0000
## dive770 8.5202 0.1639 51.9886 0.0000
## dive771 7.7345 0.1639 47.1944 0.0000
## dive772 7.9982 0.1625 49.2181 0.0000
## dive773 7.4982 0.1625 46.1413 0.0000
## dive774 7.4529 0.1648 45.2362 0.0000
## dive775 7.6672 0.1648 46.5369 0.0000
## dive776 8.0490 0.1632 49.3342 0.0000
## dive777 8.4062 0.1632 51.5232 0.0000
## dive778 8.4232 0.1680 50.1436 0.0000
## dive779 7.7089 0.1680 45.8914 0.0000
## dive780 8.2910 0.1651 50.2220 0.0000
## dive781 8.0767 0.1651 48.9240 0.0000
## dive782 8.4698 0.1735 48.8189 0.0000
## dive783 8.1126 0.1735 46.7604 0.0000
## dive784 7.2908 0.1690 43.1389 0.0000
## dive785 8.2194 0.1690 48.6331 0.0000
## dive786 7.9529 0.1648 48.2710 0.0000
## dive787 8.3815 0.1648 50.8723 0.0000
## dive788 8.0490 0.1632 49.3342 0.0000
## dive789 7.6205 0.1632 46.7074 0.0000
## dive790 7.1738 0.1677 42.7742 0.0000
## dive791 8.2452 0.1677 49.1626 0.0000
## dive792 8.5971 0.1664 51.6556 0.0000
## dive793 8.0257 0.1664 48.2222 0.0000
## dive794 8.0091 0.1659 48.2850 0.0000
## dive795 7.3662 0.1659 44.4093 0.0000
## dive796 7.4575 0.1651 45.1745 0.0000
## dive797 8.0289 0.1651 48.6360 0.0000
## dive798 7.5825 0.1740 43.5849 0.0000
## dive799 7.1539 0.1740 41.1214 0.0000
## dive800 7.7630 0.1677 46.2778 0.0000
## dive801 7.6916 0.1677 45.8520 0.0000
## dive802 7.8610 0.1616 48.6425 0.0000
## dive803 6.9324 0.1616 42.8967 0.0000
## dive804 8.0038 0.1616 49.5265 0.0000
## dive805 8.8610 0.1616 54.8304 0.0000
## dive806 8.8610 0.1616 54.8304 0.0000
## dive807 8.0038 0.1616 49.5265 0.0000
## dive808 7.1467 0.1616 44.2226 0.0000
## dive809 7.5753 0.1616 46.8746 0.0000
## dive810 7.8610 0.1616 48.6425 0.0000
## dive811 7.4324 0.1616 45.9906 0.0000
## dive812 7.5032 0.1624 46.2094 0.0000
## dive813 7.6460 0.1624 47.0892 0.0000
## dive814 7.1460 0.1624 44.0099 0.0000
## dive815 8.2175 0.1624 50.6084 0.0000
## dive816 7.5746 0.1624 46.6493 0.0000
## dive817 7.7995 0.1619 48.1878 0.0000
## dive818 7.0852 0.1619 43.7747 0.0000
## dive819 6.0852 0.1619 37.5964 0.0000
## dive820 8.7281 0.1619 53.9248 0.0000
## dive821 7.5852 0.1619 46.8639 0.0000
## dive822 8.5452 0.1680 50.8672 0.0000
## dive823 7.8309 0.1680 46.6153 0.0000
## dive824 8.5452 0.1680 50.8672 0.0000
## dive825 7.6881 0.1680 45.7649 0.0000
## dive826 7.6881 0.1680 45.7649 0.0000
## dive827 6.5852 0.1619 40.6856 0.0000
## dive828 7.9423 0.1619 49.0704 0.0000
## dive829 6.3709 0.1619 39.3616 0.0000
## dive830 7.7995 0.1619 48.1878 0.0000
## dive831 7.6566 0.1619 47.3052 0.0000
## dive832 7.9690 0.1620 49.1832 0.0000
## dive833 7.7547 0.1620 47.8607 0.0000
## dive834 7.4690 0.1620 46.0973 0.0000
## dive835 7.8261 0.1620 48.3015 0.0000
## dive836 8.1833 0.1620 50.5057 0.0000
## dive837 8.0000 0.1617 49.4628 0.0000
## dive838 6.3571 0.1617 39.3052 0.0000
## dive839 7.7857 0.1617 48.1379 0.0000
## dive840 7.1428 0.1617 44.1632 0.0000
## dive841 7.4285 0.1617 45.9297 0.0000
## dive842 8.6547 0.1645 52.6143 0.0000
## dive843 7.5833 0.1645 46.1008 0.0000
## dive844 7.7976 0.1645 47.4035 0.0000
## dive845 8.0833 0.1645 49.1404 0.0000
## dive846 7.0118 0.1645 42.6269 0.0000
## dive847 8.2046 0.1630 50.3427 0.0000
## dive848 8.0617 0.1630 49.4661 0.0000
## dive849 6.4188 0.1630 39.3856 0.0000
## dive850 6.1331 0.1630 37.6325 0.0000
## dive851 7.4188 0.1630 45.5216 0.0000
## dive852 8.5080 0.1633 52.0870 0.0000
## dive853 5.7937 0.1633 35.4698 0.0000
## dive854 7.0080 0.1633 42.9038 0.0000
## dive855 8.0794 0.1633 49.4633 0.0000
## dive856 7.8651 0.1633 48.1514 0.0000
## dive857 7.7142 0.1617 47.6963 0.0000
## dive858 7.7142 0.1617 47.6963 0.0000
## dive859 6.4285 0.1617 39.7468 0.0000
## dive860 6.5000 0.1617 40.1885 0.0000
## dive861 6.0000 0.1617 37.0970 0.0000
## dive862 7.3992 0.1630 45.3895 0.0000
## dive863 7.6849 0.1630 47.1422 0.0000
## dive864 7.2563 0.1630 44.5132 0.0000
## dive865 7.6065 0.1625 46.8018 0.0000
## dive866 8.1779 0.1625 50.3178 0.0000
## dive867 7.9706 0.1630 48.8949 0.0000
## dive868 8.2563 0.1630 50.6476 0.0000
## dive869 7.4706 0.1630 45.8277 0.0000
## dive870 6.6065 0.1625 40.6490 0.0000
## dive871 6.6065 0.1625 40.6490 0.0000
## dive872 7.0588 0.1633 43.2227 0.0000
## dive873 7.2730 0.1633 44.5349 0.0000
## dive874 5.4159 0.1633 33.1631 0.0000
## dive875 8.2986 0.1627 51.0162 0.0000
## dive876 7.1558 0.1627 43.9904 0.0000
## dive877 7.1364 0.1642 43.4547 0.0000
## dive878 5.4935 0.1642 33.4510 0.0000
## dive879 6.9221 0.1642 42.1499 0.0000
## dive880 7.3491 0.1638 44.8577 0.0000
## dive881 7.5634 0.1638 46.1656 0.0000
## dive882 6.9873 0.1633 42.7854 0.0000
## dive883 7.4873 0.1633 45.8470 0.0000
## dive884 7.1302 0.1633 43.6601 0.0000
## dive885 7.0129 0.1627 43.1122 0.0000
## dive886 6.2986 0.1627 38.7211 0.0000
## dive887 7.4098 0.1663 44.5632 0.0000
## dive888 7.1240 0.1663 42.8449 0.0000
## dive889 7.9098 0.1663 47.5703 0.0000
## dive890 7.6169 0.1661 45.8567 0.0000
## dive891 7.8312 0.1661 47.1468 0.0000
## dive892 7.6654 0.1648 46.5065 0.0000
## dive893 7.5940 0.1648 46.0731 0.0000
## dive894 6.8083 0.1648 41.3062 0.0000
## dive895 7.1105 0.1641 43.3293 0.0000
## dive896 6.1105 0.1641 37.2356 0.0000
## dive897 7.5179 0.1656 45.4032 0.0000
## dive898 6.5179 0.1656 39.3638 0.0000
## dive899 6.6607 0.1656 40.2266 0.0000
## dive900 6.8770 0.1648 41.7209 0.0000
## dive901 8.1627 0.1648 49.5210 0.0000
## dive902 7.8665 0.1632 48.2140 0.0000
## dive903 7.4380 0.1632 45.5873 0.0000
## dive904 5.5808 0.1632 34.2049 0.0000
## dive905 6.4728 0.1626 39.8051 0.0000
## dive906 6.8299 0.1626 42.0014 0.0000
## dive907 7.2237 0.1632 44.2739 0.0000
## dive908 7.2237 0.1632 44.2739 0.0000
## dive909 4.3665 0.1632 26.7625 0.0000
## dive910 6.6157 0.1626 40.6836 0.0000
## dive911 7.7585 0.1626 47.7117 0.0000
## dive912 8.0488 0.1825 44.1032 0.0000
## dive913 6.7631 0.1825 37.0582 0.0000
## dive914 3.4059 0.1825 18.6628 0.0000
## dive915 7.5548 0.1825 41.3969 0.0000
## dive916 8.1976 0.1825 44.9194 0.0000
## dive917 6.9189 0.1682 41.1241 0.0000
## dive918 6.2760 0.1682 37.3031 0.0000
## dive919 7.2760 0.1682 43.2469 0.0000
## dive920 6.2528 0.1669 37.4555 0.0000
## dive921 6.9671 0.1669 41.7342 0.0000
## dive922 7.9259 0.1641 48.3140 0.0000
## dive923 6.6402 0.1641 40.4767 0.0000
## dive924 7.6402 0.1641 46.5723 0.0000
## dive925 7.0682 0.1630 43.3525 0.0000
## dive926 4.3539 0.1630 26.7046 0.0000
## dive927 6.7277 0.1674 40.1882 0.0000
## dive928 7.0848 0.1674 42.3216 0.0000
## dive929 6.6563 0.1674 39.7615 0.0000
## dive930 5.8185 0.1660 35.0618 0.0000
## dive931 6.8900 0.1660 41.5181 0.0000
## dive932 5.7046 0.1682 33.9067 0.0000
## dive933 4.6332 0.1682 27.5384 0.0000
## dive934 6.7760 0.1682 40.2750 0.0000
## dive935 7.0385 0.1669 42.1621 0.0000
## dive936 7.4671 0.1669 44.7293 0.0000
## dive937 6.8750 0.1656 41.5207 0.0000
## dive938 6.1607 0.1656 37.2069 0.0000
## dive939 6.4465 0.1656 38.9324 0.0000
## dive940 7.3055 0.1648 44.3209 0.0000
## dive941 6.2341 0.1648 37.8208 0.0000
## dive942 6.3086 0.2546 24.7829 0.0000
## dive943 4.3086 0.2546 16.9261 0.0000
## dive944 6.5229 0.2546 25.6247 0.0000
## dive945 6.2340 0.2230 27.9544 0.0000
## dive946 7.3769 0.2230 33.0792 0.0000
## dive947 7.0688 0.1641 43.0891 0.0000
## dive948 6.3545 0.1641 38.7350 0.0000
## dive949 4.6402 0.1641 28.2853 0.0000
## dive950 7.8539 0.1630 48.1716 0.0000
## dive951 6.3539 0.1630 38.9714 0.0000
## dive952 7.3331 0.1822 40.2558 0.0000
## dive953 5.6188 0.1822 30.8450 0.0000
## dive954 7.4045 0.1822 40.6480 0.0000
## dive955 7.9785 0.1728 46.1805 0.0000
## dive956 4.1214 0.1728 23.8549 0.0000
## dive957 8.0226 0.1648 48.6733 0.0000
## dive958 7.6654 0.1648 46.5065 0.0000
## dive959 3.8797 0.1648 23.5384 0.0000
## dive960 3.9676 0.1641 24.1775 0.0000
## dive961 7.8247 0.1641 47.6820 0.0000
## dive962 7.1876 0.1732 41.5054 0.0000
## dive963 6.8305 0.1732 39.4430 0.0000
## dive964 6.9733 0.1732 40.2679 0.0000
## dive965 7.6099 0.1778 42.7902 0.0000
## dive966 3.6099 0.1778 20.2983 0.0000
## dive967 6.7700 0.1851 36.5777 0.0000
## dive968 6.6986 0.1851 36.1918 0.0000
## dive969 6.4843 0.1851 35.0340 0.0000
## dive970 6.9838 0.1772 39.4007 0.0000
## dive971 4.1981 0.1772 23.6844 0.0000
## dive972 7.1046 0.1727 41.1340 0.0000
## dive973 4.7475 0.1727 27.4867 0.0000
## dive974 6.5332 0.1727 37.8255 0.0000
## dive975 5.3151 0.1717 30.9508 0.0000
## dive976 7.3865 0.1717 43.0131 0.0000
## dive977 4.7318 0.1741 27.1796 0.0000
## dive978 6.8032 0.1741 39.0780 0.0000
## dive979 5.8746 0.1741 33.7442 0.0000
## dive980 5.3340 0.1711 31.1669 0.0000
## dive981 6.6197 0.1711 38.6794 0.0000
## dive982 7.1986 0.1851 38.8933 0.0000
## dive983 6.4843 0.1851 35.0340 0.0000
## dive984 3.1986 0.1851 17.2816 0.0000
## dive985 6.5552 0.1772 36.9828 0.0000
## dive986 6.4838 0.1772 36.5798 0.0000
## dive987 6.9209 0.1672 41.4041 0.0000
## dive988 4.1352 0.1672 24.7387 0.0000
## dive989 5.9209 0.1672 35.4216 0.0000
## dive990 6.6101 0.1659 39.8528 0.0000
## dive991 5.6101 0.1659 33.8237 0.0000
## dive992 6.6446 0.1786 37.2061 0.0000
## dive993 6.8589 0.1786 38.4060 0.0000
## dive994 6.5732 0.1786 36.8061 0.0000
## dive995 3.9060 0.1856 21.0479 0.0000
## dive996 4.1917 0.1856 22.5875 0.0000
## dive997 5.9098 0.1663 35.5420 0.0000
## dive998 5.5526 0.1663 33.3941 0.0000
## dive999 4.9098 0.1663 29.5279 0.0000
## dive1000 6.9740 0.1661 41.9864 0.0000
## dive1001 6.1169 0.1661 36.8261 0.0000
## dive1002 6.5259 0.1750 37.2924 0.0000
## dive1003 4.7402 0.1750 27.0879 0.0000
## dive1004 4.8116 0.1750 27.4961 0.0000
## dive1005 7.3950 0.1780 41.5346 0.0000
## dive1006 6.2521 0.1780 35.1156 0.0000
## dive1007 6.6188 0.1822 36.3347 0.0000
## dive1008 6.2616 0.1822 34.3741 0.0000
## dive1009 6.1188 0.1822 33.5899 0.0000
## dive1010 4.4785 0.1728 25.9221 0.0000
## dive1011 5.2642 0.1728 30.4699 0.0000
## dive1012 6.7277 0.1674 40.1882 0.0000
## dive1013 6.2277 0.1674 37.2014 0.0000
## dive1014 4.9420 0.1674 29.5211 0.0000
## dive1015 4.5328 0.1660 27.3143 0.0000
## dive1016 5.3185 0.1660 32.0489 0.0000
## dive1017 6.4739 0.2850 22.7119 0.0000
## dive1018 4.7597 0.2850 16.6978 0.0000
## dive1019 6.7597 0.2850 23.7142 0.0000
## dive1020 4.5176 0.2441 18.5057 0.0000
## dive1021 6.0890 0.2441 24.9428 0.0000
## dive1022 5.4924 0.1672 32.8577 0.0000
## dive1023 4.4209 0.1672 26.4480 0.0000
## dive1024 6.3495 0.1672 37.9855 0.0000
## dive1025 5.1816 0.1659 31.2399 0.0000
## dive1026 6.0387 0.1659 36.4076 0.0000
## dive1027 5.7281 0.2075 27.6013 0.0000
## dive1028 4.8709 0.2075 23.4711 0.0000
## dive1029 6.0852 0.2075 29.3223 0.0000
## dive1030 5.0960 0.1895 26.8952 0.0000
## dive1031 5.3102 0.1895 28.0262 0.0000
## dive1032 6.9535 0.1779 39.0953 0.0000
## dive1033 4.8820 0.1779 27.4489 0.0000
## dive1034 5.8820 0.1779 33.0713 0.0000
## dive1035 3.8058 0.1752 21.7191 0.0000
## dive1036 6.0200 0.1752 34.3558 0.0000
## dive1037 7.0332 0.1727 40.7204 0.0000
## dive1038 6.6760 0.1727 38.6526 0.0000
## dive1039 3.3189 0.1727 19.2156 0.0000
## dive1040 4.0294 0.1717 23.4639 0.0000
## dive1041 7.4580 0.1717 43.4290 0.0000
## dive1042 6.4676 0.2008 32.2094 0.0000
## dive1043 4.7534 0.2008 23.6721 0.0000
## dive1044 4.9676 0.2008 24.7393 0.0000
## dive1045 3.8825 0.1853 20.9560 0.0000
## dive1046 6.3111 0.1853 34.0644 0.0000
## dive1047 6.3523 0.2850 22.2850 0.0000
## dive1048 4.4237 0.2850 15.5192 0.0000
## dive1049 3.2808 0.2850 11.5098 0.0000
## dive1050 6.1737 0.2441 25.2895 0.0000
## dive1051 4.0308 0.2441 16.5117 0.0000
## dive1052 6.3935 0.1773 36.0674 0.0000
## dive1053 2.5364 0.1773 14.3083 0.0000
## dive1054 4.7507 0.1773 26.7997 0.0000
## dive1055 4.7667 0.1739 27.4163 0.0000
## dive1056 5.6238 0.1739 32.3463 0.0000
## dive1057 6.6688 0.1750 38.1088 0.0000
## dive1058 5.0259 0.1750 28.7206 0.0000
## dive1059 4.3830 0.1750 25.0470 0.0000
## dive1060 2.8950 0.1780 16.2600 0.0000
## dive1061 4.7521 0.1780 26.6908 0.0000
## dive1062 4.4794 0.1859 24.0965 0.0000
## dive1063 3.9079 0.1859 21.0225 0.0000
## dive1064 5.6222 0.1859 30.2444 0.0000
## dive1065 3.7071 0.1813 20.4508 0.0000
## dive1066 4.9929 0.1813 27.5436 0.0000
## dive1067 7.0649 0.1642 43.0197 0.0000
## dive1068 4.2792 0.1642 26.0570 0.0000
## dive1069 8.3922 0.1625 51.6363 0.0000
## dive1070 8.5351 0.1625 52.5152 0.0000
## dive1071 8.6065 0.1625 52.9547 0.0000
## dive1072 8.3992 0.1630 51.5239 0.0000
## dive1073 8.8278 0.1630 54.1529 0.0000
## dive1074 8.4636 0.1625 52.0757 0.0000
## dive1075 9.1065 0.1625 56.0312 0.0000
## dive1076 8.8208 0.1625 54.2732 0.0000
## dive1077 8.9706 0.1630 55.0293 0.0000
## dive1078 8.8992 0.1630 54.5911 0.0000
## dive1079 8.2272 0.1627 50.5770 0.0000
## dive1080 8.2272 0.1627 50.5770 0.0000
## dive1081 8.2986 0.1627 51.0162 0.0000
## dive1082 8.5588 0.1633 52.4076 0.0000
## dive1083 7.9873 0.1633 48.9086 0.0000
## dive1084 8.2986 0.1627 51.0162 0.0000
## dive1085 8.6558 0.1627 53.2117 0.0000
## dive1086 8.4415 0.1627 51.8944 0.0000
## dive1087 8.1302 0.1633 49.7834 0.0000
## dive1088 8.1302 0.1633 49.7834 0.0000
## dive1089 8.2776 0.1638 50.5255 0.0000
## dive1090 8.6348 0.1638 52.7055 0.0000
## dive1091 7.9205 0.1638 48.3456 0.0000
## dive1092 8.4221 0.1642 51.2836 0.0000
## dive1093 8.2792 0.1642 50.4138 0.0000
## dive1094 8.1883 0.1661 49.2969 0.0000
## dive1095 7.8312 0.1661 47.1468 0.0000
## dive1096 7.5455 0.1661 45.4267 0.0000
## dive1097 7.5526 0.1663 45.4224 0.0000
## dive1098 7.4812 0.1663 44.9928 0.0000
## dive1099 7.6105 0.1641 46.3762 0.0000
## dive1100 8.0390 0.1641 48.9878 0.0000
## dive1101 7.3962 0.1641 45.0704 0.0000
## dive1102 8.0940 0.1648 49.1066 0.0000
## dive1103 7.4512 0.1648 45.2064 0.0000
## dive1104 8.0442 0.1626 49.4687 0.0000
## dive1105 8.1871 0.1626 50.3472 0.0000
## dive1106 7.8299 0.1626 48.1509 0.0000
## dive1107 7.5808 0.1632 46.4629 0.0000
## dive1108 8.2237 0.1632 50.4029 0.0000
## dive1109 8.1976 0.1825 44.9194 0.0000
## dive1110 8.4833 0.1825 46.4850 0.0000
## dive1111 7.1976 0.1825 39.4399 0.0000
## dive1112 8.5488 0.1825 46.8430 0.0000
## dive1113 8.4059 0.1825 46.0602 0.0000
## dive1114 7.4484 0.1648 45.1876 0.0000
## dive1115 8.0912 0.1648 49.0876 0.0000
## dive1116 8.0198 0.1648 48.6543 0.0000
## dive1117 7.8750 0.1656 47.5601 0.0000
## dive1118 5.9465 0.1656 35.9128 0.0000
## dive1119 7.9728 0.1626 49.0295 0.0000
## dive1120 7.6871 0.1626 47.2724 0.0000
## dive1121 7.7585 0.1626 47.7117 0.0000
## dive1122 7.6523 0.1632 46.9006 0.0000
## dive1123 7.5808 0.1632 46.4629 0.0000
## dive1124 8.0682 0.1630 49.4859 0.0000
## dive1125 7.7825 0.1630 47.7335 0.0000
## dive1126 8.5682 0.1630 52.5526 0.0000
## dive1127 8.0688 0.1641 49.1848 0.0000
## dive1128 7.9974 0.1641 48.7494 0.0000
## dive1129 7.7528 0.1669 46.4408 0.0000
## dive1130 7.8242 0.1669 46.8687 0.0000
## dive1131 7.9671 0.1669 47.7244 0.0000
## dive1132 7.1332 0.1682 42.3977 0.0000
## dive1133 7.1332 0.1682 42.3977 0.0000
## dive1134 7.6627 0.1648 46.4876 0.0000
## dive1135 7.8770 0.1648 47.7876 0.0000
## dive1136 7.8770 0.1648 47.7876 0.0000
## dive1137 7.1607 0.1656 43.2463 0.0000
## dive1138 7.2322 0.1656 43.6777 0.0000
## dive1139 7.5911 0.2230 34.0401 0.0000
## dive1140 7.8769 0.2230 35.3213 0.0000
## dive1141 8.1626 0.2230 36.6025 0.0000
## dive1142 7.1657 0.2546 28.1502 0.0000
## dive1143 7.3800 0.2546 28.9920 0.0000
## dive1144 7.7471 0.1660 46.6832 0.0000
## dive1145 7.2471 0.1660 43.6702 0.0000
## dive1146 7.8185 0.1660 47.1136 0.0000
## dive1147 7.5848 0.1674 45.3084 0.0000
## dive1148 6.3705 0.1674 38.0548 0.0000
## dive1149 7.9254 0.1630 48.6097 0.0000
## dive1150 7.4968 0.1630 45.9811 0.0000
## dive1151 7.6396 0.1630 46.8573 0.0000
## dive1152 7.4974 0.1641 45.7015 0.0000
## dive1153 7.4259 0.1641 45.2661 0.0000
## dive1154 7.5499 0.1728 43.6999 0.0000
## dive1155 8.1214 0.1728 47.0074 0.0000
## dive1156 7.1928 0.1728 41.6327 0.0000
## dive1157 6.7616 0.1822 37.1189 0.0000
## dive1158 7.1188 0.1822 39.0795 0.0000
## dive1159 6.8956 0.1669 41.3063 0.0000
## dive1160 6.8956 0.1669 41.3063 0.0000
## dive1161 7.1813 0.1669 43.0178 0.0000
## dive1162 7.1332 0.1682 42.3977 0.0000
## dive1163 6.2046 0.1682 36.8786 0.0000
## dive1164 8.1978 0.1619 50.6399 0.0000
## dive1165 7.9835 0.1619 49.3162 0.0000
## dive1166 9.1978 0.1619 56.8171 0.0000
## dive1167 8.8406 0.1619 54.6110 0.0000
## dive1168 8.4121 0.1619 51.9636 0.0000
## dive1169 9.3251 0.1618 57.6294 0.0000
## dive1170 8.1822 0.1618 50.5665 0.0000
## dive1171 5.8965 0.1618 36.4406 0.0000
## dive1172 7.6822 0.1618 47.4764 0.0000
## dive1173 8.8251 0.1618 54.5394 0.0000
## dive1174 9.0837 0.1633 55.6148 0.0000
## dive1175 8.2266 0.1633 50.3670 0.0000
## dive1176 6.4409 0.1633 39.4340 0.0000
## dive1177 7.9409 0.1633 48.6177 0.0000
## dive1178 8.5123 0.1633 52.1163 0.0000
## dive1179 7.7536 0.1618 47.9179 0.0000
## dive1180 7.3965 0.1618 45.7107 0.0000
## dive1181 4.8965 0.1618 30.2606 0.0000
## dive1182 7.4679 0.1618 46.1521 0.0000
## dive1183 6.5393 0.1618 40.4135 0.0000
## dive1184 8.6551 0.1633 52.9909 0.0000
## dive1185 8.0123 0.1633 49.0550 0.0000
## dive1186 3.0837 0.1633 18.8800 0.0000
## dive1187 7.7980 0.1633 47.7431 0.0000
## dive1188 7.7980 0.1633 47.7431 0.0000
## dive1189 7.5544 0.1639 46.0803 0.0000
## dive1190 5.9830 0.1639 36.4950 0.0000
## dive1191 7.9116 0.1639 48.2588 0.0000
## dive1192 7.8401 0.1639 47.8231 0.0000
## dive1193 6.8401 0.1639 41.7233 0.0000
## dive1194 7.4543 0.1721 43.3200 0.0000
## dive1195 7.1686 0.1721 41.6596 0.0000
## dive1196 8.3115 0.1721 48.3012 0.0000
## dive1197 5.0258 0.1721 29.2066 0.0000
## dive1198 7.3115 0.1721 42.4898 0.0000
## dive1199 7.5827 0.1620 46.8088 0.0000
## dive1200 7.2256 0.1620 44.6041 0.0000
## dive1201 7.0827 0.1620 43.7222 0.0000
## dive1202 7.5827 0.1620 46.8088 0.0000
## dive1203 7.0827 0.1620 43.7222 0.0000
## dive1204 7.0781 0.1650 42.9070 0.0000
## dive1205 6.3638 0.1650 38.5771 0.0000
## dive1206 7.0781 0.1650 42.9070 0.0000
## dive1207 7.3638 0.1650 44.6390 0.0000
## dive1208 6.3638 0.1650 38.5771 0.0000
## dive1209 7.5260 0.1646 45.7247 0.0000
## dive1210 7.5260 0.1646 45.7247 0.0000
## dive1211 2.5974 0.1646 15.7809 0.0000
## dive1212 4.5974 0.1646 27.9320 0.0000
## dive1213 8.6689 0.1646 52.6682 0.0000
## dive1214 5.2284 0.1623 32.2133 0.0000
## dive1215 5.5141 0.1623 33.9736 0.0000
## dive1216 6.5856 0.1623 40.5749 0.0000
## dive1217 6.0141 0.1623 37.0542 0.0000
## dive1218 7.3713 0.1623 45.4158 0.0000
## dive1219 4.9946 0.1626 30.7108 0.0000
## dive1220 6.5660 0.1626 40.3733 0.0000
## dive1221 6.1374 0.1626 37.7381 0.0000
## dive1222 6.0660 0.1626 37.2989 0.0000
## dive1223 7.5660 0.1626 46.5222 0.0000
## dive1224 7.4031 0.1619 45.7294 0.0000
## dive1225 8.9746 0.1619 55.4362 0.0000
## dive1226 8.8317 0.1619 54.5538 0.0000
## dive1227 6.6306 0.1627 40.7647 0.0000
## dive1228 8.5592 0.1627 52.6214 0.0000
## dive1229 8.2603 0.1619 51.0240 0.0000
## dive1230 8.9031 0.1619 54.9950 0.0000
## dive1231 8.0460 0.1619 49.7004 0.0000
## dive1232 7.9878 0.1627 49.1083 0.0000
## dive1233 8.9163 0.1627 54.8171 0.0000
## dive1234 7.8744 0.1632 48.2411 0.0000
## dive1235 7.3029 0.1632 44.7404 0.0000
## dive1236 8.4458 0.1632 51.7419 0.0000
## dive1237 7.8697 0.1645 47.8427 0.0000
## dive1238 7.2982 0.1645 44.3688 0.0000
## dive1239 7.8744 0.1632 48.2411 0.0000
## dive1240 7.0886 0.1632 43.4276 0.0000
## dive1241 6.7315 0.1632 41.2396 0.0000
## dive1242 6.9411 0.1645 42.1976 0.0000
## dive1243 6.9411 0.1645 42.1976 0.0000
## dive1244 7.3217 0.1621 45.1597 0.0000
## dive1245 7.6074 0.1621 46.9220 0.0000
## dive1246 8.5360 0.1621 52.6493 0.0000
## dive1247 6.6338 0.1628 40.7402 0.0000
## dive1248 8.1338 0.1628 49.9521 0.0000
## dive1249 7.1849 0.1754 40.9595 0.0000
## dive1250 7.1849 0.1754 40.9595 0.0000
## dive1251 6.6849 0.1754 38.1091 0.0000
## dive1252 6.6123 0.1826 36.2119 0.0000
## dive1253 7.5409 0.1826 41.2971 0.0000
## dive1254 7.2348 0.1622 44.6103 0.0000
## dive1255 7.7348 0.1622 47.6933 0.0000
## dive1256 7.0920 0.1622 43.7294 0.0000
## dive1257 7.0023 0.1629 42.9736 0.0000
## dive1258 6.7165 0.1629 41.2201 0.0000
## dive1259 7.1920 0.1646 43.6887 0.0000
## dive1260 7.1206 0.1646 43.2548 0.0000
## dive1261 6.4777 0.1646 39.3497 0.0000
## dive1262 6.2734 0.1667 37.6427 0.0000
## dive1263 7.7020 0.1667 46.2146 0.0000
## dive1264 7.6116 0.1637 46.5061 0.0000
## dive1265 7.6830 0.1637 46.9425 0.0000
## dive1266 5.5402 0.1637 33.8499 0.0000
## dive1267 7.2484 0.1648 43.9875 0.0000
## dive1268 6.8198 0.1648 41.3867 0.0000
## dive1269 6.9096 0.1652 41.8210 0.0000
## dive1270 6.1953 0.1652 37.4978 0.0000
## dive1271 6.9096 0.1652 41.8210 0.0000
## dive1272 7.2819 0.1665 43.7270 0.0000
## dive1273 6.3533 0.1665 38.1511 0.0000
## dive1274 6.9740 0.1628 42.8314 0.0000
## dive1275 7.0455 0.1628 43.2701 0.0000
## dive1276 6.9740 0.1628 42.8314 0.0000
## dive1277 5.3828 0.1640 32.8227 0.0000
## dive1278 7.5971 0.1640 46.3246 0.0000
## dive1279 4.7087 0.1624 29.0004 0.0000
## dive1280 6.9230 0.1624 42.6378 0.0000
## dive1281 7.1373 0.1624 43.9576 0.0000
## dive1282 5.7685 0.1632 35.3390 0.0000
## dive1283 8.0542 0.1632 49.3418 0.0000
## dive1284 7.0007 0.1725 40.5872 0.0000
## dive1285 6.1436 0.1725 35.6179 0.0000
## dive1286 6.2150 0.1725 36.0320 0.0000
## dive1287 7.6200 0.1756 43.3855 0.0000
## dive1288 6.4057 0.1756 36.4718 0.0000
## dive1289 4.6953 0.1652 28.4189 0.0000
## dive1290 6.9811 0.1652 42.2533 0.0000
## dive1291 5.6239 0.1652 34.0391 0.0000
## dive1292 6.6390 0.1665 39.8667 0.0000
## dive1293 7.7819 0.1665 46.7295 0.0000
## dive1294 6.7757 0.1729 39.1963 0.0000
## dive1295 5.0614 0.1729 29.2794 0.0000
## dive1296 6.1328 0.1729 35.4774 0.0000
## dive1297 7.3343 0.1834 39.9970 0.0000
## dive1298 6.7628 0.1834 36.8808 0.0000
## dive1299 7.6074 0.1621 46.9220 0.0000
## dive1300 4.8931 0.1621 30.1804 0.0000
## dive1301 5.9645 0.1621 36.7889 0.0000
## dive1302 6.6338 0.1628 40.7402 0.0000
## dive1303 7.7766 0.1628 47.7588 0.0000
## dive1304 6.3005 0.1879 33.5350 0.0000
## dive1305 5.6576 0.1879 30.1133 0.0000
## dive1306 6.0862 0.1879 32.3944 0.0000
## dive1307 6.5483 0.1881 34.8171 0.0000
## dive1308 5.6198 0.1881 29.8799 0.0000
## dive1309 6.5920 0.1622 40.6464 0.0000
## dive1310 6.3062 0.1622 38.8847 0.0000
## dive1311 5.7348 0.1622 35.3612 0.0000
## dive1312 6.2880 0.1629 38.5899 0.0000
## dive1313 7.0023 0.1629 42.9736 0.0000
## dive1314 7.0515 0.1722 40.9563 0.0000
## dive1315 4.8372 0.1722 28.0954 0.0000
## dive1316 5.4801 0.1722 31.8292 0.0000
## dive1317 6.6060 0.1762 37.4860 0.0000
## dive1318 6.3203 0.1762 35.8647 0.0000
## dive1319 6.9740 0.1628 42.8314 0.0000
## dive1320 3.1169 0.1628 19.1426 0.0000
## dive1321 6.8312 0.1628 41.9540 0.0000
## dive1322 6.1686 0.1640 37.6137 0.0000
## dive1323 7.4543 0.1640 45.4535 0.0000
## dive1324 6.4564 0.1810 35.6658 0.0000
## dive1325 3.1707 0.1810 17.5152 0.0000
## dive1326 6.3135 0.1810 34.8766 0.0000
## dive1327 7.5965 0.1976 38.4380 0.0000
## dive1328 6.0250 0.1976 30.4866 0.0000
## dive1329 5.5492 0.1646 33.7090 0.0000
## dive1330 5.1920 0.1646 31.5395 0.0000
## dive1331 5.1206 0.1646 31.1056 0.0000
## dive1332 7.2734 0.1667 43.6430 0.0000
## dive1333 7.0591 0.1667 42.3572 0.0000
## dive1334 5.6019 0.1699 32.9781 0.0000
## dive1335 7.1734 0.1699 42.2290 0.0000
## dive1336 5.7448 0.1699 33.8191 0.0000
## dive1337 6.1437 0.1723 35.6572 0.0000
## dive1338 6.6437 0.1723 38.5591 0.0000
## dive1339 6.0659 0.1624 37.3588 0.0000
## dive1340 3.7801 0.1624 23.2814 0.0000
## dive1341 3.9230 0.1624 24.1613 0.0000
## dive1342 6.5542 0.1632 40.1525 0.0000
## dive1343 7.8399 0.1632 48.0291 0.0000
## dive1344 6.3596 0.1648 38.5813 0.0000
## dive1345 5.2168 0.1648 31.6481 0.0000
## dive1346 7.0025 0.1648 42.4812 0.0000
## dive1347 6.1772 0.1660 37.2112 0.0000
## dive1348 5.1772 0.1660 31.1872 0.0000
## dive1349 4.5614 0.1729 26.3870 0.0000
## dive1350 6.2043 0.1729 35.8906 0.0000
## dive1351 6.4900 0.1729 37.5435 0.0000
## dive1352 5.9057 0.1834 32.2064 0.0000
## dive1353 5.5485 0.1834 30.2587 0.0000
## dive1354 5.7168 0.1648 34.6813 0.0000
## dive1355 5.7882 0.1648 35.1147 0.0000
## dive1356 4.2168 0.1648 25.5815 0.0000
## dive1357 4.1058 0.1660 24.7330 0.0000
## dive1358 7.7486 0.1660 46.6775 0.0000
## dive1359 5.9139 0.1724 34.2994 0.0000
## dive1360 5.7710 0.1724 33.4708 0.0000
## dive1361 6.0568 0.1724 35.1279 0.0000
## dive1362 5.8553 0.1785 32.8020 0.0000
## dive1363 2.7839 0.1785 15.5957 0.0000
## dive1364 7.2984 0.1653 44.1643 0.0000
## dive1365 4.6555 0.1653 28.1717 0.0000
## dive1366 3.2984 0.1653 19.9593 0.0000
## dive1367 5.4042 0.1661 32.5341 0.0000
## dive1368 7.1899 0.1661 43.2845 0.0000
## dive1369 1.4444 0.1689 8.5510 0.0000
## dive1370 6.7301 0.1689 39.8425 0.0000
## dive1371 5.8730 0.1689 34.7682 0.0000
## dive1372 5.7998 0.1729 33.5505 0.0000
## dive1373 6.9426 0.1729 40.1617 0.0000
## dive1374 6.1830 0.1637 37.7777 0.0000
## dive1375 2.1116 0.1637 12.9017 0.0000
## dive1376 6.2545 0.1637 38.2141 0.0000
## dive1377 6.6056 0.1648 40.0863 0.0000
## dive1378 4.5341 0.1648 27.5157 0.0000
## dive1379 6.6555 0.1653 40.2742 0.0000
## dive1380 5.0127 0.1653 30.3329 0.0000
## dive1381 4.2269 0.1653 25.5783 0.0000
## dive1382 6.2613 0.1661 37.6943 0.0000
## dive1383 5.1185 0.1661 30.8141 0.0000
## dive1384 5.3373 0.1716 31.1014 0.0000
## dive1385 6.4802 0.1716 37.7611 0.0000
## dive1386 6.6230 0.1716 38.5935 0.0000
## dive1387 1.9855 0.1759 11.2854 0.0000
## dive1388 5.9141 0.1759 33.6151 0.0000
## dive1389 6.7448 0.1699 39.7061 0.0000
## dive1390 3.1019 0.1699 18.2608 0.0000
## dive1391 4.1734 0.1699 24.5683 0.0000
## dive1392 6.5722 0.1723 38.1446 0.0000
## dive1393 6.2151 0.1723 36.0717 0.0000
## dive1394 7.0278 0.1810 38.8224 0.0000
## dive1395 6.6707 0.1810 36.8495 0.0000
## dive1396 4.8135 0.1810 26.5905 0.0000
## dive1397 6.8107 0.1976 34.4623 0.0000
## dive1398 0.8822 0.1976 4.4638 0.0000
## dive1399 5.2563 0.1754 29.9651 0.0000
## dive1400 3.1135 0.1754 17.7492 0.0000
## dive1401 4.0421 0.1754 23.0428 0.0000
## dive1402 4.6837 0.1826 25.6501 0.0000
## dive1403 5.9694 0.1826 32.6913 0.0000
## dive1404 3.0568 0.1724 17.7286 0.0000
## dive1405 5.1282 0.1724 29.7424 0.0000
## dive1406 4.2710 0.1724 24.7712 0.0000
## dive1407 3.9982 0.1785 22.3982 0.0000
## dive1408 5.2839 0.1785 29.6008 0.0000
## dive1409 3.8225 0.1849 20.6755 0.0000
## dive1410 6.1082 0.1849 33.0386 0.0000
## dive1411 6.3225 0.1849 34.1977 0.0000
## dive1412 5.8453 0.2227 26.2424 0.0000
## dive1413 5.1729 0.1794 28.8398 0.0000
## dive1414 1.8158 0.1794 10.1232 0.0000
## dive1415 2.0301 0.1794 11.3179 0.0000
## dive1416 5.1522 0.1861 27.6842 0.0000
## dive1417 6.5093 0.1861 34.9766 0.0000
## dive1418 8.9746 0.1619 55.4362 0.0000
## dive1419 8.9031 0.1619 54.9950 0.0000
## dive1420 7.7021 0.1627 47.3517 0.0000
## dive1421 8.9878 0.1627 55.2562 0.0000
## dive1422 8.8317 0.1619 54.5538 0.0000
## dive1423 7.9031 0.1619 48.8179 0.0000
## dive1424 8.7735 0.1627 53.9388 0.0000
## dive1425 9.2021 0.1627 56.5736 0.0000
## dive1426 7.6601 0.1632 46.9283 0.0000
## dive1427 8.5886 0.1632 52.6171 0.0000
## dive1428 8.3697 0.1645 50.8824 0.0000
## dive1429 8.0840 0.1645 49.1454 0.0000
## dive1430 8.3029 0.1632 50.8667 0.0000
## dive1431 7.8744 0.1632 48.2411 0.0000
## dive1432 7.9411 0.1645 48.2769 0.0000
## dive1433 8.0840 0.1645 49.1454 0.0000
## dive1434 7.5360 0.1621 46.4814 0.0000
## dive1435 7.8217 0.1621 48.2437 0.0000
## dive1436 7.4909 0.1628 46.0042 0.0000
## dive1437 7.9909 0.1628 49.0748 0.0000
## dive1438 7.5492 0.1646 45.8582 0.0000
## dive1439 7.9063 0.1646 48.0277 0.0000
## dive1440 8.2020 0.1667 49.2147 0.0000
## dive1441 8.6306 0.1667 51.7863 0.0000
## dive1442 7.2563 0.1754 41.3667 0.0000
## dive1443 7.3992 0.1754 42.1811 0.0000
## dive1444 7.0409 0.1826 38.5589 0.0000
## dive1445 7.5409 0.1826 41.2971 0.0000
## dive1446 7.8259 0.1637 47.8153 0.0000
## dive1447 7.5402 0.1637 46.0697 0.0000
## dive1448 7.6056 0.1648 46.1548 0.0000
## dive1449 7.8198 0.1648 47.4553 0.0000
## dive1450 7.5920 0.1622 46.8124 0.0000
## dive1451 7.2348 0.1622 44.6103 0.0000
## dive1452 7.3594 0.1629 45.1654 0.0000
## dive1453 6.2165 0.1629 38.1516 0.0000
## dive1454 7.9944 0.1624 49.2366 0.0000
## dive1455 8.0659 0.1624 49.6766 0.0000
## dive1456 7.3399 0.1632 44.9659 0.0000
## dive1457 8.0542 0.1632 49.3418 0.0000
## dive1458 7.1883 0.1628 44.1475 0.0000
## dive1459 7.4026 0.1628 45.4635 0.0000
## dive1460 8.1686 0.1640 49.8090 0.0000
## dive1461 7.3828 0.1640 45.0180 0.0000
## dive1462 6.9811 0.1652 42.2533 0.0000
## dive1463 7.1239 0.1652 43.1180 0.0000
## dive1464 7.6390 0.1665 45.8716 0.0000
## dive1465 7.4248 0.1665 44.5849 0.0000
## dive1466 6.1074 0.1621 37.6701 0.0000
## dive1467 8.1074 0.1621 50.0059 0.0000
## dive1468 6.8481 0.1628 42.0562 0.0000
## dive1469 7.4909 0.1628 46.0042 0.0000
## dive1470 7.2043 0.1729 41.6755 0.0000
## dive1471 6.9186 0.1729 40.0227 0.0000
## dive1472 7.4057 0.1834 40.3865 0.0000
## dive1473 7.4771 0.1834 40.7761 0.0000
## dive1474 7.1953 0.1652 43.5503 0.0000
## dive1475 6.6239 0.1652 40.0917 0.0000
## dive1476 7.0676 0.1665 42.4403 0.0000
## dive1477 7.2819 0.1665 43.7270 0.0000
## dive1478 7.1634 0.1622 44.1698 0.0000
## dive1479 7.5205 0.1622 46.3720 0.0000
## dive1480 6.7880 0.1629 41.6585 0.0000
## dive1481 7.7880 0.1629 47.7956 0.0000
## dive1482 5.1436 0.1725 29.8203 0.0000
## dive1483 4.3579 0.1725 25.2650 0.0000
## dive1484 6.2628 0.1756 35.6584 0.0000
## dive1485 6.9771 0.1756 39.7253 0.0000
## dive1486 6.3005 0.1879 33.5350 0.0000
## dive1487 5.9433 0.1879 31.6341 0.0000
## dive1488 5.8341 0.1881 31.0193 0.0000
## dive1489 6.1198 0.1881 32.5384 0.0000
## ALT Walter -0.0758 0.0285 -2.6604 0.0078
## BARNETT Madeleine -0.1084 0.0245 -4.4219 0.0000
## BOOTHROYD Sydney 0.0007 0.0323 0.0207 0.9835
## BOUSSARD Michel -0.1487 0.0279 -5.3341 0.0000
## BOYS Beverley 0.0439 0.0322 1.3628 0.1730
## BURK Hans-Peter -0.0291 0.0425 -0.6844 0.4937
## CALDERON Felix -0.0651 0.0282 -2.3085 0.0210
## CERMAKOVA Maria -0.0404 0.0478 -0.8446 0.3983
## CRUZ Julia 0.0018 0.0314 0.0566 0.9548
## GEAR Dennis -0.0181 0.0336 -0.5386 0.5902
## GEISSBUHLER Michael 0.0128 0.0368 0.3491 0.7270
## HASSAN Mostafa -0.0452 0.0382 -1.1833 0.2367
## HOOD Robin 0.0273 0.0351 0.7788 0.4361
## HUBER Peter 0.0486 0.0336 1.4480 0.1476
## JOHNSON Bente -0.0292 0.0401 -0.7293 0.4659
## KELEMEN Ildiko 0.0030 0.0384 0.0785 0.9374
## LINDBERG Mathz 0.0246 0.0329 0.7457 0.4559
## McFARLAND Steve 0.0228 0.0246 0.9240 0.3555
## MENA Jesus -0.0442 0.0232 -1.9054 0.0568
## RUIZ-PEDREGUERA Rolando 0.0399 0.0312 1.2799 0.2006
## SEAMAN Kathy 0.0309 0.0380 0.8131 0.4162
## STEWART Anthea 0.0933 0.0425 2.1932 0.0283
## WANG Facheng 0.1992 0.0336 5.9284 0.0000
## XU Yiming 0.0689 0.0380 1.8114 0.0701
## ALT WalterAUS -0.2689 0.0849 -3.1683 0.0015
## ALT WalterAUT 0.5142 0.1436 3.5801 0.0003
## ALT WalterBLR -0.4184 0.2147 -1.9482 0.0514
## ALT WalterBRA -0.2870 0.1405 -2.0430 0.0411
## ALT WalterCAN -0.1724 0.1013 -1.7014 0.0889
## ALT WalterCHN -0.0667 0.0822 -0.8114 0.4172
## ALT WalterCOL -0.2084 0.2096 -0.9941 0.3202
## ALT WalterCUB 0.0502 0.1247 0.4028 0.6871
## ALT WalterESP -0.1123 0.1202 -0.9343 0.3502
## ALT WalterFRA 0.1741 0.1265 1.3765 0.1687
## ALT WalterGBR 0.1881 0.0983 1.9128 0.0558
## ALT WalterGER 0.3500 0.0920 3.8039 0.0001
## ALT WalterGRE -0.1270 0.1268 -1.0016 0.3166
## ALT WalterHUN -0.0115 0.1485 -0.0773 0.9384
## ALT WalterINA 0.1320 0.1992 0.6628 0.5075
## ALT WalterITA -0.0382 0.1244 -0.3070 0.7589
## ALT WalterJPN -0.1566 0.1797 -0.8716 0.3834
## ALT WalterKAZ 0.0494 0.1030 0.4796 0.6316
## ALT WalterKOR 0.1520 0.1900 0.8002 0.4236
## ALT WalterMAS 0.0223 0.1573 0.1415 0.8874
## ALT WalterMEX -0.1104 0.0945 -1.1686 0.2426
## ALT WalterPER -0.0490 0.2649 -0.1849 0.8533
## ALT WalterPHI 0.4058 0.2766 1.4669 0.1424
## ALT WalterPRK 0.2882 0.1157 2.4906 0.0128
## ALT WalterPUR -0.0508 0.1726 -0.2942 0.7686
## ALT WalterROM -0.1975 0.1593 -1.2398 0.2151
## ALT WalterRUS -0.0899 0.0824 -1.0918 0.2750
## ALT WalterSUI -0.2932 0.2766 -1.0598 0.2893
## ALT WalterSWE 0.3496 0.2042 1.7116 0.0870
## ALT WalterTHA 0.1203 0.2649 0.4540 0.6499
## ALT WalterTPE 0.0734 0.1330 0.5518 0.5811
## ALT WalterUKR 0.0080 0.0945 0.0843 0.9329
## ALT WalterUSA -0.0684 0.0823 -0.8319 0.4055
## BARNETT MadeleineAUS 0.2827 0.0751 3.7630 0.0002
## BARNETT MadeleineAUT 0.1030 0.1383 0.7448 0.4564
## BARNETT MadeleineBLR 0.1671 0.2224 0.7513 0.4525
## BARNETT MadeleineBRA 0.4531 0.1231 3.6802 0.0002
## BARNETT MadeleineCAN 0.1574 0.0827 1.9032 0.0571
## BARNETT MadeleineCHN -0.0011 0.0731 -0.0154 0.9877
## BARNETT MadeleineCOL 0.1501 0.1563 0.9603 0.3369
## BARNETT MadeleineCUB -0.0256 0.1003 -0.2556 0.7983
## BARNETT MadeleineESP -0.1425 0.1104 -1.2909 0.1968
## BARNETT MadeleineFRA -0.0316 0.1091 -0.2901 0.7717
## BARNETT MadeleineGBR -0.1500 0.0847 -1.7715 0.0765
## BARNETT MadeleineGER 0.0727 0.0781 0.9299 0.3525
## BARNETT MadeleineGRE 0.0636 0.1209 0.5258 0.5990
## BARNETT MadeleineHUN 0.1120 0.1263 0.8867 0.3752
## BARNETT MadeleineINA -0.2366 0.1515 -1.5623 0.1183
## BARNETT MadeleineITA 0.0079 0.1060 0.0749 0.9403
## BARNETT MadeleineJPN 0.0914 0.1407 0.6498 0.5159
## BARNETT MadeleineKAZ -0.0957 0.0939 -1.0198 0.3079
## BARNETT MadeleineKOR -0.0419 0.1446 -0.2898 0.7719
## BARNETT MadeleineMAS 0.2166 0.1188 1.8235 0.0683
## BARNETT MadeleineMEX -0.0041 0.0901 -0.0460 0.9633
## BARNETT MadeleinePER -0.0997 0.1885 -0.5287 0.5971
## BARNETT MadeleinePHI -0.5838 0.2611 -2.2357 0.0254
## BARNETT MadeleinePRK 0.0092 0.0886 0.1042 0.9170
## BARNETT MadeleinePUR -0.1872 0.1656 -1.1305 0.2583
## BARNETT MadeleineROM -0.1075 0.1371 -0.7836 0.4333
## BARNETT MadeleineRUS -0.0742 0.0733 -1.0127 0.3113
## BARNETT MadeleineSUI 0.4228 0.2611 1.6194 0.1054
## BARNETT MadeleineSWE 0.0739 0.2036 0.3631 0.7166
## BARNETT MadeleineTHA -0.1871 0.1885 -0.9924 0.3210
## BARNETT MadeleineTPE -0.2526 0.1242 -2.0329 0.0421
## BARNETT MadeleineUKR -0.0246 0.0844 -0.2915 0.7706
## BARNETT MadeleineUSA -0.0810 0.0732 -1.1069 0.2684
## BOOTHROYD SydneyAUS 0.0206 0.0844 0.2445 0.8069
## BOOTHROYD SydneyAUT -0.3131 0.2616 -1.1967 0.2315
## BOOTHROYD SydneyBLR -0.1156 0.2827 -0.4090 0.6826
## BOOTHROYD SydneyBRA 0.3632 0.1633 2.2237 0.0262
## BOOTHROYD SydneyCAN -0.1244 0.1063 -1.1703 0.2419
## BOOTHROYD SydneyCHN 0.2762 0.0839 3.2921 0.0010
## BOOTHROYD SydneyCOL -0.1575 0.1880 -0.8379 0.4021
## BOOTHROYD SydneyCUB -0.0314 0.1202 -0.2617 0.7936
## BOOTHROYD SydneyESP 0.0521 0.1431 0.3643 0.7157
## BOOTHROYD SydneyFRA -0.1786 0.1827 -0.9777 0.3282
## BOOTHROYD SydneyGBR 0.3037 0.1158 2.6223 0.0087
## BOOTHROYD SydneyGER 0.0071 0.0924 0.0764 0.9391
## BOOTHROYD SydneyGRE 0.1688 0.1930 0.8743 0.3820
## BOOTHROYD SydneyHUN -0.1402 0.1605 -0.8732 0.3826
## BOOTHROYD SydneyINA -0.1931 0.2681 -0.7203 0.4714
## BOOTHROYD SydneyITA -0.0679 0.1291 -0.5260 0.5989
## BOOTHROYD SydneyJPN 0.1170 0.1132 1.0339 0.3012
## BOOTHROYD SydneyKAZ 0.0309 0.1804 0.1712 0.8641
## BOOTHROYD SydneyKOR 0.3826 0.1665 2.2977 0.0216
## BOOTHROYD SydneyMAS 0.0820 0.1559 0.5261 0.5989
## BOOTHROYD SydneyMEX 0.1172 0.1367 0.8574 0.3913
## BOOTHROYD SydneyPER -0.2921 0.1892 -1.5441 0.1226
## BOOTHROYD SydneyPHI -0.5540 0.3065 -1.8075 0.0707
## BOOTHROYD SydneyPRK -0.0241 0.1075 -0.2242 0.8226
## BOOTHROYD SydneyROM 0.0597 0.1870 0.3192 0.7496
## BOOTHROYD SydneyRUS -0.0130 0.0841 -0.1542 0.8774
## BOOTHROYD SydneySUI 0.1471 0.3065 0.4799 0.6313
## BOOTHROYD SydneyTHA 0.2038 0.1892 1.0776 0.2812
## BOOTHROYD SydneyTPE -0.0132 0.2592 -0.0511 0.9593
## BOOTHROYD SydneyUKR -0.2796 0.1311 -2.1338 0.0329
## BOOTHROYD SydneyUSA 0.1434 0.0840 1.7074 0.0878
## BOUSSARD MichelAUS 0.0262 0.0655 0.3997 0.6894
## BOUSSARD MichelAUT -0.2028 0.2584 -0.7850 0.4325
## BOUSSARD MichelBLR -0.1579 0.2146 -0.7358 0.4619
## BOUSSARD MichelBRA -0.0230 0.1412 -0.1626 0.8708
## BOUSSARD MichelCAN -0.0254 0.0831 -0.3060 0.7596
## BOUSSARD MichelCHN 0.1196 0.0608 1.9677 0.0491
## BOUSSARD MichelCOL -0.1621 0.1672 -0.9696 0.3323
## BOUSSARD MichelCUB -0.0389 0.1104 -0.3529 0.7242
## BOUSSARD MichelESP -0.0905 0.1377 -0.6573 0.5110
## BOUSSARD MichelFRA 0.1763 0.1426 1.2368 0.2162
## BOUSSARD MichelGBR 0.0710 0.0868 0.8178 0.4135
## BOUSSARD MichelGER 0.0459 0.0687 0.6679 0.5042
## BOUSSARD MichelGRE -0.1815 0.1650 -1.0999 0.2714
## BOUSSARD MichelHUN -0.0637 0.1114 -0.5719 0.5674
## BOUSSARD MichelINA -0.0068 0.2043 -0.0331 0.9736
## BOUSSARD MichelITA 0.0707 0.1086 0.6506 0.5153
## BOUSSARD MichelJPN 0.1039 0.0942 1.1031 0.2700
## BOUSSARD MichelKAZ 0.0214 0.1064 0.2010 0.8407
## BOUSSARD MichelKOR 0.1105 0.1646 0.6717 0.5018
## BOUSSARD MichelMAS 0.1662 0.1395 1.1916 0.2335
## BOUSSARD MichelMEX -0.0119 0.0903 -0.1315 0.8954
## BOUSSARD MichelPER 0.0239 0.1888 0.1268 0.8991
## BOUSSARD MichelPHI 0.1787 0.2765 0.6462 0.5182
## BOUSSARD MichelPRK -0.0472 0.0963 -0.4902 0.6240
## BOUSSARD MichelPUR 0.5998 0.3092 1.9400 0.0524
## BOUSSARD MichelROM -0.0929 0.1860 -0.4994 0.6175
## BOUSSARD MichelRUS 0.0610 0.0630 0.9679 0.3331
## BOUSSARD MichelSUI -0.7202 0.2765 -2.6044 0.0092
## BOUSSARD MichelSWE -0.0942 0.1391 -0.6768 0.4986
## BOUSSARD MichelTHA 0.1832 0.1888 0.9701 0.3320
## BOUSSARD MichelTPE -0.0181 0.1732 -0.1048 0.9165
## BOUSSARD MichelUKR 0.0721 0.0891 0.8096 0.4182
## BOUSSARD MichelUSA 0.0063 0.0609 0.1034 0.9176
## BOYS BeverleyAUS 0.0661 0.0921 0.7178 0.4729
## BOYS BeverleyAUT -0.0230 0.2616 -0.0878 0.9300
## BOYS BeverleyBLR -0.1589 0.2827 -0.5619 0.5742
## BOYS BeverleyBRA 0.1325 0.1633 0.8112 0.4172
## BOYS BeverleyCAN 0.2210 0.1267 1.7436 0.0813
## BOYS BeverleyCHN -0.0811 0.0842 -0.9633 0.3354
## BOYS BeverleyCOL 0.2159 0.1879 1.1489 0.2506
## BOYS BeverleyCUB 0.0191 0.1201 0.1587 0.8739
## BOYS BeverleyESP -0.0820 0.1431 -0.5732 0.5665
## BOYS BeverleyFRA -0.2218 0.1827 -1.2145 0.2246
## BOYS BeverleyGBR -0.1435 0.1008 -1.4233 0.1547
## BOYS BeverleyGER 0.0679 0.0853 0.7959 0.4261
## BOYS BeverleyGRE 0.4589 0.1930 2.3773 0.0175
## BOYS BeverleyHUN -0.0526 0.1259 -0.4182 0.6758
## BOYS BeverleyINA 0.2637 0.2681 0.9837 0.3253
## BOYS BeverleyITA -0.0342 0.1291 -0.2652 0.7909
## BOYS BeverleyJPN 0.1441 0.1141 1.2630 0.2066
## BOYS BeverleyKAZ -0.1790 0.1804 -0.9922 0.3211
## BOYS BeverleyKOR -0.2162 0.1665 -1.2985 0.1941
## BOYS BeverleyMAS 0.0388 0.1559 0.2488 0.8036
## BOYS BeverleyMEX -0.1983 0.1125 -1.7632 0.0779
## BOYS BeverleyPER -0.1686 0.1891 -0.8917 0.3726
## BOYS BeverleyPHI -0.4305 0.3065 -1.4048 0.1601
## BOYS BeverleyPRK -0.1078 0.1280 -0.8419 0.3999
## BOYS BeverleyROM -0.1502 0.1869 -0.8035 0.4217
## BOYS BeverleyRUS 0.0509 0.0918 0.5541 0.5795
## BOYS BeverleySUI 0.4372 0.3065 1.4265 0.1538
## BOYS BeverleyTHA 0.2439 0.1891 1.2898 0.1972
## BOYS BeverleyTPE -0.2231 0.2592 -0.8608 0.3894
## BOYS BeverleyUKR 0.0521 0.1310 0.3978 0.6908
## BOYS BeverleyUSA -0.0312 0.0843 -0.3698 0.7116
## BURK Hans-PeterAUS 0.1279 0.1438 0.8894 0.3738
## BURK Hans-PeterBRA 0.0201 0.2579 0.0781 0.9378
## BURK Hans-PeterCAN -0.1228 0.1456 -0.8438 0.3988
## BURK Hans-PeterCHN 0.1221 0.1432 0.8527 0.3939
## BURK Hans-PeterCOL -0.1820 0.2655 -0.6856 0.4930
## BURK Hans-PeterCUB -0.4049 0.1671 -2.4228 0.0154
## BURK Hans-PeterESP 0.0004 0.2559 0.0017 0.9987
## BURK Hans-PeterFRA 0.0661 0.2559 0.2583 0.7962
## BURK Hans-PeterGBR 0.1684 0.1619 1.0404 0.2982
## BURK Hans-PeterGER 0.4477 0.1444 3.1001 0.0019
## BURK Hans-PeterHUN 0.3801 0.2573 1.4772 0.1396
## BURK Hans-PeterINA 0.0052 0.2674 0.0195 0.9844
## BURK Hans-PeterITA 0.0037 0.2026 0.0185 0.9853
## BURK Hans-PeterJPN -0.3977 0.1976 -2.0126 0.0442
## BURK Hans-PeterKAZ -0.0529 0.1995 -0.2650 0.7910
## BURK Hans-PeterKOR 0.0467 0.2039 0.2290 0.8189
## BURK Hans-PeterMAS 0.1008 0.1930 0.5226 0.6013
## BURK Hans-PeterMEX 0.0610 0.2204 0.2767 0.7821
## BURK Hans-PeterPER -0.0956 0.2675 -0.3574 0.7208
## BURK Hans-PeterPRK -0.1161 0.1475 -0.7869 0.4314
## BURK Hans-PeterROM 0.0881 0.2608 0.3378 0.7356
## BURK Hans-PeterRUS -0.2268 0.1435 -1.5808 0.1140
## BURK Hans-PeterTHA 0.3003 0.2675 1.1225 0.2617
## BURK Hans-PeterUKR -0.1400 0.1826 -0.7668 0.4432
## BURK Hans-PeterUSA -0.0181 0.1433 -0.1264 0.8994
## CALDERON FelixAUS 0.0229 0.0666 0.3443 0.7307
## CALDERON FelixAUT 0.1621 0.1193 1.3583 0.1744
## CALDERON FelixBLR 0.1613 0.3065 0.5261 0.5988
## CALDERON FelixBRA 0.0709 0.1358 0.5220 0.6017
## CALDERON FelixCAN -0.0861 0.0756 -1.1378 0.2552
## CALDERON FelixCHN -0.1160 0.0610 -1.9009 0.0573
## CALDERON FelixCOL 0.1351 0.1917 0.7050 0.4808
## CALDERON FelixCUB 0.3572 0.1079 3.3090 0.0009
## CALDERON FelixESP 0.1042 0.1114 0.9357 0.3494
## CALDERON FelixFRA -0.1911 0.1316 -1.4521 0.1465
## CALDERON FelixGBR -0.1852 0.0881 -2.1022 0.0356
## CALDERON FelixGER -0.1074 0.0673 -1.5951 0.1107
## CALDERON FelixGRE -0.0282 0.1377 -0.2046 0.8379
## CALDERON FelixHUN -0.0892 0.1245 -0.7160 0.4740
## CALDERON FelixINA -0.4509 0.1869 -2.4122 0.0159
## CALDERON FelixITA 0.1057 0.1291 0.8190 0.4128
## CALDERON FelixJPN 0.1073 0.0942 1.1394 0.2546
## CALDERON FelixKAZ 0.1821 0.1002 1.8177 0.0691
## CALDERON FelixKOR -0.1929 0.1446 -1.3343 0.1822
## CALDERON FelixMAS -0.0896 0.1340 -0.6689 0.5036
## CALDERON FelixMEX 0.0484 0.0958 0.5053 0.6134
## CALDERON FelixPER 0.1070 0.1887 0.5673 0.5706
## CALDERON FelixPHI 0.6507 0.3405 1.9109 0.0561
## CALDERON FelixPRK -0.2970 0.0828 -3.5852 0.0003
## CALDERON FelixPUR 0.2075 0.2111 0.9831 0.3256
## CALDERON FelixROM -0.1767 0.1390 -1.2709 0.2038
## CALDERON FelixRUS -0.1071 0.0655 -1.6346 0.1022
## CALDERON FelixSUI -0.9816 0.3405 -2.8826 0.0040
## CALDERON FelixTHA 0.1830 0.1887 0.9696 0.3323
## CALDERON FelixTPE 0.2233 0.1606 1.3906 0.1644
## CALDERON FelixUKR -0.0404 0.0920 -0.4390 0.6607
## CALDERON FelixUSA 0.0273 0.0631 0.4337 0.6646
## CERMAKOVA MariaAUS -0.0707 0.1445 -0.4892 0.6247
## CERMAKOVA MariaBLR -0.3079 0.2435 -1.2647 0.2060
## CERMAKOVA MariaBRA -0.1225 0.3077 -0.3981 0.6906
## CERMAKOVA MariaCAN -0.0394 0.1694 -0.2328 0.8159
## CERMAKOVA MariaCHN -0.0018 0.1439 -0.0126 0.9900
## CERMAKOVA MariaCOL -0.1627 0.3150 -0.5165 0.6055
## CERMAKOVA MariaCUB 0.3136 0.3056 1.0260 0.3049
## CERMAKOVA MariaFRA -0.1319 0.2232 -0.5908 0.5547
## CERMAKOVA MariaGBR -0.0843 0.1710 -0.4926 0.6223
## CERMAKOVA MariaGER 0.0913 0.1965 0.4648 0.6421
## CERMAKOVA MariaGRE -0.5695 0.3082 -1.8480 0.0646
## CERMAKOVA MariaHUN -0.0148 0.2268 -0.0652 0.9480
## CERMAKOVA MariaINA 0.4404 0.3105 1.4183 0.1562
## CERMAKOVA MariaITA -0.1320 0.1769 -0.7460 0.4557
## CERMAKOVA MariaKAZ 0.0256 0.1712 0.1493 0.8813
## CERMAKOVA MariaMAS 0.3452 0.3070 1.1242 0.2609
## CERMAKOVA MariaMEX -0.0338 0.1485 -0.2276 0.8200
## CERMAKOVA MariaPHI 0.2371 0.3467 0.6839 0.4941
## CERMAKOVA MariaPRK 0.5553 0.2191 2.5348 0.0113
## CERMAKOVA MariaPUR 0.2416 0.3091 0.7816 0.4345
## CERMAKOVA MariaRUS 0.1989 0.1441 1.3806 0.1674
## CERMAKOVA MariaSUI 0.1881 0.3467 0.5427 0.5873
## CERMAKOVA MariaSWE -0.0858 0.2059 -0.4167 0.6769
## CERMAKOVA MariaTPE -0.7832 0.2271 -3.4493 0.0006
## CERMAKOVA MariaUKR 0.0849 0.1463 0.5800 0.5619
## CERMAKOVA MariaUSA -0.1253 0.1440 -0.8698 0.3844
## CRUZ JuliaAUS -0.0301 0.0776 -0.3880 0.6980
## CRUZ JuliaAUT -0.1475 0.2616 -0.5639 0.5728
## CRUZ JuliaBLR 0.3833 0.2827 1.3558 0.1752
## CRUZ JuliaBRA 0.1421 0.1604 0.8858 0.3758
## CRUZ JuliaCAN 0.0654 0.1059 0.6178 0.5367
## CRUZ JuliaCHN -0.1773 0.0728 -2.4358 0.0149
## CRUZ JuliaCOL -0.5033 0.1855 -2.7128 0.0067
## CRUZ JuliaCUB 0.1726 0.1182 1.4596 0.1444
## CRUZ JuliaESP 0.3633 0.1397 2.5999 0.0093
## CRUZ JuliaFRA 0.0125 0.1805 0.0694 0.9447
## CRUZ JuliaGBR -0.0715 0.0982 -0.7283 0.4665
## CRUZ JuliaGER -0.0912 0.0778 -1.1725 0.2410
## CRUZ JuliaGRE -0.1657 0.1930 -0.8585 0.3906
## CRUZ JuliaHUN -0.2098 0.1216 -1.7259 0.0844
## CRUZ JuliaINA 0.1410 0.2679 0.5262 0.5988
## CRUZ JuliaITA -0.0161 0.1270 -0.1268 0.8991
## CRUZ JuliaJPN -0.0338 0.0960 -0.3522 0.7247
## CRUZ JuliaKAZ 0.2047 0.1568 1.3058 0.1916
## CRUZ JuliaKOR 0.2881 0.1648 1.7482 0.0805
## CRUZ JuliaMAS -0.0580 0.1547 -0.3750 0.7077
## CRUZ JuliaMEX -0.0813 0.1073 -0.7580 0.4485
## CRUZ JuliaPER -0.2099 0.1844 -1.1378 0.2552
## CRUZ JuliaPHI -0.8884 0.3065 -2.8989 0.0038
## CRUZ JuliaPRK 0.0924 0.1074 0.8600 0.3898
## CRUZ JuliaROM 0.2451 0.1837 1.3341 0.1822
## CRUZ JuliaRUS -0.0298 0.0774 -0.3851 0.7002
## CRUZ JuliaSUI 0.4793 0.3065 1.5639 0.1179
## CRUZ JuliaTHA 0.3261 0.1844 1.7679 0.0771
## CRUZ JuliaTPE -0.1810 0.2592 -0.6984 0.4850
## CRUZ JuliaUKR 0.2544 0.1292 1.9688 0.0490
## CRUZ JuliaUSA 0.0049 0.0729 0.0674 0.9463
## GEAR DennisAUS -0.0363 0.0873 -0.4157 0.6776
## GEAR DennisAUT -0.1044 0.1279 -0.8156 0.4147
## GEAR DennisBLR -0.0524 0.3071 -0.1707 0.8644
## GEAR DennisBRA 0.0528 0.1626 0.3248 0.7453
## GEAR DennisCAN 0.0304 0.1015 0.2994 0.7647
## GEAR DennisCHN 0.0704 0.0750 0.9378 0.3484
## GEAR DennisCOL 0.6799 0.2684 2.5336 0.0113
## GEAR DennisCUB 0.1909 0.1401 1.3632 0.1729
## GEAR DennisESP -0.1008 0.1222 -0.8248 0.4095
## GEAR DennisFRA -0.0629 0.1680 -0.3743 0.7082
## GEAR DennisGBR -0.0148 0.1063 -0.1391 0.8894
## GEAR DennisGER -0.1434 0.0814 -1.7625 0.0780
## GEAR DennisGRE 0.2338 0.1453 1.6086 0.1077
## GEAR DennisHUN 0.2133 0.1389 1.5356 0.1247
## GEAR DennisINA -1.0627 0.3136 -3.3889 0.0007
## GEAR DennisITA 0.4496 0.1617 2.7797 0.0055
## GEAR DennisJPN -0.0416 0.1307 -0.3179 0.7506
## GEAR DennisKAZ 0.0867 0.1152 0.7526 0.4517
## GEAR DennisKOR -0.0155 0.2206 -0.0703 0.9439
## GEAR DennisMAS -0.1812 0.1968 -0.9209 0.3571
## GEAR DennisMEX 0.0885 0.1070 0.8271 0.4082
## GEAR DennisPER 0.3933 0.2653 1.4827 0.1382
## GEAR DennisPHI 0.4370 0.3410 1.2815 0.2000
## GEAR DennisPRK -0.0763 0.1213 -0.6290 0.5294
## GEAR DennisPUR -0.2624 0.2314 -1.1341 0.2568
## GEAR DennisROM -0.0993 0.1740 -0.5704 0.5684
## GEAR DennisRUS 0.0022 0.0847 0.0257 0.9795
## GEAR DennisSUI -0.5286 0.3410 -1.5502 0.1211
## GEAR DennisTHA -0.4374 0.2653 -1.6489 0.0992
## GEAR DennisTPE -0.2161 0.1688 -1.2804 0.2004
## GEAR DennisUKR 0.1308 0.1106 1.1820 0.2372
## GEAR DennisUSA 0.2116 0.0790 2.6793 0.0074
## GEISSBUHLER MichaelAUS -0.0431 0.0936 -0.4602 0.6454
## GEISSBUHLER MichaelAUT 0.0636 0.1477 0.4304 0.6669
## GEISSBUHLER MichaelBLR 0.1500 0.2702 0.5552 0.5788
## GEISSBUHLER MichaelBRA -0.2416 0.2023 -1.1941 0.2325
## GEISSBUHLER MichaelCAN -0.1257 0.0884 -1.4215 0.1552
## GEISSBUHLER MichaelCHN -0.2207 0.0802 -2.7520 0.0059
## GEISSBUHLER MichaelCOL -0.0742 0.2768 -0.2682 0.7885
## GEISSBUHLER MichaelCUB -0.2432 0.2004 -1.2138 0.2249
## GEISSBUHLER MichaelESP 0.2481 0.1959 1.2667 0.2053
## GEISSBUHLER MichaelFRA -0.0116 0.1484 -0.0785 0.9374
## GEISSBUHLER MichaelGBR 0.0680 0.1337 0.5085 0.6112
## GEISSBUHLER MichaelGER 0.0668 0.0983 0.6790 0.4971
## GEISSBUHLER MichaelGRE 0.2139 0.1738 1.2304 0.2186
## GEISSBUHLER MichaelHUN 0.0148 0.1974 0.0748 0.9404
## GEISSBUHLER MichaelINA -0.2470 0.2065 -1.1960 0.2317
## GEISSBUHLER MichaelITA -0.2923 0.1750 -1.6702 0.0949
## GEISSBUHLER MichaelKAZ -0.0012 0.0964 -0.0125 0.9900
## GEISSBUHLER MichaelKOR -0.3582 0.4475 -0.8005 0.4235
## GEISSBUHLER MichaelMAS 0.3711 0.2020 1.8373 0.0662
## GEISSBUHLER MichaelMEX 0.0827 0.1264 0.6542 0.5130
## GEISSBUHLER MichaelPHI 0.3227 0.3341 0.9660 0.3341
## GEISSBUHLER MichaelPRK -0.0891 0.1140 -0.7814 0.4346
## GEISSBUHLER MichaelPUR -0.2555 0.1749 -1.4613 0.1440
## GEISSBUHLER MichaelROM -0.3414 0.2411 -1.4160 0.1568
## GEISSBUHLER MichaelRUS 0.0322 0.0849 0.3789 0.7048
## GEISSBUHLER MichaelSUI 1.3016 0.3341 3.8959 0.0001
## GEISSBUHLER MichaelSWE -0.1099 0.1450 -0.7578 0.4486
## GEISSBUHLER MichaelTPE -0.2049 0.1495 -1.3706 0.1705
## GEISSBUHLER MichaelUKR 0.0868 0.0950 0.9130 0.3613
## GEISSBUHLER MichaelUSA -0.0867 0.0848 -1.0226 0.3065
## HASSAN MostafaAUS 0.0591 0.0927 0.6378 0.5236
## HASSAN MostafaAUT 0.2125 0.1483 1.4326 0.1520
## HASSAN MostafaBLR 0.3969 0.2430 1.6332 0.1025
## HASSAN MostafaBRA -0.1429 0.2191 -0.6522 0.5143
## HASSAN MostafaCAN 0.3159 0.0887 3.5602 0.0004
## HASSAN MostafaCHN 0.2508 0.0799 3.1398 0.0017
## HASSAN MostafaCOL -0.6579 0.3153 -2.0868 0.0369
## HASSAN MostafaCUB 0.1211 0.2177 0.5565 0.5779
## HASSAN MostafaESP -0.1105 0.1963 -0.5632 0.5733
## HASSAN MostafaFRA 0.1997 0.1596 1.2515 0.2108
## HASSAN MostafaGBR 0.0832 0.1361 0.6113 0.5410
## HASSAN MostafaGER 0.3634 0.1012 3.5891 0.0003
## HASSAN MostafaGRE 0.1883 0.1831 1.0284 0.3038
## HASSAN MostafaHUN -0.0100 0.2261 -0.0444 0.9646
## HASSAN MostafaINA -0.1702 0.2213 -0.7693 0.4418
## HASSAN MostafaITA -0.0558 0.1754 -0.3181 0.7504
## HASSAN MostafaKAZ -0.1729 0.0968 -1.7867 0.0740
## HASSAN MostafaKOR -0.3002 0.4476 -0.6706 0.5025
## HASSAN MostafaMAS -0.4024 0.2187 -1.8396 0.0659
## HASSAN MostafaMEX 0.0297 0.1240 0.2397 0.8105
## HASSAN MostafaPHI -0.0082 0.3473 -0.0235 0.9813
## HASSAN MostafaPRK 0.1787 0.1187 1.5051 0.1323
## HASSAN MostafaPUR -0.0748 0.1839 -0.4066 0.6843
## HASSAN MostafaROM -0.0335 0.2414 -0.1386 0.8898
## HASSAN MostafaRUS 0.1279 0.0844 1.5154 0.1297
## HASSAN MostafaSUI -0.8071 0.3473 -2.3242 0.0201
## HASSAN MostafaSWE 0.1523 0.1407 1.0822 0.2792
## HASSAN MostafaTPE 0.1002 0.1612 0.6215 0.5343
## HASSAN MostafaUKR -0.1115 0.0939 -1.1869 0.2353
## HASSAN MostafaUSA 0.0798 0.0843 0.9460 0.3442
## HOOD RobinAUS 0.0639 0.0798 0.8015 0.4229
## HOOD RobinBLR -0.1756 0.2431 -0.7224 0.4701
## HOOD RobinBRA 0.4021 0.1991 2.0192 0.0435
## HOOD RobinCAN -0.0312 0.0901 -0.3469 0.7287
## HOOD RobinCHN 0.1047 0.0755 1.3876 0.1653
## HOOD RobinCOL -0.3353 0.2049 -1.6361 0.1019
## HOOD RobinCUB -0.1700 0.1478 -1.1496 0.2503
## HOOD RobinESP 0.1106 0.2571 0.4304 0.6669
## HOOD RobinFRA -0.0385 0.1693 -0.2273 0.8202
## HOOD RobinGBR 0.0888 0.1192 0.7448 0.4564
## HOOD RobinGER 0.1535 0.0920 1.6683 0.0953
## HOOD RobinGRE -0.1372 0.3087 -0.4445 0.6567
## HOOD RobinHUN 0.0201 0.1714 0.1173 0.9066
## HOOD RobinINA 0.5183 0.2047 2.5321 0.0114
## HOOD RobinITA 0.0699 0.1344 0.5200 0.6031
## HOOD RobinJPN 0.1017 0.1358 0.7488 0.4540
## HOOD RobinKAZ 0.1406 0.1117 1.2588 0.2081
## HOOD RobinKOR 0.3236 0.2043 1.5835 0.1133
## HOOD RobinMAS -0.0224 0.1652 -0.1354 0.8923
## HOOD RobinMEX 0.3573 0.1234 2.8961 0.0038
## HOOD RobinPER 0.1812 0.2688 0.6742 0.5002
## HOOD RobinPHI -0.8307 0.3477 -2.3891 0.0169
## HOOD RobinPRK 0.1973 0.1060 1.8619 0.0627
## HOOD RobinPUR 0.1738 0.3096 0.5614 0.5746
## HOOD RobinROM 0.0316 0.2620 0.1207 0.9040
## HOOD RobinRUS 0.1854 0.0757 2.4507 0.0143
## HOOD RobinSUI -0.3796 0.3477 -1.0918 0.2750
## HOOD RobinSWE -0.1702 0.1405 -1.2112 0.2258
## HOOD RobinTHA -0.7562 0.2688 -2.8128 0.0049
## HOOD RobinTPE -0.2259 0.2264 -0.9978 0.3184
## HOOD RobinUKR 0.0763 0.1016 0.7509 0.4527
## HOOD RobinUSA 0.2643 0.0756 3.4981 0.0005
## HUBER PeterAUS -0.2251 0.0968 -2.3255 0.0201
## HUBER PeterAUT 0.4361 0.1669 2.6131 0.0090
## HUBER PeterBLR 0.1142 0.2698 0.4234 0.6720
## HUBER PeterBRA -0.3130 0.1825 -1.7153 0.0863
## HUBER PeterCAN -0.2513 0.0976 -2.5751 0.0100
## HUBER PeterCHN -0.0387 0.0862 -0.4495 0.6531
## HUBER PeterCOL 0.5567 0.2764 2.0141 0.0440
## HUBER PeterCUB -0.1248 0.1803 -0.6924 0.4887
## HUBER PeterESP 0.0328 0.1653 0.1986 0.8425
## HUBER PeterFRA -0.0031 0.1347 -0.0228 0.9818
## HUBER PeterGBR -0.2359 0.1224 -1.9272 0.0540
## HUBER PeterGER -0.1582 0.1025 -1.5428 0.1229
## HUBER PeterGRE 0.0970 0.1520 0.6385 0.5232
## HUBER PeterHUN -0.1043 0.1969 -0.5298 0.5962
## HUBER PeterINA -0.0533 0.1866 -0.2857 0.7751
## HUBER PeterITA -0.2031 0.1744 -1.1643 0.2443
## HUBER PeterKAZ -0.2538 0.0994 -2.5538 0.0107
## HUBER PeterKOR 0.3670 0.2609 1.4063 0.1597
## HUBER PeterMAS 0.1812 0.1819 0.9960 0.3193
## HUBER PeterMEX -0.0696 0.1171 -0.5946 0.5521
## HUBER PeterPHI -0.0464 0.3338 -0.1389 0.8895
## HUBER PeterPRK 0.0694 0.1219 0.5696 0.5690
## HUBER PeterPUR -0.0942 0.1665 -0.5658 0.5715
## HUBER PeterROM 0.1260 0.1933 0.6515 0.5147
## HUBER PeterRUS -0.0653 0.0864 -0.7562 0.4496
## HUBER PeterSUI 0.4325 0.3338 1.2957 0.1951
## HUBER PeterSWE -0.1456 0.1444 -1.0087 0.3131
## HUBER PeterTPE -0.0046 0.1410 -0.0327 0.9739
## HUBER PeterUKR 0.0645 0.0983 0.6566 0.5114
## HUBER PeterUSA -0.1423 0.0863 -1.6488 0.0992
## JOHNSON BenteAUS 0.2652 0.1108 2.3944 0.0167
## JOHNSON BenteAUT -0.3223 0.2592 -1.2435 0.2137
## JOHNSON BenteBLR 0.2921 0.3072 0.9507 0.3418
## JOHNSON BenteBRA -0.1867 0.1922 -0.9716 0.3313
## JOHNSON BenteCAN 0.1421 0.2499 0.5687 0.5696
## JOHNSON BenteCHN 0.2343 0.0980 2.3902 0.0169
## JOHNSON BenteCOL 0.1911 0.2687 0.7111 0.4771
## JOHNSON BenteCUB -0.1770 0.1582 -1.1189 0.2632
## JOHNSON BenteESP -0.1762 0.1603 -1.0993 0.2716
## JOHNSON BenteFRA 0.1985 0.2551 0.7782 0.4365
## JOHNSON BenteGBR -0.2318 0.1218 -1.9026 0.0571
## JOHNSON BenteGER -0.1444 0.0992 -1.4561 0.1454
## JOHNSON BenteGRE 0.0423 0.1933 0.2187 0.8269
## JOHNSON BenteHUN -0.0673 0.1403 -0.4793 0.6318
## JOHNSON BenteITA 0.3496 0.1629 2.1463 0.0319
## JOHNSON BenteJPN -0.0721 0.1321 -0.5455 0.5854
## JOHNSON BenteKAZ 0.3012 0.2517 1.1966 0.2315
## JOHNSON BenteKOR -0.7338 0.2612 -2.8090 0.0050
## JOHNSON BenteMAS 0.1635 0.2561 0.6386 0.5231
## JOHNSON BenteMEX 0.1167 0.1227 0.9512 0.3415
## JOHNSON BentePER 0.4045 0.2655 1.5233 0.1277
## JOHNSON BentePHI -0.0519 0.3410 -0.1521 0.8791
## JOHNSON BentePRK -0.0590 0.2507 -0.2352 0.8140
## JOHNSON BenteROM 0.3602 0.2580 1.3960 0.1627
## JOHNSON BenteRUS 0.0695 0.1105 0.6289 0.5294
## JOHNSON BenteSUI -0.5175 0.3410 -1.5176 0.1292
## JOHNSON BenteTHA -0.5929 0.2655 -2.2328 0.0256
## JOHNSON BenteTPE 0.5714 0.2591 2.2055 0.0274
## JOHNSON BenteUKR 0.0589 0.1820 0.3239 0.7460
## JOHNSON BenteUSA -0.0211 0.0982 -0.2153 0.8296
## KELEMEN IldikoAUS -0.1039 0.1238 -0.8393 0.4013
## KELEMEN IldikoAUT 0.2359 0.1321 1.7863 0.0741
## KELEMEN IldikoBRA -0.1260 0.2507 -0.5024 0.6154
## KELEMEN IldikoCAN -0.0678 0.1042 -0.6503 0.5155
## KELEMEN IldikoCHN -0.1278 0.1028 -1.2432 0.2138
## KELEMEN IldikoCUB -0.3522 0.2487 -1.4161 0.1568
## KELEMEN IldikoESP 0.1409 0.1645 0.8569 0.3915
## KELEMEN IldikoFRA 0.0736 0.1827 0.4030 0.6869
## KELEMEN IldikoGBR 0.0302 0.1784 0.1692 0.8656
## KELEMEN IldikoGER -0.0289 0.1241 -0.2329 0.8159
## KELEMEN IldikoGRE 0.0474 0.1843 0.2570 0.7972
## KELEMEN IldikoINA 0.1574 0.2549 0.6174 0.5370
## KELEMEN IldikoKAZ 0.0979 0.1193 0.8202 0.4121
## KELEMEN IldikoKOR 0.4126 0.2585 1.5958 0.1106
## KELEMEN IldikoMAS -0.1498 0.2504 -0.5984 0.5496
## KELEMEN IldikoMEX -0.5276 0.1788 -2.9508 0.0032
## KELEMEN IldikoPRK -0.0817 0.1254 -0.6516 0.5147
## KELEMEN IldikoPUR -0.2606 0.2097 -1.2432 0.2138
## KELEMEN IldikoROM 0.2549 0.1920 1.3277 0.1843
## KELEMEN IldikoRUS 0.1129 0.1164 0.9701 0.3320
## KELEMEN IldikoTPE 0.2248 0.1993 1.1283 0.2592
## KELEMEN IldikoUKR 0.0832 0.1251 0.6650 0.5060
## LINDBERG MathzAUS 0.0774 0.0821 0.9430 0.3457
## LINDBERG MathzAUT 0.2337 0.1470 1.5897 0.1119
## LINDBERG MathzBRA -0.0152 0.1974 -0.0770 0.9386
## LINDBERG MathzCAN -0.0949 0.0823 -1.1542 0.2484
## LINDBERG MathzCHN 0.1075 0.0757 1.4206 0.1555
## LINDBERG MathzCOL -0.7357 0.2656 -2.7701 0.0056
## LINDBERG MathzCUB -0.0960 0.1462 -0.6570 0.5112
## LINDBERG MathzESP 0.0843 0.1539 0.5480 0.5837
## LINDBERG MathzFRA 0.1949 0.1677 1.1621 0.2452
## LINDBERG MathzGBR 0.0926 0.1303 0.7108 0.4772
## LINDBERG MathzGER 0.1255 0.0894 1.4038 0.1604
## LINDBERG MathzGRE 0.1201 0.2257 0.5321 0.5947
## LINDBERG MathzHUN -0.0069 0.2573 -0.0269 0.9785
## LINDBERG MathzINA -0.2712 0.2021 -1.3417 0.1797
## LINDBERG MathzITA -0.0499 0.2020 -0.2472 0.8047
## LINDBERG MathzJPN -0.0773 0.1350 -0.5726 0.5669
## LINDBERG MathzKAZ -0.0594 0.1086 -0.5469 0.5844
## LINDBERG MathzKOR 0.0126 0.1812 0.0696 0.9445
## LINDBERG MathzMAS -0.2707 0.1631 -1.6594 0.0971
## LINDBERG MathzMEX 0.0571 0.1555 0.3674 0.7133
## LINDBERG MathzPER 0.3507 0.2678 1.3097 0.1903
## LINDBERG MathzPRK -0.0846 0.0911 -0.9292 0.3528
## LINDBERG MathzPUR -0.0550 0.2306 -0.2386 0.8114
## LINDBERG MathzROM 0.0272 0.1740 0.1565 0.8757
## LINDBERG MathzRUS -0.0168 0.0800 -0.2102 0.8335
## LINDBERG MathzTHA -0.0867 0.2678 -0.3238 0.7461
## LINDBERG MathzTPE 0.1590 0.2236 0.7112 0.4770
## LINDBERG MathzUKR 0.1944 0.1099 1.7691 0.0769
## LINDBERG MathzUSA -0.0147 0.0799 -0.1837 0.8543
## McFARLAND SteveAUS -0.0066 0.0729 -0.0903 0.9281
## McFARLAND SteveAUT -0.1752 0.1430 -1.2248 0.2207
## McFARLAND SteveBLR -0.2669 0.2143 -1.2451 0.2131
## McFARLAND SteveBRA -0.0954 0.1216 -0.7849 0.4326
## McFARLAND SteveCAN -0.0555 0.0833 -0.6667 0.5050
## McFARLAND SteveCHN -0.1449 0.0711 -2.0366 0.0417
## McFARLAND SteveCOL -0.0920 0.1624 -0.5666 0.5710
## McFARLAND SteveCUB 0.0304 0.0987 0.3081 0.7580
## McFARLAND SteveESP -0.2869 0.1073 -2.6753 0.0075
## McFARLAND SteveFRA 0.1266 0.1122 1.1282 0.2593
## McFARLAND SteveGBR 0.0801 0.0835 0.9595 0.3373
## McFARLAND SteveGER -0.1216 0.0774 -1.5705 0.1163
## McFARLAND SteveGRE -0.2970 0.1261 -2.3548 0.0186
## McFARLAND SteveHUN 0.1065 0.1276 0.8347 0.4039
## McFARLAND SteveINA 0.3159 0.1596 1.9801 0.0477
## McFARLAND SteveITA 0.0749 0.1052 0.7118 0.4766
## McFARLAND SteveJPN -0.0708 0.1303 -0.5435 0.5868
## McFARLAND SteveKAZ -0.0802 0.0910 -0.8815 0.3781
## McFARLAND SteveKOR 0.1908 0.1407 1.3564 0.1750
## McFARLAND SteveMAS -0.0583 0.1208 -0.4826 0.6294
## McFARLAND SteveMEX -0.0237 0.0859 -0.2758 0.7827
## McFARLAND StevePER 0.1858 0.1777 1.0459 0.2956
## McFARLAND StevePHI 0.7073 0.2763 2.5596 0.0105
## McFARLAND StevePRK -0.0133 0.0911 -0.1464 0.8836
## McFARLAND StevePUR 0.0650 0.1721 0.3776 0.7057
## McFARLAND SteveROM 0.1620 0.1349 1.2011 0.2297
## McFARLAND SteveRUS -0.1028 0.0712 -1.4432 0.1490
## McFARLAND SteveSUI -0.5917 0.2763 -2.1413 0.0323
## McFARLAND SteveSWE -0.0489 0.2038 -0.2401 0.8102
## McFARLAND SteveTHA 0.0518 0.1777 0.2913 0.7708
## McFARLAND SteveTPE 0.2665 0.1323 2.0146 0.0440
## McFARLAND SteveUKR -0.0608 0.0833 -0.7299 0.4655
## McFARLAND SteveUSA 0.2014 0.0712 2.8297 0.0047
## MENA JesusAUS 0.0570 0.0607 0.9393 0.3476
## MENA JesusAUT 0.1485 0.1145 1.2962 0.1949
## MENA JesusBLR -0.1472 0.2223 -0.6620 0.5080
## MENA JesusBRA 0.1559 0.1204 1.2944 0.1955
## MENA JesusCAN 0.0742 0.0655 1.1330 0.2572
## MENA JesusCHN -0.1075 0.0562 -1.9119 0.0559
## MENA JesusCOL 0.0783 0.1537 0.5093 0.6106
## MENA JesusCUB 0.1729 0.0982 1.7605 0.0784
## MENA JesusESP 0.0530 0.1073 0.4938 0.6215
## MENA JesusFRA -0.1429 0.1073 -1.3322 0.1828
## MENA JesusGBR -0.0257 0.0829 -0.3103 0.7564
## MENA JesusGER -0.1057 0.0650 -1.6264 0.1039
## MENA JesusGRE 0.0660 0.1208 0.5464 0.5848
## MENA JesusHUN -0.1873 0.1229 -1.5240 0.1275
## MENA JesusINA -0.3558 0.1505 -2.3639 0.0181
## MENA JesusITA -0.2378 0.1040 -2.2871 0.0222
## MENA JesusJPN 0.1139 0.1105 1.0308 0.3027
## MENA JesusKAZ -0.0479 0.0777 -0.6170 0.5372
## MENA JesusKOR 0.0738 0.1422 0.5189 0.6039
## MENA JesusMAS -0.2643 0.1170 -2.2583 0.0240
## MENA JesusMEX 0.3175 0.0868 3.6567 0.0003
## MENA JesusPER -0.1639 0.1838 -0.8921 0.3724
## MENA JesusPHI 0.1020 0.2610 0.3906 0.6961
## MENA JesusPRK -0.0999 0.0752 -1.3282 0.1841
## MENA JesusPUR -0.0640 0.1654 -0.3867 0.6990
## MENA JesusROM -0.0368 0.1339 -0.2747 0.7836
## MENA JesusRUS -0.0981 0.0580 -1.6910 0.0909
## MENA JesusSUI 0.4419 0.2610 1.6928 0.0905
## MENA JesusSWE 0.2471 0.1430 1.7278 0.0841
## MENA JesusTHA -0.0447 0.1838 -0.2431 0.8080
## MENA JesusTPE -0.3168 0.1241 -2.5538 0.0107
## MENA JesusUKR -0.0922 0.0731 -1.2616 0.2071
## MENA JesusUSA 0.0756 0.0579 1.3056 0.1917
## RUIZ-PEDREGUERA RolandoAUS -0.1117 0.0844 -1.3245 0.1854
## RUIZ-PEDREGUERA RolandoAUT -0.5190 0.2620 -1.9810 0.0476
## RUIZ-PEDREGUERA RolandoBLR 0.0813 0.2232 0.3641 0.7158
## RUIZ-PEDREGUERA RolandoBRA 0.0801 0.1628 0.4923 0.6225
## RUIZ-PEDREGUERA RolandoCAN 0.2209 0.1138 1.9410 0.0523
## RUIZ-PEDREGUERA RolandoCHN -0.0257 0.0742 -0.3464 0.7290
## RUIZ-PEDREGUERA RolandoCOL 0.2002 0.1943 1.0304 0.3028
## RUIZ-PEDREGUERA RolandoCUB 0.3104 0.1385 2.2402 0.0251
## RUIZ-PEDREGUERA RolandoESP 0.1603 0.1658 0.9670 0.3336
## RUIZ-PEDREGUERA RolandoFRA -0.1442 0.1530 -0.9422 0.3461
## RUIZ-PEDREGUERA RolandoGBR -0.1522 0.0992 -1.5341 0.1250
## RUIZ-PEDREGUERA RolandoGER -0.2786 0.0813 -3.4256 0.0006
## RUIZ-PEDREGUERA RolandoGRE 0.1296 0.1579 0.8207 0.4118
## RUIZ-PEDREGUERA RolandoHUN -0.1458 0.1156 -1.2605 0.2075
## RUIZ-PEDREGUERA RolandoINA 0.4569 0.2620 1.7438 0.0812
## RUIZ-PEDREGUERA RolandoITA -0.1208 0.1245 -0.9703 0.3320
## RUIZ-PEDREGUERA RolandoJPN 0.1761 0.1343 1.3109 0.1899
## RUIZ-PEDREGUERA RolandoKAZ -0.1598 0.1149 -1.3903 0.1645
## RUIZ-PEDREGUERA RolandoKOR -0.0387 0.2601 -0.1487 0.8818
## RUIZ-PEDREGUERA RolandoMAS 0.0240 0.1826 0.1313 0.8955
## RUIZ-PEDREGUERA RolandoMEX 0.1373 0.0969 1.4160 0.1568
## RUIZ-PEDREGUERA RolandoPER -0.3313 0.2588 -1.2802 0.2005
## RUIZ-PEDREGUERA RolandoPHI 0.1012 0.2618 0.3867 0.6990
## RUIZ-PEDREGUERA RolandoPRK -0.1382 0.1489 -0.9281 0.3534
## RUIZ-PEDREGUERA RolandoPUR 0.2679 0.2542 1.0538 0.2920
## RUIZ-PEDREGUERA RolandoROM -0.1051 0.2572 -0.4086 0.6829
## RUIZ-PEDREGUERA RolandoRUS -0.2302 0.0792 -2.9071 0.0037
## RUIZ-PEDREGUERA RolandoSUI 0.5245 0.2618 2.0035 0.0452
## RUIZ-PEDREGUERA RolandoSWE -0.0869 0.1444 -0.6019 0.5472
## RUIZ-PEDREGUERA RolandoTHA 0.1780 0.2588 0.6877 0.4917
## RUIZ-PEDREGUERA RolandoTPE -0.1169 0.1557 -0.7508 0.4528
## RUIZ-PEDREGUERA RolandoUKR -0.0427 0.1018 -0.4195 0.6749
## RUIZ-PEDREGUERA RolandoUSA -0.0873 0.0743 -1.1750 0.2400
## SEAMAN KathyAUS 0.0397 0.1163 0.3413 0.7329
## SEAMAN KathyAUT 0.1544 0.1945 0.7939 0.4273
## SEAMAN KathyBLR 0.4319 0.2703 1.5977 0.1102
## SEAMAN KathyBRA -0.2597 0.2026 -1.2821 0.1999
## SEAMAN KathyCAN 0.1747 0.1171 1.4925 0.1356
## SEAMAN KathyCHN -0.1639 0.1099 -1.4916 0.1359
## SEAMAN KathyCOL 0.5743 0.2769 2.0740 0.0381
## SEAMAN KathyCUB -0.0613 0.2006 -0.3057 0.7599
## SEAMAN KathyESP -0.3533 0.1961 -1.8012 0.0717
## SEAMAN KathyFRA -0.2297 0.1487 -1.5450 0.1224
## SEAMAN KathyGBR 0.0082 0.1340 0.0614 0.9511
## SEAMAN KathyGER -0.0503 0.1271 -0.3956 0.6924
## SEAMAN KathyGRE -0.1613 0.1741 -0.9266 0.3542
## SEAMAN KathyHUN -0.0033 0.1977 -0.0168 0.9866
## SEAMAN KathyINA 0.1349 0.2068 0.6523 0.5142
## SEAMAN KathyITA -0.0604 0.1753 -0.3446 0.7304
## SEAMAN KathyKAZ -0.2071 0.1188 -1.7435 0.0813
## SEAMAN KathyKOR 0.1237 0.4476 0.2764 0.7822
## SEAMAN KathyMAS -0.5469 0.2022 -2.7045 0.0069
## SEAMAN KathyMEX -0.0783 0.1267 -0.6176 0.5369
## SEAMAN KathyPHI -0.3620 0.3342 -1.0831 0.2788
## SEAMAN KathyPRK -0.1043 0.1337 -0.7801 0.4354
## SEAMAN KathyPUR 0.0121 0.1751 0.0692 0.9448
## SEAMAN KathyROM 0.0155 0.2413 0.0641 0.9489
## SEAMAN KathyRUS 0.0624 0.1102 0.5664 0.5711
## SEAMAN KathySUI 0.7835 0.3342 2.3442 0.0191
## SEAMAN KathySWE -0.1654 0.2047 -0.8082 0.4190
## SEAMAN KathyTPE 0.0770 0.1498 0.5137 0.6075
## SEAMAN KathyUKR -0.0638 0.1177 -0.5421 0.5877
## SEAMAN KathyUSA -0.1274 0.1101 -1.1571 0.2473
## STEWART AntheaAUS 0.2055 0.1438 1.4287 0.1531
## STEWART AntheaBRA 0.2310 0.2579 0.8960 0.3703
## STEWART AntheaCAN 0.0047 0.1456 0.0324 0.9741
## STEWART AntheaCHN 0.0497 0.1432 0.3468 0.7288
## STEWART AntheaCOL 0.1955 0.2655 0.7366 0.4614
## STEWART AntheaCUB -0.0899 0.1671 -0.5377 0.5908
## STEWART AntheaESP 0.3780 0.2559 1.4769 0.1397
## STEWART AntheaFRA 0.1103 0.2559 0.4311 0.6664
## STEWART AntheaGBR 0.1085 0.1619 0.6702 0.5028
## STEWART AntheaGER -0.1748 0.1444 -1.2103 0.2262
## STEWART AntheaHUN 0.0910 0.2573 0.3536 0.7237
## STEWART AntheaINA 0.0494 0.2674 0.1849 0.8533
## STEWART AntheaITA -0.0187 0.2026 -0.0922 0.9265
## STEWART AntheaJPN -0.0201 0.1976 -0.1018 0.9189
## STEWART AntheaKAZ -0.2753 0.1995 -1.3799 0.1677
## STEWART AntheaKOR 0.0909 0.2039 0.4460 0.6556
## STEWART AntheaMAS 0.2284 0.1930 1.1836 0.2366
## STEWART AntheaMEX -0.0615 0.2204 -0.2790 0.7803
## STEWART AntheaPER -0.3847 0.2675 -1.4380 0.1505
## STEWART AntheaPRK 0.2115 0.1475 1.4338 0.1517
## STEWART AntheaROM -0.5344 0.2608 -2.0493 0.0405
## STEWART AntheaRUS 0.0507 0.1435 0.3535 0.7237
## STEWART AntheaTHA 0.0112 0.2675 0.0419 0.9666
## STEWART AntheaUKR -0.0958 0.1826 -0.5246 0.5999
## STEWART AntheaUSA 0.1094 0.1433 0.7635 0.4452
## WANG FachengAUS -0.3813 0.0995 -3.8341 0.0001
## WANG FachengAUT -0.5508 0.2585 -2.1303 0.0332
## WANG FachengBLR -0.4364 0.3068 -1.4227 0.1549
## WANG FachengBRA -0.0950 0.1572 -0.6046 0.5454
## WANG FachengCAN -0.2614 0.1263 -2.0690 0.0386
## WANG FachengCHN -0.0431 0.0989 -0.4354 0.6633
## WANG FachengCOL 0.2041 0.1923 1.0612 0.2886
## WANG FachengCUB 0.1472 0.1183 1.2436 0.2137
## WANG FachengESP -0.1051 0.1386 -0.7579 0.4485
## WANG FachengFRA 0.2116 0.1828 1.1580 0.2469
## WANG FachengGBR 0.0420 0.1133 0.3710 0.7107
## WANG FachengGER -0.2848 0.0999 -2.8500 0.0044
## WANG FachengGRE -0.5195 0.1923 -2.7022 0.0069
## WANG FachengHUN -0.0668 0.1551 -0.4308 0.6666
## WANG FachengINA 0.4417 0.2683 1.6462 0.0998
## WANG FachengITA 0.2342 0.1302 1.7986 0.0721
## WANG FachengJPN -0.1321 0.1344 -0.9829 0.3257
## WANG FachengKAZ 0.6246 0.1797 3.4761 0.0005
## WANG FachengKOR 0.2626 0.1653 1.5891 0.1121
## WANG FachengMAS 0.0322 0.1559 0.2068 0.8362
## WANG FachengMEX -0.1435 0.1326 -1.0819 0.2793
## WANG FachengPER 0.1760 0.1893 0.9296 0.3526
## WANG FachengPHI 0.5530 0.3406 1.6234 0.1045
## WANG FachengPRK 0.0353 0.1276 0.2769 0.7818
## WANG FachengROM 0.3092 0.1866 1.6572 0.0975
## WANG FachengRUS -0.1158 0.0992 -1.1676 0.2430
## WANG FachengSUI -1.0793 0.3406 -3.1683 0.0015
## WANG FachengTHA 0.2519 0.1893 1.3306 0.1834
## WANG FachengTPE 1.1763 0.2584 4.5514 0.0000
## WANG FachengUKR -0.1791 0.1308 -1.3694 0.1709
## WANG FachengUSA -0.2158 0.0990 -2.1795 0.0293
## XU YimingAUS -0.0295 0.1163 -0.2539 0.7996
## XU YimingAUT 0.1164 0.1945 0.5987 0.5494
## XU YimingBLR -0.0061 0.2703 -0.0225 0.9821
## XU YimingBRA -0.0977 0.2026 -0.4822 0.6297
## XU YimingCAN 0.0430 0.1171 0.3674 0.7133
## XU YimingCHN 0.2148 0.1099 1.9540 0.0507
## XU YimingCOL 0.3697 0.2769 1.3350 0.1819
## XU YimingCUB -0.1993 0.2006 -0.9934 0.3206
## XU YimingESP -0.3079 0.1961 -1.5699 0.1165
## XU YimingFRA -0.2177 0.1487 -1.4641 0.1432
## XU YimingGBR -0.1547 0.1340 -1.1544 0.2484
## XU YimingGER -0.0498 0.1271 -0.3917 0.6953
## XU YimingGRE 0.2293 0.1741 1.3168 0.1879
## XU YimingHUN 0.3754 0.1977 1.8991 0.0576
## XU YimingINA -0.1031 0.2068 -0.4986 0.6181
## XU YimingITA 0.0266 0.1753 0.1519 0.8793
## XU YimingKAZ -0.1513 0.1188 -1.2739 0.2027
## XU YimingKOR -0.9142 0.4476 -2.0426 0.0411
## XU YimingMAS 0.2151 0.2022 1.0635 0.2876
## XU YimingMEX 0.1338 0.1267 1.0554 0.2913
## XU YimingPHI 0.1000 0.3342 0.2992 0.7648
## XU YimingPRK -0.1423 0.1337 -1.0641 0.2873
## XU YimingPUR -0.2401 0.1751 -1.3713 0.1703
## XU YimingROM -0.0225 0.2413 -0.0932 0.9257
## XU YimingRUS -0.0867 0.1102 -0.7866 0.4315
## XU YimingSUI 0.5789 0.3342 1.7319 0.0833
## XU YimingSWE -0.2034 0.2047 -0.9937 0.3204
## XU YimingTPE 0.0890 0.1498 0.5940 0.5525
## XU YimingUKR -0.1018 0.1177 -0.8647 0.3873
## XU YimingUSA -0.1653 0.1101 -1.5020 0.1331
Note that the output of lsfit
matches the diving paper. For instance, we see the out of .35 for the coefficient of ALT-GER. As we have already considered judge's overall tenancies, the the quality of a dive, we may be reasonably confident that this value is meaningful. Of course, many of the coefficients are not calculated directly by the model, but are instead just linear combinations of the displayed values and thus are easy to find.