diff --git a/R/npde.R b/R/npde.R
index 9511f6d..8aef5bf 100644
--- a/R/npde.R
+++ b/R/npde.R
@@ -22,7 +22,7 @@
#' \donttest{
#' require(magrittr)
#' require(ggplot2)
-#'
+#'
#' obs <- obs_data[MDV==0]
#' sim <- sim_data[MDV==0]
#'
@@ -35,17 +35,21 @@
#' binning("eqcut", nbins=10) %>%
#' vpcstats()
#'
-#' plot(vpc) +
+#' plot(vpc) +
#' labs(x="Simulation-based Population Prediction", y="Normalized Prediction Distribution Error")
#' }
#'
#' @export
-npde <- function(o, ...) UseMethod("npde")
+npde <- function(o, ...)
+ UseMethod("npde")
#' @rdname npde
#' @export
-npde.tidyvpcobj <- function(o, id, data=o$data, smooth=FALSE, ...) {
-
+npde.tidyvpcobj <- function(o,
+ id,
+ data = o$data,
+ smooth = FALSE,
+ ...) {
obs <- rn <- y <- iter <- NULL
if (missing(id)) {
@@ -56,89 +60,96 @@ npde.tidyvpcobj <- function(o, id, data=o$data, smooth=FALSE, ...) {
if (is.null(id)) {
stop("No id specified")
}
-
- niter <- nrow(o$sim)/nrow(o$obs)
-
- calc.npde <- function(dv, iter, smooth=FALSE) {
- yobs <- dv[iter==0]
+
+ niter <- nrow(o$sim) / nrow(o$obs)
+
+ calc.npde <- function(dv, iter, smooth = FALSE) {
+ yobs <- dv[iter == 0]
nobs <- length(yobs)
niter <- max(iter) # = length(dv)/nobs - 1
- ysim <- matrix(dv[iter != 0], nrow=nobs, ncol=niter)
-
+ ysim <- matrix(dv[iter != 0], nrow = nobs, ncol = niter)
+
# -- Non-decorrelated --
-
+
pd.obs <- apply(ysim < yobs, 1, mean)
-
+
# Handle extremes
if (isTRUE(smooth)) {
- u <- runif(nobs, 0, 1/niter)
- pd.obs[pd.obs == 1] <- rep(1 - (1/niter), len=sum(pd.obs == 1))
+ u <- runif(nobs, 0, 1 / niter)
+ pd.obs[pd.obs == 1] <-
+ rep(1 - (1 / niter), len = sum(pd.obs == 1))
pd.obs <- pd.obs + u
} else {
- pd.obs[pd.obs == 0] <- 1/(2*niter)
- pd.obs[pd.obs == 1] <- 1 - 1/(2*niter)
+ pd.obs[pd.obs == 0] <- 1 / (2 * niter)
+ pd.obs[pd.obs == 1] <- 1 - 1 / (2 * niter)
}
-
+
# Normalize
npd.obs <- qnorm(pd.obs)
-
+
# Compute for simulated data
r <- apply(ysim, 1, rank)
- pd.sim <- r/(niter + 1) # +1 prevents Inf after normalization
+ pd.sim <- r / (niter + 1) # +1 prevents Inf after normalization
npd.sim <- qnorm(pd.sim)
-
+
# -- Decorrelated --
-
+
epred <- apply(ysim, 1, mean)
ec <- cov(t(ysim))
- ec.inv.chol <- chol(solve(ec)) # In future, should we consider different decorrelation methods?
-
+ ec.inv.chol <-
+ solve(chol(ec)) # In future, should we consider different decorrelation methods?
+
eres <- yobs - epred
esres <- ysim - epred
-
- ewres <- drop(ec.inv.chol %*% eres)
- eswres <- ec.inv.chol %*% esres
-
+
+ ewres <- drop(t(ec.inv.chol) %*% eres)
+ eswres <- t(ec.inv.chol) %*% esres
+
pde.obs <- apply(eswres < ewres, 1, mean)
-
+
# Handle extremes
if (isTRUE(smooth)) {
# Can use the same uniform as for pd, no need to call runif again
- pde.obs[pde.obs == 1] <- rep(1 - (1/niter), len=sum(pde.obs == 1))
+ pde.obs[pde.obs == 1] <-
+ rep(1 - (1 / niter), len = sum(pde.obs == 1))
pde.obs <- pde.obs + u
} else {
- pde.obs[pde.obs == 0] <- 1/(2*niter)
- pde.obs[pde.obs == 1] <- 1 - 1/(2*niter)
+ pde.obs[pde.obs == 0] <- 1 / (2 * niter)
+ pde.obs[pde.obs == 1] <- 1 - 1 / (2 * niter)
}
-
+
# Normalize
npde.obs <- qnorm(pde.obs)
-
+
# Compute for simulated data
r <- apply(eswres, 1, rank)
- pde.sim <- r/(niter + 1) # +1 prevents Inf after normalization
+ pde.sim <- r / (niter + 1) # +1 prevents Inf after normalization
npde.sim <- qnorm(pde.sim)
-
+
data.table(
- iter=iter,
- epred=epred,
- eres=c(eres, esres),
- ewres=c(ewres, eswres),
- npd=c(npd.obs, npd.sim),
- npde=c(npde.obs, npde.sim))
+ iter = iter,
+ epred = epred,
+ eres = c(eres, esres),
+ ewres = c(ewres, eswres),
+ npd = c(npd.obs, npd.sim),
+ npde = c(npde.obs, npde.sim)
+ )
}
-
+
obssim <- data.table(
y = c(o$obs$y, o$sim$y),
- id = rep(id, length.out=(niter + 1)*nrow(o$obs)),
- iter = rep(0:niter, each=nrow(o$obs)))
-
- obssim <- obssim[, rn := (1:.N)][, cbind(rn, calc.npde(y, iter, smooth=smooth)), by=id][order(rn)][, rn := NULL]
-
- npdeobs <- obssim[iter==0]
- npdesim <- obssim[iter!=0]
-
- update(o, npdeobs=npdeobs, npdesim=npdesim)
+ id = rep(id, length.out = (niter + 1) * nrow(o$obs)),
+ iter = rep(0:niter, each = nrow(o$obs))
+ )
+
+ obssim <-
+ obssim[, rn := (1:.N)][, cbind(rn, calc.npde(y, iter, smooth = smooth)), by =
+ id][order(rn)][, rn := NULL]
+
+ npdeobs <- obssim[iter == 0]
+ npdesim <- obssim[iter != 0]
+
+ update(o, npdeobs = npdeobs, npdesim = npdesim)
}
# vim: ts=2 sw=2 et
diff --git a/inst/extdata/NPDE/npdeobs.csv b/inst/extdata/NPDE/npdeobs.csv
index 9c0bcf9..464bb61 100644
--- a/inst/extdata/NPDE/npdeobs.csv
+++ b/inst/extdata/NPDE/npdeobs.csv
@@ -1,551 +1,551 @@
-id,iter,epred,eres,ewres,npd,npde
-1,0,32.98649,4.313509999999994,-0.3271833290278028,0.3318533464368165,-0.3054807880993974
-1,0,55.16439,7.0356100000000055,-0.0015369121595598667,0.3318533464368165,0.025068908258711057
-1,0,72.73415,1.3658499999999947,-0.2799363542950679,0.050153583464733656,-0.050153583464733656
-1,0,74.96015,0.1398499999999956,0.044897652427656295,0.0752698620998299,0.050153583464733656
-1,0,70.28047,-11.980469999999997,-0.5035166741992256,-0.7388468491852137,-0.4676987991145081
-1,0,61.19115,-13.091149999999999,-0.4211612124570493,-0.7721932141886849,-0.3853204664075676
-1,0,52.997370000000004,-7.1973700000000065,1.5595115566934803,-0.4124631294414046,1.4757910281791708
-1,0,36.29181,-18.291809999999998,-0.48797935685134153,-1.4050715603096322,-0.5828415072712162
-1,0,16.262574,-10.532574,-0.5191775635138232,-1.1263911290388005,-0.6744897501960817
-1,0,7.2422496,-5.6322496,-0.8878855369751157,-1.080319340814956,-0.9153650878428141
-1,0,1.659029759,-1.498029759,-0.6980356045936771,-0.7721932141886849,-0.7721932141886849
-2,0,32.91392,5.486080000000001,-0.30305788642276177,0.5244005127080407,-0.4399131656732338
-2,0,54.36598,3.034019999999998,-1.4430298402744184,0.2533471031357998,-1.6448536269514726
-2,0,72.7127,18.887299999999996,0.1476269728489672,0.9541652531461942,0.4399131656732339
-2,0,76.69794,21.90205999999999,1.4918577976552845,1.2815515655446008,1.2265281200366105
-2,0,69.77278,10.927220000000005,0.5888274221908052,0.7721932141886849,0.8064212470182404
-2,0,61.20712,-0.2071200000000033,-0.8165192507487175,0.0752698620998299,-0.7063025628400875
-2,0,52.42241,4.377589999999998,0.7843250460481205,0.41246312944140484,0.8064212470182404
-2,0,35.20014,-2.4001400000000004,0.07902324105266412,-0.17637416478086135,0.1004337205114699
-2,0,15.798852,-2.1988520000000005,1.0040605880679716,-0.050153583464733656,1.080319340814956
-2,0,7.1508851,-3.3008851,-0.5115154929314973,-0.4399131656732338,-0.5244005127080407
-2,0,1.611683345,-0.9376833450000001,-0.3774139640288944,-0.050153583464733656,-0.050153583464733656
-3,0,31.647474,42.45252599999999,0.9703074882498393,2.5758293035489,1.2265281200366105
-3,0,51.41016,62.58984,2.4462988781710036,2.5758293035489,2.3263478740408408
-3,0,69.29666,65.70334,0.9227144550794595,2.3263478740408408,0.9944578832097528
-3,0,72.74355,38.25645,-1.5381046901022142,1.8807936081512504,-1.6448536269514726
-3,0,66.65453,42.345470000000006,0.5730467881333068,2.053748910631822,0.7063025628400875
-3,0,57.6599,36.1401,2.334373154792326,1.8807936081512504,1.8807936081512504
-3,0,50.25955,18.64045000000001,3.158805084407755,1.4050715603096327,2.5758293035489
-3,0,34.794,-1.1939999999999955,1.544084527649178,0,1.8807936081512504
-3,0,15.648635,-8.098635000000002,0.45530806902972354,-0.8416212335729142,0.612812991016627
-3,0,7.1830721,-5.6930721,-0.8844942684135888,-1.080319340814956,-0.8416212335729142
-3,0,1.69543447,-1.63813447,-0.768866385369294,-1.17498679206609,-1.17498679206609
-4,0,33.13046,-9.23046,-0.6234462825918254,-0.5533847195556729,-0.612812991016627
-4,0,54.38464,-21.184639999999995,-1.6220369140845121,-1.1263911290388005,-1.7506860712521695
-4,0,73.58276,-8.982759999999999,-0.5926172219559462,-0.3853204664075676,-0.4958503473474532
-4,0,75.10723,-15.00723,-0.28964926257166446,-0.6744897501960817,-0.2018934791418509
-4,0,67.45665,4.4433500000000095,-0.4249926845809662,0.4399131656732339,-0.3853204664075676
-4,0,60.75565,7.044349999999994,1.017426177173176,0.5828415072712162,0.9944578832097528
-4,0,51.00847,6.091529999999999,1.9334644032386148,0.5828415072712162,1.7506860712521695
-4,0,35.287601,7.012398999999995,-0.04839949181127423,0.5828415072712162,0.050153583464733656
-4,0,15.886334100000001,18.413665899999998,0.7805450057851182,1.6448536269514715,0.8416212335729144
-4,0,7.20921866,10.09078134,-4.09973709298322,1.4757910281791708,-2.5758293035489
-4,0,1.6375878803,6.3124121197,3.1128459480037503,2.3263478740408408,2.3263478740408408
-5,0,30.89556,-2.095559999999999,0.6536975615043205,-0.0752698620998299,0.7721932141886849
-5,0,50.91278,-6.712779999999995,-0.22156182193524127,-0.3054807880993974,-0.17637416478086135
-5,0,70.51819,-16.31819,-2.139666504726693,-0.9541652531461942,-2.3263478740408408
-5,0,74.82976,-2.1297599999999903,-0.47693247243587766,-0.10043372051146975,-0.4676987991145081
-5,0,69.04273,0.1572699999999969,-0.178940885006248,0.1509692154967774,-0.22754497664114945
-5,0,61.18271,-3.4827099999999973,-0.40635868031528005,-0.2018934791418509,-0.4958503473474532
-5,0,53.21686,-1.6168599999999955,0.6444240052391232,-0.17637416478086135,0.7721932141886849
-5,0,38.01328,-7.013280000000002,0.5722511303380861,-0.5533847195556729,0.7063025628400875
-5,0,18.098743,-9.108742999999999,-1.1933082172584855,-1.17498679206609,-1.4050715603096322
-5,0,8.441635,-4.191635,-0.15900201653890345,-0.5533847195556729,-0.22754497664114945
-5,0,1.980586884,-1.6285868840000002,-0.7576835914018177,-0.8778962950512285,-0.8778962950512285
-6,0,31.65385,8.046150000000004,-0.3667762775138346,0.7388468491852137,-0.4399131656732338
-6,0,51.79885,7.0011499999999955,-0.7851439387415731,0.3318533464368165,-0.8416212335729142
-6,0,70.52856,14.571439999999996,-0.16771760436868122,0.7388468491852137,-0.2018934791418509
-6,0,71.75039,20.34961,1.3338785935773836,1.080319340814956,1.2815515655446008
-6,0,67.70093,15.599069999999998,1.6710271352900676,0.9541652531461942,1.8807936081512504
-6,0,59.91821,10.78179,1.5273024934432768,0.8416212335729144,1.5547735945968528
-6,0,51.40442,1.8955799999999954,-0.24001364636567685,0.4399131656732339,-0.050153583464733656
-6,0,36.11598,4.88402,-0.6451399429113981,0.5533847195556728,-0.5244005127080407
-6,0,16.843305,5.556694999999998,0.7732091187410906,0.6744897501960817,0.9153650878428139
-6,0,8.2162266,2.5837734,0.40856257143562585,0.6433454053929168,0.612812991016627
-6,0,2.13460391,0.6853960899999998,0.2179954219130615,0.6433454053929168,0.6433454053929168
-7,0,30.305673,-7.905673,-2.311249717768669,-0.612812991016627,-2.3263478740408408
-7,0,50.45624,-3.156240000000004,0.5020098090003703,-0.15096921549677725,0.5244005127080407
-7,0,69.03299,2.8670100000000076,1.3541841974954159,0.1509692154967774,1.4050715603096327
-7,0,71.25392,-1.9539199999999965,-0.19975381117007074,-0.10043372051146975,-0.3054807880993974
-7,0,67.03062,4.869380000000007,0.5112628205085079,0.35845879325119373,0.5533847195556728
-7,0,58.78452,-3.4845200000000034,-1.8999986446897312,-0.27931903444745404,-1.7506860712521695
-7,0,50.90107,14.098930000000003,0.45953152667491665,0.8778962950512288,0.49585034734745304
-7,0,35.993683,9.906317000000001,-0.339370782508988,0.8416212335729144,-0.27931903444745404
-7,0,16.9971381,8.902861899999998,0.8244219745407207,1.0364333894937894,0.8064212470182404
-7,0,8.12867732,4.47132268,0.6951726681066235,0.9541652531461942,0.6433454053929168
-7,0,2.1198473724,1.3801526275999998,0.4547689354138489,0.8778962950512288,0.8778962950512288
-8,0,30.50213,8.897869999999998,1.5958355914282545,0.8778962950512288,1.7506860712521695
-8,0,50.35428,5.745719999999999,0.4194153273208774,0.46769879911450835,0.46769879911450835
-8,0,69.13838,-1.438379999999995,-0.7904421856880685,-0.025068908258711057,-0.7388468491852137
-8,0,71.00996,0.5900399999999877,-0.13844480512728807,0,-0.2018934791418509
-8,0,65.8017,-1.7017000000000024,-0.13418064268899446,-0.125661346855074,0
-8,0,57.50904,1.7909599999999983,1.2410927739103481,0.20189347914185077,1.5547735945968528
-8,0,49.48443,-9.684430000000006,-0.5129825710424789,-0.7388468491852137,-0.4676987991145081
-8,0,35.254383,-8.254382999999997,-0.31322077301866746,-0.5828415072712162,-0.3318533464368165
-8,0,16.4409217,-5.5409217,-0.13862139932758305,-0.4124631294414046,-0.025068908258711057
-8,0,7.70709919,-3.5670991900000004,-0.15163183457030494,-0.3318533464368165,-0.17637416478086135
-8,0,1.981368427,-1.485368427,-0.5468938685769554,-0.3318533464368165,-0.3318533464368165
-9,0,33.6075,-10.907500000000002,-1.1199998733856884,-0.8416212335729142,-1.0364333894937894
-9,0,53.60861,-8.808610000000002,0.011060566173259907,-0.3853204664075676,-0.025068908258711057
-9,0,73.09997,-15.19997,-1.1693587529292604,-0.6744897501960817,-1.17498679206609
-9,0,73.953,8.447000000000003,1.0611726645056863,0.49585034734745304,1.080319340814956
-9,0,69.03407,-16.03407,-2.842254879656204,-0.9541652531461942,-2.5758293035489
-9,0,61.12286,3.377139999999997,-0.4502235035495014,0.35845879325119373,-0.2533471031357998
-9,0,50.84802,5.251980000000003,0.07466935060082724,0.3853204664075676,0.050153583464733656
-9,0,35.020516,3.879483999999998,0.6638722142785772,0.3318533464368165,0.7388468491852137
-9,0,16.112816,-1.6128159999999987,0.5560663421508545,-0.025068908258711057,0.8064212470182404
-9,0,7.6144193200000005,-2.5244193200000007,0.19155762283095457,-0.2018934791418509,0.20189347914185077
-9,0,1.8158749739,-1.2438749739000001,-0.49795527797638195,-0.27931903444745404,-0.27931903444745404
-10,0,31.57111,-7.371110000000002,0.11049969913202684,-0.6433454053929168,0.1509692154967774
-10,0,53.09727,-11.99727,0.30552246550528106,-0.4676987991145081,0.35845879325119373
-10,0,70.88617,-19.286170000000006,-1.176935165023856,-0.9153650878428141,-1.2815515655446008
-10,0,73.23445,-21.734449999999995,-0.49454950443963375,-1.3407550336902165,-0.4124631294414046
-10,0,69.22801,-19.92801,0.1547348723881134,-1.17498679206609,0.20189347914185077
-10,0,61.86628,-31.366280000000003,-2.237444066225957,-2.3263478740408408,-1.8807936081512509
-10,0,52.337180000000004,-15.937180000000005,-0.35129207259667244,-1.2815515655446008,-0.2533471031357998
-10,0,36.60179,-12.601790000000001,0.3481690915469613,-1.2815515655446008,0.3318533464368165
-10,0,17.52343,-12.073430000000002,-0.6331760464761774,-1.6448536269514726,-0.6744897501960817
-10,0,8.3378365,-6.8078365,-1.0090843082141103,-1.554773594596853,-1.1263911290388005
-10,0,2.133938161,-2.030938161,-0.7763702113839502,-1.2815515655446008,-1.2815515655446008
-11,0,32.05782,-7.85782,-1.2194768547164823,-0.4124631294414046,-1.4757910281791702
-11,0,52.57534,0.22466000000000008,0.5588686015120699,0.27931903444745404,0.7063025628400875
-11,0,68.92559,-2.8255900000000054,0.6433018886894877,0,0.6433454053929168
-11,0,73.08532,-12.085319999999996,-0.8834824078628006,-0.5828415072712162,-0.8416212335729142
-11,0,66.22493,-3.4249300000000034,0.17306017249660405,-0.025068908258711057,0.17637416478086118
-11,0,58.22184,-7.22184,-0.5905227556012889,-0.3054807880993974,-0.6744897501960817
-11,0,50.10844,-5.8084400000000045,-1.1413748252989637,-0.3318533464368165,-1.080319340814956
-11,0,35.06275,-0.5627500000000012,0.7021171180652637,0.050153583464733656,0.7063025628400875
-11,0,16.3244924,-4.3244924000000005,0.5185046340397711,-0.2018934791418509,0.7063025628400875
-11,0,7.75810345,-3.98810345,-0.28081977639845235,-0.3318533464368165,-0.15096921549677725
-11,0,1.94535670757,-1.57035670757,-0.5451891299189464,-0.4124631294414046,-0.4124631294414046
-12,0,32.06656,-7.366560000000003,-0.1503104090562768,-0.5244005127080407,-0.22754497664114945
-12,0,52.63218,-0.03217999999999677,0.7936320873128131,0.12566134685507413,0.9541652531461942
-12,0,70.7676,-6.9676000000000045,-0.4163181762478095,-0.3853204664075676,-0.4958503473474532
-12,0,75.25261,-2.15261000000001,-1.6085974133886256,-0.025068908258711057,-1.8807936081512509
-12,0,67.75347,17.546530000000004,1.3102686275148014,0.9944578832097528,1.2815515655446008
-12,0,59.74328,14.356719999999996,1.9468733052114375,0.9944578832097528,1.7506860712521695
-12,0,51.441900000000004,12.758099999999999,-0.10966936368960678,0.8778962950512288,-0.125661346855074
-12,0,37.38537,16.014629999999997,-0.4153445583480895,1.3407550336902165,-0.3318533464368165
-12,0,16.702301,12.197699,-4.002493860144265,1.4757910281791708,-2.5758293035489
-12,0,8.0054587,14.1945413,3.26704157550511,2.3263478740408408,2.5758293035489
-12,0,2.025490789,2.524509211,1.0464325558077572,1.080319340814956,1.080319340814956
-13,0,30.91024,0.5897599999999983,0.18714918212668874,0.3318533464368165,0.3318533464368165
-13,0,51.71224,-2.3122400000000027,-0.9384612503542609,-0.10043372051146975,-0.9541652531461942
-13,0,72.7964,-1.5964000000000027,-1.2854280577072483,-0.10043372051146975,-1.3407550336902165
-13,0,74.34071,13.659289999999999,0.7055907527159356,0.8416212335729144,0.6744897501960817
-13,0,69.34733,5.752669999999995,-0.0939681891877081,0.49585034734745304,-0.025068908258711057
-13,0,60.55243,4.847570000000005,0.21221541921136083,0.35845879325119373,0.2275449766411493
-13,0,51.6524,2.9476000000000013,0.06263600149876963,0.3853204664075676,0.050153583464733656
-13,0,36.03955,-0.6395499999999998,0.07922117046596255,0.0752698620998299,0.2275449766411493
-13,0,16.00582,0.7941800000000008,1.2702713195198165,0.3318533464368165,1.4757910281791708
-13,0,7.2819215999999996,-1.7419215999999995,-0.2590002971836276,-0.025068908258711057,-0.35845879325119373
-13,0,1.626813419,-0.4968134190000002,-0.21445991728967104,0.2275449766411493,0.2275449766411493
-14,0,32.416273,-5.7162729999999975,0.4158817429094082,-0.3318533464368165,0.41246312944140484
-14,0,53.47654,-1.3765399999999985,0.9115748235019725,0,1.2265281200366105
-14,0,72.05888,1.1411200000000008,0.2979301244939203,0.12566134685507413,0.3853204664075676
-14,0,74.20409,8.195910000000012,0.00122154824030285,0.5244005127080407,-0.10043372051146975
-14,0,67.70015,12.799850000000006,0.40425992654497434,0.8778962950512288,0.5533847195556728
-14,0,59.59063,18.20937,0.4601887782062283,1.0364333894937894,0.3853204664075676
-14,0,50.7706,12.929400000000001,-0.9222397477015218,0.9944578832097528,-0.8778962950512285
-14,0,34.73704,19.162959999999998,0.27814355310066063,1.6448536269514715,0.35845879325119373
-14,0,15.60488,17.89512,3.896059975923408,2.053748910631822,2.5758293035489
-14,0,7.3125215,5.7874785,-0.1904593918177424,1.080319340814956,-0.125661346855074
-14,0,1.8149014239999999,3.015098576,1.1457795166478655,1.4050715603096327,1.4050715603096327
-15,0,30.80775,0.19225000000000136,1.1604727650922013,0.1004337205114699,1.2815515655446008
-15,0,50.79576,-10.69576,-0.8147600671186549,-0.5244005127080407,-0.7388468491852137
-15,0,68.72773,-7.127729999999993,0.15709381639697417,-0.3054807880993974,0.2533471031357998
-15,0,71.110830000000007,-14.110830000000007,-0.1747645673465678,-0.8416212335729142,-0.2533471031357998
-15,0,65.37143,-13.67143,-0.5981305595475676,-0.9541652531461942,-0.5533847195556729
-15,0,57.31489,-11.91489,-0.3983410470664212,-0.7388468491852137,-0.3318533464368165
-15,0,49.05522,-10.255220000000001,-0.35949457511965266,-0.7063025628400875,-0.3853204664075676
-15,0,34.672645,-9.372645000000002,-0.3064965552900591,-0.5828415072712162,-0.2018934791418509
-15,0,15.92991,-6.039909999999999,-0.19755762220382223,-0.5244005127080407,-0.050153583464733656
-15,0,7.4911739,-3.6911739,-0.32363301909560405,-0.3054807880993974,-0.3054807880993974
-15,0,1.854818636,-1.253818636,-0.4766047001566884,-0.22754497664114945,-0.22754497664114945
-16,0,31.5144,-9.714399999999998,0.7576827445023488,-0.7721932141886849,0.8416212335729144
-16,0,51.88112,-23.681120000000004,-0.6123234498183856,-1.554773594596853,-0.5533847195556729
-16,0,71.56897,-25.46896999999999,-0.6068616612031106,-1.3407550336902165,-0.5244005127080407
-16,0,74.04428,-21.94428,-0.23562915698568387,-1.3407550336902165,-0.15096921549677725
-16,0,69.50291,-22.202910000000003,-1.641134578886674,-1.554773594596853,-1.7506860712521695
-16,0,60.71202,-3.112020000000001,0.8771286954375246,-0.125661346855074,1.0364333894937894
-16,0,52.55294,-13.452939999999998,-0.6619807182246589,-0.8778962950512285,-0.5533847195556729
-16,0,37.469633,-10.169633000000001,-1.0496461152651375,-0.8778962950512285,-1.1263911290388005
-16,0,17.2814569,-3.581456899999999,0.20557008790407533,-0.22754497664114945,0.35845879325119373
-16,0,8.27431972,-2.9643197199999998,-0.17617066693220074,-0.2018934791418509,-0.125661346855074
-16,0,2.036978611,-1.2289786109999998,-0.41835309507382173,-0.17637416478086135,-0.17637416478086135
-17,0,33.053628,20.346371999999995,3.0711926698806487,1.3407550336902165,2.5758293035489
-17,0,52.76529,11.334709999999994,-0.2904525309593575,0.7063025628400875,-0.15096921549677725
-17,0,72.68404,20.315960000000004,-0.24231755454960036,0.8416212335729144,-0.27931903444745404
-17,0,72.4172,28.582800000000006,1.575655000880728,1.4757910281791708,1.6448536269514715
-17,0,63.75925,-5.65925,-3.1578279445976434,-0.17637416478086135,-2.5758293035489
-17,0,56.48859,19.21141,0.7147648679202291,1.2815515655446008,0.7063025628400875
-17,0,47.10975,12.79025,1.2217250734295029,0.9541652531461942,1.2815515655446008
-17,0,32.593548,4.406452000000002,0.7140924159111308,0.5244005127080407,0.9153650878428139
-17,0,14.1971016,-0.7971015999999995,0.08998641727330689,-0.050153583464733656,0.20189347914185077
-17,0,6.53055625,-1.0005562499999998,0.4232583505704581,0.025068908258711057,0.5244005127080407
-17,0,1.4348947358,-0.6968947357999999,-0.36906692178767336,-0.025068908258711057,-0.025068908258711057
-18,0,31.64646,-9.446460000000002,-0.8823329780422109,-0.5828415072712162,-0.8778962950512285
-18,0,50.54937,-11.249370000000006,-0.7340551132168255,-0.5244005127080407,-0.7063025628400875
-18,0,70.52844,-19.128440000000005,-0.3799210302453059,-0.7388468491852137,-0.3054807880993974
-18,0,70.3076,-19.60759999999999,0.097496086229997,-1.080319340814956,0.050153583464733656
-18,0,64.6941,-21.494100000000003,-0.11711264457537435,-1.8807936081512509,-0.125661346855074
-18,0,57.57622,-24.17622,-0.3660102330149821,-1.6448536269514726,-0.35845879325119373
-18,0,48.38737,-22.387369999999997,-1.058071224778394,-2.0537489106318225,-1.1263911290388005
-18,0,33.508397,-16.608397000000004,-0.8821368519568993,-1.4757910281791702,-0.9541652531461942
-18,0,14.8437977,-9.473797699999999,-0.45389280356994144,-1.2265281200366105,-0.4676987991145081
-18,0,6.89533964,-5.505339640000001,-1.0346328634323803,-1.2815515655446008,-1.1263911290388005
-18,0,1.6550451646,-1.5746451646,-0.658903170651057,-1.17498679206609,-1.17498679206609
-19,0,30.642030000000002,-8.54203,-0.31987606075548103,-0.8064212470182404,-0.15096921549677725
-19,0,49.60836,-12.208359999999999,-0.6149623624442012,-0.6433454053929168,-0.4958503473474532
-19,0,68.80645,-10.506450000000001,-0.04823449597345505,-0.5533847195556729,-0.0752698620998299
-19,0,72.92941,-6.529409999999999,-0.2371820843198752,-0.15096921549677725,-0.3054807880993974
-19,0,67.90264,-1.302640000000011,0.012461172993869046,0.1004337205114699,0.050153583464733656
-19,0,60.50148,-0.10148000000000224,-0.3859613385238458,0.17637416478086118,-0.27931903444745404
-19,0,52.94633,0.6536699999999982,-0.7208750447890807,0.2275449766411493,-0.612812991016627
-19,0,38.15784,3.7421599999999984,-0.657562313706988,0.5828415072712162,-0.7721932141886849
-19,0,18.074631,5.125368999999999,1.1800336372440547,0.612812991016627,1.2815515655446008
-19,0,8.8164803,0.40351970000000037,0.518612751967938,0.27931903444745404,0.5828415072712162
-19,0,2.38702118,-0.53702118,-0.17189179232334972,0.2533471031357998,0.2533471031357998
-20,0,32.26288,-1.0628800000000034,0.4150759781154538,0.1004337205114699,0.49585034734745304
-20,0,52.17906,-4.279060000000001,-0.3627459384014118,0.025068908258711057,-0.3853204664075676
-20,0,68.45721,1.7427899999999994,0.3186083951278974,0.2275449766411493,0.3318533464368165
-20,0,70.26481,-1.3648099999999914,-1.2215580381083622,0,-1.2815515655446008
-20,0,64.60202,8.397980000000004,0.4642409608315357,0.6433454053929168,0.46769879911450835
-20,0,55.37977,2.4202299999999966,0.10392378161944901,0.35845879325119373,0.20189347914185077
-20,0,47.8074,-0.8074000000000012,-0.6015487077825127,-0.0752698620998299,-0.4676987991145081
-20,0,32.475829,2.3241709999999998,0.9857795381223415,0.17637416478086118,1.2265281200366105
-20,0,15.2275025,-3.5275025000000007,0.3422091188245533,-0.125661346855074,0.5828415072712162
-20,0,7.00580872,-3.12580872,0.007700699501000496,-0.15096921549677725,0.1004337205114699
-20,0,1.84086494905,-1.34586494905,-0.49153842728744285,-0.15096921549677725,-0.15096921549677725
-21,0,32.0139,-7.8139,-0.038123993579523396,-0.5244005127080407,0.12566134685507413
-21,0,52.34211,-14.44211,-0.04139001604510637,-0.612812991016627,-0.050153583464733656
-21,0,70.14758,-21.247580000000006,-0.6048178908820581,-1.080319340814956,-0.5533847195556729
-21,0,71.62987,-18.129869999999997,-0.7167152572897901,-0.9153650878428141,-0.4676987991145081
-21,0,66.11001,-17.310010000000005,-1.4238421947885684,-0.9944578832097528,-1.554773594596853
-21,0,58.65431,-9.754310000000004,-0.31477776777138466,-0.5533847195556729,-0.3853204664075676
-21,0,49.73717,-7.537169999999996,0.1524225091000566,-0.4124631294414046,0.1509692154967774
-21,0,34.81607,-10.216070000000002,-0.23893071841293134,-0.7063025628400875,-0.125661346855074
-21,0,16.548645,-7.308645,-0.24515357436365615,-0.5244005127080407,-0.22754497664114945
-21,0,7.824506,-4.424506000000001,-0.17003867006276052,-0.4958503473474532,-0.050153583464733656
-21,0,1.981246413,-1.6212464130000002,-0.6411049680431086,-0.4676987991145081,-0.4676987991145081
-22,0,35.23494,-6.734940000000002,-1.46394999015055,-0.17637416478086135,-1.6448536269514726
-22,0,57.52521,-1.1252100000000027,-0.21757892688343658,0.0752698620998299,-0.22754497664114945
-22,0,75.69579,16.404209999999992,1.7020601734119283,0.8064212470182404,1.6448536269514715
-22,0,76.87858,10.321420000000003,0.3558480161841553,0.6744897501960817,0.41246312944140484
-22,0,69.66951,13.830489999999998,-0.18110918448691504,0.9153650878428139,-0.050153583464733656
-22,0,59.34868,26.65132,1.219672965784457,2.053748910631822,1.6448536269514715
-22,0,50.69351,22.50649,0.7824980664110587,1.6448536269514715,0.7721932141886849
-22,0,34.42666,25.273340000000005,0.10538932934494172,2.3263478740408408,0.12566134685507413
-22,0,14.9517444,19.448255599999996,0.5458210538378756,2.053748910631822,0.6433454053929168
-22,0,7.1211663099999996,13.57883369,1.7004051109096587,1.8807936081512504,1.8807936081512504
-22,0,1.7631368958,4.636863104200001,1.5019655915181962,1.6448536269514715,1.6448536269514715
-23,0,30.77469,-7.674689999999998,-0.6982079396365896,-0.612812991016627,-0.8778962950512285
-23,0,50.74437,-12.04437,-0.6654564096049871,-0.6744897501960817,-0.5244005127080407
-23,0,67.62467,-9.124669999999995,-0.48325602807196305,-0.4399131656732338,-0.612812991016627
-23,0,72.324,-10.823999999999998,-0.7077337828812533,-0.4676987991145081,-0.6433454053929168
-23,0,68.17526,-6.675259999999994,0.04412470856660741,-0.3054807880993974,0.1004337205114699
-23,0,61.32764,-2.727640000000001,0.6659462858214619,-0.125661346855074,0.5828415072712162
-23,0,51.59881,-12.498809999999999,-0.989352598029544,-0.7388468491852137,-0.9944578832097528
-23,0,36.88018,-6.180180000000004,-0.16905970451732422,-0.612812991016627,-0.0752698620998299
-23,0,17.269746,-5.569746000000002,-0.3568343453825287,-0.35845879325119373,-0.35845879325119373
-23,0,8.0892946,-3.3892946000000004,-0.1097557434498373,-0.3318533464368165,-0.0752698620998299
-23,0,2.149186148,-1.6481861480000002,-0.5238810508825317,-0.4676987991145081,-0.4676987991145081
-24,0,31.18981,-6.489810000000002,0.5256347249164577,-0.5533847195556729,0.5244005127080407
-24,0,51.11877,-14.81877,-0.3490434284067889,-1.080319340814956,-0.2018934791418509
-24,0,70.81894,-13.218939999999996,0.1536884244861266,-0.7388468491852137,0.12566134685507413
-24,0,72.11027,-9.210270000000001,-0.8348288595916278,-0.4958503473474532,-0.9541652531461942
-24,0,69.59898,2.6010200000000054,-0.39650448996435117,0.2275449766411493,-0.4124631294414046
-24,0,60.92281,12.377189999999999,1.260223716068292,0.9541652531461942,1.4050715603096327
-24,0,51.78579,8.11421,-0.022175853591368977,0.612812991016627,-0.0752698620998299
-24,0,37.039665,7.260334999999998,-1.6335690938246332,0.5828415072712162,-1.8807936081512509
-24,0,17.6869023,13.8130977,-0.19976315162399638,1.2815515655446008,-0.15096921549677725
-24,0,8.34838231,9.85161769,1.175762989286413,1.17498679206609,1.3407550336902165
-24,0,2.1344955033,3.1355044966999994,1.0810437496979133,1.080319340814956,1.080319340814956
-25,0,31.31288,5.487119999999997,-0.5505652600892408,0.5533847195556728,-0.6433454053929168
-25,0,52.07501,-1.9750099999999975,-3.139074455388191,0.050153583464733656,-2.5758293035489
-25,0,71.56741,8.932590000000005,-1.8249267414362387,0.5244005127080407,-1.7506860712521695
-25,0,73.91909,34.08091,2.1353901704319473,1.7506860712521695,2.3263478740408408
-25,0,67.64013,11.759870000000006,0.68705259802475,0.7721932141886849,0.8416212335729144
-25,0,60.19922,6.000780000000006,0.8529348154635639,0.5244005127080407,0.9541652531461942
-25,0,51.25101,-3.551009999999998,-0.08561528062849133,-0.2018934791418509,0.0752698620998299
-25,0,36.16116,-3.261160000000004,1.1784506539662871,-0.3318533464368165,1.17498679206609
-25,0,16.532615,-7.852615,-0.42532680536104,-0.7388468491852137,-0.4399131656732338
-25,0,7.4179287,-4.2779287,-0.4500823652503012,-0.6744897501960817,-0.4676987991145081
-25,0,1.857431061,-1.601431061,-0.5711761167756462,-0.7063025628400875,-0.7063025628400875
-26,0,30.43859,-0.83859,0.13888874076038588,0.17637416478086118,0.17637416478086118
-26,0,54.46915,-0.2691499999999962,-0.08369538560575539,0.20189347914185077,-0.10043372051146975
-26,0,84.73071,-3.030709999999999,-0.45702461402145966,0,-0.35845879325119373
-26,0,99.74206,-0.042059999999992215,0.5702290951633139,0.12566134685507413,0.6433454053929168
-26,0,105.88431,1.1156900000000007,0.3710675301078682,0.1509692154967774,0.35845879325119373
-26,0,108.54331,-9.543310000000005,-0.3389647421845604,-0.3054807880993974,-0.3853204664075676
-26,0,107.78206,-5.782060000000001,0.44028816149354966,-0.025068908258711057,0.5828415072712162
-26,0,101.63562,-14.235619999999997,-0.3214952077105635,-0.4399131656732338,-0.2018934791418509
-26,0,87.18049,-15.980490000000003,0.42852841299781014,-0.7388468491852137,0.41246312944140484
-26,0,72.32761,-24.52761000000001,-0.662907753541639,-1.6448536269514726,-0.7721932141886849
-26,0,49.46234,-18.162339999999997,-1.2627560951105659,-1.17498679206609,-1.17498679206609
-27,0,33.83902,38.96098,0.31324025171434666,2.3263478740408408,0.41246312944140484
-27,0,58.74661,59.25339,0.5299151847762498,2.053748910631822,0.6433454053929168
-27,0,88.79966,82.20034,1.8195966334522378,2.053748910631822,1.8807936081512504
-27,0,105.04532,58.954679999999996,-1.0614542332598516,1.4050715603096327,-1.2265281200366105
-27,0,112.11857,66.88143,1.258881122207248,1.5547735945968528,1.2815515655446008
-27,0,114.87291,38.127089999999995,-1.482268303248099,1.080319340814956,-1.6448536269514726
-27,0,112.52349,66.47651,3.8021447200060594,1.5547735945968528,2.5758293035489
-27,0,106.55367,7.446330000000003,1.02058939660904,0.46769879911450835,0.9944578832097528
-27,0,89.05464,-14.65464,-0.36965147392856545,-0.7063025628400875,-0.27931903444745404
-27,0,73.45875,-18.358749999999993,0.24329470518813046,-1.080319340814956,0.3318533464368165
-27,0,50.75273,-30.25273,-2.0101425766052485,-1.8807936081512509,-1.8807936081512509
-28,0,32.431,-5.830999999999996,0.2178036344091975,-0.2018934791418509,0.20189347914185077
-28,0,56.78469,-15.684689999999996,-2.175333404927181,-0.5828415072712162,-2.5758293035489
-28,0,86.0802,-9.48020000000001,-0.6628005661029226,-0.125661346855074,-0.7721932141886849
-28,0,103.24001,16.759990000000002,1.5538491072789786,0.7063025628400875,1.6448536269514715
-28,0,112.22483,-3.224829999999997,0.06893024490157415,0.12566134685507413,0.0752698620998299
-28,0,114.33807,7.661929999999998,1.0277362728687278,0.46769879911450835,1.0364333894937894
-28,0,113.97487,-5.974869999999996,-0.65284453453398394,0,-0.5244005127080407
-28,0,108.2256,-3.2256,-1.0011070527321326,0.0752698620998299,-0.9541652531461942
-28,0,91.8752,20.124799999999993,0.8928449030772698,0.7721932141886849,1.080319340814956
-28,0,75.19557,9.90442999999999,-0.5054106935302503,0.612812991016627,-0.6433454053929168
-28,0,51.76723,16.332769999999996,1.086449331007783,1.2265281200366105,1.2265281200366105
-29,0,34.63483,7.9651700000000005,-1.0502725124947019,0.612812991016627,-1.080319340814956
-29,0,60.84981,17.250189999999996,-0.4308647167201439,0.9541652531461942,-0.5828415072712162
-29,0,94.6439,45.3561,2.023179262190992,1.4757910281791708,2.3263478740408408
-29,0,111.28833,2.711669999999998,-2.2168814113146427,0.2275449766411493,-2.5758293035489
-29,0,117.27315,43.72685,1.642322368484038,1.5547735945968528,2.053748910631822
-29,0,119.48838,38.51161999999999,1.800888126577779,1.2265281200366105,1.5547735945968528
-29,0,120.9029,4.0970999999999975,-1.375842658018485,0.4399131656732339,-1.3407550336902165
-29,0,114.15478,5.845219999999998,-1.9999304727372864,0.4399131656732339,-2.3263478740408408
-29,0,91.79163,22.208370000000002,1.6275718348355621,1.17498679206609,1.6448536269514715
-29,0,76.17545,-2.775449999999992,0.9696424410097897,-0.15096921549677725,0.9541652531461942
-29,0,51.42789,-17.02789,-1.1540879443028134,-1.2265281200366105,-1.2265281200366105
-30,0,35.170641,-17.970641000000004,0.3261816401300575,-1.17498679206609,0.20189347914185077
-30,0,61.09683,-30.296829999999996,-0.40755020854192475,-1.3407550336902165,-0.3853204664075676
-30,0,93.08097,-37.280969999999996,-0.04936714679231461,-1.080319340814956,0.025068908258711057
-30,0,108.23859,-38.13859000000001,0.7027156991985298,-0.8778962950512285,0.7721932141886849
-30,0,117.54939,-53.44939000000001,-0.40240164355384844,-1.6448536269514726,-0.4958503473474532
-30,0,119.31887,-52.91887,-0.4824191516288797,-1.4050715603096322,-0.3853204664075676
-30,0,116.16423,-37.06423000000001,0.25658855151802124,-1.0364333894937894,0.20189347914185077
-30,0,109.86629,-37.666290000000004,-0.5059174403425333,-1.4050715603096322,-0.5244005127080407
-30,0,92.40439,-24.60439000000001,-0.588596124215829,-1.080319340814956,-0.612812991016627
-30,0,75.44289,-15.142890000000008,-0.951529622905128,-0.8064212470182404,-0.9944578832097528
-30,0,49.94382,-2.0438200000000037,-0.1324758043223026,-0.15096921549677725,-0.15096921549677725
-31,0,33.86128,42.83872,0.3860961808874051,2.3263478740408408,0.5244005127080407
-31,0,58.23953,70.76047,-1.9989135992133766,2.3263478740408408,-1.8807936081512509
-31,0,90.24248,112.75752,2.5316904484713247,2.5758293035489,1.8807936081512504
-31,0,106.92388,95.07612,0.6125559883506557,2.5758293035489,0.6433454053929168
-31,0,115.40493,104.59507,0.6773995997770799,2.5758293035489,0.7721932141886849
-31,0,115.41397,102.58603,0.7638790634312915,2.3263478740408408,0.7388468491852137
-31,0,116.46393,102.53607,3.853824752225953,2.5758293035489,2.5758293035489
-31,0,109.45805,42.54195,0.5709819086548381,1.4757910281791708,0.612812991016627
-31,0,91.31525,17.684749999999994,-0.07833360367538178,0.8778962950512288,0.050153583464733656
-31,0,77.09371,11.006289999999993,2.166711666971671,0.6744897501960817,2.053748910631822
-31,0,52.37909,-21.579089999999997,-1.42858779762907,-1.2815515655446008,-1.2815515655446008
-32,0,33.47248,-1.872479999999996,-1.0913128549096007,0.050153583464733656,-1.17498679206609
-32,0,58.8158,3.484199999999994,-0.47242104839966836,0.20189347914185077,-0.4958503473474532
-32,0,91.80295,13.197050000000004,1.2757021239735988,0.5828415072712162,1.4050715603096327
-32,0,107.63474,5.365260000000006,-0.027124296963012974,0.2275449766411493,-0.050153583464733656
-32,0,115.86559,22.134410000000003,1.779023746769065,0.7721932141886849,1.5547735945968528
-32,0,116.66288,-11.662880000000001,-1.0918862297755108,-0.3054807880993974,-1.17498679206609
-32,0,118.13547,2.864530000000002,-0.5604283511601745,0.20189347914185077,-0.5828415072712162
-32,0,108.90735,19.092650000000006,0.8445844085065051,0.7063025628400875,0.8778962950512288
-32,0,91.3857,12.6143,-0.1587169820695779,0.6433454053929168,-0.125661346855074
-32,0,72.94107,15.258930000000007,0.06621040655474264,0.8778962950512288,0.17637416478086118
-32,0,49.186956,17.713044000000004,0.9956658421478805,0.9944578832097528,0.9944578832097528
-33,0,36.183866,-4.783866000000003,-0.26194086112956566,-0.17637416478086135,-0.15096921549677725
-33,0,63.28795,1.9120500000000007,2.0382917190920367,0.0752698620998299,1.7506860712521695
-33,0,97.66181,-12.561810000000008,0.9666991860247472,-0.27931903444745404,1.17498679206609
-33,0,114.8352,-38.5352,-0.8763169322536837,-0.8778962950512285,-0.9541652531461942
-33,0,119.3279,-30.727900000000005,-0.5883944568875332,-0.7063025628400875,-0.5244005127080407
-33,0,121.64929,-21.649289999999993,0.08269513115754056,-0.4676987991145081,0.2533471031357998
-33,0,119.49242,-13.492419999999996,0.6641623742462275,-0.27931903444745404,0.6744897501960817
-33,0,109.10354,-27.20353999999999,-0.346238761675242,-0.7721932141886849,-0.4399131656732338
-33,0,89.93958,-15.239580000000004,-0.46014788814572744,-0.7721932141886849,-0.4124631294414046
-33,0,70.78442,-7.384419999999999,-0.664086777740518,-0.3054807880993974,-0.6744897501960817
-33,0,45.8258,0.5741999999999976,0.03749163560893469,0.1004337205114699,0.1004337205114699
-34,0,32.846003,-5.146003000000004,0.4965709867486269,-0.3318533464368165,0.5244005127080407
-34,0,57.46953,-5.969529999999999,1.0387518175402373,-0.2018934791418509,1.1263911290388005
-34,0,88.45005,-16.25005,0.7370352183118838,-0.3853204664075676,0.8064212470182404
-34,0,102.98376999999999,-32.78376999999999,-0.7181249395416658,-0.9153650878428141,-0.8064212470182404
-34,0,112.18761,-14.487610000000004,0.8567098857094156,-0.3054807880993974,0.9541652531461942
-34,0,114.7626,-31.262600000000006,-0.22384428407993104,-0.8778962950512285,-0.3318533464368165
-34,0,113.49555,-27.79554999999999,-0.12682293106770426,-0.7721932141886849,-0.125661346855074
-34,0,104.47742,-22.977419999999995,-0.8191777382417342,-0.9153650878428141,-0.8064212470182404
-34,0,91.05495,-22.854950000000002,-1.7270848196143473,-0.9541652531461942,-2.3263478740408408
-34,0,76.9284,2.371600000000001,0.9261470006829419,0.27931903444745404,1.080319340814956
-34,0,53.21942,-10.519419999999997,-0.6483356427432146,-0.6433454053929168,-0.6433454053929168
-35,0,33.70687,-7.8068700000000035,-1.6626278198334463,-0.5244005127080407,-1.7506860712521695
-35,0,58.28002,-4.380020000000002,0.03787196674672358,0.025068908258711057,0
-35,0,90.26905,-7.06904999999999,-0.46775063293984753,-0.2018934791418509,-0.3853204664075676
-35,0,108.56095,-5.560950000000005,-0.29776996502147307,-0.025068908258711057,-0.27931903444745404
-35,0,115.65106,-4.651060000000001,0.2901042137284828,-0.125661346855074,0.4399131656732339
-35,0,117.00376,-16.00376,-1.1253658423805866,-0.4958503473474532,-1.17498679206609
-35,0,119.86448,5.13552,1.0679276898531114,0.1509692154967774,1.080319340814956
-35,0,111.56446,-1.5644599999999969,0.9046209308976245,0.050153583464733656,0.8778962950512288
-35,0,91.199,-16.198999999999998,-0.37992746217755663,-0.7388468491852137,-0.3853204664075676
-35,0,76.59885,-11.798850000000002,-0.7929375822220874,-0.7388468491852137,-0.7388468491852137
-35,0,51.2864,-3.2864000000000004,-0.2207418175390094,-0.0752698620998299,-0.0752698620998299
-36,0,34.76948,33.83051999999999,-3.62626891626983,2.053748910631822,-2.5758293035489
-36,0,62.19328,88.80672,2.1604540355107695,2.5758293035489,1.8807936081512504
-36,0,92.69112,104.30888,1.051963047722384,2.3263478740408408,1.0364333894937894
-36,0,111.68341,109.31659,0.13007503926699907,2.3263478740408408,0.1509692154967774
-36,0,119.56324,133.43676,1.5675621388467074,2.5758293035489,1.5547735945968528
-36,0,121.36186000000001,118.63813999999999,2.574156028946092,2.3263478740408408,2.5758293035489
-36,0,119.30179,118.69821,2.5382702084090187,2.053748910631822,2.3263478740408408
-36,0,110.91067,69.08933,0.9960936934005594,1.6448536269514715,1.0364333894937894
-36,0,92.93766,44.062340000000006,-0.6659742616490748,1.4050715603096327,-0.7063025628400875
-36,0,77.10322,48.89678000000001,2.9230079903622532,1.7506860712521695,2.3263478740408408
-36,0,51.14185,8.958150000000003,0.5466725972530295,0.5533847195556728,0.5533847195556728
-37,0,34.26303,-13.863030000000002,1.1341523251237815,-1.080319340814956,1.2265281200366105
-37,0,59.53232,-29.732319999999998,-0.684952619575943,-1.6448536269514726,-0.6433454053929168
-37,0,92.42369,-28.423689999999993,0.522582823048314,-0.8778962950512285,0.612812991016627
-37,0,105.38446,-48.984460000000006,-3.2903379002552633,-1.6448536269514726,-2.5758293035489
-37,0,113.47236,-12.472359999999995,-0.5103802528459467,-0.050153583464733656,-0.4399131656732338
-37,0,115.38409,-11.38409,-1.1040999735969803,-0.2533471031357998,-1.17498679206609
-37,0,115.90002,-7.900019999999998,-1.7768007713978295,-0.10043372051146975,-2.0537489106318225
-37,0,109.66792,31.332080000000005,0.970391750117968,0.9944578832097528,0.9944578832097528
-37,0,90.55816,26.44184,0.2495763075620886,1.1263911290388005,0.3318533464368165
-37,0,73.05187,28.948130000000006,-0.0819426600280968,1.6448536269514715,-0.050153583464733656
-37,0,49.52268,35.07731999999999,2.209247771586971,2.053748910631822,2.053748910631822
-38,0,34.86035,-11.160349999999998,-0.21747093876210777,-0.5828415072712162,-0.2018934791418509
-38,0,60.1342,-17.934199999999997,-0.5524247894659465,-0.5533847195556729,-0.6744897501960817
-38,0,91.35145,-21.951449999999994,-0.08306406691237325,-0.4676987991145081,0.025068908258711057
-38,0,109.09658,-22.596580000000003,-0.31394467867780707,-0.4124631294414046,-0.4124631294414046
-38,0,113.57166,-17.17165999999999,-0.12746490778316866,-0.3054807880993974,-0.17637416478086135
-38,0,116.78019,-10.780190000000005,0.57247586538873,-0.2018934791418509,0.7063025628400875
-38,0,110.60588,-10.605879999999999,0.3979892786222071,-0.125661346855074,0.4399131656732339
-38,0,105.76445,-14.86444999999999,-0.5548163610630203,-0.5244005127080407,-0.6433454053929168
-38,0,87.16221,3.3377899999999983,0.7035215564375933,0.46769879911450835,0.9541652531461942
-38,0,71.16171,-3.561710000000005,-1.2681906693937797,-0.10043372051146975,-1.17498679206609
-38,0,47.5367,11.963299999999997,0.6953538710993041,0.8064212470182404,0.8064212470182404
-39,0,34.24566,-21.54566,-0.6097426861080908,-2.3263478740408408,-0.4958503473474532
-39,0,60.22407,-34.82407,-0.044197676280382334,-2.3263478740408408,-0.10043372051146975
-39,0,91.90304,-51.30304,-0.761968955609703,-2.3263478740408408,-0.7721932141886849
-39,0,104.89775,-52.69775,0.11060077118232742,-2.0537489106318225,0.1004337205114699
-39,0,113.69048,-55.59047999999999,-0.13330250438685393,-2.0537489106318225,-0.10043372051146975
-39,0,114.22153,-52.22153,-0.4140719698015001,-2.3263478740408408,-0.3054807880993974
-39,0,113.57057999999999,-51.770579999999995,-0.10769240376645292,-2.0537489106318225,-0.10043372051146975
-39,0,106.48026,-39.78026,0.10593710168767051,-1.6448536269514726,0.12566134685507413
-39,0,89.96994,-30.669939999999997,-1.1528382712739782,-1.7506860712521695,-1.4050715603096322
-39,0,74.87209,-19.572090000000003,-1.8277863229432856,-1.2265281200366105,-2.3263478740408408
-39,0,50.97511,4.224890000000002,0.2899446542606259,0.2533471031357998,0.2533471031357998
-40,0,33.2341,-17.734099999999998,-0.42157514169881166,-1.8807936081512509,-0.3853204664075676
-40,0,57.68149,-31.481489999999997,-0.6576983327672293,-2.0537489106318225,-0.612812991016627
-40,0,89.22919,-41.72919,-0.5718255102231976,-1.8807936081512509,-0.6433454053929168
-40,0,103.08826,-32.68826,1.0374709922618237,-1.1263911290388005,1.3407550336902165
-40,0,113.20365,-41.00364999999999,-0.06898059437123777,-1.3407550336902165,0.025068908258711057
-40,0,114.6628,-46.36280000000001,-0.9429458828320376,-1.6448536269514726,-0.9541652531461942
-40,0,111.77727,-32.17727000000001,-0.20670540885116773,-1.2815515655446008,-0.22754497664114945
-40,0,105.37992,-27.979919999999993,-1.076986540468144,-1.17498679206609,-1.17498679206609
-40,0,88.98219,-9.982190000000003,-1.0458069338368514,-0.4958503473474532,-1.17498679206609
-40,0,72.57964,3.2203599999999994,-0.5672315016420245,0.27931903444745404,-0.4676987991145081
-40,0,49.02254,12.077460000000002,0.8388026829918973,0.9153650878428139,0.9153650878428139
-41,0,32.62464,10.075360000000003,-0.4132677299207901,0.9541652531461942,-0.612812991016627
-41,0,57.56586,13.734139999999996,-0.9046188844181541,0.8416212335729144,-0.8778962950512285
-41,0,89.35037,33.64963,1.545290498899607,1.1263911290388005,1.6448536269514715
-41,0,105.95622,23.043779999999998,1.0416527823078618,0.8416212335729144,1.0364333894937894
-41,0,113.17076,19.82924,1.4610030027533563,0.612812991016627,1.5547735945968528
-41,0,117.59971,-6.599710000000002,0.3379905766389779,-0.22754497664114945,0.3318533464368165
-41,0,114.93825,-17.53824999999999,-0.5309856272941545,-0.612812991016627,-0.6433454053929168
-41,0,109.1525,-13.152500000000003,-0.5753050765414334,-0.5244005127080407,-0.612812991016627
-41,0,91.0679,-14.067899999999995,0.735677513447027,-0.6744897501960817,0.7721932141886849
-41,0,73.84795,-22.847949999999997,0.04859722077876083,-1.4757910281791702,0.1004337205114699
-41,0,49.883179999999996,-31.083179999999995,-2.040246829897791,-2.5758293035489,-2.5758293035489
-42,0,33.76874,4.33126,-2.3864465042942924,0.5533847195556728,-2.5758293035489
-42,0,59.97372,28.626279999999994,0.4511282417082578,0.9944578832097528,0.8416212335729144
-42,0,91.60654,44.393460000000005,-0.8676689376264136,1.2815515655446008,-0.8778962950512285
-42,0,107.85342,60.14658,0.25455524734300594,1.4757910281791708,0.3318533464368165
-42,0,115.39781,50.60218999999999,-2.6671348761874425,1.17498679206609,-2.3263478740408408
-42,0,116.94549,94.05451,1.3410204847126836,2.3263478740408408,1.3407550336902165
-42,0,115.86819,76.13181,0.49341327522848333,1.7506860712521695,0.5244005127080407
-42,0,110.23254,87.76746,1.4208340467904668,2.3263478740408408,1.3407550336902165
-42,0,92.66958,51.330420000000004,-0.718562324854314,2.5758293035489,-0.7388468491852137
-42,0,74.27367,64.72633,3.6315738000019797,2.3263478740408408,2.5758293035489
-42,0,49.88008,26.019920000000006,1.7389874203157822,1.8807936081512504,1.8807936081512504
-43,0,35.32524,-14.72524,-0.5790494326640656,-1.0364333894937894,-0.5828415072712162
-43,0,61.44978,-19.54978,-0.14482838225714914,-0.7388468491852137,-0.025068908258711057
-43,0,91.63226,-22.332260000000005,-0.15385330376719494,-0.6433454053929168,-0.17637416478086135
-43,0,110.73523,-26.135230000000007,-0.4139520184273998,-0.5828415072712162,-0.4676987991145081
-43,0,115.62494,-26.924939999999992,-1.036901280726853,-0.7063025628400875,-1.1263911290388005
-43,0,117.74148,-7.741479999999996,0.12244391258691101,0.025068908258711057,0.1509692154967774
-43,0,116.91901,-2.91901,0.9383026420486036,-0.050153583464733656,1.0364333894937894
-43,0,109.61418,-19.314180000000007,-1.0515612388029911,-0.5533847195556729,-0.9944578832097528
-43,0,89.24991,5.650090000000006,0.3844168702912726,0.2533471031357998,0.35845879325119373
-43,0,74.23074,2.4692600000000056,-0.6644494491830131,0.2533471031357998,-0.6433454053929168
-43,0,49.823984,10.776015999999998,0.6328433630366054,0.7063025628400875,0.7063025628400875
-44,0,33.78031,4.019689999999997,0.6708511314009884,0.3318533464368165,0.7063025628400875
-44,0,59.1888,-1.288800000000002,-1.0153063344462727,0.0752698620998299,-1.1263911290388005
-44,0,90.75795,13.242050000000006,1.0500166487141234,0.49585034734745304,0.9541652531461942
-44,0,107.0305,-7.230500000000006,-0.8162627092848261,-0.0752698620998299,-0.9541652531461942
-44,0,114.22722,2.7727799999999974,0.20190277841910242,0.20189347914185077,0.3318533464368165
-44,0,115.67969,-0.6796899999999937,-0.2447488132621844,0.1509692154967774,-0.27931903444745404
-44,0,114.95441,18.045590000000004,1.9983151748119832,0.7063025628400875,2.053748910631822
-44,0,108.12473,-0.12472999999999956,1.027562201195532,0.2533471031357998,0.9541652531461942
-44,0,90.34821,-9.348209999999995,-0.9207912574500495,-0.35845879325119373,-0.9153650878428141
-44,0,74.92278999999999,3.277210000000011,-0.6439724679180379,0.3853204664075676,-0.5828415072712162
-44,0,51.94362,14.75638,0.8744655136834542,0.9944578832097528,0.9944578832097528
-45,0,33.98541,-9.085410000000003,-0.8642252982147544,-0.5828415072712162,-0.8416212335729142
-45,0,59.48933,-9.489330000000002,0.3950567125822686,-0.22754497664114945,0.35845879325119373
-45,0,92.39269,-27.492689999999996,-0.38570629148290553,-0.7721932141886849,-0.3318533464368165
-45,0,109.4206,-15.72059999999999,1.2427758798848907,-0.3054807880993974,1.3407550336902165
-45,0,114.184,-21.584000000000003,0.7614148306834841,-0.4399131656732338,0.6744897501960817
-45,0,116.29217,-27.392169999999993,0.2641014586858732,-0.8416212335729142,0.2275449766411493
-45,0,116.37418,-36.97417999999999,-1.0773284315225204,-1.17498679206609,-1.080319340814956
-45,0,109.67452,-18.67452,-0.12474437633200548,-0.5244005127080407,0.050153583464733656
-45,0,89.19358,-12.493579999999994,-0.5770945133057024,-0.612812991016627,-0.5533847195556729
-45,0,72.89984,-4.199839999999995,-0.6011567124297116,-0.15096921549677725,-0.612812991016627
-45,0,49.71323,2.98677,0.19049666011154795,0.20189347914185077,0.20189347914185077
-46,0,36.69009,-1.7900899999999993,0.03169664732015785,0.0752698620998299,0
-46,0,63.56924,-7.869239999999998,0.8140667283292533,-0.10043372051146975,0.8064212470182404
-46,0,96.39896,-24.098960000000005,-1.6110524780091195,-0.6744897501960817,-1.554773594596853
-46,0,114.13118,1.8688199999999995,0.137623023668914,0.12566134685507413,0.12566134685507413
-46,0,121.14541,-24.245409999999993,-2.078188644954827,-0.5828415072712162,-2.0537489106318225
-46,0,119.85061,14.149389999999997,0.6304020998057277,0.5244005127080407,0.6433454053929168
-46,0,119.17355,2.826449999999994,0.11693040335977868,0.20189347914185077,0.12566134685507413
-46,0,110.96001,-2.960009999999997,-0.4251692674611124,0.025068908258711057,-0.3853204664075676
-46,0,94.04273,4.157269999999997,0.9003740477377358,0.17637416478086118,0.8778962950512288
-46,0,73.77977,-8.579769999999996,-0.3635363161628664,-0.4958503473474532,-0.3054807880993974
-46,0,50.902677,-4.702676999999994,-0.2874706228030364,-0.4399131656732338,-0.4399131656732338
-47,0,33.68251,7.217489999999998,1.115578239623265,0.612812991016627,1.1263911290388005
-47,0,59.26409,4.6359099999999955,1.2841959191465901,0.3853204664075676,1.4757910281791708
-47,0,92.49259,-1.7925900000000041,1.3362629853835197,0.20189347914185077,1.2815515655446008
-47,0,109.15086,-9.350859999999997,2.6759204072270175,-0.025068908258711057,2.053748910631822
-47,0,114.81821,-54.018209999999996,-2.0458667867227045,-1.7506860712521695,-2.3263478740408408
-47,0,117.78516,-35.08516,-1.1210257961430632,-1.17498679206609,-1.2815515655446008
-47,0,116.27022,-23.67022,-0.3893291762358375,-0.6433454053929168,-0.35845879325119373
-47,0,109.7909,-21.890899999999988,-0.1913047788297737,-0.7063025628400875,-0.3318533464368165
-47,0,92.89532,-23.795320000000004,-1.0452122477879522,-1.0364333894937894,-1.2265281200366105
-47,0,75.83385,-11.533850000000001,0.3015903956925401,-0.6744897501960817,0.27931903444745404
-47,0,52.238179,-15.238179000000002,-1.0407882637242205,-1.080319340814956,-1.080319340814956
-48,0,30.702248,27.297752,0.12718284152756745,1.7506860712521695,0.1509692154967774
-48,0,52.85027,53.14973,1.9391740737887335,1.7506860712521695,1.8807936081512504
-48,0,83.81876,45.18124,-0.9683976470064879,1.4050715603096327,-0.9153650878428141
-48,0,99.18825,79.81175,2.6588368934010864,2.053748910631822,2.3263478740408408
-48,0,106.4877,49.512299999999996,-0.5016578413311652,1.2815515655446008,-0.5533847195556729
-48,0,107.60059,52.39941,1.0645811517936945,1.4050715603096327,1.0364333894937894
-48,0,108.63958,33.360420000000005,-0.24357444042829018,1.1263911290388005,-0.3318533464368165
-48,0,104.12849,48.87151,2.608875941760615,1.4757910281791708,2.3263478740408408
-48,0,88.52035,4.479650000000007,0.1335180229521668,0.5244005127080407,0.2275449766411493
-48,0,72.43499,3.9650100000000066,0.3917112461618566,0.35845879325119373,0.46769879911450835
-48,0,50.66006,-1.06006,-0.05887015192100728,0.050153583464733656,0.050153583464733656
-49,0,38.34718,-12.147180000000002,-0.4259903295628072,-0.7721932141886849,-0.4958503473474532
-49,0,66.04721,-10.24721000000001,1.3716819606012902,-0.2018934791418509,1.2815515655446008
-49,0,103.89393,-23.49392999999999,-0.0746846683884355,-0.5533847195556729,0
-49,0,119.49187,-35.89187000000001,-1.8133635625956268,-0.8778962950512285,-1.8807936081512509
-49,0,127.18112,-13.181120000000007,0.09826297514101173,-0.15096921549677725,0.0752698620998299
-49,0,127.23342,-25.233419999999995,-0.7326430604972636,-0.5244005127080407,-0.8064212470182404
-49,0,125.87965,-5.879649999999998,1.0564705195118798,-0.17637416478086135,1.0364333894937894
-49,0,116.82374,-22.123739999999998,0.2808377045719369,-0.6433454053929168,0.3853204664075676
-49,0,95.99339,-30.09339,-1.2619954274686795,-1.2815515655446008,-1.17498679206609
-49,0,78.09167,-13.591669999999993,-0.296408337693155,-0.7721932141886849,-0.17637416478086135
-49,0,50.987547,-11.487547,-0.7129134282082896,-0.7721932141886849,-0.7721932141886849
-50,0,34.99286,-17.29286,-0.7656083354885638,-1.4050715603096322,-0.7721932141886849
-50,0,61.75246,-22.552459999999996,0.2784274122542114,-1.0364333894937894,0.35845879325119373
-50,0,93.50129,-31.10129,-0.11648855438907352,-1.080319340814956,-0.15096921549677725
-50,0,110.14026,-29.84026,0.12569095254099277,-0.9153650878428141,0.20189347914185077
-50,0,116.64653,-41.446529999999996,-0.9412446421501491,-1.4757910281791702,-0.9944578832097528
-50,0,119.55272,-26.652719999999988,-0.36409980566674455,-0.7388468491852137,-0.3318533464368165
-50,0,118.66516,-34.565160000000006,-1.4051831446008491,-1.4050715603096322,-1.554773594596853
-50,0,112.00061,-18.60060999999999,-0.7728469631962352,-0.5828415072712162,-0.8416212335729142
-50,0,91.55806,-8.658059999999992,-0.2048970391158926,-0.3318533464368165,-0.2533471031357998
-50,0,77.51983,-6.919830000000005,0.2622981465538773,-0.3318533464368165,0.3853204664075676
-50,0,50.69201,-11.392010000000006,-0.6883285935025976,-0.4958503473474532,-0.4958503473474532
+"id","iter","epred","eres","ewres","npd","npde"
+1,0,32.98649,4.31350999999999,0.39312293044349,0.331853346436817,0.331853346436817
+1,0,55.16439,7.03561000000001,0.19897869808175,0.331853346436817,0.201893479141851
+1,0,72.73415,1.36584999999999,-0.610934640971768,0.0501535834647337,-0.582841507271216
+1,0,74.96015,0.139849999999996,-0.192167909093386,0.0752698620998299,-0.150969215496777
+1,0,70.28047,-11.98047,-1.18750908983652,-0.738846849185214,-1.1263911290388
+1,0,61.19115,-13.09115,-0.358449603067949,-0.772193214188685,-0.412463129441405
+1,0,52.99737,-7.19737000000001,0.697622680453787,-0.412463129441405,0.706302562840088
+1,0,36.29181,-18.29181,-1.34482923475675,-1.40507156030963,-1.2815515655446
+1,0,16.262574,-10.532574,-0.340615074780662,-1.1263911290388,-0.305480788099397
+1,0,7.2422496,-5.6322496,0.383644047221346,-1.08031934081496,0.738846849185214
+1,0,1.659029759,-1.498029759,0.363677010933435,-0.772193214188685,0.674489750196082
+2,0,32.91392,5.48608,0.47480256722356,0.524400512708041,0.524400512708041
+2,0,54.36598,3.03402,-0.540264839116089,0.2533471031358,-0.674489750196082
+2,0,72.7127,18.8873,1.32433732486848,0.954165253146194,1.55477359459685
+2,0,76.69794,21.90206,1.16010296843497,1.2815515655446,1.2815515655446
+2,0,69.77278,10.92722,-0.665364172752635,0.772193214188685,-0.553384719555673
+2,0,61.20712,-0.207120000000003,-1.63361408856867,0.0752698620998299,-1.64485362695147
+2,0,52.42241,4.37759,0.309002845013764,0.412463129441405,0.305480788099397
+2,0,35.20014,-2.40014,-0.339971039103801,-0.176374164780861,-0.176374164780861
+2,0,15.798852,-2.198852,0.600900668593846,-0.0501535834647337,0.772193214188685
+2,0,7.1508851,-3.3008851,0.0854047358931787,-0.439913165673234,0.305480788099397
+2,0,1.611683345,-0.937683345,0.400994521436739,-0.0501535834647337,0.582841507271216
+3,0,31.647474,42.452526,3.68479897061817,2.5758293035489,2.5758293035489
+3,0,51.41016,62.58984,0.684620566434409,2.5758293035489,0.772193214188685
+3,0,69.29666,65.70334,-0.480972819704679,2.32634787404084,-0.674489750196082
+3,0,72.74355,38.25645,-0.97735242760172,1.88079360815125,-0.915365087842814
+3,0,66.65453,42.34547,1.9177838430967,2.05374891063182,1.88079360815125
+3,0,57.6599,36.1401,2.02713944059706,1.88079360815125,2.32634787404084
+3,0,50.25955,18.64045,1.37935162858044,1.40507156030963,1.47579102817917
+3,0,34.794,-1.194,-1.40385183681678,0,-1.34075503369022
+3,0,15.648635,-8.098635,-0.756242889191841,-0.841621233572914,-0.994457883209753
+3,0,7.1830721,-5.6930721,1.10487339053815,-1.08031934081496,1.2815515655446
+3,0,1.69543447,-1.63813447,1.08513185541445,-1.17498679206609,1.40507156030963
+4,0,33.13046,-9.23046,-0.685453951235572,-0.553384719555673,-0.553384719555673
+4,0,54.38464,-21.18464,-1.03032324497326,-1.1263911290388,-0.954165253146194
+4,0,73.58276,-8.98276,0.790358659465378,-0.385320466407568,0.80642124701824
+4,0,75.10723,-15.00723,-0.375613511304178,-0.674489750196082,-0.467698799114508
+4,0,67.45665,4.44335000000001,1.31441992890972,0.439913165673234,1.34075503369022
+4,0,60.75565,7.04434999999999,0.333904663732469,0.582841507271216,0.582841507271216
+4,0,51.00847,6.09153,-0.407188014670507,0.582841507271216,-0.358458793251194
+4,0,35.287601,7.01239899999999,-0.328825294659297,0.582841507271216,-0.279319034447454
+4,0,15.8863341,18.4136659,3.41002108742579,1.64485362695147,2.32634787404084
+4,0,7.20921866,10.09078134,0.452223834473836,1.47579102817917,0.80642124701824
+4,0,1.6375878803,6.3124121197,4.39033615641083,2.32634787404084,2.5758293035489
+5,0,30.89556,-2.09556,-0.203423413243197,-0.0752698620998299,-0.0752698620998299
+5,0,50.91278,-6.71278,-0.553215526175051,-0.305480788099397,-0.674489750196082
+5,0,70.51819,-16.31819,-1.19845328746698,-0.954165253146194,-1.22652812003661
+5,0,74.82976,-2.12975999999999,1.05129425674635,-0.10043372051147,1.17498679206609
+5,0,69.04273,0.157269999999997,0.512545637271678,0.150969215496777,0.612812991016627
+5,0,61.18271,-3.48271,-0.53421709570619,-0.201893479141851,-0.467698799114508
+5,0,53.21686,-1.61686,-0.406838586071851,-0.176374164780861,-0.358458793251194
+5,0,38.01328,-7.01328,-0.980789361260318,-0.553384719555673,-1.1263911290388
+5,0,18.098743,-9.108743,-1.80406284677375,-1.17498679206609,-2.05374891063182
+5,0,8.441635,-4.191635,0.652359127141043,-0.553384719555673,0.841621233572914
+5,0,1.980586884,-1.628586884,0.0242691004535125,-0.877896295051228,0.0250689082587111
+6,0,31.65385,8.04615,0.564060592214514,0.738846849185214,0.738846849185214
+6,0,51.79885,7.00115,-0.455337018722475,0.331853346436817,-0.495850347347453
+6,0,70.52856,14.57144,0.305414366631289,0.738846849185214,0.305480788099397
+6,0,71.75039,20.34961,1.15347071449693,1.08031934081496,1.08031934081496
+6,0,67.70093,15.59907,0.54118727007836,0.954165253146194,0.612812991016627
+6,0,59.91821,10.78179,-0.0915155785631547,0.841621233572914,0
+6,0,51.40442,1.89558,-1.39952795660263,0.439913165673234,-1.64485362695147
+6,0,36.11598,4.88402,0.899244342829166,0.553384719555673,0.915365087842814
+6,0,16.843305,5.556695,1.75635554936885,0.674489750196082,1.47579102817917
+6,0,8.2162266,2.5837734,-0.204255610447637,0.643345405392917,-0.125661346855074
+6,0,2.13460391,0.68539609,-0.90833911641571,0.643345405392917,-1.40507156030963
+7,0,30.305673,-7.905673,-0.683721443520991,-0.612812991016627,-0.612812991016627
+7,0,50.45624,-3.15624,1.43524689379264,-0.150969215496777,1.55477359459685
+7,0,69.03299,2.86701000000001,1.28427276301979,0.150969215496777,1.2815515655446
+7,0,71.25392,-1.95392,-0.873629932810721,-0.10043372051147,-0.772193214188685
+7,0,67.03062,4.86938000000001,0.596851875490606,0.358458793251194,0.643345405392917
+7,0,58.78452,-3.48452,-1.42111306149852,-0.279319034447454,-1.40507156030963
+7,0,50.90107,14.09893,2.20480005250065,0.877896295051229,1.88079360815125
+7,0,35.993683,9.906317,0.314731910261431,0.841621233572914,0.358458793251194
+7,0,16.9971381,8.9028619,0.626853652417336,1.03643338949379,0.738846849185214
+7,0,8.12867732,4.47132268,-0.425738716245344,0.954165253146194,-0.412463129441405
+7,0,2.1198473724,1.3801526276,0.429995203674228,0.877896295051229,0.412463129441405
+8,0,30.50213,8.89787,0.767724804010169,0.877896295051229,0.877896295051229
+8,0,50.35428,5.74572,-1.11203462613931,0.467698799114508,-1.08031934081496
+8,0,69.13838,-1.43838,-1.09818114847678,-0.0250689082587111,-1.2815515655446
+8,0,71.00996,0.590039999999988,0.0759196531664311,0,-0.0250689082587111
+8,0,65.8017,-1.7017,0.548951623486234,-0.125661346855074,0.643345405392917
+8,0,57.50904,1.79096,1.07136583131254,0.201893479141851,0.954165253146194
+8,0,49.48443,-9.68443000000001,-0.922239571456732,-0.738846849185214,-0.841621233572914
+8,0,35.254383,-8.254383,-0.38294180286263,-0.582841507271216,-0.358458793251194
+8,0,16.4409217,-5.5409217,0.0519476015803535,-0.412463129441405,0.150969215496777
+8,0,7.70709919,-3.56709919,0.321093492584651,-0.331853346436817,0.467698799114508
+8,0,1.981368427,-1.485368427,-0.19367726921527,-0.331853346436817,-0.201893479141851
+9,0,33.6075,-10.9075,-0.879523340111988,-0.841621233572914,-0.841621233572914
+9,0,53.60861,-8.80861,0.930772730448659,-0.385320466407568,0.994457883209753
+9,0,73.09997,-15.19997,-0.348357938652603,-0.674489750196082,-0.279319034447454
+9,0,73.953,8.447,1.41123118217732,0.495850347347453,1.75068607125217
+9,0,69.03407,-16.03407,-2.05478706005687,-0.954165253146194,-2.32634787404084
+9,0,61.12286,3.37714,1.14218972023147,0.358458793251194,0.915365087842814
+9,0,50.84802,5.25198,0.739620041659109,0.385320466407568,0.706302562840088
+9,0,35.020516,3.879484,-0.641006832342895,0.331853346436817,-0.706302562840088
+9,0,16.112816,-1.612816,-1.20498551437066,-0.0250689082587111,-1.34075503369022
+9,0,7.61441932,-2.52441932,-0.4982221269139,-0.201893479141851,-0.643345405392917
+9,0,1.8158749739,-1.2438749739,1.06375406674706,-0.279319034447454,1.47579102817917
+10,0,31.57111,-7.37111,-0.650232366826373,-0.643345405392917,-0.643345405392917
+10,0,53.09727,-11.99727,-0.128250689600475,-0.467698799114508,-0.0501535834647337
+10,0,70.88617,-19.28617,-1.09562708280291,-0.915365087842814,-1.17498679206609
+10,0,73.23445,-21.73445,-0.821914542047923,-1.34075503369022,-0.706302562840088
+10,0,69.22801,-19.92801,-0.185959136028582,-1.17498679206609,-0.150969215496777
+10,0,61.86628,-31.36628,-1.68107591720721,-2.32634787404084,-1.88079360815125
+10,0,52.33718,-15.93718,1.1096529880753,-1.2815515655446,1.08031934081496
+10,0,36.60179,-12.60179,-0.069592489866324,-1.2815515655446,-0.125661346855074
+10,0,17.52343,-12.07343,-1.3818768133729,-1.64485362695147,-1.75068607125217
+10,0,8.3378365,-6.8078365,-0.248265817011067,-1.55477359459685,-0.305480788099397
+10,0,2.133938161,-2.030938161,0.80546150344065,-1.2815515655446,0.994457883209753
+11,0,32.05782,-7.85782,-0.563917549035041,-0.412463129441405,-0.412463129441405
+11,0,52.57534,0.22466,1.24175375521645,0.279319034447454,1.47579102817917
+11,0,68.92559,-2.82559000000001,0.186141138189767,0,0.412463129441405
+11,0,73.08532,-12.08532,-1.07530481500242,-0.582841507271216,-1.17498679206609
+11,0,66.22493,-3.42493,0.459757337975933,-0.0250689082587111,0.439913165673234
+11,0,58.22184,-7.22184,-0.361330459515467,-0.305480788099397,-0.305480788099397
+11,0,50.10844,-5.80844,-0.324036288051979,-0.331853346436817,-0.2533471031358
+11,0,35.06275,-0.562750000000001,0.733894351312348,0.0501535834647337,0.772193214188685
+11,0,16.3244924,-4.3244924,-1.01763596875535,-0.201893479141851,-1.17498679206609
+11,0,7.75810345,-3.98810345,-0.698486994912247,-0.331853346436817,-0.915365087842814
+11,0,1.94535670757,-1.57035670757,0.503247377866691,-0.412463129441405,0.738846849185214
+12,0,32.06656,-7.36656,-0.666231495214141,-0.524400512708041,-0.524400512708041
+12,0,52.63218,-0.0321799999999968,1.29412263397007,0.125661346855074,1.1263911290388
+12,0,70.7676,-6.9676,-0.166021349248737,-0.385320466407568,-0.125661346855074
+12,0,75.25261,-2.15261000000001,0.247319140127375,-0.0250689082587111,0.358458793251194
+12,0,67.75347,17.54653,1.95615468754485,0.994457883209753,2.05374891063182
+12,0,59.74328,14.35672,0.489214889931639,0.994457883209753,0.495850347347453
+12,0,51.4419,12.7581,-0.326970842618165,0.877896295051229,-0.279319034447454
+12,0,37.38537,16.01463,0.377995344215651,1.34075503369022,0.582841507271216
+12,0,16.702301,12.197699,0.73431388111997,1.47579102817917,0.738846849185214
+12,0,8.0054587,14.1945413,3.96912736955459,2.32634787404084,2.5758293035489
+12,0,2.025490789,2.524509211,-3.75197935222363,1.08031934081496,-2.5758293035489
+13,0,30.91024,0.589759999999998,0.0558562832554577,0.331853346436817,0.331853346436817
+13,0,51.71224,-2.31224,-0.436902920470727,-0.10043372051147,-0.201893479141851
+13,0,72.7964,-1.5964,-0.0160414503615464,-0.10043372051147,0
+13,0,74.34071,13.65929,1.62266063962039,0.841621233572914,1.55477359459685
+13,0,69.34733,5.75266999999999,0.0642916550956923,0.495850347347453,0.150969215496777
+13,0,60.55243,4.84757,-0.407521039568674,0.358458793251194,-0.227544976641149
+13,0,51.6524,2.9476,-0.726099634492215,0.385320466407568,-0.643345405392917
+13,0,36.03955,-0.63955,-0.58469930326017,0.0752698620998299,-0.643345405392917
+13,0,16.00582,0.794180000000001,0.0246371353093706,0.331853346436817,0.125661346855074
+13,0,7.2819216,-1.7419216,-0.752333347165826,-0.0250689082587111,-0.877896295051228
+13,0,1.626813419,-0.496813419,0.650725633911507,0.227544976641149,0.772193214188685
+14,0,32.416273,-5.716273,-0.409875952215932,-0.331853346436817,-0.331853346436817
+14,0,53.47654,-1.37654,0.75341710974117,0,0.706302562840088
+14,0,72.05888,1.14112,0.569733205688529,0.125661346855074,0.738846849185214
+14,0,74.20409,8.19591000000001,0.658333016219243,0.524400512708041,0.706302562840088
+14,0,67.70015,12.79985,0.440547232746005,0.877896295051229,0.553384719555673
+14,0,59.59063,18.20937,0.916443014872761,1.03643338949379,0.954165253146194
+14,0,50.7706,12.9294,-0.394172970842559,0.994457883209753,-0.279319034447454
+14,0,34.73704,19.16296,1.38657573620426,1.64485362695147,1.34075503369022
+14,0,15.60488,17.89512,2.17689326643711,2.05374891063182,1.88079360815125
+14,0,7.3125215,5.7874785,-2.77047688308555,1.08031934081496,-2.5758293035489
+14,0,1.814901424,3.015098576,1.37992539492347,1.40507156030963,1.40507156030963
+15,0,30.80775,0.192250000000001,0.0172466113020918,0.10043372051147,0.10043372051147
+15,0,50.79576,-10.69576,-1.47376540311708,-0.524400512708041,-1.55477359459685
+15,0,68.72773,-7.12772999999999,0.221230502948216,-0.305480788099397,0.331853346436817
+15,0,71.11083,-14.11083,-0.842789370188902,-0.841621233572914,-0.954165253146194
+15,0,65.37143,-13.67143,-0.0811256100127415,-0.954165253146194,-0.10043372051147
+15,0,57.31489,-11.91489,0.0585563644551135,-0.738846849185214,0.150969215496777
+15,0,49.05522,-10.25522,0.0253179605383851,-0.706302562840088,0.10043372051147
+15,0,34.672645,-9.372645,-0.26833311951649,-0.582841507271216,-0.150969215496777
+15,0,15.92991,-6.03991,-0.107733098884611,-0.524400512708041,-0.10043372051147
+15,0,7.4911739,-3.6911739,-0.375512451690341,-0.305480788099397,-0.439913165673234
+15,0,1.854818636,-1.253818636,0.0974427651156176,-0.227544976641149,0
+16,0,31.5144,-9.7144,-0.830394137179051,-0.772193214188685,-0.772193214188685
+16,0,51.88112,-23.68112,-1.20583892838542,-1.55477359459685,-1.47579102817917
+16,0,71.56897,-25.46897,-0.812062083358356,-1.34075503369022,-0.80642124701824
+16,0,74.04428,-21.94428,-0.0106510658698027,-1.34075503369022,0.0501535834647337
+16,0,69.50291,-22.20291,-0.262356571385829,-1.55477359459685,-0.305480788099397
+16,0,60.71202,-3.11202,1.51143763998718,-0.125661346855074,1.47579102817917
+16,0,52.55294,-13.45294,-0.476118109561761,-0.877896295051228,-0.439913165673234
+16,0,37.469633,-10.169633,-0.909644798718531,-0.877896295051228,-0.841621233572914
+16,0,17.2814569,-3.5814569,-0.391141980717591,-0.227544976641149,-0.524400512708041
+16,0,8.27431972,-2.96431972,-0.0506768159455835,-0.201893479141851,0.0250689082587111
+16,0,2.036978611,-1.228978611,-0.507597738730934,-0.176374164780861,-0.772193214188685
+17,0,33.053628,20.346372,1.43138370390125,1.34075503369022,1.34075503369022
+17,0,52.76529,11.33471,-1.98043818425422,0.706302562840088,-2.5758293035489
+17,0,72.68404,20.31596,0.0423678727664312,0.841621233572914,0.10043372051147
+17,0,72.4172,28.5828,1.56964726336242,1.47579102817917,1.64485362695147
+17,0,63.75925,-5.65925,-2.71427386438519,-0.176374164780861,-2.5758293035489
+17,0,56.48859,19.21141,2.45656549978684,1.2815515655446,2.5758293035489
+17,0,47.10975,12.79025,1.11538340907079,0.954165253146194,1.17498679206609
+17,0,32.593548,4.406452,0.257443272285735,0.524400512708041,0.524400512708041
+17,0,14.1971016,-0.7971016,-1.31028687186885,-0.0501535834647337,-1.40507156030963
+17,0,6.53055625,-1.00055625,-0.0278394314214561,0.0250689082587111,-0.0250689082587111
+17,0,1.4348947358,-0.6968947358,-0.0138770669759458,-0.0250689082587111,0
+18,0,31.64646,-9.44646,-0.685633414218757,-0.582841507271216,-0.582841507271216
+18,0,50.54937,-11.24937,0.0282799899746484,-0.524400512708041,0.125661346855074
+18,0,70.52844,-19.12844,-0.564363812796358,-0.738846849185214,-0.553384719555673
+18,0,70.3076,-19.6076,-0.58191309984128,-1.08031934081496,-0.495850347347453
+18,0,64.6941,-21.4941,-1.16049404449826,-1.88079360815125,-1.22652812003661
+18,0,57.57622,-24.17622,-0.932882759683634,-1.64485362695147,-0.841621233572914
+18,0,48.38737,-22.38737,-1.03569038563162,-2.05374891063182,-1.08031934081496
+18,0,33.508397,-16.608397,-0.504241139580999,-1.47579102817917,-0.439913165673234
+18,0,14.8437977,-9.4737977,-0.168129997011851,-1.22652812003661,-0.0752698620998299
+18,0,6.89533964,-5.50533964,-0.160684968781903,-1.2815515655446,-0.227544976641149
+18,0,1.6550451646,-1.5746451646,0.707919535320543,-1.17498679206609,1.17498679206609
+19,0,30.64203,-8.54203,-0.814053805908193,-0.80642124701824,-0.80642124701824
+19,0,49.60836,-12.20836,-0.132294369348704,-0.643345405392917,-0.125661346855074
+19,0,68.80645,-10.50645,0.360722237968559,-0.553384719555673,0.439913165673234
+19,0,72.92941,-6.52941,0.383750858182617,-0.150969215496777,0.385320466407568
+19,0,67.90264,-1.30264000000001,0.30762438096602,0.10043372051147,0.331853346436817
+19,0,60.50148,-0.101480000000002,-0.161974840951743,0.176374164780861,-0.150969215496777
+19,0,52.94633,0.653669999999998,-0.427779400291993,0.227544976641149,-0.305480788099397
+19,0,38.15784,3.74216,-0.289618141332177,0.582841507271216,-0.201893479141851
+19,0,18.074631,5.125369,0.513617231179221,0.612812991016627,0.674489750196082
+19,0,8.8164803,0.4035197,-1.31215914813774,0.279319034447454,-1.55477359459685
+19,0,2.38702118,-0.53702118,-0.0189656503991484,0.2533471031358,-0.0250689082587111
+20,0,32.26288,-1.06288,-0.0768913019219232,0.10043372051147,0.10043372051147
+20,0,52.17906,-4.27906,-0.404332079224738,0.0250689082587111,-0.439913165673234
+20,0,68.45721,1.74279,0.542831590147082,0.227544976641149,0.738846849185214
+20,0,70.26481,-1.36480999999999,-0.234438619119605,0,-0.201893479141851
+20,0,64.60202,8.39798,0.914843942174948,0.643345405392917,1.03643338949379
+20,0,55.37977,2.42023,-0.307069340818639,0.358458793251194,-0.305480788099397
+20,0,47.8074,-0.807400000000001,-0.847229506614441,-0.0752698620998299,-0.915365087842814
+20,0,32.475829,2.324171,0.579753054826227,0.176374164780861,0.612812991016627
+20,0,15.2275025,-3.5275025,-0.87263157432098,-0.125661346855074,-1.17498679206609
+20,0,7.00580872,-3.12580872,-0.5160007735913,-0.150969215496777,-0.80642124701824
+20,0,1.84086494905,-1.34586494905,0.533288834904178,-0.150969215496777,0.674489750196082
+21,0,32.0139,-7.8139,-0.640897055812664,-0.524400512708041,-0.524400512708041
+21,0,52.34211,-14.44211,-0.40302286948953,-0.612812991016627,-0.439913165673234
+21,0,70.14758,-21.24758,-0.698736178528431,-1.08031934081496,-0.706302562840088
+21,0,71.62987,-18.12987,-0.178985979980425,-0.915365087842814,-0.0250689082587111
+21,0,66.11001,-17.31001,-0.246142454167662,-0.994457883209753,-0.201893479141851
+21,0,58.65431,-9.75431,0.526781800293178,-0.553384719555673,0.524400512708041
+21,0,49.73717,-7.53717,0.123432145039733,-0.412463129441405,0.150969215496777
+21,0,34.81607,-10.21607,-0.948742924576526,-0.706302562840088,-0.877896295051228
+21,0,16.548645,-7.308645,-1.03050837998201,-0.524400512708041,-1.08031934081496
+21,0,7.824506,-4.424506,-0.265712168541266,-0.495850347347453,-0.2533471031358
+21,0,1.981246413,-1.621246413,0.331638638349569,-0.467698799114508,0.305480788099397
+22,0,35.23494,-6.73494,-0.414524475940842,-0.176374164780861,-0.176374164780861
+22,0,57.52521,-1.12521,1.02431099708813,0.0752698620998299,1.1263911290388
+22,0,75.69579,16.40421,1.930848334388,0.80642124701824,1.75068607125217
+22,0,76.87858,10.32142,0.333240695156475,0.674489750196082,0.331853346436817
+22,0,69.66951,13.83049,0.0458336211238966,0.915365087842814,0.201893479141851
+22,0,59.34868,26.65132,1.61276455663847,2.05374891063182,1.75068607125217
+22,0,50.69351,22.50649,0.660936537143599,1.64485362695147,0.738846849185214
+22,0,34.42666,25.27334,1.407560946888,2.32634787404084,1.22652812003661
+22,0,14.9517444,19.4482556,1.49068246603471,2.05374891063182,1.40507156030963
+22,0,7.12116631,13.57883369,0.026905728726736,1.88079360815125,0.0752698620998299
+22,0,1.7631368958,4.6368631042,-0.706283880091186,1.64485362695147,-1.17498679206609
+23,0,30.77469,-7.67469,-0.688586383689249,-0.612812991016627,-0.612812991016627
+23,0,50.74437,-12.04437,-0.179424106247368,-0.674489750196082,-0.10043372051147
+23,0,67.62467,-9.12466999999999,0.358831395362803,-0.439913165673234,0.385320466407568
+23,0,72.324,-10.824,-0.318298350495068,-0.467698799114508,-0.227544976641149
+23,0,68.17526,-6.67525999999999,0.00802771088660714,-0.305480788099397,0.10043372051147
+23,0,61.32764,-2.72764,0.220561332337222,-0.125661346855074,0.331853346436817
+23,0,51.59881,-12.49881,-1.58746652254845,-0.738846849185214,-1.55477359459685
+23,0,36.88018,-6.18018,-0.258979824976591,-0.612812991016627,-0.201893479141851
+23,0,17.269746,-5.569746,-0.343733962056723,-0.358458793251194,-0.331853346436817
+23,0,8.0892946,-3.3892946,0.0251080765005849,-0.331853346436817,0.125661346855074
+23,0,2.149186148,-1.648186148,-0.200937656474886,-0.467698799114508,-0.2533471031358
+24,0,31.18981,-6.48981,-0.581304898708375,-0.553384719555673,-0.553384719555673
+24,0,51.11877,-14.81877,-1.03696447467707,-1.08031934081496,-1.17498679206609
+24,0,70.81894,-13.21894,0.0161581846632188,-0.738846849185214,0.10043372051147
+24,0,72.11027,-9.21027,-0.0275322888175503,-0.495850347347453,0.150969215496777
+24,0,69.59898,2.60102000000001,1.06088207264286,0.227544976641149,0.994457883209753
+24,0,60.92281,12.37719,1.0567636871106,0.954165253146194,0.994457883209753
+24,0,51.78579,8.11421,-0.0636698117264665,0.612812991016627,0
+24,0,37.039665,7.260335,-0.818557764500948,0.582841507271216,-0.954165253146194
+24,0,17.6869023,13.8130977,1.47529406980799,1.2815515655446,1.64485362695147
+24,0,8.34838231,9.85161769,0.541505279073935,1.17498679206609,0.674489750196082
+24,0,2.1344955033,3.1355044967,-1.15057382388431,1.08031934081496,-1.64485362695147
+25,0,31.31288,5.48712,0.478149760485102,0.553384719555673,0.553384719555673
+25,0,52.07501,-1.97501,-1.23216317784065,0.0501535834647337,-1.34075503369022
+25,0,71.56741,8.93259,0.843560270878343,0.524400512708041,0.954165253146194
+25,0,73.91909,34.08091,2.75450975074492,1.75068607125217,2.32634787404084
+25,0,67.64013,11.75987,-0.490609537661758,0.772193214188685,-0.524400512708041
+25,0,60.19922,6.00078000000001,-1.59293853529404,0.524400512708041,-1.75068607125217
+25,0,51.25101,-3.55101,-2.49718302839063,-0.201893479141851,-1.75068607125217
+25,0,36.16116,-3.26116,-0.0132047180851422,-0.331853346436817,0.125661346855074
+25,0,16.532615,-7.852615,-0.471395173426429,-0.738846849185214,-0.582841507271216
+25,0,7.4179287,-4.2779287,1.12170541023481,-0.674489750196082,1.17498679206609
+25,0,1.857431061,-1.601431061,0.901131259399899,-0.706302562840088,1.47579102817917
+26,0,30.43859,-0.83859,-0.064569254194729,0.176374164780861,0.176374164780861
+26,0,54.46915,-0.269149999999996,0.142468035464236,0.201893479141851,0.227544976641149
+26,0,84.73071,-3.03071,-0.208827617020389,0,-0.0752698620998299
+26,0,99.74206,-0.0420599999999922,0.20789437672223,0.125661346855074,0.305480788099397
+26,0,105.88431,1.11569,0.151967237309542,0.150969215496777,0.150969215496777
+26,0,108.54331,-9.54331000000001,-0.762786388256035,-0.305480788099397,-0.738846849185214
+26,0,107.78206,-5.78206,-0.243343826668271,-0.0250689082587111,-0.125661346855074
+26,0,101.63562,-14.23562,-0.950615549660815,-0.439913165673234,-0.915365087842814
+26,0,87.18049,-15.98049,-0.531967251008955,-0.738846849185214,-0.439913165673234
+26,0,72.32761,-24.52761,-1.16536112811511,-1.64485362695147,-1.17498679206609
+26,0,49.46234,-18.16234,-0.0871243943785043,-1.17498679206609,-0.0250689082587111
+27,0,33.83902,38.96098,2.55041160560908,2.32634787404084,2.32634787404084
+27,0,58.74661,59.25339,-0.480967650979689,2.05374891063182,-0.643345405392917
+27,0,88.79966,82.20034,0.464329128467578,2.05374891063182,0.412463129441405
+27,0,105.04532,58.95468,-1.95777258944029,1.40507156030963,-2.32634787404084
+27,0,112.11857,66.88143,0.184505227978238,1.55477359459685,0.385320466407568
+27,0,114.87291,38.12709,-1.50956880549016,1.08031934081496,-1.55477359459685
+27,0,112.52349,66.47651,2.20400294411266,1.55477359459685,2.05374891063182
+27,0,106.55367,7.44633,-2.43740869175629,0.467698799114508,-2.5758293035489
+27,0,89.05464,-14.65464,-2.05639989406196,-0.706302562840088,-1.88079360815125
+27,0,73.45875,-18.35875,0.00564984373970145,-1.08031934081496,0.0501535834647337
+27,0,50.75273,-30.25273,-0.456306310872281,-1.88079360815125,-0.385320466407568
+28,0,32.431,-5.831,-0.414111627587634,-0.201893479141851,-0.201893479141851
+28,0,56.78469,-15.68469,-0.778714390679532,-0.582841507271216,-0.954165253146194
+28,0,86.0802,-9.48020000000001,0.607209607623187,-0.125661346855074,0.524400512708041
+28,0,103.24001,16.75999,2.29159040103147,0.706302562840088,2.05374891063182
+28,0,112.22483,-3.22483,-0.312414379339432,0.125661346855074,-0.305480788099397
+28,0,114.33807,7.66193,0.22324659513426,0.467698799114508,0.279319034447454
+28,0,113.97487,-5.97487,-1.22940221840958,0,-1.2815515655446
+28,0,108.2256,-3.2256,0.161365986572981,0.0752698620998299,0.0752698620998299
+28,0,91.8752,20.1248,1.84223194039223,0.772193214188685,1.55477359459685
+28,0,75.19557,9.90442999999999,-0.41391691142422,0.612812991016627,-0.412463129441405
+28,0,51.76723,16.33277,0.84120938839248,1.22652812003661,0.994457883209753
+29,0,34.63483,7.96517,0.561757634311817,0.612812991016627,0.612812991016627
+29,0,60.84981,17.25019,0.485214270440465,0.954165253146194,0.706302562840088
+29,0,94.6439,45.3561,1.85030796672071,1.47579102817917,1.75068607125217
+29,0,111.28833,2.71167,-2.43741143193107,0.227544976641149,-2.5758293035489
+29,0,117.27315,43.72685,1.68470047921785,1.55477359459685,1.55477359459685
+29,0,119.48838,38.51162,0.664930951400881,1.22652812003661,0.772193214188685
+29,0,120.9029,4.0971,-1.97100020974333,0.439913165673234,-2.05374891063182
+29,0,114.15478,5.84522,-1.1228150179555,0.439913165673234,-1.2815515655446
+29,0,91.79163,22.20837,1.79202918401122,1.17498679206609,1.55477359459685
+29,0,76.17545,-2.77544999999999,-0.971500905397786,-0.150969215496777,-0.915365087842814
+29,0,51.42789,-17.02789,-2.13401735221743,-1.22652812003661,-2.5758293035489
+30,0,35.170641,-17.970641,-0.957895774026036,-1.17498679206609,-1.17498679206609
+30,0,61.09683,-30.29683,-0.418185784144988,-1.34075503369022,-0.331853346436817
+30,0,93.08097,-37.28097,-0.0819061284013811,-1.08031934081496,-0.10043372051147
+30,0,108.23859,-38.13859,0.224639869640904,-0.877896295051228,0.331853346436817
+30,0,117.54939,-53.44939,-1.012127882061,-1.64485362695147,-1.22652812003661
+30,0,119.31887,-52.91887,-0.415971939884948,-1.40507156030963,-0.524400512708041
+30,0,116.16423,-37.06423,0.403100712720604,-1.03643338949379,0.439913165673234
+30,0,109.86629,-37.66629,-0.448136419453834,-1.40507156030963,-0.385320466407568
+30,0,92.40439,-24.60439,-0.179358816992973,-1.08031934081496,-0.305480788099397
+30,0,75.44289,-15.14289,0.0621084801102427,-0.80642124701824,0.125661346855074
+30,0,49.94382,-2.04382,0.0905156799643454,-0.150969215496777,0.176374164780861
+31,0,33.86128,42.83872,3.23993466550628,2.32634787404084,2.32634787404084
+31,0,58.23953,70.76047,0.713114264795246,2.32634787404084,0.612812991016627
+31,0,90.24248,112.75752,2.369687828525,2.5758293035489,2.32634787404084
+31,0,106.92388,95.07612,-0.807813007649633,2.5758293035489,-0.877896295051228
+31,0,115.40493,104.59507,0.776606281834186,2.5758293035489,0.877896295051229
+31,0,115.41397,102.58603,0.407824920948838,2.32634787404084,0.2533471031358
+31,0,116.46393,102.53607,1.22725156597076,2.5758293035489,1.40507156030963
+31,0,109.45805,42.54195,-3.13365931791344,1.47579102817917,-2.5758293035489
+31,0,91.31525,17.68475,-1.73725802329955,0.877896295051229,-1.64485362695147
+31,0,77.09371,11.00629,1.16645133345326,0.674489750196082,1.2815515655446
+31,0,52.37909,-21.57909,0.379001699837457,-1.2815515655446,0.412463129441405
+32,0,33.47248,-1.87248,-0.134578675804354,0.0501535834647337,0.0501535834647337
+32,0,58.8158,3.48419999999999,0.70913230649934,0.201893479141851,0.80642124701824
+32,0,91.80295,13.19705,0.916738597774995,0.582841507271216,1.03643338949379
+32,0,107.63474,5.36526000000001,-0.183202124327555,0.227544976641149,-0.125661346855074
+32,0,115.86559,22.13441,0.74498235304322,0.772193214188685,0.877896295051229
+32,0,116.66288,-11.66288,-2.20412420983451,-0.305480788099397,-2.32634787404084
+32,0,118.13547,2.86453,0.00841463411523435,0.201893479141851,0.0250689082587111
+32,0,108.90735,19.09265,1.30858455702237,0.706302562840088,1.55477359459685
+32,0,91.3857,12.6143,0.683483347661314,0.643345405392917,0.674489750196082
+32,0,72.94107,15.25893,0.153837941626595,0.877896295051229,0.227544976641149
+32,0,49.186956,17.713044,0.660584043885142,0.994457883209753,0.772193214188685
+33,0,36.183866,-4.783866,-0.326194676268182,-0.176374164780861,-0.176374164780861
+33,0,63.28795,1.91205,1.02241876213897,0.0752698620998299,1.03643338949379
+33,0,97.66181,-12.56181,-0.469803370762184,-0.279319034447454,-0.582841507271216
+33,0,114.8352,-38.5352,-2.06207026323447,-0.877896295051228,-2.5758293035489
+33,0,119.3279,-30.7279,-0.504430610883222,-0.706302562840088,-0.495850347347453
+33,0,121.64929,-21.64929,0.698780801447171,-0.467698799114508,0.80642124701824
+33,0,119.49242,-13.49242,0.963953420376705,-0.279319034447454,1.08031934081496
+33,0,109.10354,-27.20354,0.0681947246355448,-0.772193214188685,0.10043372051147
+33,0,89.93958,-15.23958,0.247935904758722,-0.772193214188685,0.2533471031358
+33,0,70.78442,-7.38442,-0.357376050308435,-0.305480788099397,-0.305480788099397
+33,0,45.8258,0.574199999999998,0.0591079462890958,0.10043372051147,0.305480788099397
+34,0,32.846003,-5.146003,-0.373097638180254,-0.331853346436817,-0.331853346436817
+34,0,57.46953,-5.96953,0.316014581047527,-0.201893479141851,0.358458793251194
+34,0,88.45005,-16.25005,-0.539014679455788,-0.385320466407568,-0.706302562840088
+34,0,102.98377,-32.78377,-1.48052827668581,-0.915365087842814,-1.40507156030963
+34,0,112.18761,-14.48761,0.790403991708382,-0.305480788099397,0.954165253146194
+34,0,114.7626,-31.2626,-0.596221804547908,-0.877896295051228,-0.612812991016627
+34,0,113.49555,-27.79555,-0.27606760726912,-0.772193214188685,-0.305480788099397
+34,0,104.47742,-22.97742,-0.0709134670312777,-0.915365087842814,0.0501535834647337
+34,0,91.05495,-22.85495,-0.0226043780798431,-0.954165253146194,0.125661346855074
+34,0,76.9284,2.3716,1.46715447456647,0.279319034447454,1.47579102817917
+34,0,53.21942,-10.51942,-1.47666314927514,-0.643345405392917,-1.75068607125217
+35,0,33.70687,-7.80687,-0.600440484318956,-0.524400512708041,-0.524400512708041
+35,0,58.28002,-4.38002,0.921844050312807,0.0250689082587111,1.17498679206609
+35,0,90.26905,-7.06904999999999,0.197978245380008,-0.201893479141851,0.2533471031358
+35,0,108.56095,-5.56095000000001,0.334202548759989,-0.0250689082587111,0.385320466407568
+35,0,115.65106,-4.65106,-0.135527905579885,-0.125661346855074,-0.2533471031358
+35,0,117.00376,-16.00376,-1.34680309199175,-0.495850347347453,-1.22652812003661
+35,0,119.86448,5.13552,1.3603532973179,0.150969215496777,1.34075503369022
+35,0,111.56446,-1.56446,0.0726938462050042,0.0501535834647337,0.201893479141851
+35,0,91.199,-16.199,-1.22057316101048,-0.738846849185214,-1.34075503369022
+35,0,76.59885,-11.79885,-0.702209059721474,-0.738846849185214,-0.738846849185214
+35,0,51.2864,-3.2864,0.415044667455644,-0.0752698620998299,0.524400512708041
+36,0,34.76948,33.83052,2.38005992781498,2.05374891063182,2.05374891063182
+36,0,62.19328,88.80672,4.73632087589552,2.5758293035489,2.5758293035489
+36,0,92.69112,104.30888,0.686862169687528,2.32634787404084,0.612812991016627
+36,0,111.68341,109.31659,-0.512840710391356,2.32634787404084,-0.582841507271216
+36,0,119.56324,133.43676,0.838222514645074,2.5758293035489,0.841621233572914
+36,0,121.36186,118.63814,0.757965510798156,2.32634787404084,0.772193214188685
+36,0,119.30179,118.69821,-0.337484738324202,2.05374891063182,-0.439913165673234
+36,0,110.91067,69.08933,-2.21718381868542,1.64485362695147,-2.32634787404084
+36,0,92.93766,44.06234,-0.718246786178169,1.40507156030963,-0.877896295051228
+36,0,77.10322,48.89678,2.88032200675631,1.75068607125217,2.32634787404084
+36,0,51.14185,8.95815,0.891382443656348,0.553384719555673,0.954165253146194
+37,0,34.26303,-13.86303,-1.04574198540925,-1.08031934081496,-1.08031934081496
+37,0,59.53232,-29.73232,-0.985467153363718,-1.64485362695147,-1.08031934081496
+37,0,92.42369,-28.42369,0.553860626621109,-0.877896295051228,0.643345405392917
+37,0,105.38446,-48.98446,-1.1786877736405,-1.64485362695147,-1.22652812003661
+37,0,113.47236,-12.47236,2.51498996158856,-0.0501535834647337,2.05374891063182
+37,0,115.38409,-11.38409,1.48511190147444,-0.2533471031358,1.55477359459685
+37,0,115.90002,-7.90002,0.807677511496044,-0.10043372051147,0.772193214188685
+37,0,109.66792,31.33208,2.8956225990275,0.994457883209753,2.32634787404084
+37,0,90.55816,26.44184,0.70070569555998,1.1263911290388,0.643345405392917
+37,0,73.05187,28.94813,1.10559757387908,1.64485362695147,1.1263911290388
+37,0,49.52268,35.07732,0.583981696020082,2.05374891063182,0.738846849185214
+38,0,34.86035,-11.16035,-0.645665627417913,-0.582841507271216,-0.582841507271216
+38,0,60.1342,-17.9342,0.00688734623449827,-0.553384719555673,0.0752698620998299
+38,0,91.35145,-21.95145,0.207131736961163,-0.467698799114508,0.305480788099397
+38,0,109.09658,-22.59658,0.0682464524662785,-0.412463129441405,0.150969215496777
+38,0,113.57166,-17.17166,0.222277309238612,-0.305480788099397,0.331853346436817
+38,0,116.78019,-10.78019,0.45413520984399,-0.201893479141851,0.524400512708041
+38,0,110.60588,-10.60588,0.173627056539272,-0.125661346855074,0.331853346436817
+38,0,105.76445,-14.86445,-0.640961877532932,-0.524400512708041,-0.643345405392917
+38,0,87.16221,3.33779,0.586923327577352,0.467698799114508,0.643345405392917
+38,0,71.16171,-3.56171000000001,-0.724662418485571,-0.10043372051147,-0.915365087842814
+38,0,47.5367,11.9633,1.35061305986737,0.80642124701824,1.2815515655446
+39,0,34.24566,-21.54566,-1.63115177088665,-2.32634787404084,-2.32634787404084
+39,0,60.22407,-34.82407,-0.107668684021138,-2.32634787404084,-0.125661346855074
+39,0,91.90304,-51.30304,-1.00891110075427,-2.32634787404084,-1.03643338949379
+39,0,104.89775,-52.69775,0.0789848101678494,-2.05374891063182,0.0501535834647337
+39,0,113.69048,-55.59048,-0.232255233522157,-2.05374891063182,-0.0752698620998299
+39,0,114.22153,-52.22153,-0.606186546251964,-2.32634787404084,-0.524400512708041
+39,0,113.57058,-51.77058,-0.0341758986383645,-2.05374891063182,-0.0752698620998299
+39,0,106.48026,-39.78026,0.0816401027531652,-1.64485362695147,0.150969215496777
+39,0,89.96994,-30.66994,-0.290192481572806,-1.75068607125217,-0.279319034447454
+39,0,74.87209,-19.57209,-0.141064010507693,-1.22652812003661,-0.10043372051147
+39,0,50.97511,4.22489,1.30490758012988,0.2533471031358,1.2815515655446
+40,0,33.2341,-17.7341,-1.50955179913374,-1.88079360815125,-1.88079360815125
+40,0,57.68149,-31.48149,-0.267796086769085,-2.05374891063182,-0.176374164780861
+40,0,89.22919,-41.72919,-0.134785432339757,-1.88079360815125,-0.125661346855074
+40,0,103.08826,-32.68826,0.788329590063421,-1.1263911290388,0.915365087842814
+40,0,113.20365,-41.00365,-0.367498886851412,-1.34075503369022,-0.553384719555673
+40,0,114.6628,-46.3628,-0.59324775921528,-1.64485362695147,-0.706302562840088
+40,0,111.77727,-32.17727,0.0974184451188158,-1.2815515655446,0.0752698620998299
+40,0,105.37992,-27.97992,-0.132712433665976,-1.17498679206609,0
+40,0,88.98219,-9.98219,0.532207580316721,-0.495850347347453,0.495850347347453
+40,0,72.57964,3.22036,1.49851301792071,0.279319034447454,1.47579102817917
+40,0,49.02254,12.07746,0.442978261020323,0.915365087842814,0.467698799114508
+41,0,32.62464,10.07536,0.699314436434933,0.954165253146194,0.954165253146194
+41,0,57.56586,13.73414,-0.158165728588137,0.841621233572914,-0.0501535834647337
+41,0,89.35037,33.64963,1.26209508958094,1.1263911290388,1.17498679206609
+41,0,105.95622,23.04378,-0.0336392120804823,0.841621233572914,0.0501535834647337
+41,0,113.17076,19.82924,-0.619772124551268,0.612812991016627,-0.553384719555673
+41,0,117.59971,-6.59971,-2.11691588926395,-0.227544976641149,-1.88079360815125
+41,0,114.93825,-17.53825,-1.6587889738609,-0.612812991016627,-1.88079360815125
+41,0,109.1525,-13.1525,-0.869311700125891,-0.524400512708041,-0.841621233572914
+41,0,91.0679,-14.0679,0.0380095536738729,-0.674489750196082,0.0250689082587111
+41,0,73.84795,-22.84795,-0.978465335126308,-1.47579102817917,-1.08031934081496
+41,0,49.88318,-31.08318,-0.768324274315821,-2.5758293035489,-0.738846849185214
+42,0,33.76874,4.33126,0.298657133025891,0.553384719555673,0.553384719555673
+42,0,59.97372,28.62628,2.54488862815248,0.994457883209753,2.32634787404084
+42,0,91.60654,44.39346,2.28935302964347,1.2815515655446,2.32634787404084
+42,0,107.85342,60.14658,1.25218532764668,1.47579102817917,1.22652812003661
+42,0,115.39781,50.60219,-0.317794747801738,1.17498679206609,-0.201893479141851
+42,0,116.94549,94.05451,2.51058904657281,2.32634787404084,1.88079360815125
+42,0,115.86819,76.13181,0.805393800827879,1.75068607125217,0.706302562840088
+42,0,110.23254,87.76746,1.50553595396594,2.32634787404084,1.55477359459685
+42,0,92.66958,51.33042,-1.28811335940296,2.5758293035489,-1.22652812003661
+42,0,74.27367,64.72633,2.95649167522427,2.32634787404084,2.32634787404084
+42,0,49.88008,26.01992,-1.23491373472014,1.88079360815125,-1.47579102817917
+43,0,35.32524,-14.72524,-0.989261078167038,-1.03643338949379,-1.03643338949379
+43,0,61.44978,-19.54978,0.287478004811989,-0.738846849185214,0.495850347347453
+43,0,91.63226,-22.33226,0.558615490072292,-0.643345405392917,0.772193214188685
+43,0,110.73523,-26.13523,0.0799027602685287,-0.582841507271216,0.0501535834647337
+43,0,115.62494,-26.92494,-0.116017992719282,-0.706302562840088,0
+43,0,117.74148,-7.74148,1.04175390867686,0.0250689082587111,1.03643338949379
+43,0,116.91901,-2.91901,0.717861937787438,-0.0501535834647337,0.706302562840088
+43,0,109.61418,-19.31418,-1.12750078312749,-0.553384719555673,-1.08031934081496
+43,0,89.24991,5.65009000000001,0.391299988085136,0.2533471031358,0.412463129441405
+43,0,74.23074,2.46926000000001,-0.255559746698042,0.2533471031358,-0.176374164780861
+43,0,49.823984,10.776016,0.366021832317961,0.706302562840088,0.467698799114508
+44,0,33.78031,4.01969,0.297869939284769,0.331853346436817,0.331853346436817
+44,0,59.1888,-1.2888,-0.902243373993608,0.0752698620998299,-0.915365087842814
+44,0,90.75795,13.24205,1.15774062680086,0.495850347347453,1.22652812003661
+44,0,107.0305,-7.23050000000001,-0.668792346458866,-0.0752698620998299,-0.877896295051228
+44,0,114.22722,2.77278,0.50619460517578,0.201893479141851,0.553384719555673
+44,0,115.67969,-0.679689999999994,-0.228392722480111,0.150969215496777,-0.305480788099397
+44,0,114.95441,18.04559,1.6120270919512,0.706302562840088,1.64485362695147
+44,0,108.12473,-0.12473,-0.422824112146694,0.2533471031358,-0.412463129441405
+44,0,90.34821,-9.34820999999999,-1.12294861793176,-0.358458793251194,-1.08031934081496
+44,0,74.92279,3.27721000000001,0.486466837580151,0.385320466407568,0.553384719555673
+44,0,51.94362,14.75638,1.77563559582619,0.994457883209753,1.64485362695147
+45,0,33.98541,-9.08541,-0.680537912525521,-0.582841507271216,-0.582841507271216
+45,0,59.48933,-9.48933,0.653652352685496,-0.227544976641149,0.706302562840088
+45,0,92.39269,-27.49269,-0.936471639523884,-0.772193214188685,-1.03643338949379
+45,0,109.4206,-15.7206,0.611064382861663,-0.305480788099397,0.738846849185214
+45,0,114.184,-21.584,-0.189071478989465,-0.439913165673234,-0.331853346436817
+45,0,116.29217,-27.39217,-0.692547419262164,-0.841621233572914,-0.582841507271216
+45,0,116.37418,-36.97418,-1.34364021184262,-1.17498679206609,-1.1263911290388
+45,0,109.67452,-18.67452,-0.164437234517446,-0.524400512708041,-0.176374164780861
+45,0,89.19358,-12.49358,0.293634135763319,-0.612812991016627,0.385320466407568
+45,0,72.89984,-4.19983999999999,0.502547235743707,-0.150969215496777,0.467698799114508
+45,0,49.71323,2.98677,0.570357185807738,0.201893479141851,0.674489750196082
+46,0,36.69009,-1.79009,-0.130237003258494,0.0752698620998299,0.0752698620998299
+46,0,63.56924,-7.86924,-0.481811392062161,-0.10043372051147,-0.467698799114508
+46,0,96.39896,-24.09896,-1.24088015452596,-0.674489750196082,-1.40507156030963
+46,0,114.13118,1.86882,1.28147259492434,0.125661346855074,1.34075503369022
+46,0,121.14541,-24.24541,-1.14771540995408,-0.582841507271216,-1.22652812003661
+46,0,119.85061,14.14939,1.8355814851989,0.524400512708041,1.88079360815125
+46,0,119.17355,2.82644999999999,0.575056155754335,0.201893479141851,0.643345405392917
+46,0,110.96001,-2.96001,-0.0826203833741622,0.0250689082587111,-0.0752698620998299
+46,0,94.04273,4.15727,-0.0216572639718297,0.176374164780861,0.0501535834647337
+46,0,73.77977,-8.57977,-0.868242220562521,-0.495850347347453,-1.03643338949379
+46,0,50.902677,-4.70267699999999,0.0694881150601276,-0.439913165673234,0.10043372051147
+47,0,33.68251,7.21749,0.472278861697257,0.612812991016627,0.612812991016627
+47,0,59.26409,4.63591,-0.74749679072422,0.385320466407568,-0.706302562840088
+47,0,92.49259,-1.79259,-0.801801333432956,0.201893479141851,-0.80642124701824
+47,0,109.15086,-9.35086,-0.608785392914969,-0.0250689082587111,-0.524400512708041
+47,0,114.81821,-54.01821,-3.38904799207138,-1.75068607125217,-2.5758293035489
+47,0,117.78516,-35.08516,-0.47804392042228,-1.17498679206609,-0.495850347347453
+47,0,116.27022,-23.67022,1.32737324113273,-0.643345405392917,1.34075503369022
+47,0,109.7909,-21.8909,1.06955720659071,-0.706302562840088,1.03643338949379
+47,0,92.89532,-23.79532,0.00163742705052172,-1.03643338949379,0
+47,0,75.83385,-11.53385,0.831465345057111,-0.674489750196082,0.80642124701824
+47,0,52.238179,-15.238179,-1.62180366203023,-1.08031934081496,-1.75068607125217
+48,0,30.702248,27.297752,2.10858812043666,1.75068607125217,1.75068607125217
+48,0,52.85027,53.14973,1.48651002122902,1.75068607125217,1.40507156030963
+48,0,83.81876,45.18124,-2.00357014530904,1.40507156030963,-2.05374891063182
+48,0,99.18825,79.81175,1.79204820646513,2.05374891063182,1.75068607125217
+48,0,106.4877,49.5123,-1.16972482516115,1.2815515655446,-1.34075503369022
+48,0,107.60059,52.39941,-0.0692750184064348,1.40507156030963,0.0752698620998299
+48,0,108.63958,33.36042,-0.452951453105168,1.1263911290388,-0.467698799114508
+48,0,104.12849,48.87151,1.41081660090295,1.47579102817917,1.40507156030963
+48,0,88.52035,4.47965000000001,-1.24707002336628,0.524400512708041,-1.22652812003661
+48,0,72.43499,3.96501000000001,-0.886895757741071,0.358458793251194,-0.954165253146194
+48,0,50.66006,-1.06006,0.64582352550688,0.0501535834647337,0.738846849185214
+49,0,38.34718,-12.14718,-0.748090842011941,-0.772193214188685,-0.772193214188685
+49,0,66.04721,-10.24721,0.923796571441197,-0.201893479141851,0.994457883209753
+49,0,103.89393,-23.49393,-0.376327044547606,-0.553384719555673,-0.439913165673234
+49,0,119.49187,-35.89187,-1.05251077953546,-0.877896295051228,-1.1263911290388
+49,0,127.18112,-13.18112,1.10390933027331,-0.150969215496777,1.17498679206609
+49,0,127.23342,-25.23342,-0.378273809071941,-0.524400512708041,-0.331853346436817
+49,0,125.87965,-5.87965,1.15415518343348,-0.176374164780861,0.915365087842814
+49,0,116.82374,-22.12374,-0.846472307346858,-0.643345405392917,-0.915365087842814
+49,0,95.99339,-30.09339,-1.59926916254033,-1.2815515655446,-1.64485362695147
+49,0,78.09167,-13.59167,0.568011418526343,-0.772193214188685,0.582841507271216
+49,0,50.987547,-11.487547,-0.57789728109177,-0.772193214188685,-0.582841507271216
+50,0,34.99286,-17.29286,-1.16907060794248,-1.40507156030963,-1.40507156030963
+50,0,61.75246,-22.55246,0.447327880109292,-1.03643338949379,0.495850347347453
+50,0,93.50129,-31.10129,0.0397754408463182,-1.08031934081496,0.0501535834647337
+50,0,110.14026,-29.84026,0.17461946532547,-0.915365087842814,0.331853346436817
+50,0,116.64653,-41.44653,-0.78654317276125,-1.47579102817917,-0.915365087842814
+50,0,119.55272,-26.65272,0.209894116529727,-0.738846849185214,0.305480788099397
+50,0,118.66516,-34.56516,-0.480455804760832,-1.40507156030963,-0.439913165673234
+50,0,112.00061,-18.60061,0.710090646574447,-0.582841507271216,0.841621233572914
+50,0,91.55806,-8.65805999999999,-0.279051477305512,-0.331853346436817,-0.227544976641149
+50,0,77.51983,-6.91983,-0.438363613708399,-0.331853346436817,-0.412463129441405
+50,0,50.69201,-11.39201,-1.26540918284388,-0.495850347347453,-1.2815515655446
diff --git a/tests/testthat/_snaps/plot/censored-plot-with-aql.svg b/tests/testthat/_snaps/plot/censored-plot-with-aql.svg
index 8a75992..2e8e1ec 100644
--- a/tests/testthat/_snaps/plot/censored-plot-with-aql.svg
+++ b/tests/testthat/_snaps/plot/censored-plot-with-aql.svg
@@ -61,12 +61,16 @@
+
+
+
+
-
-
+
+
-
+
@@ -96,6 +100,10 @@
+
+
+
+
@@ -167,33 +175,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -258,17 +266,15 @@
-
-Percentage of ALQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of ALQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -748,6 +754,10 @@
+
+
+
+
@@ -853,6 +863,10 @@
+
+
+
+
@@ -891,6 +905,10 @@
+
+
+
+
@@ -940,6 +958,10 @@
+
+
+
+
@@ -984,6 +1006,10 @@
+
+
+
+
@@ -1010,6 +1036,10 @@
+
+
+
+
@@ -1066,7 +1096,11 @@
-
+
+
+
+
+
@@ -1091,6 +1125,10 @@
+
+
+
+
@@ -1132,33 +1170,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -1203,17 +1241,15 @@
-
-Percentage of ALQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of ALQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -1673,6 +1709,10 @@
+
+
+
+
@@ -1763,6 +1803,10 @@
+
+
+
+
@@ -1796,6 +1840,10 @@
+
+
+
+
@@ -1835,6 +1883,10 @@
+
+
+
+
@@ -1859,6 +1911,10 @@
+
+
+
+
@@ -1875,6 +1931,10 @@
+
+
+
+
diff --git a/tests/testthat/_snaps/plot/censored-plot-with-bql-aql.svg b/tests/testthat/_snaps/plot/censored-plot-with-bql-aql.svg
index caea95d..5a30707 100644
--- a/tests/testthat/_snaps/plot/censored-plot-with-bql-aql.svg
+++ b/tests/testthat/_snaps/plot/censored-plot-with-bql-aql.svg
@@ -70,12 +70,16 @@
+
+
+
+
-
-
+
+
-
+
@@ -107,9 +111,13 @@
+
+
+
+
-
+
@@ -142,6 +150,10 @@
+
+
+
+
@@ -222,33 +234,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -313,17 +325,15 @@
-
-Percentage of BLQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of BLQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -388,17 +398,15 @@
-
-Percentage of ALQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of ALQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -878,6 +886,10 @@
+
+
+
+
@@ -988,6 +1000,10 @@
+
+
+
+
@@ -1093,6 +1109,10 @@
+
+
+
+
@@ -1131,6 +1151,10 @@
+
+
+
+
@@ -1180,6 +1204,10 @@
+
+
+
+
@@ -1224,6 +1252,10 @@
+
+
+
+
@@ -1277,6 +1309,10 @@
+
+
+
+
@@ -1303,6 +1339,10 @@
+
+
+
+
@@ -1329,6 +1369,10 @@
+
+
+
+
@@ -1398,7 +1442,11 @@
-
+
+
+
+
+
@@ -1425,6 +1473,10 @@
+
+
+
+
@@ -1450,6 +1502,10 @@
+
+
+
+
@@ -1495,33 +1551,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -1566,17 +1622,15 @@
-
-Percentage of BLQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of BLQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -1621,17 +1675,15 @@
-
-Percentage of ALQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of ALQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -2091,6 +2143,10 @@
+
+
+
+
@@ -2186,6 +2242,10 @@
+
+
+
+
@@ -2276,6 +2336,10 @@
+
+
+
+
@@ -2309,6 +2373,10 @@
+
+
+
+
@@ -2348,6 +2416,10 @@
+
+
+
+
@@ -2387,6 +2459,10 @@
+
+
+
+
@@ -2415,6 +2491,10 @@
+
+
+
+
@@ -2431,6 +2511,10 @@
+
+
+
+
@@ -2447,6 +2531,10 @@
+
+
+
+
diff --git a/tests/testthat/_snaps/plot/censored-plot-with-bql.svg b/tests/testthat/_snaps/plot/censored-plot-with-bql.svg
index bd971de..f2a49b3 100644
--- a/tests/testthat/_snaps/plot/censored-plot-with-bql.svg
+++ b/tests/testthat/_snaps/plot/censored-plot-with-bql.svg
@@ -61,12 +61,16 @@
+
+
+
+
-
-
+
+
-
+
@@ -98,9 +102,13 @@
+
+
+
+
-
+
@@ -169,33 +177,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -260,17 +268,15 @@
-
-Percentage of BLQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of BLQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -750,6 +756,10 @@
+
+
+
+
@@ -860,6 +870,10 @@
+
+
+
+
@@ -898,6 +912,10 @@
+
+
+
+
@@ -947,6 +965,10 @@
+
+
+
+
@@ -991,6 +1013,10 @@
+
+
+
+
@@ -1017,6 +1043,10 @@
+
+
+
+
@@ -1073,7 +1103,11 @@
-
+
+
+
+
+
@@ -1100,6 +1134,10 @@
+
+
+
+
@@ -1141,33 +1179,33 @@
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
@@ -1212,17 +1250,15 @@
-
-Percentage of BLQ
-Median (lines) 95% CI (areas)
-
-
-
-
-
-
-observed
-simulated
+
+Percentage of BLQ
+Median (lines) 95% CI (areas)
+
+
+
+
+observed
+simulated
@@ -1682,6 +1718,10 @@
+
+
+
+
@@ -1777,6 +1817,10 @@
+
+
+
+
@@ -1810,6 +1854,10 @@
+
+
+
+
@@ -1849,6 +1897,10 @@
+
+
+
+
@@ -1873,6 +1925,10 @@
+
+
+
+
@@ -1889,6 +1945,10 @@
+
+
+
+
diff --git a/tests/testthat/_snaps/plot/one-sided-strat-formula-with-facet-wrap.svg b/tests/testthat/_snaps/plot/one-sided-strat-formula-with-facet-wrap.svg
index e256863..942c332 100644
--- a/tests/testthat/_snaps/plot/one-sided-strat-formula-with-facet-wrap.svg
+++ b/tests/testthat/_snaps/plot/one-sided-strat-formula-with-facet-wrap.svg
@@ -18,7 +18,7 @@
-
+
@@ -859,33 +859,33 @@
TIME
Percentiles and associated 95% CI
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
One sided strat formula with facet_wrap
diff --git a/tests/testthat/_snaps/plot/single-value-group.svg b/tests/testthat/_snaps/plot/single-value-group.svg
index 41e5f9a..3e4dd18 100644
--- a/tests/testthat/_snaps/plot/single-value-group.svg
+++ b/tests/testthat/_snaps/plot/single-value-group.svg
@@ -18,7 +18,7 @@
-
+
@@ -186,33 +186,33 @@
TIME
Percentiles and associated 95% CI
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-5%
-50%
-95%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+5%
+50%
+95%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-5%
-50%
-95%
+
+
+
+
+
+
+
+
+
+5%
+50%
+95%
single-value group
diff --git a/tests/testthat/_snaps/plot/two-sided-strat-formula-with-facet-grid.svg b/tests/testthat/_snaps/plot/two-sided-strat-formula-with-facet-grid.svg
index a8921fd..cc8dec9 100644
--- a/tests/testthat/_snaps/plot/two-sided-strat-formula-with-facet-grid.svg
+++ b/tests/testthat/_snaps/plot/two-sided-strat-formula-with-facet-grid.svg
@@ -18,7 +18,7 @@
-
+
@@ -863,33 +863,33 @@
TIME
Percentiles and associated 95% CI
-
-Observed Percentiles
-(black lines)
-
-
-
-
-
-
-10%
-50%
-90%
-
+
+Observed Percentiles
+(black lines)
+
+
+
+
+
+
+10%
+50%
+90%
+
Simulated Percentiles
Median (lines) 95% CI (areas)
-
-
-
-
-
-
-
-
-
-10%
-50%
-90%
+
+
+
+
+
+
+
+
+
+10%
+50%
+90%
Two sided strat formula with facet_grid
diff --git a/tests/testthat/test_npde.R b/tests/testthat/test_npde.R
index 88b384d..b10eb73 100644
--- a/tests/testthat/test_npde.R
+++ b/tests/testthat/test_npde.R
@@ -1,47 +1,47 @@
test_that("npde colnames are correct", {
- obs <- obs_data[MDV==0]
- sim <- sim_data[MDV==0]
+ obs <- obs_data[MDV == 0]
+ sim <- sim_data[MDV == 0]
- npde <- observed(obs, x=NULL, y=DV) %>%
- simulated(sim, y=DV) %>%
- npde(id=ID)
+ npde <- observed(obs, x = NULL, y = DV) %>%
+ simulated(sim, y = DV) %>%
+ npde(id = ID)
- expect_true(
- all(colnames(npde$npdeobs) == c("id", "iter","epred", "eres", "ewres", "npd", "npde"))
- )
+ expect_true(all(
+ colnames(npde$npdeobs) == c("id", "iter", "epred", "eres", "ewres", "npd", "npde")
+ ))
+
+ expect_true(all(
+ colnames(npde$npdesim) == c("id", "iter", "epred", "eres", "ewres", "npd", "npde")
+ ))
- expect_true(
- all(colnames(npde$npdesim) == c("id", "iter","epred", "eres", "ewres", "npd", "npde"))
- )
-
})
test_that("npde results are correct", {
skip_on_cran()
- obs <- obs_data[MDV==0]
- sim <- sim_data[MDV==0]
+ obs <- obs_data[MDV == 0]
+ sim <- sim_data[MDV == 0]
- npde <- observed(obs, x=NULL, y=DV)
- npde <- simulated(npde, sim, y=DV)
- npde <- npde(npde, id=ID)
-
- location=system.file("extdata/NPDE","npdeobs.csv", package="tidyvpc")
-
- stats <- fread(location)
+ npde <- observed(obs, x = NULL, y = DV)
+ npde <- simulated(npde, sim, y = DV)
+ npde <- npde(npde, id = ID)
- expect_equal(npde$npdeobs, stats)
+ location <- system.file("extdata/NPDE", "npdeobs.csv", package = "tidyvpc")
- vpc <- observed(npde$npdeobs, x=epred, y=npde)
- vpc <- simulated(vpc, npde$npdesim, y=npde)
- vpc <- binning(vpc, "eqcut", nbins=10)
+ stats <- data.table::fread(location)
+
+ testthat::expect_equal(npde$npdeobs, stats)
+
+ vpc <- observed(npde$npdeobs, x = epred, y = npde)
+ vpc <- simulated(vpc, npde$npdesim, y = npde)
+ vpc <- binning(vpc, "eqcut", nbins = 10)
vpc <- vpcstats(vpc)
expect_true(inherits(vpc, "tidyvpcobj"))
vpc_plot <- tidyvpc:::plot.tidyvpcobj(vpc, point.alpha = 0.25)
-
+
expect_true(inherits(vpc_plot, "ggplot"))
})