diff --git a/materials/tutorial_03/plot.png b/materials/tutorial_03/plot.png
new file mode 100644
index 0000000..1e0b5c9
Binary files /dev/null and b/materials/tutorial_03/plot.png differ
diff --git a/materials/tutorial_03/tests_tutorial_03.R b/materials/tutorial_03/tests_tutorial_03.R
new file mode 100644
index 0000000..ef0cf8a
--- /dev/null
+++ b/materials/tutorial_03/tests_tutorial_03.R
@@ -0,0 +1,293 @@
+library(testthat)
+library(digest)
+
+test_1.1 <- function() {
+ test_that('Did not assign answer to an object called "answer1.1"', {
+ expect_true(exists("answer1.1"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer1.1, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer1.1))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Think about potential edge cases.")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_1.2 <- function() {
+ test_that('Did not assign answer to an object called "answer1.2"', {
+ expect_true(exists("answer1.2"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer1.2, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer1.2))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("When we sample with replacement, we put the observation we just sampled BACK into the pool before selecting another.")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_2.0 <- function() {
+ test_that('Did not assign answer to an object called "answer2.0"', {
+ expect_true(exists("answer2.0"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", or "D")', {
+ expect_match(answer2.0, "a|b|c|d", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.0))
+ if (answer_hash == "127a2ec00989b9f7faf671ed470be7f8" | answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Where would the centre of the new sampling distribution be? Would expect either of the edges of the distribution still appear 'cut off'?")
+ } else if (answer_hash == "d110f00cfb1b248e835137025804a23b") {
+ print("Try to visualize what the new sampling disitribution would look like compared to the sampling distribution above.")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "6e7a8c1c098e8817e3df3fd1b21149d1")
+ })
+
+ print("Success!")
+}
+
+test_2.1 <- function() {
+ test_that('Did not assign answer to an object called "barrier_pop"', {
+ expect_true(exists("barrier_pop"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(barrier_pop))
+ })
+
+ expected_colnames <- c("root_barrier")
+ given_colnames <- colnames(barrier_pop)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame should not contain any NA values", {
+ expect_equal(digest(as.integer(nrow(filter(barrier_pop, is.na(root_barrier))))), "1473d70e5646a26de3c52aa1abd85b1f")
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(barrier_pop))), "33cdfaf5b5548592e62ab05a10e99d7d")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(nrow(filter(barrier_pop, root_barrier == "N")))), "7b52488abfeed248a0eecb9d27db8758")
+ })
+
+ print("Success!")
+}
+
+test_2.2 <- function() {
+ test_that('Did not assign answer to an object called "barrier_sampling_dist"', {
+ expect_true(exists("barrier_sampling_dist"))
+ })
+ properties <- c(barrier_sampling_dist$layers[[1]]$mapping, barrier_sampling_dist$mapping)
+
+ test_that("Plot should have p on the x-axis", {
+ expect_true("p" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(barrier_sampling_dist$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", barrier_sampling_dist$layers[[1]])[["stat_params"]][["binwidth"]]) * 1000),
+ "908d1fd10b357ed0ceaaec823abf81bc"
+ )
+ })
+
+ test_that("Plot does not use the correct data. Sampling distribution should be drawn by sampling without replacement", {
+ expect_equal(digest(nrow(barrier_sampling_dist$data)), "6e96c307060fba1b1d3a36d2410fd595")
+ expect_equal(digest(round(sd(barrier_sampling_dist$data$p),7)), "e9db0e152223a01249a4c3225e899af9")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(barrier_sampling_dist$labels$x == "p")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(barrier_sampling_dist$labels))
+ })
+
+ print("Success!")
+}
+
+test_2.3 <- function() {
+ test_that('Did not assign answer to an object called "barrier_sample"', {
+ expect_true(exists("barrier_sample"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(barrier_sample))
+ })
+
+ expected_colnames <- c("root_barrier")
+ given_colnames <- colnames(barrier_sample)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(barrier_sample))), "be3c152f6f6bcd5f85f9e4cba49b1e48")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(nrow(filter(barrier_sample, root_barrier == "N")))), "2a099397e2d2dd0f2a2e5a5b4234867d")
+ })
+
+ print("Success!")
+}
+
+test_2.4 <- function() {
+ test_that('Did not assign answer to an object called "answer2.4"', {
+ expect_true(exists("answer2.4"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", "D", "E", "F", or "G")', {
+ expect_match(answer2.4, "a|b|c|d|e|f|g", ignore.case = TRUE)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer2.4)), "127a2ec00989b9f7faf671ed470be7f8")
+ })
+
+ print("Success!")
+}
+
+test_2.5 <- function() {
+ test_that('Did not assign answer to an object called "barrier_bootstrap_dist"', {
+ expect_true(exists("barrier_bootstrap_dist"))
+ })
+ properties <- c(barrier_bootstrap_dist$layers[[1]]$mapping, barrier_bootstrap_dist$mapping)
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(barrier_bootstrap_dist$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", barrier_bootstrap_dist$layers[[1]])[["stat_params"]][["binwidth"]]) * 1000),
+ "908d1fd10b357ed0ceaaec823abf81bc"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(barrier_bootstrap_dist$data)), "6e96c307060fba1b1d3a36d2410fd595")
+ expect_equal(digest(round(sum(pull(barrier_bootstrap_dist$data, rlang::get_expr(properties$x))))), "39fe840086944a2ff92b5b0413fada63")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(barrier_bootstrap_dist$labels$x == toString(rlang::get_expr(properties$x)))
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(barrier_bootstrap_dist$labels))
+ })
+
+ print("Success!")
+}
+
+test_2.6 <- function() {
+ # part A
+ test_that('Did not assign answer to an object called "standard_error"', {
+ expect_true(exists("standard_error"))
+ })
+
+ answer_as_numeric <- as.numeric(standard_error)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000000)), "01b27636cb5a0bc29d3245cf9b5d14d7")
+ })
+
+ # part B
+ test_that('Did not assign answer to an object called "standard_deviation"', {
+ expect_true(exists("standard_deviation"))
+ })
+
+ answer_as_numeric <- as.numeric(standard_deviation)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000000)), "b46b14ab0d3b4cdb172dae88b8921fa6")
+ })
+
+ print("Success!")
+}
+
+test_2.7 <- function() {
+ test_that('Did not assign answer to an object called "answer2.7"', {
+ expect_true(exists("answer2.7"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer2.7, "true|false", ignore.case = TRUE)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer2.7)), "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_3.0 <- function() {
+ test_that('Did not assign answer to an object called "plum_pop"', {
+ expect_true(exists("plum_pop"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(plum_pop))
+ })
+
+ expected_colnames <- c("diameter")
+ given_colnames <- colnames(plum_pop)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(plum_pop))), "81069550898d54275db061d49bb7f779")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(plum_pop$diameter))), "c82ea42b76ddfa4115c6472821803b9f")
+ })
+
+ print("Success!")
+}
+
diff --git a/materials/tutorial_03/tutorial_03.ipynb b/materials/tutorial_03/tutorial_03.ipynb
new file mode 100644
index 0000000..d286667
--- /dev/null
+++ b/materials/tutorial_03/tutorial_03.ipynb
@@ -0,0 +1,2061 @@
+{
+ "cells": [
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "38f531f0b13511dae6c173db3a34b41e",
+ "grade": false,
+ "grade_id": "cell-f3ae6db28c5041d9",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "# Tutorial 3: Bootstrapping and its Relationship to the Sampling Distribution"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "db9756e7b71b8b631805409a4e335e65",
+ "grade": false,
+ "grade_id": "cell-712e9ac4e769eb39",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Lecture and Tutorial Learning Goals\n",
+ "After completing this week's lecture and tutorial work, you will be able to:\n",
+ "1. Explain why we don’t know/have a sampling distribution in practice/real life.\n",
+ "2. Define bootstrapping.\n",
+ "3. Write a computer script to create a bootstrap distribution to approximate a sampling distribution.\n",
+ "4. Contrast a bootstrap sampling distribution with a sampling distribution obtained using multiple samples."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "30515f2934452486657577710bcb6636",
+ "grade": false,
+ "grade_id": "cell-28cb9e52e89ace8d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "library(cowplot)\n",
+ "library(datateachr)\n",
+ "library(digest)\n",
+ "library(gridExtra)\n",
+ "library(infer)\n",
+ "library(repr)\n",
+ "library(taxyvr)\n",
+ "library(tidyverse)\n",
+ "source(\"tests_tutorial_03.R\")"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "0044a8ce4048de32292c6153b18507d1",
+ "grade": false,
+ "grade_id": "cell-dc2ef0d60b4a4933",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 1. Warm-Up Questions\n",
+ "\n",
+ "Let's start off with a few questions about bootstrapping and sampling practices in reality."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "6c325c84f9dbc24ca7d5dd77335510ce",
+ "grade": false,
+ "grade_id": "cell-3e24b34269f128b4",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.0**\n",
+ "
{points: 3}\n",
+ "\n",
+ "In 1-2 sentences, explain what bootstrapping is useful for."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a23919b36d994ade6b9ed4960645ddc4",
+ "grade": true,
+ "grade_id": "cell-8c84f203af7f48fd",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "85c80662a5bdaf88fa4396a949fd85e2",
+ "grade": false,
+ "grade_id": "cell-608fcde8287d2be1",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "A bootstrap sampling distribution will **always** have a similar width as the sampling distribution it is approximating.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.1`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9f5912307ae2c5fb859dd19047b8449b",
+ "grade": false,
+ "grade_id": "cell-3eb563d3ebcd4b3e",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "159c62cc078cc395c73a49dd100e9700",
+ "grade": true,
+ "grade_id": "cell-ec461d6d65200f1d",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e06f748b9e001c4c12d026edd1b3c0a8",
+ "grade": false,
+ "grade_id": "cell-45d0af92c1953424",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.2**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "In reality, when we take a sample from the population, we are sampling with replacement.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.2`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "715b740d7cf5ba296e0e533c16da3b80",
+ "grade": false,
+ "grade_id": "cell-54bf9d55fc56bbf6",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.2 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6f9346280e962f7a161c81946e3709e1",
+ "grade": true,
+ "grade_id": "cell-1b1ad2d17f5bb494",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "7f34576a7df82c2f84f434d90fb048fb",
+ "grade": false,
+ "grade_id": "cell-d6c903c695f1f6a5",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 2. Bootstrap Distribution vs Sampling Distribution\n",
+ "\n",
+ "By now you should understand that not all sampling distributions come out as a nice symmetrical bell shape. In `worksheet_02` you saw one example of this when we were studying the distributions of point estimates for the proportion of properties that are located in downtown Vancouver, using the `tax_2019` data set. In the code cell below, we have re-created this sampling distribution so we can look at it a bit more closely.\n",
+ "\n",
+ "_Use the plot below to answer the **next question**._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "45078ac3d5cba761589d3ae6362d5732",
+ "grade": false,
+ "grade_id": "cell-0b662bd6e3054d2b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2410) # Use the same seed as last time to get\n",
+ " # the exact same observations in our samples.\n",
+ "\n",
+ "sampling_dist <- tax_2019 %>% \n",
+ " filter(!is.na(geo_local_area)) %>% \n",
+ " select(geo_local_area) %>% \n",
+ " rep_sample_n(size = 10, reps = 2000) %>% \n",
+ " group_by(replicate) %>% \n",
+ " summarize(x = sum(geo_local_area == \"Downtown\"),\n",
+ " n = n()) %>% \n",
+ " mutate(sample_proportion = x / n) %>% \n",
+ " ggplot(aes(x = sample_proportion)) +\n",
+ " geom_histogram(binwidth = 1/10, colour = \"white\") +\n",
+ " xlab(\"Sample Proportion of Downtown Buildings\") +\n",
+ " ggtitle(\"n = 10\") +\n",
+ " scale_x_continuous(breaks = seq(0, 0.9, 0.1))\n",
+ "sampling_dist"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a27791770b11804017dfe0d6af4a4985",
+ "grade": false,
+ "grade_id": "cell-d41acc8f82a60bac",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "The true proportion of buildings in Vancouver that are located downtown is 0.195. Suppose the data was adjusted such that the true proportion is now 0.5, and we created another sampling distribution with samples of size 100 using the code above. How would the symmetry of the new sampling distribution compare to the one generated above?\n",
+ "\n",
+ "A. The new sampling distribution would be less symmetrical.\n",
+ "\n",
+ "B. The symmetry of the new sampling distribution would be about the same.\n",
+ "\n",
+ "C. The new sampling distribution would be more symmetrical.\n",
+ "\n",
+ "D. It is impossible to tell how the symmetry of the new sampling distribution would compare.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.0`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d32a422a3e1d2411aadd5250d84d22c6",
+ "grade": false,
+ "grade_id": "cell-1487c5a41a521870",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.0 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f45c1240d909b00f9b28a6f39b1b5793",
+ "grade": true,
+ "grade_id": "cell-79e2ecf537661b10",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a37e3967abd22349e9e31d730aa45ad4",
+ "grade": false,
+ "grade_id": "cell-f3fec4bdcd74fe8c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Root Barriers\n",
+ "\n",
+ "In this section, we are going to test the limits of bootstrapping to see whether it results in reliable approximations of asymmetrical sampling distributions, such as the one shown above. To do this, we will attempt to use bootstrapping to estimate sampling distributions that we know are even less symmetrical and compare them to see if our estimates are reasonable. One population that we have at our disposal that yields some asymmetrical sampling distributions is the `vancouver_trees` data set from the `datateachr` package. One example of this is the sampling distribution of sample proportions for the `root_barrier` variable; in this section, we will be looking at the proportion of trees that **do not** have a root barrier.\n",
+ "\n",
+ "\n",
+ "\n",
+ "
\n",
+ "\n",
+ "Recall that the `vancouver_trees` dataset contains information about public trees planted along boulevards in Vancouver. The `root_barrier` variable in this dataset specifies whether or not a tree was planted with a root barrier or not. A root barrier is a type of underground wall that protects buildings, sidewalks, and roads from roots, which can severely damage these structures. One example of a type of root barrier is shown in the picture above."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "351f3d626a4db26ff8712f7c9a1a135b",
+ "grade": false,
+ "grade_id": "cell-c719fb42fc24881f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.1** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Filter `vancouver_trees` such that there are no `NA` values in the `root_barrier` column, and then select only that column. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "tree_pop <- vancouver_trees %>% \n",
+ " filter(...) %>% \n",
+ " ...(root_barrier)\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `barrier_pop`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b8c41f19fcece75027afa5a77acfd61b",
+ "grade": false,
+ "grade_id": "cell-65aebf1f840a376d",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(barrier_pop)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d453b38d0b4b0438c14f6a5ce3ffc859",
+ "grade": true,
+ "grade_id": "cell-5be38a133d838f2f",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3e5c9418633f33c559fb99a2ec38e9ea",
+ "grade": false,
+ "grade_id": "cell-3db19654da2479d1",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.2** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Draw 2000 random samples of size 20 from the population `barrier_pop` using the `rep_sample_n` function and a seed of 3909. For each sample, calculate the proportion of trees that **do not** have a root barrier (i.e. where `root_barrier == \"N\"`) as the point estimate. Lastly, visualize the distribution of the sample proportions you just calculated by plotting a histogram using `geom_histogram` with bin widths of 1/20. Add a descriptive title to the plot using `ggtitle` and ensure that the x-axis has a human-readable label. Your final plot should have a variable named `p` on the x-axis. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "barrier_sampling_dist <- ... %>% \n",
+ " rep_sample_n(size = ..., reps = ..., replace = ...) %>% \n",
+ " ...(replicate) %>% \n",
+ " summarize(x = sum(... == \"N\"),\n",
+ " n = n()) %>% \n",
+ " mutate(p = ... / ...) %>% \n",
+ " ggplot(aes(x = p)) +\n",
+ " geom_histogram(... = ...) +\n",
+ " xlab(\"Proportion\") +\n",
+ " ggtitle(\"Sampling Distribution of Proportions (n = 20)\")\n",
+ "```\n",
+ "\n",
+ "_Assign your plot to an object called `barrier_sampling_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "749d6e267353d126881216786837c83a",
+ "grade": false,
+ "grade_id": "cell-68ae3b69a08fbf94",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(3909) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "barrier_sampling_dist"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d55ad4e6a96aa5f120f32e77c85e8c38",
+ "grade": true,
+ "grade_id": "cell-baec19ed025dc2e9",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "11913c8f65c17bbd77210c78dd465d74",
+ "grade": false,
+ "grade_id": "cell-656b90f2deb5d102",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.3** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take a single random sample of size 20 from `barrier_pop` using `rep_sample_n` and a seed of 1933. Ensure your resulting data frame only has a single column: `root_barrier`.\n",
+ "\n",
+ "**Hint:** Remember to `ungroup()` before using `select()`!\n",
+ "\n",
+ "_Assign your data frame to an object called `barrier_sample`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "4367ca632b75b5d3ae359a67a64f793f",
+ "grade": false,
+ "grade_id": "cell-d565a00f0fb18d3a",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(1933) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(barrier_sample)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "883d740dbfe5561607ee39b666e967a0",
+ "grade": true,
+ "grade_id": "cell-789b0060d74dbe20",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e8fba40dcf4610cc4c7e0188b330a453",
+ "grade": false,
+ "grade_id": "cell-5cc1c16691bdfe76",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.4** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Now we want to produce a bootstrap sampling distribution using `barrier_sample` sample we just took, which we will be able to compare to the sampling distribution we generated above. We want to use the exact same scaffolding as **question 2.2** (except the object name we are saving to) to complete the following task: \n",
+ "\n",
+ "> Take 2000 bootstrap samples from `barrier_sample` using `rep_sample_n` with a seed of 2767. Then, calculate the proportion of trees in each sample that does not have a root barrier (`root_barrier == \"N\"`); name the column containing the sample propotions `p`. Lastly, use `geom_histogram` with bin widths of 1/20 to visualize the bootstrap distribution. Add a descriptive title to the plot using `ggtitle` and ensure that the x-axis has a human-readable label. \n",
+ "\n",
+ "**Which two `...`'s in the scaffolding below _must_ be different than the code you used in question 2.2?**\n",
+ "\n",
+ "```R\n",
+ "# LINE 1: bootstrap_dist_20 <- ... %>% \n",
+ "# LINE 2: rep_sample_n(size = ..., reps = ..., replace = ...) %>% \n",
+ "# LINE 3: ...(replicate) %>% \n",
+ "# LINE 4: summarize(x = sum(... == \"N\"),\n",
+ "# LINE 5: n = n()) %>% \n",
+ "# LINE 6: mutate(p = ... / ...) %>% \n",
+ "# LINE 7: ggplot(aes(x = p)) +\n",
+ "# LINE 8: geom_histogram(... = ...) +\n",
+ "# LINE 9: xlab(\"Proportion\") +\n",
+ "# LINE 10: ...(\"n = 20\")\n",
+ "```\n",
+ "\n",
+ "A. The `...` in `LINE 1` and the third `...` from the left in `LINE 2`\n",
+ "\n",
+ "B. The `...` in `LINE 1` and the second `...` from the left in `LINE 8`\n",
+ "\n",
+ "C. The first `...` from the left in `LINE 2` and the third `...` from the left in `LINE 2`\n",
+ "\n",
+ "D. The first `...` from the left in `LINE 2` and the second `...` from the left in `LINE 8`\n",
+ "\n",
+ "E. Some other two `...`'s not listed above.\n",
+ "\n",
+ "F. None of the above; only one `...` must be different.\n",
+ "\n",
+ "G. None of the above; three or more of the `...` must be different.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.4`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f8bbd80dd4c4cdbeb39f6ed8ea860c06",
+ "grade": false,
+ "grade_id": "cell-bb6ac4a03c970908",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.4 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fcacfde33502575ab5c58484bd216830",
+ "grade": true,
+ "grade_id": "cell-c108dea3f7b6b6e2",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a6a5b5bb19434837649ecf829ddad640",
+ "grade": false,
+ "grade_id": "cell-092e11d77cbda9d5",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.5** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take 2000 bootstrap samples from `barrier_sample` using `rep_sample_n` with a seed of 2767. Then, calculate the proportion of trees in each sample that does not have a root barrier (`root_barrier == \"N\"`). Lastly, use `geom_histogram` with bin widths of 1/20 to visualize the bootstrap distribution. Add a descriptive title to the plot using `ggtitle` and ensure that the x-axis has a human-readable label. \n",
+ "\n",
+ "**Hint:** use your answer to the previous question and your code from **question 2.2**.\n",
+ "\n",
+ "_Assign your plot to an object called `barrier_bootstrap_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a6e988e4e63b3365325e7d60be2e9330",
+ "grade": false,
+ "grade_id": "cell-49c66e4141824107",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2767) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "barrier_bootstrap_dist"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "3b2625cf78306e32c7186da8b945ea32",
+ "grade": true,
+ "grade_id": "cell-1e5db4cb336f35b7",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.5()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a5449d507c19491aa14350813efcc4d4",
+ "grade": false,
+ "grade_id": "cell-5b7a33251a40cd78",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.6** \n",
+ "
{points: 1}\n",
+ "\n",
+ "**Note:** this question has two parts!\n",
+ "\n",
+ "a) Calculate the standard deviation of the sampling distribution you generated above (`barrier_sampling_dist`); this is the standard error of the corresponding estimator.\n",
+ "\n",
+ "_Assign your answer to an object called `standard_error`. Your answer should be a single number._\n",
+ "\n",
+ "
\n",
+ "\n",
+ "b) Calculate the standard deviation of the bootstrap distribution you generated above (`barrier_bootstrap_dist`).\n",
+ "\n",
+ "_Assign your answer to an object called `standard_deviation`. Your answer should be a single number._\n",
+ "\n",
+ "**Hints:**\n",
+ "- You can get the data that was used to generate using a plot with `plot_name$data`, for example: `barrier_sampling_dist$data`.\n",
+ "- You can convert a 1x1 data frame to a number using `as.numeric()`."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9f4b1d0a76fe148b09e2e30c3ed6d181",
+ "grade": false,
+ "grade_id": "cell-723febc1c6611afd",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "standard_error\n",
+ "standard_deviation"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "0d66edec900a689d8254cd6926e8976d",
+ "grade": true,
+ "grade_id": "cell-96fbd5f460153e4d",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.6()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "52cc1899a2724b40dae616dc80ed7e2f",
+ "grade": false,
+ "grade_id": "cell-872bca96dfb37d39",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.7** \n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "The standard deviation of a bootstrap distribution is a \"good guess\" of the standard deviation of the corresponding sampling distribution."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a7477575e102bfb6c8f759f276c7acd5",
+ "grade": false,
+ "grade_id": "cell-98838fdd73e845c4",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.7 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fca85ddd5ac1d7323ac72e1faa9c6be9",
+ "grade": true,
+ "grade_id": "cell-2b590d0c77cfb166",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.7()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8ff10ec5398dcdb8b846e04a11be84a7",
+ "grade": false,
+ "grade_id": "cell-c1862c7bad5b258e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.8** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Will the standard deviation of a bootstrap distribution **always** be relatively close to the standard deviation of the corresponding sampling distribution?\n",
+ "- If no, describe one situation related to our root barrier scenario above that would result in the `standard_deviation` object from **question 2.6** being very different than the `standard_error` object.\n",
+ "- If yes, explain why no such situation exists."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "fa4ef74f207a8af9d77c47ade5dd5548",
+ "grade": true,
+ "grade_id": "cell-692bb294134028ed",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "88dad7be920980f75fae98697fc803c7",
+ "grade": false,
+ "grade_id": "cell-09699b3910c5e22d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 3. A Closer Look at Bootstrapping\n",
+ "\n",
+ "There is one \"rule\" related to bootstrapping that we have not mentioned yet:\n",
+ "\n",
+ "> When generating a bootstrap distribution to estimate the sampling distribution for the original sample size, the **bootstrap samples** should be the **same size** as the **original sample** to get a useful estimate.\n",
+ "\n",
+ "For example, we would get poor results if we took a sample of size 30 from the population, and then took many bootstrap samples (resamples from the original sample, with replacement) of size 60 to estimate a sampling distribution for samples of size 30. Why? Let's try it out ourselves to discover the answer. Afterwards, we'll also go through some other questions to continue to solidify our understanding of the various nuances related to bootstrapping."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "29f0247abda2cf0190a6b00d05a8795e",
+ "grade": false,
+ "grade_id": "cell-0bd9dc7d44fd3c04",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Building Permits\n",
+ "\n",
+ "To explore the \"rule of thumb\" that we mentioned above, we will again use the `vancouver_trees` data set from the `datateachr` pacakge. However, this time the population we are interested in is only the trees with the common name `\"PISSARD PLUM\"`, and the parameter that we are interested in is the standard deviation of the `diameter` of these trees."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "edddfed3762773a96971a5767cad4355",
+ "grade": false,
+ "grade_id": "cell-499c4bc56a311d6f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "head(vancouver_trees)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a613408aebd17172332b5689490c2d1b",
+ "grade": false,
+ "grade_id": "cell-b08c8f90c4b7f79d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.0** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Filter the `vancouver_trees` dataset for the population that we are interested in and then select the variable that we are interested in (your final data frame should have a single column).\n",
+ "\n",
+ "_Assign your data frame to an object called `plum_pop`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "76373c38979f404115129c5182a0c2fc",
+ "grade": false,
+ "grade_id": "cell-bdde492539c6004d",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(plum_pop)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a25d03df15bf8776893bdbc138012b67",
+ "grade": true,
+ "grade_id": "cell-ae4e3ed82fd5daf8",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8f1c3c40a52d7b018041b290dac44fdc",
+ "grade": false,
+ "grade_id": "cell-380227c9b0e5412d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.1** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Take a single random sample of size 10 from `plum_pop` using the `rep_sample_n` function and a seed of 0737. Ensure your resulting data frame only has a single column: `diameter`.\n",
+ "\n",
+ "_Assign your data frame to an object called `plum_sample`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2c7107f26e57daf5c739e7f9be58d65a",
+ "grade": false,
+ "grade_id": "cell-75af97d43ec269ac",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(0737) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(plum_sample)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b746a6c7a74cd1aa6ee9061d8867c4ed",
+ "grade": true,
+ "grade_id": "cell-0986f2eb2717d803",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"plum_sample\"', {\n",
+ " expect_true(exists(\"plum_sample\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a data frame\", {\n",
+ " expect_true(\"data.frame\" %in% class(plum_sample))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "97c11d31d3e9f6b64a86e59f2934cc6d",
+ "grade": false,
+ "grade_id": "cell-997950696b0f714d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.2** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Take 2500 bootstrap samples **of size 100** from the sample you took in the previous question by using the `rep_sample_n` function and a seed of 9284. \n",
+ "\n",
+ "_Assign your data frame to an object called `plum_resamples`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "56d583dd611bcbbe6df83f1b791af971",
+ "grade": false,
+ "grade_id": "cell-b06447756aff9cd5",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(9284) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(plum_resamples)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6024169a3b230b918d508557b7862530",
+ "grade": true,
+ "grade_id": "cell-a2e18241939fda90",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"plum_resamples\"', {\n",
+ " expect_true(exists(\"plum_resamples\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a data frame\", {\n",
+ " expect_true(\"data.frame\" %in% class(plum_resamples))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "79ab6cd4efd145db521b5cbefca13a73",
+ "grade": false,
+ "grade_id": "cell-c8eda13872adcd19",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.3** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Calculate the standard deviation for each resample that you took in the previous question with `group_by()` and `summarize()`. Name the new column containing the standard deviation `sd`.\n",
+ "\n",
+ "_Assign your data frame to an object called `resample_estimates`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d8426c02e20209394824498868530160",
+ "grade": false,
+ "grade_id": "cell-704a430b3580ea41",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(resample_estimates)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "acb1bf708fc89826d14bc2707f3eb135",
+ "grade": true,
+ "grade_id": "cell-caa64285e3611f8d",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"resample_estimates\"', {\n",
+ " expect_true(exists(\"resample_estimates\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a data frame\", {\n",
+ " expect_true(\"data.frame\" %in% class(resample_estimates))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "58bc88c1684a60cb15e98ccb71d7de31",
+ "grade": false,
+ "grade_id": "cell-28a80204df4ba87d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.3** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Visualize the bootstrap distribution (of `resample_estimates`) by plotting a histogram using `geom_histogram` with bin widths of 0.25. Ensure that the x-axis has a human-readable label.\n",
+ "\n",
+ "_Assign your plot to an object called `plum_bootstrap_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "131209bf2b21a0c29462c42caf136cf8",
+ "grade": false,
+ "grade_id": "cell-f4e06076985de5fe",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "plum_bootstrap_dist"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d1871e5552d82012ff62a7c8117ec982",
+ "grade": true,
+ "grade_id": "cell-962d663ea98f596f",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"plum_bootstrap_dist\"', {\n",
+ " expect_true(exists(\"plum_bootstrap_dist\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a ggplot object\", {\n",
+ " expect_true(is.ggplot(plum_bootstrap_dist))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "fef5fec05cefa5ac860f3952033d674f",
+ "grade": false,
+ "grade_id": "cell-1b4a28c6484afef9",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.4** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Produce a sampling distribution (**not** a bootstrap distribution) of sample standard deviations for samples of size 10 from the population `plum_pop` using a procedure similar to the previous questions and the last section; use `geom_histogram` with bin widths of 0.25. Also, use 2500 sample replicates and a seed of 2362.\n",
+ "\n",
+ "_Assign your plot to an object called `plum_sampling_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5add0c837275b32c7deaeb266f9b0f9c",
+ "grade": false,
+ "grade_id": "cell-ad672783439467a1",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2362) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "plum_sampling_dist"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "bcc3c9bc04e09bf71c4d853c3e8dc380",
+ "grade": true,
+ "grade_id": "cell-6766ffaf56560b7f",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"plum_sampling_dist\"', {\n",
+ " expect_true(exists(\"plum_sampling_dist\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a ggplot object\", {\n",
+ " expect_true(is.ggplot(plum_sampling_dist))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "9650703e071d3003622c3c388e8ee15a",
+ "grade": false,
+ "grade_id": "cell-7e8315e5d3cbc365",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "In the code cell below, we have used `plot_grid` to plot the sample distribution and bootstrap distribution side by side.\n",
+ "\n",
+ "**Note:** some of the sample standard deviations are not visible because we have manually set bounds on the x-axis so you can compare the important parts of the distributions more easily\n",
+ "\n",
+ "_Use the two plots below to answer the next **three questions**._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fee2002f5ff4d0f86197d3da2c2bc03b",
+ "grade": false,
+ "grade_id": "cell-8fb6ead05de278cb",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "options(repr.plot.width = 12, repr.plot.height = 4)\n",
+ "plot_grid(plum_sampling_dist +\n",
+ " labs(title = \"Sampling Distribution\",\n",
+ " caption = \"Generated using 2500 sample replicates of size 10.\") +\n",
+ " scale_x_continuous(limits = c(0, 10)),\n",
+ " plum_bootstrap_dist +\n",
+ " labs(title = \"Bootstrap Distribution\",\n",
+ " caption = \"Generated using 2500 bootstrap samples of size 100 from a sample of size 10.\") + \n",
+ " scale_x_continuous(limits = c(0, 10)),\n",
+ " ncol = 2)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "cb65d84a6c4ab211340c07d46ab1d94b",
+ "grade": false,
+ "grade_id": "cell-2244b50e950e9a0c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.5** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Which statement **best** describes the bootstrap distribution above?\n",
+ "\n",
+ "A. The distribution of many point estimates for the standard deviation of the population, which were acquired by taking many samples from the population and calculating the standard deviation of each sample.\n",
+ "\n",
+ "B. The distribution of many point estimates for the standard deviation of the sampling distribution (which is the standard error of the corresponding estimator), which were acquired by re-sampling from the original sample and calculating the standard deviation of each re-sample.\n",
+ "\n",
+ "C. The distribution of the standard deviations of many samples that were taken from the population.\n",
+ "\n",
+ "D. The distribution of standard deviations for many re-samples that were taken from the original sample.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.5`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6dfce03f274f48e431ea0ef4659a95ca",
+ "grade": false,
+ "grade_id": "cell-91d590e6b77000e6",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.5 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7ac2bfde607b3bb3ff66ca641e8ef7a1",
+ "grade": true,
+ "grade_id": "cell-edf9b5c8e15d6131",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer3.5\"', {\n",
+ " expect_true(exists(\"answer3.5\"))\n",
+ "})\n",
+ "test_that('Solution should be a single character (\"A\", \"B\", \"C\", or \"D\")', {\n",
+ " expect_match(answer3.5, \"a|b|c|d\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "08e96f05c3a16af30e6b3c1ca9907d1b",
+ "grade": false,
+ "grade_id": "cell-a21ce58b3d2da734",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.6** \n",
+ "
{points: 3}\n",
+ "\n",
+ "By referencing the plots above, explain why it's not a good idea to take bootstrap sizes of a **larger size than the original sample** to estimate the sampling distribution for the original sample size."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ec10052cbfc89966d146437b3686976b",
+ "grade": true,
+ "grade_id": "cell-ea429f75fae054cc",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "88995f4e7559480dc857d341e63eae24",
+ "grade": false,
+ "grade_id": "cell-5a499689a7ee1a31",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.7** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Suppose you took a single sample of size 164 and then took many bootstrap samples of size 10 from the first sample to produce a bootstrap distribution for the mean of the `diameter` variable in the `plum_pop` population. Suppose you wanted to use the standard deviation of the bootstrap distribution to estimate the standard deviation of the sampling distribution of sample means for the `diameter` variable for samples of size 164. How would you expect the estimate to compare to the actual standard error?\n",
+ "\n",
+ "A. The estimate would likely be an under-estimate.\n",
+ "\n",
+ "B. The estimate would likely be accurate.\n",
+ "\n",
+ "C. The estimate would likely be an over-estimate.\n",
+ "\n",
+ "D. There is not enough information to make this comparison.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.7`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "935c8fec12d03944b439bced23c09f10",
+ "grade": false,
+ "grade_id": "cell-fcc688c1a5f5aafc",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.7 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "138b7aab3f29269f02391ae81d211739",
+ "grade": true,
+ "grade_id": "cell-77a7fcc29f5d9d08",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer3.7\"', {\n",
+ " expect_true(exists(\"answer3.7\"))\n",
+ "})\n",
+ "test_that('Solution should be a single character (\"A\", \"B\", \"C\", or \"D\")', {\n",
+ " expect_match(answer3.7, \"a|b|c|d\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "4d279ea8b312399f1ebff0e7b687e543",
+ "grade": false,
+ "grade_id": "cell-aa93730bf9b99905",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### More Bootstrapping Nuances"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "daf5b677527958ca272fe85e819c8583",
+ "grade": false,
+ "grade_id": "cell-926dcf19654f9798",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.8** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Suppose a bootstrap distribution of sample means of the `diameter` variable in `plum_pop`, using `rep_sample_n` to take single sample of size 8 from the population and 3000 bootstrap samples. The resulting distribution is displayed below with bin widths of 0.25:\n",
+ "\n",
+ "\n",
+ "\n",
+ "a) Given that the standard deviation of the `diameter` variable for the population `plum_pop` is around 5.0, is this a shape that you would expect the bootstrap distribution to have?\n",
+ "\n",
+ "b) If you answered yes, justify yourself in 1-2 sentences. If you answered no, justify yourself in 1-2 sentence and describe an error or scenario that would result in such a distribution in another sentence."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "76acfe4edb73921e9bef0df9313caab0",
+ "grade": true,
+ "grade_id": "cell-b89f9dba49eab352",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "eb924b9f35ecc910c3d6a3db9503b20c",
+ "grade": false,
+ "grade_id": "cell-2ea018ce1de43103",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.9** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Consider the following single random sample of 6 observations of the reported average hours of screen time a person is exposed to each day:\n",
+ "\n",
+ "| `screen_time`
``|\n",
+ "| -- |\n",
+ "| 3 |\n",
+ "| 6 |\n",
+ "| 8 |\n",
+ "| 1 |\n",
+ "| 7 |\n",
+ "| 7 |\n",
+ " \n",
+ "Below are two more data frames that are claimed to have been created by bootstrapping from the original sample.\n",
+ "\n",
+ "| `screen_time`
``|\n",
+ "| -- |\n",
+ "| 6 |\n",
+ "| 7 |\n",
+ "| 6 |\n",
+ "| 7 |\n",
+ "| 7 |\n",
+ "| 1 |\n",
+ "\n",
+ "| `screen_time`
``|\n",
+ "| -- |\n",
+ "| 7 |\n",
+ "| 1 |\n",
+ "| 7 |\n",
+ "| 3 |\n",
+ "| 6 |\n",
+ "| 8 |\n",
+ "\n",
+ " Consider the values in the two data frames above. Do you agree that the two data frames above were bootstrapped samples? Explain why or why not in your own words in a few sentences."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c06bcbd38196b61090cc73d7078bdb39",
+ "grade": true,
+ "grade_id": "cell-e29a92ff6d0d764d",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ }
+ ],
+ "metadata": {
+ "docker": {
+ "latest_image_tag": "v0.4.0"
+ },
+ "jupytext": {
+ "formats": "ipynb,Rmd"
+ },
+ "kernelspec": {
+ "display_name": "R",
+ "language": "R",
+ "name": "ir"
+ },
+ "language_info": {
+ "codemirror_mode": "r",
+ "file_extension": ".r",
+ "mimetype": "text/x-r-source",
+ "name": "R",
+ "pygments_lexer": "r",
+ "version": "4.2.3"
+ }
+ },
+ "nbformat": 4,
+ "nbformat_minor": 4
+}
diff --git a/materials/tutorial_04/flow_sample.csv b/materials/tutorial_04/flow_sample.csv
new file mode 100644
index 0000000..e8bb8c2
--- /dev/null
+++ b/materials/tutorial_04/flow_sample.csv
@@ -0,0 +1,110 @@
+ID,PARAM,Year,MM--DD,MAX,SYM,MM--DD,MIN,SYM
+05BB001,1,1909,07--07,314,,,,
+05BB001,1,1910,06--12,230,,,,
+05BB001,1,1911,06--14,264,,02--27,5.75,
+05BB001,1,1912,08--25,174,,03--14,5.80,
+05BB001,1,1913,06--11,232,,03--18,6.12,B
+05BB001,1,1914,06--18,214,,11--17,7.16,
+05BB001,1,1915,06--27,236,,01--27,6.94,
+05BB001,1,1916,06--20,309,,03--02,6.97,B
+05BB001,1,1917,06--17,174,,02--23,6.06,B
+05BB001,1,1918,06--15,345,,02--20,6.03,B
+05BB001,1,1919,06--22,185,,02--28,4.56,B
+05BB001,1,1920,07--03,248,,04--03,5.69,B
+05BB001,1,1921,06--09,171,,03--11,6.37,B
+05BB001,1,1922,06--05,209,,03--27,6.57,B
+05BB001,1,1923,06--14,377,,12--20,6.43,E
+05BB001,1,1924,07--05,167,,04--20,6.26,
+05BB001,1,1925,05--23,212,,12--31,5.44,B
+05BB001,1,1926,07--07,130,,04--05,5.52,B
+05BB001,1,1927,06--27,221,,02--17,6.48,B
+05BB001,1,1928,05--28,289,,12--29,6.09,B
+05BB001,1,1929,06--02,215,,04--08,4.90,B
+05BB001,1,1930,06--08,263,,12--29,6.00,B
+05BB001,1,1931,06--18,187,,03--26,4.70,B
+05BB001,1,1932,06--03,279,,01--05,3.62,B
+05BB001,1,1933,06--17,311,,12--26,5.27,B
+05BB001,1,1934,05--31,269,,02--26,4.08,B
+05BB001,1,1935,06--16,197,,12--19,5.95,B
+05BB001,1,1936,06--01,219,,02--16,5.64,B
+05BB001,1,1937,06--17,148,,02--14,5.15,B
+05BB001,1,1938,06--23,220,,02--15,6.63,B
+05BB001,1,1939,05--29,178,,02--10,5.49,B
+05BB001,1,1940,05--26,204,,03--12,6.43,B
+05BB001,1,1941,06--25,126,,11--23,6.14,
+05BB001,1,1942,07--05,166,,02--17,6.37,B
+05BB001,1,1943,07--10,209,,02--28,5.04,B
+05BB001,1,1944,06--12,158,,03--13,5.55,B
+05BB001,1,1945,06--22,126,,04--11,6.99,
+05BB001,1,1946,05--29,204,,03--14,7.70,B
+05BB001,1,1947,06--11,167,,03--04,7.31,B
+05BB001,1,1948,06--09,292,,01--27,8.41,B
+05BB001,1,1949,06--07,121,,12--11,6.09,B
+05BB001,1,1950,06--21,286,,03--31,5.04,
+05BB001,1,1951,06--16,243,,03--05,4.25,B
+05BB001,1,1952,06--30,155,,04--01,6.06,
+05BB001,1,1953,06--14,260,,02--09,6.00,B
+05BB001,1,1954,07--08,286,,03--28,6.43,B
+05BB001,1,1955,06--24,246,,02--11,6.74,B
+05BB001,1,1956,06--05,257,,12--06,6.09,B
+05BB001,1,1957,05--20,152,,03--05,5.86,B
+05BB001,1,1958,05--26,191,,03--01,6.14,B
+05BB001,1,1959,06--22,212,,01--03,6.68,B
+05BB001,1,1960,07--01,182,,02--27,7.25,B
+05BB001,1,1961,06--07,266,,01--19,7.59,B
+05BB001,1,1962,06--26,184,,02--05,5.44,B
+05BB001,1,1963,06--19,183,,02--02,6.43,B
+05BB001,1,1964,06--14,246,,03--23,7.31,B
+05BB001,1,1965,06--19,289,,03--18,7.87,B
+05BB001,1,1966,06--01,225,,03--03,7.93,B
+05BB001,1,1967,06--22,275,,03--11,7.53,B
+05BB001,1,1968,06--27,191,,04--22,7.53,
+05BB001,1,1969,06--06,203,,01--31,7.50,B
+05BB001,1,1970,06--05,155,,11--23,5.21,B
+05BB001,1,1971,06--07,199,,03--22,5.41,B
+05BB001,1,1972,06--12,311,,03--01,7.16,B
+05BB001,1,1973,06--24,215,,01--04,6.71,B
+05BB001,1,1974,06--25,317,,03--22,6.09,B
+05BB001,1,1975,07--14,144,,03--08,5.66,B
+05BB001,1,1976,07--01,191,,03--23,5.95,B
+05BB001,1,1977,06--09,207,,11--21,5.83,B
+05BB001,1,1978,06--06,189,,01--30,5.75,B
+05BB001,1,1979,06--13,150,,02--09,5.40,B
+05BB001,1,1980,05--22,190,,03--04,4.14,B
+05BB001,1,1981,05--27,227,,02--10,7.24,B
+05BB001,1,1982,06--22,192,,01--16,6.15,B
+05BB001,1,1983,05--31,155,,12--02,5.83,
+05BB001,1,1984,06--30,220,E,03--14,5.91,B
+05BB001,1,1985,05--25,160,,03--03,6.04,B
+05BB001,1,1986,06--02,313,,02--18,5.55,B
+05BB001,1,1987,06--17,146,A,11--30,6.19,B
+05BB001,1,1988,06--08,244,,01--05,5.11,B
+05BB001,1,1989,06--16,208,,03--30,6.40,B
+05BB001,1,1990,06--25,239,,03--23,8.12,B
+05BB001,1,1991,07--04,242,,03--02,6.39,B
+05BB001,1,1992,06--13,131,,12--28,6.88,B
+05BB001,1,1993,06--02,128,,02--15,5.64,B
+05BB001,1,1994,06--27,147,A,02--25,7.35,B
+05BB001,1,1995,06--07,263,,02--11,4.85,B
+05BB001,1,1996,06--09,231,,02--26,6.51,B
+05BB001,1,1997,06--06,213,,02--28,6.73,B
+05BB001,1,1998,05--28,133,,12--20,6.25,B
+05BB001,1,1999,06--19,205,,01--24,6.68,B
+05BB001,1,2000,07--02,153,,12--11,7.88,B
+05BB001,1,2001,05--29,165,,03--15,6.27,B
+05BB001,1,2002,06--29,226,,03--17,5.58,B
+05BB001,1,2003,06--11,164,,02--23,5.64,B
+05BB001,1,2004,06--12,162,,01--26,7.80,B
+05BB001,1,2005,06--23,167,,03--24,8.44,B
+05BB001,1,2006,05--21,168,,02--18,7.83,B
+05BB001,1,2007,06--07,298,,02--14,7.98,B
+05BB001,1,2008,07--01,163,,03--31,7.00,B
+05BB001,1,2009,06--17,143,,12--07,6.30,B
+05BB001,1,2010,06--30,138,,04--05,6.40,B
+05BB001,1,2011,06--23,179,,01--30,7.13,B
+05BB001,1,2012,06--07,332,,12--25,6.12,B
+05BB001,1,2013,06--21,466,,01--02,5.31,B
+05BB001,1,2014,06--26,178,,01--28,6.09,B
+05BB001,1,2015,06--09,151,,03--04,6.59,B
+05BB001,1,2016,06--08,107,,03--28,7.70,B
+05BB001,1,2018,05--27,199,,03--31,6.77,B
diff --git a/materials/tutorial_04/tests_tutorial_04.R b/materials/tutorial_04/tests_tutorial_04.R
new file mode 100644
index 0000000..e8738e7
--- /dev/null
+++ b/materials/tutorial_04/tests_tutorial_04.R
@@ -0,0 +1,277 @@
+library(digest)
+library(testthat)
+
+test_1.0 <- function() {
+ test_that('Did not assign answer to an object called "steam_pop"', {
+ expect_true(exists("steam_pop"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_pop))
+ })
+
+ expected_colnames <- c("original_price")
+ given_colnames <- colnames(steam_pop)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_pop))), "bc015e4c2e1698184f3f79d5432f54f1")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(steam_pop$original_price) * 1000)), "4d38676bfa8adb0e95087935662737c9")
+ })
+
+ print("Success!")
+}
+
+test_1.1 <- function() {
+ test_that('Did not assign answer to an object called "steam_sample"', {
+ expect_true(exists("steam_sample"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_sample))
+ })
+
+ expected_colnames <- c("original_price")
+ given_colnames <- colnames(steam_sample)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_sample))), "16071ab8270571c6c83d682892e00ea5")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(steam_sample$original_price) * 1000)), "9e4221b66064892c1311cfb904d05af9")
+ })
+
+ print("Success!")
+}
+
+test_1.2 <- function() {
+ test_that('Did not assign answer to an object called "steam_bootstrapped"', {
+ expect_true(exists("steam_bootstrapped"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_bootstrapped))
+ })
+
+ expected_colnames <- c("replicate", "bootstrap_median")
+ given_colnames <- colnames(steam_bootstrapped)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_bootstrapped))), "a6d2eaaf1485f7b5c2c656e014e1835c")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(steam_bootstrapped$bootstrap_median) * 1000)), "81f8e8b8151f4ce03110e473991992a8")
+ })
+
+ print("Success!")
+}
+
+test_1.3 <- function() {
+ test_that('Did not assign answer to an object called "steam_ci"', {
+ expect_true(exists("steam_ci"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_ci))
+ })
+
+ expected_colnames <- c("ci_lower", "ci_upper")
+ given_colnames <- colnames(steam_ci)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_ci))), "4b5630ee914e848e8d07221556b0a2fb")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(steam_ci$ci_lower * 1000)), "8da5500b2599f3c65fdea9ebde1e892e")
+ expect_equal(digest(as.integer(steam_ci$ci_upper * 1000)), "5078d99ad73dda092eca9e13110ea1ce")
+ })
+
+ print("Success!")
+}
+
+test_1.2_infer <- function() {
+ test_that('Did not assign answer to an object called "steam_bootstrapped2"', {
+ expect_true(exists("steam_bootstrapped2"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_bootstrapped2))
+ })
+
+ expected_colnames <- c("replicate", "stat")
+ given_colnames <- colnames(steam_bootstrapped2)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_bootstrapped2))), "a6d2eaaf1485f7b5c2c656e014e1835c")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(steam_bootstrapped2$stat) * 1000)), "81f8e8b8151f4ce03110e473991992a8")
+ })
+
+ print("Success!")
+}
+
+test_1.3_infer <- function() {
+ test_that('Did not assign answer to an object called "steam_ci2"', {
+ expect_true(exists("steam_ci2"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(steam_ci2))
+ })
+
+ expected_colnames <- c("lower_ci", "upper_ci")
+ given_colnames <- colnames(steam_ci2)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(steam_ci2))), "4b5630ee914e848e8d07221556b0a2fb")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(steam_ci2$lower_ci * 1000)), "8da5500b2599f3c65fdea9ebde1e892e")
+ expect_equal(digest(as.integer(steam_ci2$upper_ci * 1000)), "5078d99ad73dda092eca9e13110ea1ce")
+ })
+
+ print("Success!")
+}
+
+test_1.4 <- function() {
+ test_that('Did not assign answer to an object called "steam_ci_plot"', {
+ expect_true(exists("steam_ci_plot"))
+ })
+ properties <- c(steam_ci_plot$layers[[1]]$mapping, steam_ci_plot$mapping)
+
+ test_that("Plot should have stat on the x-axis", {
+ expect_true("stat" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot does not have the correct layers", {
+ expect_true("GeomBar" %in% class(steam_ci_plot$layers[[1]]$geom))
+ expect_true("GeomVline" %in% class(steam_ci_plot$layers[[2]]$geom))
+ expect_true("GeomVline" %in% class(steam_ci_plot$layers[[3]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", steam_ci_plot$layers[[1]])[["stat_params"]][["binwidth"]] * 1000)),
+ "189e2f1b2fbb3743811990e9708c226a"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(steam_ci_plot$data)), "a6d2eaaf1485f7b5c2c656e014e1835c")
+ expect_equal(digest(as.integer(sum(steam_ci_plot$data$stat) * 1000)), "81f8e8b8151f4ce03110e473991992a8")
+ })
+
+ test_that("geom_vline layers are not in the correct locations", {
+ expect_equal(digest(as.integer(steam_ci_plot$layers[[2]]$data * 1000)), "8da5500b2599f3c65fdea9ebde1e892e")
+ expect_equal(digest(as.integer(steam_ci_plot$layers[[3]]$data * 1000)), "5078d99ad73dda092eca9e13110ea1ce")
+ })
+
+ print("Success!")
+}
+
+test_1.6 <- function() {
+ test_that('Did not assign answer to an object called "steam_median"', {
+ expect_true(exists("steam_median"))
+ })
+
+ answer_as_numeric <- as.numeric(steam_median)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000)), "8da5500b2599f3c65fdea9ebde1e892e")
+ })
+
+ print("Success!")
+}
+
+test_1.7 <- function() {
+ test_that('Did not assign answer to an object called "answer1.7"', {
+ expect_true(exists("answer1.7"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer1.7, "true|false", ignore.case = TRUE)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer1.7)), "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_2.1 <- function() {
+ test_that('Did not assign answer to an object called "cancer_ci"', {
+ expect_true(exists("cancer_ci"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(cancer_ci))
+ })
+
+ expected_colnames <- c("lower_ci", "upper_ci")
+ given_colnames <- colnames(cancer_ci)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(cancer_ci))), "4b5630ee914e848e8d07221556b0a2fb")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(cancer_ci$lower_ci * 1000000)), "81d11d2d9c5edc8dde5943e7e8ccf428")
+ expect_equal(digest(as.integer(cancer_ci$upper_ci * 1000000)), "f79b45b4d0457d5c267b08e74659f678")
+ })
+
+ print("Success!")
+}
diff --git a/materials/tutorial_04/tutorial_04.ipynb b/materials/tutorial_04/tutorial_04.ipynb
new file mode 100644
index 0000000..7db2761
--- /dev/null
+++ b/materials/tutorial_04/tutorial_04.ipynb
@@ -0,0 +1,1918 @@
+{
+ "cells": [
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "4ab39923e859202b3dac23e507ed2a90",
+ "grade": false,
+ "grade_id": "cell-0a3a16e4560c3222",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "# Tutorial 4: Confidence Intervals via Bootstrapping"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "af30f6f6426fae8bddd94612c19f7280",
+ "grade": false,
+ "grade_id": "cell-697926f90dfb6d3f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "#### Lecture and Tutorial Learning Goals:\n",
+ "From this section, students are expected to be able to:\n",
+ "\n",
+ "1. Define what a confidence interval is, and why we want to generate one.\n",
+ "2. Explain how the bootstrap sampling distribution can be used to create confidence intervals.\n",
+ "3. Write a computer script to calculate confidence intervals for a population parameter using bootstrapping.\n",
+ "4. Effectively visualize point estimates and confidence intervals.\n",
+ "5. Interpret and explain results from confidence intervals.\n",
+ "6. Discuss the potential limitations of these methods."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9be68c508ee8bbb19091c1c26490932f",
+ "grade": false,
+ "grade_id": "cell-9d4ab0c1978d7fc8",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "library(cowplot)\n",
+ "library(datateachr)\n",
+ "library(digest)\n",
+ "library(infer)\n",
+ "library(repr)\n",
+ "library(taxyvr)\n",
+ "library(tidyverse)\n",
+ "source(\"tests_tutorial_04.R\")"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d61511e7aa18bf87dd7c00f4a7313a70",
+ "grade": false,
+ "grade_id": "cell-8f98efcea21ec2e0",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 1. Steam Games\n",
+ "\n",
+ "For the first part of this tutorial, we'll be working with a dataset that contains various attributes, including the name, original price, genre, and description, of over 40,000 different games available on Steam. Steam is a platform where video games (and some other types of applications) are distributed digitally. Essentially, Steam acts as a digital game store and library. Although this particular dataset was compiled in 2019, for this tutorial, we will assume we have data for the entire population for simplicity.\n",
+ "\n",
+ "\n",
+ "\n",
+ "
\n",
+ "\n",
+ "This data set, like several of the others we have worked with so far, is included in the `datateachr` package under the object name `steam_games`. The original source of the data set can be found in the documentation (`?steam_games`). We are interested in calculating a **90% confidence interval** for the **median of the `original_price`** of the games in the population. Afterwards, we will interpret the confidence interval and, because we are lucky enough to have access to data for the entire finite population, we will calculate the true median and see whether it is captured by our confidence interval."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "227788338cab9dbc911dc817701eae1c",
+ "grade": false,
+ "grade_id": "cell-ad245a9f4e1c5358",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "?steam_games"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f33106681c17504006b884904dfa4b86",
+ "grade": false,
+ "grade_id": "cell-e3af05128aa353b2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.0** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Filter out all `NA` values from the variable we are interested in (`original_price`), and select only that column.\n",
+ "\n",
+ "**Note:** the values of `original_price` are in $USD.\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_pop`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "defe590fe055c73e6f911de6ecb82cea",
+ "grade": false,
+ "grade_id": "cell-fa279e7c87ba536d",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "head(steam_pop)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "43c1d812896a0cb82f8f8f902c736879",
+ "grade": true,
+ "grade_id": "cell-2328820ae2dd9342",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "fd266d9ca666ec5392f50a66961f7576",
+ "grade": false,
+ "grade_id": "cell-6e83465e672d5f4a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.1** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take a single random sample of size 40 from `steam_pop` using `rep_sample_n` and a seed of 2078. After taking the sample, ensure that only the `original_price` column is selected. (_Hint: you will need to ungroup before selecting the column_.)\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_sample`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "4d91b6b44ebf5c30e0e4f55d1fb56609",
+ "grade": false,
+ "grade_id": "cell-b15be21c9148990e",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2078) # DO NOT CHANGE\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "head(steam_sample)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "3bbcc2e183f04c22b6c1ec3862c7ef22",
+ "grade": true,
+ "grade_id": "cell-aa73f2f5d26ec1a5",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "4d507dcb0aa7e8203cce2b8427e0a5dc",
+ "grade": false,
+ "grade_id": "cell-f8d2705dd1f8a738",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.2** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take 1500 bootstrap samples from `steam_sample` using `rep_sample_n` and a seed of 9844. Then, calculate the median of each sample (name this column `bootstrap_median`). Your final data frame should have a `replicate` column and a `bootstrap_median` column.\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_bootstrapped`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "670d26f008167559c8c7301d128bd531",
+ "grade": false,
+ "grade_id": "cell-fb44dfe96bbfc3e2",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(9844) # DO NOT CHANGE\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "head(steam_bootstrapped)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "0a936f8824b87b368ec46cf274e24af7",
+ "grade": true,
+ "grade_id": "cell-ac7825fd6fb09e74",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c7f220f713c5a889e7e388537a21feec",
+ "grade": false,
+ "grade_id": "cell-a81081ee88a8dcbb",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.3** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Use the `summarize` and `quantile` functions to calculate a 90% confidence interval for the median. Use the 0.05th and 0.95th quantiles for the lower and upper bounds of the interval, respectively. Name the column containing the lower bound of the interval `ci_lower` and the upper bound `ci_upper`.\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_ci`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "68bc9f6a4e84a69245fb4582e1b86047",
+ "grade": false,
+ "grade_id": "cell-32b6987424efb99e",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(steam_ci)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2337cba0041021ee6be2b882216291cc",
+ "grade": true,
+ "grade_id": "cell-d5e684abafd5de61",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3c7b1ef5c45106ddfa3c376c43ddc3bb",
+ "grade": false,
+ "grade_id": "cell-83b27ff0876de4d5",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### The `infer` package workflow for bootstrapping (and calculating confidence intervals)\n",
+ "\n",
+ "As you may have seen in [ModernDive](https://moderndive.com/8-confidence-intervals.html#infer-workflow), there is an alternative workflow for generating bootstrap distributions and calculating confidence intervals. The benefits are outlined in [Section 8.4.2](https://moderndive.com/8-confidence-intervals.html#infer-workflow). However, to summarize, the main benefit is that it will allow us to use similar code for inference methods that we will learn about later on, so we can compare and transition from one method to another much easier. The general workflow for bootstrapping with the `infer` workflow is summarized in the chart below:\n",
+ "\n",
+ "\n",
+ "
\n",
+ "\n",
+ "Given a sample, in the `specify` step, you \"specify\" the variable in the sample that you are interested in. With `generate`, you \"generate\" the bootstrap samples (like using `rep_sample_n`). Then, with `calculate`, you \"calculate\" the statistic you are interested in for each re-sample (like using `group_by(replicate)` and then `summarize`).\n",
+ "\n",
+ "Finally, you can use `get_confidence_interval` to calculate a confidence interval using our bootstrap distribution and quantiles (like using the `summarize` and `quantile` functions).\n",
+ "\n",
+ "Let's re-do **question 1.2** and **question 1.3** using this new workflow for practice."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "79309a4db19c5fb687d20ba011244e74",
+ "grade": false,
+ "grade_id": "cell-d38884f4b37c73d0",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.2 (with the `infer` workflow!)** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Using the `infer` workflow, take 1500 bootstrap samples from `steam_sample` and calculate the **median** of each sample. Use the same seed as you did previously (9844) and the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "steam_bootstrapped2 <- ... %>% \n",
+ " specify(response = ...) %>% \n",
+ " generate(type = \"bootstrap\", reps = ...) %>% \n",
+ " calculate(stat = \"...\")\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_bootstrapped2`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5ed3133010cfb9ea0197b258fc04a5b1",
+ "grade": false,
+ "grade_id": "cell-1f0df6bdbb62604c",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(9844) # DO NOT CHANGE\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(steam_bootstrapped2)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8b1e65ce3b046d0057a4ab82669b0f72",
+ "grade": true,
+ "grade_id": "cell-b45446b574e94ceb",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.2_infer()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "de8940b2aa2ca55af5ce334a9f9db0c1",
+ "grade": false,
+ "grade_id": "cell-2d3f19165602c754",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.3 (with the `infer` workflow)** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Use the `get_confidence_interval` function with the bootstrap distribution you just generated (`steam_bootstrapped2`) to calculate a 90% confidence interval for the median. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "steam_ci2 <- steam_bootstrapped2 %>% \n",
+ " get_confidence_interval(level = ..., type = \"percentile\")\n",
+ "\n",
+ "```\n",
+ "\n",
+ "**Note:** you can also use the function `get_ci`, which is the same as the function `get_confidence_interval`, but it is much more concise. Try replacing `get_confidence_interval` with `get_ci`, and the result will be the same!\n",
+ "\n",
+ "_Assign your data frame to an object called `steam_ci2`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fb1acd4a13b4c79c4b8c332806278127",
+ "grade": false,
+ "grade_id": "cell-236e2d720af60c9f",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "steam_ci2"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "057d0b52f21247b5489abcd90fa05b59",
+ "grade": true,
+ "grade_id": "cell-bcb118f1c903bc0c",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.3_infer()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "73b102e923f60fed1360a9ad31944c2b",
+ "grade": false,
+ "grade_id": "cell-787bd139839ff9f2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Visualize the confidence interval (`steam_ci2`) with two `geom_vline` layers on top of the bootstrap distribution (`steam_bootstrapped2`) using `geom_histogram` with bin widths of 5. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "steam_ci_plot <- steam_bootstrapped2 %>% \n",
+ " ggplot(aes(x = ...)) +\n",
+ " ...(binwidth = ...) +\n",
+ " ...(xintercept = steam_ci[[1]]) +\n",
+ " ...(xintercept = ...)\n",
+ "```\n",
+ "\n",
+ "_Assign your plot to an object called `steam_ci_plot`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f72b52cd3cc106700ac06b8d1cfc2ca2",
+ "grade": false,
+ "grade_id": "cell-ed597d1944e8d0f4",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "steam_ci_plot"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ac084109fb348bfd0d2c07ea1019cf08",
+ "grade": true,
+ "grade_id": "cell-33d5d981468b489b",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "706486984cdbda00167d37cf4335da02",
+ "grade": false,
+ "grade_id": "cell-ae991fa30d049a8c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.5** \n",
+ "
{points: 3}\n",
+ "\n",
+ "Consider the effectiveness of the plot above. If you think the plot is effective, list **at least** three reasons why. Otherwise, list **at least** three things that you would change about the plot to make it more effective."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "b2e5749eaf38060acb4fac0382bd343a",
+ "grade": true,
+ "grade_id": "cell-d8bb30be9c34acae",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "83657a8daeca2e0e3765e36459c0e603",
+ "grade": false,
+ "grade_id": "cell-671f9c9171d201f1",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.6** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the median of the population `steam_pop`.\n",
+ "\n",
+ "_Assign your answer to an object called `steam_median`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5e9c3809092194522cbdeba00bb96e24",
+ "grade": false,
+ "grade_id": "cell-bf6e8d2bad6dbfa0",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "steam_median"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "435b0750da8f883296f6f59acec10960",
+ "grade": true,
+ "grade_id": "cell-54bb7b760cdd994e",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.6()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "15435aaae46548ac208c0d43e9972944",
+ "grade": false,
+ "grade_id": "cell-479025f4f0b088ae",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.7**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "The confidence interval `steam_ci` captures the parameter of interest.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.7`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "082c06c4e4bbf9245a327a68dd6e658d",
+ "grade": false,
+ "grade_id": "cell-667d895a7bdce38f",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.7 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b1c28b66220bc6de62706de2b54fa689",
+ "grade": true,
+ "grade_id": "cell-d4ea9b654f5ac678",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.7()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e417622f4ce890f4c4393df0a309d421",
+ "grade": false,
+ "grade_id": "cell-ad40e9e61ba37ed6",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.8**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you repeated the process above and took 100 more samples and calculated a 90% cofidence interval for each sample. How many of the 100 intervals would you expect to capture the true median of the population?\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.8`. Your answer should be a single integer._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9990fffac2dfd19de46e1db71c04b23f",
+ "grade": false,
+ "grade_id": "cell-20d3a4e79a063c02",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.8 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6c4415d8a5aec418f9107d3fb0d5555b",
+ "grade": true,
+ "grade_id": "cell-8e27b4947d4866fb",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer1.8\"', {\n",
+ " expect_true(exists(\"answer1.8\"))\n",
+ "})\n",
+ "answer_as_numeric <- as.numeric(answer1.8)\n",
+ "test_that(\"Solution should be a number\", {\n",
+ " expect_false(is.na(answer_as_numeric))\n",
+ "})\n",
+ "test_that(\"Solution should be an integer\", {\n",
+ " expect_true(answer_as_numeric %% 1 == 0)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "579395940a42ea27afeed737af0141df",
+ "grade": false,
+ "grade_id": "cell-90ccaf35bb6ea089",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 2. Breast Cancer Diagnosis\n",
+ "\n",
+ "In this section, we'll be working with a sample of characteristics of the cell nuclei of various breast masses. The data originates from University of Wisconsin Hospital, where a physician named Dr. William H. Wolberg obtained samples of breast lumps (or tumors) using a fine needle aspiration (FNA) biopsy. Images of the samples were digitized to compute the characteristics of the nuclei that you can find in the sample to work towards Dr. Wolberg's original goal of diagnosing new tumours mathematically using only a single FNA [(he was quite successful!)](https://www.pnas.org/content/87/23/9193.short). In the sample, the nuclei characteristics have been paired with the ultimate diagnosis of the mass (benign or malignant).\n",
+ "\n",
+ "\n",
+ "A screenshot from Xcyt, a program that was developed by Dr. Wolberg for breast mass diagnoses using these data.
Image from pages.cs.wisc.edu
\n",
+ "\n",
+ "This sample is located in the `datateachr` package, and is named `cancer_sample`. We are interested in estimating the **proportion of the patients from the population whose breast masses are malignant** (`diagnosis == \"M\"`)."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d0fa0d8449308f971963465b6d98c30c",
+ "grade": false,
+ "grade_id": "cell-97d69e73d0674bea",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "head(cancer_sample)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e9ba371b2fa8d81b257c2eb47df58499",
+ "grade": false,
+ "grade_id": "cell-40898ae24f137226",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.0**\n",
+ "
{points: 3}\n",
+ "\n",
+ "Describe the population from which the sample `cancer_sample` was drawn from.\n",
+ "\n",
+ "**Note:** this question has a fairly wide range of acceptable answers!"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "758c3dca7a8f12f784480e93cc5f7768",
+ "grade": true,
+ "grade_id": "cell-c8e6f6b5bbccd05b",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "176c8c20ef7f72bebc5fb474dcae51cc",
+ "grade": false,
+ "grade_id": "cell-26332d818a4387fa",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Use the `infer` package workflow to calculate an 80% confidence interval for the proportion with malignant breast masses (`diagnosis == \"M\"`), using bootstrapping with 1000 replicates. Set your seed to 8943. Your final dataframe should have a single row and two columns named `lower_ci` and `upper_ci`.\n",
+ "\n",
+ "**Hint:** If you're stuck, don't be afraid to explore the [documentation for the `infer` package](https://cran.r-project.org/web/packages/infer/infer.pdf), peek at [Section 8.5 of ModernDive](https://moderndive.com/8-confidence-intervals.html#one-prop-ci), or ask someone for help! You can use your code from the previous section as a blueprint.\n",
+ "\n",
+ "_Assign your data frame to an object called `cancer_ci`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "58015b6a9d8a9e6e428715fbcd47c743",
+ "grade": false,
+ "grade_id": "cell-b3208e919708e3a6",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(8943) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "cancer_ci"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d81ba5294bb7787e00ad3ad3c806239b",
+ "grade": true,
+ "grade_id": "cell-a48f1ab67ab90f8f",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "1eff2d367e1f321f38171a9c0bc2fce8",
+ "grade": false,
+ "grade_id": "cell-c136664317b779e9",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.2**\n",
+ "
{points: 3}\n",
+ "\n",
+ "Does the confidence interval capture the population parameter we are interested in? If there is no way to determine this for certain, explain why that is the case."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "0dc8ab43fb616518a71a405b362d4869",
+ "grade": true,
+ "grade_id": "cell-dace4e4a65f80abb",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "1c509c810af1159e3a2a3d46f89b41b1",
+ "grade": false,
+ "grade_id": "cell-439bd5e9841feb5b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.3**\n",
+ "
{points: 3}\n",
+ "\n",
+ "In 1-2 sentences, explain one way you can interpret the confidence interval you calculated above (`cancer_ci`)."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "47c8d031c2acec306273fc5d57fa2b61",
+ "grade": true,
+ "grade_id": "cell-7d0ade0ba996d669",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "17ef2f8a26ea5a754f79a87d1748a67d",
+ "grade": false,
+ "grade_id": "cell-e62dad9584edaeb3",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you calculated another 80% confidence interval for the population proportion, but with a sample that was 5 times larger than `cancer_sample`. How would you expect this second interval compare to the first confidence interval you calculated above (`cancer_ci`)?\n",
+ "\n",
+ "A. The second confidence interval would likely be narrower than the first.\n",
+ "\n",
+ "B. The second confidence interval would likely be about the same width as the first.\n",
+ "\n",
+ "C. The second confidence interval would likely be wider than the first.\n",
+ "\n",
+ "D. There is no way to tell how the second interval would compare to the first.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.4`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ed6880dc41e3c65b21111c33e18ba7a4",
+ "grade": false,
+ "grade_id": "cell-f8ebc2b8a4e59c38",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.4 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9f3d9b7eca19aa91074726481b195095",
+ "grade": true,
+ "grade_id": "cell-1c527e7a33c44b58",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer2.4\"', {\n",
+ " expect_true(exists(\"answer2.4\"))\n",
+ "})\n",
+ "test_that('Solution should be a single character (\"A\", \"B\", \"C\", or \"D\")', {\n",
+ " expect_match(answer2.4, \"a|b|c|d\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "59c10a1e2e63fdc78f6ebcdcb371813e",
+ "grade": false,
+ "grade_id": "cell-ede7d2d839cfd7d4",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 3. Bow River at Banff: 100-Year Flood\n",
+ "\n",
+ "Sample quantiles, like the other statistics we have introduced such as the sample mean and standard deviation, can also be considered as a point estimate of a population parameter. Meaning, quantiles can be used to describe the distribution of a quantitative variable of a population; each distribution has a unique 0.4 quantile, 0.93 quantile, and so on. One common usage of quantiles is to estimate N-year floods. An N-year flood is defined as smallest possible severety for a flood that we **expect** to occur once every N years (but could occur more or less than once in any given N-year span). To calculate a point estimate N-year flood, one must find a quantile such that $\\frac{1}{N}$ known observations fall above it. Also, like the other population parameters we have mentioned, we can also calculate a **confidence interval** for this parameter, which is what we will be doing in this section.\n",
+ "\n",
+ "\n",
+ "In 2013, a combination of factors lead to the Bow River reaching very high flow rates (466 ${\\text{m}^3}/{\\text{s}}$ near Banff), which contributed to extreme flooding throughout Alberta, the Canadian province that lies directly east of British Columbia. One photograph of the event is shown above. For many years the Government of Canada has been collecting hydrometric data at many different stations for several rivers, including the Bow River. So, what's the least severe flood due to high Bow River flow rates that Albertans can expect every 100 years? To answer this question, our goal is calculate a **95% confidence interval for the 100-year flood** (the $1 - \\frac{1}{100} = 0.99$ quantile) using the **maxima** flow rate data collected at the Banff Bow River station, recorded in ${\\text{m}^3}/{\\text{s}}$. This data is located [here](https://wateroffice.ec.gc.ca/report/historical_e.html?stn=05BB001&dataType=Annual+Extremes¶meterType=Flow&year=2018&mode=Table) but we have already tidied the data for you and included it in the `datateachr` package under the name `flow_sample`.\n",
+ "\n",
+ "`flow_sample` contains information about the maximum _and_ minimum flow rates for each year, so we need to filter the data set for **flow maxima**. We have done this for you in the cell below:"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "264de0861282cf155f80a526fe692a06",
+ "grade": false,
+ "grade_id": "cell-bd77bcb71614f9ea",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "flow_sample <- flow_sample %>% \n",
+ " filter(extreme_type == \"maximum\")\n",
+ "\n",
+ "head(flow_sample)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "0a62b9f437a5fae6ed9b602708345eaf",
+ "grade": false,
+ "grade_id": "cell-899204d1a64f2bfd",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.0**\n",
+ "
{points: 3}\n",
+ "\n",
+ "The data contained in `flow_sample` is considered a sample. Describe the population from which the sample was drawn from.\n",
+ "\n",
+ "**Note:** there may more than one solution to this question depending on how one interprets \"population\"."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "50d40f9d93bd6e5036808cde1e064d62",
+ "grade": true,
+ "grade_id": "cell-31c1a7ca3535d01a",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "source": [
+ "DOUBLE CLICK TO EDIT **THIS CELL** AND REPLACE THIS TEXT WITH YOUR ANSWER."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8cf3095d95de7f39a0c10c4a40daa35c",
+ "grade": false,
+ "grade_id": "cell-c6f632ef113e101b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.1**\n",
+ "
{points: 3}\n",
+ "\n",
+ "Use the `infer` package workflow to generate bootstrap distribution of the appropriate sample quantiles for `flow_sample` using 3000 bootstrap replicates. Set your seed to 4629. Your final dataframe should have the columns `replicate` and `stat`.\n",
+ "\n",
+ "**IMPORTANT NOTE:** because the `calculate` function does not support using quantiles as the sample statistic, here we have to use the `summarize` function. Thus, in place of the line where you would usually use `calculate` with the `infer` package workflow, you can use the following line:\n",
+ "\n",
+ "```r\n",
+ " ... %>%\n",
+ " summarize(stat = quantile(flow, probs = 0.99))\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `flow_bootstrapped`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b956204cc704c08c7e3a70de5382daf7",
+ "grade": false,
+ "grade_id": "cell-0355d24604d1db72",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(4629) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(flow_bootstrapped)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "47e10cb1d924af0840b7ffb8ae2bd99c",
+ "grade": true,
+ "grade_id": "cell-6773d36ab69a5944",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"flow_bootstrapped\"', {\n",
+ " expect_true(exists(\"flow_bootstrapped\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a data frame\", {\n",
+ " expect_true(\"data.frame\" %in% class(flow_bootstrapped))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c63b08b0eaf03c135810545fc1be74f8",
+ "grade": false,
+ "grade_id": "cell-0654e2f42a6a3bc0",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.2**\n",
+ "
{points: 3}\n",
+ "\n",
+ "Use the appropriate function from the `infer` package to calculate a 95% confidence interval for the 100-year flood from the bootstrap distribution you just generated. Your final dataframe should have a single row and two columns named `lower_ci` and `upper_ci`.\n",
+ "\n",
+ "_Assign your data frame to an object called `flow_ci`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "183cc268fd2176442c27288ac786313d",
+ "grade": false,
+ "grade_id": "cell-4b586362c8579701",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(flow_ci)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "068c492e6e95a8b4f765c3c8acc46a98",
+ "grade": true,
+ "grade_id": "cell-0452ee4cd567c75f",
+ "locked": true,
+ "points": 3,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"flow_ci\"', {\n",
+ " expect_true(exists(\"flow_ci\"))\n",
+ "})\n",
+ "test_that(\"Solution should be a data frame\", {\n",
+ " expect_true(\"data.frame\" %in% class(flow_ci))\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "85ef64954d9286a02648c326d3bb5e51",
+ "grade": false,
+ "grade_id": "cell-38ba2cf206a30f11",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.3**\n",
+ "
{points: 3}\n",
+ "\n",
+ "Create an **effective** visualization of the confidence interval `flow_ci` and its associated bootstrap distribution `flow_bootstrapped`. Use whichever layers and arguments you wish. \n",
+ "\n",
+ "**Hint:** if you want some inspiration, check out https://www.r-graph-gallery.com/index.html!\n",
+ "\n",
+ "_Assign your plot to an object called `flow_ci_plot`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8aef645e0a789179cf12d3127b7f14ca",
+ "grade": true,
+ "grade_id": "cell-b2ea95c2613769e0",
+ "locked": false,
+ "points": 3,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "steam_ci_plot"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "22f33c6ff2c2aadb3c8d44c7e6b363fa",
+ "grade": false,
+ "grade_id": "cell-d8c1d59bb6a4338c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "_Use your plot above to help you answer the **next 3 questions**._"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "1d27982dacde907bf7d8c0e46c0d276f",
+ "grade": false,
+ "grade_id": "cell-83d097657c5a693e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "There is a 50% chance that the true 100-year flood value is captured by the confidence interval `flow_ci`.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.4`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5eb1cc95b98041a9d937075d7f7dd5bd",
+ "grade": false,
+ "grade_id": "cell-d9a4eb2e56e2ecbe",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.4 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "26733256d3d6d726278d2be915180390",
+ "grade": true,
+ "grade_id": "cell-3eb0b62c08bdfbe9",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer3.4\"', {\n",
+ " expect_true(exists(\"answer3.4\"))\n",
+ "})\n",
+ "test_that('Answer should be \"true\" or \"false\"', {\n",
+ " expect_match(answer3.4, \"true|false\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c0155c66c81fcdbc77819fe910c19e6b",
+ "grade": false,
+ "grade_id": "cell-d03d1d2daa5f780e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.5**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "We are 95% confident that the true 100-year flood value is captured by the confidence interval `flow_ci`.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.5`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ba88552f56b0fc18f9bdccaf0504f839",
+ "grade": false,
+ "grade_id": "cell-f67f3bc2d2cecd09",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.5 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b9c8d89fc1eca272b79a9ea4ae5cd580",
+ "grade": true,
+ "grade_id": "cell-2c25ad9596dad135",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer3.5\"', {\n",
+ " expect_true(exists(\"answer3.5\"))\n",
+ "})\n",
+ "test_that('Answer should be \"true\" or \"false\"', {\n",
+ " expect_match(answer3.5, \"true|false\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "7d005791cc14cfdbef2be34df2bb7ee1",
+ "grade": false,
+ "grade_id": "cell-008bc1078d0f8846",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.6**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "If we increased the confidence level of the confidence interval `flow_ci`, we would expect that it would become narrower.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.6`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2484a9220502b270eb1ead910fbdb627",
+ "grade": false,
+ "grade_id": "cell-91d3dae1fa9afd59",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.6 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "25ca65c55b35cb478c4100f649bf87ea",
+ "grade": true,
+ "grade_id": "cell-8375139f411d5d82",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "# Here we check to see if you have given your answer the correct object name\n",
+ "# and if your answer is plausible. However, all other tests have been hidden\n",
+ "# so you can practice deciding when you have the correct answer.\n",
+ "test_that('Did not assign answer to an object called \"answer3.6\"', {\n",
+ " expect_true(exists(\"answer3.6\"))\n",
+ "})\n",
+ "test_that('Answer should be \"true\" or \"false\"', {\n",
+ " expect_match(answer3.6, \"true|false\", ignore.case = TRUE)\n",
+ "})"
+ ]
+ }
+ ],
+ "metadata": {
+ "docker": {
+ "latest_image_tag": "v0.4.0"
+ },
+ "jupytext": {
+ "formats": "ipynb,Rmd"
+ },
+ "kernelspec": {
+ "display_name": "R",
+ "language": "R",
+ "name": "ir"
+ },
+ "language_info": {
+ "codemirror_mode": "r",
+ "file_extension": ".r",
+ "mimetype": "text/x-r-source",
+ "name": "R",
+ "pygments_lexer": "r",
+ "version": "4.2.3"
+ }
+ },
+ "nbformat": 4,
+ "nbformat_minor": 4
+}
diff --git a/materials/worksheet_03/section_3.R b/materials/worksheet_03/section_3.R
new file mode 100644
index 0000000..78ea63c
--- /dev/null
+++ b/materials/worksheet_03/section_3.R
@@ -0,0 +1,13 @@
+library(tidyverse)
+
+set.seed(111)
+ubc_sample <- tibble(full_years = rexp(n = 40, rate = 0.25) - 1) %>%
+ ceiling() %>%
+ filter(full_years >= 0, full_years <= 10)
+
+sample_dist <- ubc_sample %>%
+ ggplot(aes(x = full_years)) +
+ geom_histogram(binwidth = 1, colour = "white") +
+ ggtitle("Sample Distribution") +
+ xlab("# Full Years At UBC") +
+ scale_x_continuous(breaks = seq(0, 10, 1))
\ No newline at end of file
diff --git a/materials/worksheet_03/section_4.R b/materials/worksheet_03/section_4.R
new file mode 100644
index 0000000..b754765
--- /dev/null
+++ b/materials/worksheet_03/section_4.R
@@ -0,0 +1,120 @@
+library(cowplot)
+library(datateachr)
+library(digest)
+library(gridExtra)
+library(infer)
+library(repr)
+library(taxyvr)
+library(tidyverse)
+
+options(warn=-1)
+
+# =========================== SECTION 3 =========================== #
+set.seed(111)
+ubc_sample <- tibble(full_years = rexp(n = 40, rate = 0.25) - 1) %>%
+ ceiling() %>%
+ filter(full_years >= 0, full_years <= 10)
+
+sample_dist <- ubc_sample %>%
+ ggplot(aes(x = full_years)) +
+ geom_histogram(binwidth = 1, colour = "white") +
+ ggtitle("Sample Distribution") +
+ xlab("# Full Years At UBC") +
+ scale_x_continuous(breaks = seq(0, 10, 1))
+
+# =========================== SECTION 4 =========================== #
+set.seed(9869)
+sampling_dist_10 <- multi_family_strata %>%
+ rep_sample_n(size = 10, reps = 2000) %>%
+ group_by(replicate) %>%
+ summarise(mean_land_value = mean(current_land_value)) %>%
+ ggplot(aes(x = mean_land_value)) +
+ geom_histogram(binwidth = 15000) +
+ xlab("Mean Land Value (CAD)") +
+ ggtitle("n = 10")
+
+set.seed(7032)
+sampling_dist_30 <- multi_family_strata %>%
+ rep_sample_n(size = 30, reps = 2000) %>%
+ group_by(replicate) %>%
+ summarise(mean_land_value = mean(current_land_value)) %>%
+ ggplot(aes(x = mean_land_value)) +
+ geom_histogram(binwidth = 15000) +
+ xlab("Mean Land Value (CAD)") +
+ ggtitle("n = 30")
+
+set.seed(8408)
+sampling_dist_100 <- multi_family_strata %>%
+ rep_sample_n(size = 100, reps = 2000) %>%
+ group_by(replicate) %>%
+ summarise(mean_land_value = mean(current_land_value)) %>%
+ ggplot(aes(x = mean_land_value)) +
+ geom_histogram(binwidth = 15000) +
+ xlab("Mean Land Value (CAD)") +
+ ggtitle("n = 100")
+
+bootstrap_10_mean <- round(mean(bootstrap_dist_10$data$mean_land_value), 2)
+bootstrap_30_mean <- round(mean(bootstrap_dist_30$data$mean_land_value), 2)
+bootstrap_100_mean <- round(mean(bootstrap_dist_100$data$mean_land_value), 2)
+sampling_10_mean <- round(mean(sampling_dist_10$data$mean_land_value), 2)
+sampling_30_mean <- round(mean(sampling_dist_30$data$mean_land_value), 2)
+sampling_100_mean <- round(mean(sampling_dist_100$data$mean_land_value), 2)
+
+bootstrap_dist_row <- plot_grid(bootstrap_dist_10 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = bootstrap_10_mean, colour = "red"),
+ bootstrap_dist_30 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = bootstrap_30_mean, colour = "red"),
+ bootstrap_dist_100 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = bootstrap_100_mean, colour = "red"),
+ ncol = 3)
+title <- ggdraw() +
+ draw_label("Bootstrap Sampling Distributions (of Sample Means)",
+ fontface = 'bold',
+ x = 0,
+ hjust = 0) +
+ theme(plot.margin = margin(0, 0, 0, 7))
+bootstrap_dist_grid <- plot_grid(title,
+ bootstrap_dist_row,
+ ncol = 1,
+ rel_heights = c(0.1, 1))
+
+sampling_dist_row <- plot_grid(sampling_dist_10 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = sampling_10_mean, colour = "red"),
+ sampling_dist_30 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = sampling_30_mean, colour = "red"),
+ sampling_dist_100 +
+ theme(axis.text.x = element_text(angle = 90)) +
+ scale_x_continuous(breaks = seq(400000, 1200000, 200000),
+ limits = c(400000, 1200000)) +
+ geom_vline(xintercept = sampling_100_mean, colour = "red"),
+ ncol = 3)
+title <- ggdraw() +
+ draw_label("Sampling Distributions (of Sample Means)",
+ fontface = 'bold',
+ x = 0,
+ hjust = 0) +
+ theme(plot.margin = margin(0, 0, 0, 7))
+
+sampling_dist_grid <- plot_grid(title,
+ sampling_dist_row,
+ ncol = 1,
+ rel_heights = c(0.1, 1))
+
+all_dist_grid <- plot_grid(bootstrap_dist_grid, sampling_dist_grid, ncol = 1)
+
+
diff --git a/materials/worksheet_03/tests_worksheet_03.R b/materials/worksheet_03/tests_worksheet_03.R
new file mode 100644
index 0000000..aea73a1
--- /dev/null
+++ b/materials/worksheet_03/tests_worksheet_03.R
@@ -0,0 +1,593 @@
+library(digest)
+library(testthat)
+
+test_1.0 <- function() {
+ test_that('Did not assign answer to an object called "answer1.0.0"', {
+ expect_true(exists("answer1.0.0"))
+ })
+ test_that('Did not assign answer to an object called "answer1.0.1"', {
+ expect_true(exists("answer1.0.1"))
+ })
+ test_that('Did not assign answer to an object called "answer1.0.2"', {
+ expect_true(exists("answer1.0.2"))
+ })
+ test_that('Did not assign answer to an object called "answer1.0.3"', {
+ expect_true(exists("answer1.0.3"))
+ })
+
+ test_that('Solutions should be a single character ("A", "B", or "C")', {
+ expect_match(answer1.0.0, "a|b|c", ignore.case = TRUE)
+ expect_match(answer1.0.1, "a|b|c", ignore.case = TRUE)
+ expect_match(answer1.0.2, "a|b|c", ignore.case = TRUE)
+ expect_match(answer1.0.3, "a|b|c", ignore.case = TRUE)
+ })
+
+ test_that("One or more solutions are incorrect", {
+ expect_equal(digest(tolower(answer1.0.0)), "127a2ec00989b9f7faf671ed470be7f8")
+ expect_equal(digest(tolower(answer1.0.1)), "ddf100612805359cd81fdc5ce3b9fbba")
+ expect_equal(digest(tolower(answer1.0.2)), "ddf100612805359cd81fdc5ce3b9fbba")
+ expect_equal(digest(tolower(answer1.0.3)), "127a2ec00989b9f7faf671ed470be7f8")
+ })
+
+ print("Success!")
+}
+
+test_1.1 <- function() {
+ test_that('Did not assign answer to an object called "answer1.1"', {
+ expect_true(exists("answer1.1"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer1.1, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer1.1))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("What is required to generate a bootstrap distribution?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_1.2 <- function() {
+ test_that('Did not assign answer to an object called "answer1.2"', {
+ expect_true(exists("answer1.2"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer1.2, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer1.2))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("What do we need to compute a population parameter? Is it realistic?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_2.0 <- function() {
+ test_that('Did not assign answer to an object called "answer2.0"', {
+ expect_true(exists("answer2.0"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", "D", "E", or "F")', {
+ expect_match(answer2.0, "a|b|c|d|e|f", ignore.case = TRUE)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer2.0)), "6e7a8c1c098e8817e3df3fd1b21149d1")
+ })
+
+ print("Success!")
+}
+
+test_2.1 <- function() {
+ test_that('Did not assign answer to an object called "answer2.1"', {
+ expect_true(exists("answer2.1"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", or "C")', {
+ expect_match(answer2.1, "a|b|c", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.1))
+ if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Is there any characteristic of the sample that guarantees it was taken without replacement?")
+ } else if (answer_hash == "6e7a8c1c098e8817e3df3fd1b21149d1") {
+ print("Is there any scenario where you wouldn't know if the sample was taken with or without replacement?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "127a2ec00989b9f7faf671ed470be7f8")
+ })
+
+ print("Success!")
+}
+
+test_2.2 <- function() {
+ test_that('Did not assign answer to an object called "answer2.2"', {
+ expect_true(exists("answer2.2"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", or "C")', {
+ expect_match(answer2.2, "a|b|c", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.2))
+ if (answer_hash == "127a2ec00989b9f7faf671ed470be7f8") {
+ print("Is there any characteristic of the sample that guarantees it was taken with replacement?")
+ } else if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Is there any characteristic of the sample that guarantees it was taken without replacement?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "6e7a8c1c098e8817e3df3fd1b21149d1")
+ })
+
+ print("Success!")
+}
+
+test_2.3 <- function() {
+ test_that('Did not assign answer to an object called "answer2.3"', {
+ expect_true(exists("answer2.3"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer2.3, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.3))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Read carefully!")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_3.0 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_sample"', {
+ expect_true(exists("bootstrap_sample"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(bootstrap_sample))
+ })
+
+ expected_colnames <- c("replicate", "full_years")
+ given_colnames <- colnames(bootstrap_sample)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(bootstrap_sample))), "20c9a920779e3feca5b4ed6948450f8a")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(bootstrap_sample$full_years))), "dc1d757c56fd15656b23102dc5f6727c")
+ })
+ print("Success!")
+}
+
+test_3.1 <- function() {
+ test_that('Did not assign answer to an object called "ubc_sample_mean"', {
+ expect_true(exists("ubc_sample_mean"))
+ })
+
+ answer_as_numeric <- as.numeric(ubc_sample_mean)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(round(ubc_sample_mean,3)), "baf0148fd27fa92338a8c33829af5128")
+ })
+
+ print("Success!")
+}
+
+test_3.2 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_sample_mean"', {
+ expect_true(exists("bootstrap_sample_mean"))
+ })
+
+ answer_as_numeric <- as.numeric(bootstrap_sample_mean)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric*1000000000)), "328b8c66e7f4b6511242246eab9bd08b")
+ })
+
+ print("Success!")
+}
+
+test_3.3 <- function() {
+ test_that('Did not assign answer to an object called "answer3.3"', {
+ expect_true(exists("answer3.3"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.3, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.3))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("Would the mean change if we sampled without replacement?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_3.4 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_sample_dist"', {
+ expect_true(exists("bootstrap_sample_dist"))
+ })
+ properties <- c(bootstrap_sample_dist$layers[[1]]$mapping, bootstrap_sample_dist$mapping)
+
+ test_that("Plot should have full_years on the x-axis", {
+ expect_true("full_years" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(bootstrap_sample_dist$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", bootstrap_sample_dist$layers[[1]])[["stat_params"]][["binwidth"]])),
+ "4b5630ee914e848e8d07221556b0a2fb"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(bootstrap_sample_dist$data)), "20c9a920779e3feca5b4ed6948450f8a")
+ expect_equal(digest(as.integer(sum(bootstrap_sample_dist$data$full_years))), "dc1d757c56fd15656b23102dc5f6727c")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(bootstrap_sample_dist$labels$x == "full_years")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(bootstrap_sample_dist$labels))
+ })
+
+ print("Success!")
+}
+
+test_3.5 <- function() {
+ test_that('Did not assign answer to an object called "answer3.5"', {
+ expect_true(exists("answer3.5"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.5, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.5))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Think through the process of sampling with replacement carefully")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_4.0 <- function() {
+ test_that('Did not assign answer to an object called "sample_10"', {
+ expect_true(exists("sample_10"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sample_10))
+ })
+
+ expected_colnames <- c("current_land_value")
+ given_colnames <- colnames(sample_10)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sample_10))), "71db8a6cad03244e6e50f0ad8bc95a65")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sample_10$current_land_value))), "3f92c7fab3c6a839e5ab5aacda979f3a")
+ })
+ print("Success!")
+}
+
+test_4.1 <- function() {
+ test_that('Did not assign answer to an object called "resampled_means_10"', {
+ expect_true(exists("resampled_means_10"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(resampled_means_10))
+ })
+
+ expected_colnames <- c("replicate", "mean_land_value")
+ given_colnames <- colnames(resampled_means_10)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(resampled_means_10))), "6e96c307060fba1b1d3a36d2410fd595")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(resampled_means_10$mean_land_value))), "1de19f20fb7008fb8a562077cbcc2cf0")
+ })
+
+ print("Success!")
+}
+
+test_4.2 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_dist_10"', {
+ expect_true(exists("bootstrap_dist_10"))
+ })
+ properties <- c(bootstrap_dist_10$layers[[1]]$mapping, bootstrap_dist_10$mapping)
+
+ test_that("Plot should have mean_land_value on the x-axis", {
+ expect_true("mean_land_value" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(bootstrap_dist_10$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", bootstrap_dist_10$layers[[1]])[["stat_params"]][["binwidth"]])),
+ "829aba66b0d64feac09b067c4cce133c"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(bootstrap_dist_10$data)), "6e96c307060fba1b1d3a36d2410fd595")
+ expect_equal(digest(round(as.integer(bootstrap_dist_10$data$mean_land_value))), "60b3274d21a3e83b615c7731adfd0d79")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(bootstrap_dist_10$labels$x == "mean_land_value")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(bootstrap_dist_10$labels))
+ })
+
+ print("Success!")
+}
+
+test_4.3 <- function() {
+ test_that('Did not assign answer to an object called "answer4.3"', {
+ expect_true(exists("answer4.3"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer4.3, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.3))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Note: the distribution above is a BOOTSTRAP distribution")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_4.4 <- function() {
+ test_that('Did not assign answer to an object called "sample_30"', {
+ expect_true(exists("sample_30"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sample_30))
+ })
+
+ expected_colnames <- c("current_land_value")
+ given_colnames <- colnames(sample_30)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sample_30))), "7d2842cab7725fd8f382293e410d42b2")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sample_30$current_land_value))), "20a5caed5f997ae762307c6a6e98c276")
+ })
+ print("Success!")
+}
+
+test_4.5 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_dist_30"', {
+ expect_true(exists("bootstrap_dist_30"))
+ })
+ properties <- c(bootstrap_dist_30$layers[[1]]$mapping, bootstrap_dist_30$mapping)
+
+ test_that("Plot should have mean_land_value on the x-axis", {
+ expect_true("mean_land_value" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(bootstrap_dist_30$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", bootstrap_dist_30$layers[[1]])[["stat_params"]][["binwidth"]])),
+ "829aba66b0d64feac09b067c4cce133c"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(bootstrap_dist_30$data)), "6e96c307060fba1b1d3a36d2410fd595")
+ expect_equal(digest(as.integer(sum(bootstrap_dist_30$data$mean_land_value))), "a6d96db9e40e16a8b310b518ba018d08")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(bootstrap_dist_30$labels$x == "mean_land_value")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(bootstrap_dist_30$labels))
+ })
+
+ print("Success!")
+}
+
+test_4.6 <- function() {
+ test_that('Did not assign answer to an object called "sample_100"', {
+ expect_true(exists("sample_100"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sample_100))
+ })
+
+ expected_colnames <- c("current_land_value")
+ given_colnames <- colnames(sample_100)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sample_100))), "5d6e7fe43b3b73e5fd2961d5162486fa")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sample_100$current_land_value))), "225421bda4b1e262315936431acd58aa")
+ })
+
+ print("Success!")
+}
+
+test_4.7 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_dist_100"', {
+ expect_true(exists("bootstrap_dist_100"))
+ })
+ properties <- c(bootstrap_dist_100$layers[[1]]$mapping, bootstrap_dist_100$mapping)
+
+ test_that("Plot should have mean_land_value on the x-axis", {
+ expect_true("mean_land_value" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot is not the correct type", {
+ expect_true("GeomBar" %in% class(bootstrap_dist_100$layers[[1]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", bootstrap_dist_100$layers[[1]])[["stat_params"]][["binwidth"]])),
+ "829aba66b0d64feac09b067c4cce133c"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(bootstrap_dist_100$data)), "6e96c307060fba1b1d3a36d2410fd595")
+ expect_equal(digest(as.integer(sum(bootstrap_dist_100$data$mean_land_value))), "518a8fc51da6a689fee9e954795fb1d2")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(bootstrap_dist_100$labels$x == "mean_land_value")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(bootstrap_dist_100$labels))
+ })
+
+ print("Success!")
+}
+
+test_4.8 <- function() {
+ test_that('Did not assign answer to an object called "answer4.8"', {
+ expect_true(exists("answer4.8"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", "D", or "E")', {
+ expect_match(answer4.8, "a|b|c|d|e", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.8))
+ if (answer_hash == "127a2ec00989b9f7faf671ed470be7f8") {
+ print("Compare the red vertical lines for each bootstrap distribution and its corresponding sampling distribution")
+ } else if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Are the widths truly identical?")
+ } else if (answer_hash == "6e7a8c1c098e8817e3df3fd1b21149d1") {
+ print("In other words, do the plots become more narrow as the sample size increases?")
+ } else if (answer_hash == "d110f00cfb1b248e835137025804a23b") {
+ print("The sampling & bootstrap distributions for larger sample sizes may not look EXACTLY symmetrical and bell-shaped, but consider the OVERALL trend as sample size increases")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "93a9078c6326f37b481d3e99b60ad987")
+ })
+
+ print("Success!")
+}
+
+test_4.9 <- function() {
+ test_that('Did not assign answer to an object called "answer4.9"', {
+ expect_true(exists("answer4.9"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer4.9, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.9))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("Do the bootstrap distributions above look at least SOMEWHAT similar to their corresponding sampling distributions?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
diff --git a/materials/worksheet_03/worksheet_03.ipynb b/materials/worksheet_03/worksheet_03.ipynb
new file mode 100644
index 0000000..f09092e
--- /dev/null
+++ b/materials/worksheet_03/worksheet_03.ipynb
@@ -0,0 +1,2169 @@
+{
+ "cells": [
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e74aceff7ff293312405c2ef890ab6ab",
+ "grade": false,
+ "grade_id": "cell-e883b594bd088087",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "# Worksheet 3: Bootstrapping and its Relationship to the Sampling Distribution"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "049bda460bad4f83117d546bbe10321b",
+ "grade": false,
+ "grade_id": "cell-9460eb96253e3080",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Lecture and Tutorial Learning Goals\n",
+ "After completing this week's lecture and tutorial work, you will be able to:\n",
+ "1. Explain why we don’t know/have a sampling distribution in practice/real life.\n",
+ "2. Define bootstrapping.\n",
+ "3. Write a computer script to create a bootstrap distribution to approximate a sampling distribution.\n",
+ "4. Contrast a bootstrap sampling distribution with a sampling distribution obtained using multiple samples."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8e4ea5f6af2c4baffbf1f0d12d6eda7e",
+ "grade": false,
+ "grade_id": "cell-9e25e98e883dccff",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "library(cowplot)\n",
+ "library(digest)\n",
+ "library(gridExtra)\n",
+ "library(infer)\n",
+ "library(repr)\n",
+ "library(taxyvr)\n",
+ "library(tidyverse)\n",
+ "source(\"tests_worksheet_03.R\")"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "dd2381152ee03caebb7e99863d972111",
+ "grade": false,
+ "grade_id": "cell-2ab7d5e0c77883ab",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 1. Warm Up Questions"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "81d9e7a4fe5388d982aa72dff10517fd",
+ "grade": false,
+ "grade_id": "cell-c5774e72ef309fbb",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Below is a table that lists out various types of distributions that require sampling to generate. The right column of the table is empty but should describe the location(s) from which one **must** sample (at some point) to produce the corresponding distribution. Fill in the blanks of the table by assigning the object name with the letter associated with the phrase that is the most appropriate for that cell. The options are listed below the table.\n",
+ "\n",
+ "| Distribution | Requires sampling from? |\n",
+ "| ------------------------------- | ----------------------- |\n",
+ "| Sampling distribution | `answer1.0.0` |\n",
+ "| Bootstrap sample distribution | `answer1.0.1` |\n",
+ "| Bootstrap sampling distribution | `answer1.0.2` |\n",
+ "| Sample distribution | `answer1.0.3` |\n",
+ "\n",
+ "A. The population.\n",
+ "\n",
+ "B. A sample from the population.\n",
+ "\n",
+ "_Assign your answers to the objects `answer1.0.0`, `answer1.0.1`, `answer1.0.2`, and `answer1.0.3`. Your answer should each be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d933570fd74dcecd4c3ede0df82979c6",
+ "grade": false,
+ "grade_id": "cell-bdb1f0ffdd6da9e6",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.0.0 <- ...\n",
+ "# answer1.0.1 <- ...\n",
+ "# answer1.0.2 <- ...\n",
+ "# answer1.0.3 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a37902e636d6912317218aa0234327d1",
+ "grade": true,
+ "grade_id": "cell-f7e3a38d921ae45d",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d874e7dc59ae1b6f7c4c1166db8b3071",
+ "grade": false,
+ "grade_id": "cell-33fde50e9b5f9dcb",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "You are tasked with finding the proportion of UBC undergraduate students who own one or more pairs of Blundstone boots. You only have the time and resources to take a single sample of around 45 students.\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "Given the scenario above, it would be possible to generate a bootstrap sampling distribution of point estimates for the population parameter of interest.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.1`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "16c627d85e3336f342a3949a83805a57",
+ "grade": false,
+ "grade_id": "cell-dbaa0d908d99de44",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "be3f456359b02aac45982de80b8c40a7",
+ "grade": true,
+ "grade_id": "cell-24bcecb2e78c1557",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a93b0b1951576157f6e6d8ccb7ff3664",
+ "grade": false,
+ "grade_id": "cell-2ec23f379874e209",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.2**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "In reality, we most often have the ability to directly compute the population parameter that we are interested in.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.2`. Your answer should be either \"true\" or \"false\" surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ae47cc4ba564ec7b1ecd14cc91e527f4",
+ "grade": false,
+ "grade_id": "cell-f61e1c57732aee28",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.2 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "3a685666096c714972c27a148d1cec03",
+ "grade": true,
+ "grade_id": "cell-d8a18c40c1276dca",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ffaf96915907a06de727048b6b85e97a",
+ "grade": false,
+ "grade_id": "cell-7e27e396adcfb7e1",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 2. We Need More Samples (An Introduction to Bootstrapping)\n",
+ "\n",
+ "If you recall from the last tutorial, you were given a hypothetical scenario where you did not have access to data for the population of interest. Instead, you had two different samples from the population, and we got stuck when we wanted to study the variation (or, more formally, the standard error) of our point estimates (also called the *sampling variation*). The reasoning behind this was because we need many point estimates to study sampling variation, but we only had one of each size... So how do we study sampling variation without taking more samples from the population to produce a sampling distribution?\n",
+ "\n",
+ "
\n",
+ "\n",
+ "![](https://i1.wp.com/www.r-bloggers.com/wp-content/uploads/2010/06/boot.jpg?resize=210%2C294&ssl=1)\n",
+ "
\n",
+ "\n",
+ "The solution to this is **bootstrapping** (or specifically, **bootstrap resampling with replacement**). The term bootstrapping originates from the phrase \"to pull oneself up by one's bootstraps\", which refers to completing a seemingly impossible task with no external help. In Statistics, Bootstrapping is the idea of sampling from our original sample **with replacement** (also called **resampling with replacement**) to generate a **bootstrap sampling distribution**. Sampling with replacement means that each time we choose an observation from the population or sample, we return it before randomly selecting another. With this procedure, the original sample acts as an *estimate* of the population, and resampling with replacement gives us enough samples and results in enough *sampling variation* necessary to produce an approximation of the sampling distributions we have generated in the previous weeks. In this sense, our single sample has acted as our \"bootstrap\", and we have used it to \"pull ourselves up\" and create an approximation of the desired sampling distribution."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "df916681627390ccf488a47195a383c7",
+ "grade": false,
+ "grade_id": "cell-3cf9e544012b7eda",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you had a single sample of size 20 held in the data frame `sample` and you wanted to study the variation of a point estimate from samples of this size. This means we need many more samples of size 20 to generate a sampling distribution. **Which of the following statements is true about the approach below?**\n",
+ "\n",
+ "```r\n",
+ "more_samples <- sample %>% \n",
+ " rep_sample_n(size = 20, reps = 1400, replace = FALSE)\n",
+ "```\n",
+ "\n",
+ "A. This approach would enable us to approximate the sampling distribution so we can study sampling variation.\n",
+ "\n",
+ "B. This approach would not give us enough samples (we need to increase the `reps` argument).\n",
+ "\n",
+ "C. This approach would give us 1400 identical samples.\n",
+ "\n",
+ "D. This approach is known as sampling with replacement.\n",
+ "\n",
+ "E. Both A & D.\n",
+ "\n",
+ "F. None of the above.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.0`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8375ebf6af5ce95260d4cb00a41b051f",
+ "grade": false,
+ "grade_id": "cell-17beaf6d485bc828",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.0 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "e51028a0572b891beb67716c21550221",
+ "grade": true,
+ "grade_id": "cell-f6e3d66d982cf39a",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f33976e1c18d68a5ade0e984f120cd83",
+ "grade": false,
+ "grade_id": "cell-18405f12fa50f6dc",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "Use the following scenario to answer **Question 2.1 and Question 2.2**:\n",
+ "\n",
+ "--- \n",
+ "Suppose you had a small bowl of 9 Canadian dimes with the following production years (listed in increasing order):\n",
+ "\n",
+ "```\n",
+ "1994, 1995, 1997, 1999, 2000, 2000, 2001, 2001, 2012\n",
+ "```\n",
+ "---"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ab231eb67909277b48bf8163db5c8260",
+ "grade": false,
+ "grade_id": "cell-d94685a11194b662",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Assume we sampled 9 dimes out of the bowl, one at a time, in the order below. However, you do not know whether we returned the dime that we chose before taking another (sampling with replacement) or not (sampling without replacement).\n",
+ "\n",
+ "```\n",
+ "1997, 1999, 1994, 2001, 1994, 2012, 2001, 2012, 2000\n",
+ "```\n",
+ "\n",
+ "Given the sample above, was it a result of sampling **with replacement** or **without replacement**?\n",
+ "\n",
+ "A. The sample is a result of sampling with replacement.\n",
+ "\n",
+ "B. The sample is a result of sampling without replacement.\n",
+ "\n",
+ "C. There is not enough information to answer the question.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.1`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5e36bb0b2a26dde9e17568ed46925a91",
+ "grade": false,
+ "grade_id": "cell-cd12b59b81ebaeb9",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f2067ce2693cc3c8ad43736261aba0b6",
+ "grade": true,
+ "grade_id": "cell-c4693651ea64e97c",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d95b93a9dcd453ab7bc53ea911a20ba5",
+ "grade": false,
+ "grade_id": "cell-08bdbd88e7b40015",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.2**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Assume we sampled 9 dimes out of the bowl, one at a time, in the order below. However, you do not know whether we returned the dime that we chose before taking another (sampling with replacement) or not (sampling without replacement).\n",
+ "\n",
+ "```\n",
+ "2012, 1994, 2001, 1999, 1997, 2001, 2000, 2000, 1995\n",
+ "```\n",
+ "\n",
+ "Given the sample above, was it a result of sampling **with replacement** or **without replacement**?\n",
+ "\n",
+ "A. The sample is a result of sampling with replacement.\n",
+ "\n",
+ "B. The sample is a result of sampling without replacement.\n",
+ "\n",
+ "C. There is not enough information to answer the question.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.2`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "95f9ad1a3003658ab271d2604708266a",
+ "grade": false,
+ "grade_id": "cell-991f90f96be76120",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.2 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2c8659d46d7e6d22ee8a88a3e6c5b67b",
+ "grade": true,
+ "grade_id": "cell-3280774d9788a5d5",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "61b80ba1c212bf63799c9a6d085ace2c",
+ "grade": false,
+ "grade_id": "cell-255aba27bffea910",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.3**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "When you take a bootstrap sample, you are sampling with replacement from the population.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.3`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "853e6af568e83670a5caf3ef03554251",
+ "grade": false,
+ "grade_id": "cell-92f4cdff4df3b451",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.3 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f3e7beb2227a225a33dead228535280f",
+ "grade": true,
+ "grade_id": "cell-771676480db29167",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "70e070af628cbd8539e7a0b8cfa51fac",
+ "grade": false,
+ "grade_id": "cell-93ad5f31ad660c76",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 3. Sample Distribution vs. Bootstrap Sample Distribution(s)\n",
+ "\n",
+ "Before we jump into creating bootstrap sampling distributions, let's take a moment to gain some more insight into how sampling with replacement introduces **sampling variation**. Consider the population of all current UBC students, and suppose we were interested in the mean number of **full** years that they have been studying at UBC. Assume we had the following sample of size 35 from the population named `ubc_sample`:"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d14cdb0ff78b73b6fd68a60939a79dfa",
+ "grade": false,
+ "grade_id": "cell-88a0a3192fae352b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "source(\"section_3.R\") # Runs code to produce the sample.\n",
+ "head(ubc_sample)\n",
+ "nrow(ubc_sample)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8a8cf635a38be44f2901addce4802b7d",
+ "grade": false,
+ "grade_id": "cell-fc10e0e5c79ee757",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Take a single bootstrap sample from `ubc_sample` using `rep_sample_n` with a seed of 0242. The resulting data frame should have two columns: `replicate` and `full_years`.\n",
+ "\n",
+ "_Assign your data frame to an object called `bootstrap_sample`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f214b5c5350112dff4169d55358ee62f",
+ "grade": false,
+ "grade_id": "cell-f4bcf34fa7f83066",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(0242) # DO NOT CHANGE!\n",
+ "\n",
+ "# bootstrap_sample <- ... %>% \n",
+ "# rep_sample_n(size = ..., replace = ...)\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(bootstrap_sample)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b4dc83238133562d93a056382c82967d",
+ "grade": true,
+ "grade_id": "cell-79158cb203e2a650",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "test_3.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f9e11a47bbcd76cd58d1fb07b276a599",
+ "grade": false,
+ "grade_id": "cell-b8690eaec88d238e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.1** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the mean of the sample (`ubc_sample`).\n",
+ "\n",
+ "_Assign your answer to an object called `ubc_sample_mean`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "cc3ce514b9ffebb16f5acd81f7be293a",
+ "grade": false,
+ "grade_id": "cell-a955e4165977b263",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "ubc_sample_mean"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c8d54cae12388dfb03078367a99aff7d",
+ "grade": true,
+ "grade_id": "cell-9f921dd2e40bf012",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "test_3.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "9fcc4194ddd2e1d5cb779e6c6b295af7",
+ "grade": false,
+ "grade_id": "cell-8a25972eddd20fcf",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.2** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the mean of the bootstrap sample that you took in **question 3.0** (`bootstrap_sample`).\n",
+ "\n",
+ "_Assign your answer to an object called `bootstrap_sample_mean`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "40ad6c4c1dee67b2b9510c7d7f002d64",
+ "grade": false,
+ "grade_id": "cell-33cecf1485afe722",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "bootstrap_sample_mean"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "aa3cd6f8ff2a48b518dba2512b0b6b5d",
+ "grade": true,
+ "grade_id": "cell-a46af22ef1b12f46",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "1e882d99420422b1cc79f8452bd0a6de",
+ "grade": false,
+ "grade_id": "cell-1b210e15af6de543",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.3**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "The mean of the bootstrap sample is different than the original sample because we sampled **with replacement** from the original sample.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.3`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "498f4ea04b65e2a1353401438c632a5b",
+ "grade": false,
+ "grade_id": "cell-b20cbe04061d9bfb",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.3 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "96693a976429b40e15f92597ae85b371",
+ "grade": true,
+ "grade_id": "cell-3616eec8b17904be",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "81db23884bb7667dc2012b47ac62d960",
+ "grade": false,
+ "grade_id": "cell-af13c58c5dd4a8e0",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Plot the bootstrap sample you just took by filling in the scaffolding below to create a histogram with bin widths of 1.\n",
+ "\n",
+ "**Notes:**\n",
+ "- The `colour = \"white\"` argument in `geom_histogram` adds outlines to the histogram bars.\n",
+ "- The `scale_x_continuous` layer modifies the x-axis scale to make it more readable.\n",
+ "\n",
+ "_Assign your plot to an object called `bootstrap_sample_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b446434c118aeee3915d1ae435a83f89",
+ "grade": false,
+ "grade_id": "cell-15b934fd4299ba32",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "# bootstrap_sample_dist <- ... %>% \n",
+ "# ...(aes(x = ...)) + \n",
+ "# geom_histogram(binwidth = ..., colour = \"white\") +\n",
+ "# ...(\"Bootstrap Sample Distribution\") +\n",
+ "# xlab(\"# Full Years At UBC\") + \n",
+ "# scale_x_continuous(breaks = seq(0, 10, 1), limits = c(-0.5, 10.5)) \n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "bootstrap_sample_dist"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a03f5988d55a328f67d53f23706ad9e4",
+ "grade": true,
+ "grade_id": "cell-817473b6609acfbc",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "test_3.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "481c182a3e79e1d6d67a38965e6bd6a1",
+ "grade": false,
+ "grade_id": "cell-b64797421e69d54a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "In the code cell below, we have used `plot_grid` to plot the sample distribution and bootstrap distribution together.\n",
+ "\n",
+ "_Use the set of plots below to answer the **next question**._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a4403ff4afb08bca8ea2a3932af4d3cd",
+ "grade": false,
+ "grade_id": "cell-c259d96c4d2a6bcc",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "plot_grid(sample_dist, bootstrap_sample_dist, ncol = 1)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "911720cfbbe57cf16bea2fd7af4cfe13",
+ "grade": false,
+ "grade_id": "cell-2b75e7dead17cf81",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.5**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose we repeated the process above, but using a different seed when we took our bootstrap sample (`bootstrap_sample`) from the original sample (`ubc_sample`).\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "We are guaranteed that the two distributions above will be different.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.5`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a69ab9222d9fbfc01b96a8aa2124f821",
+ "grade": false,
+ "grade_id": "cell-26b26e8fec74b1bd",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.5 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "252bb0234596e3cac9b38a4a3b703735",
+ "grade": true,
+ "grade_id": "cell-7e74ab7f7467ea07",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.5()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a824dffb4b2c4ac5bba5719ec5065092",
+ "grade": false,
+ "grade_id": "cell-da1566194fd1cfbc",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 4. Sampling Distributions vs. Bootstrap Sampling Distributions\n",
+ "\n",
+ "Now that we understand that we can use **bootstrapping** to produce an **approximation** of a sampling distribution, we are going to use it to approximate the sampling distributions that we produced in `worksheet_02` and compare the two. You will produce a bootstrap sample distribution of size 10, 30, and 100 for the tax assessment values in the population of **multiple-family dwellings in strata housing** in Vancouver, we will give you their corresponding sampling distributions, and then you'll be able to compare the two types of distributions for each sample size. Let's get started!\n",
+ "\n",
+ "Recall our population of interest (**multiple-family dwellings in strata housing** in Vancouver) originates from the `tax_2019` data set included in the `taxyvr` R package. Again, since you have already done this is `worksheet_01`, we have done it for you in the code cell below. To filter the `tax_2019` data set for the population that we are interested in, we need the `current_land_value` of properties that meet the following critera:\n",
+ "- **Have a `current_land_value` greater than \\$1:** Some properties are assigned a value of `NA` and these are the properties undergoing big renovations. These values get ammended after the improvement and are reflected in the following year's assessment. The same occurs with homes that are asssessed at $0.\n",
+ "- **Are of `legal_type` `\"STRATA\"`**\n",
+ "- **Are of `zone_category` `\"Multiple Family Dwelling\"`**\n",
+ "\n",
+ "_If you need a refresher on the `tax_2019` data set and where it came from, please look back at `worksheet_01` and re-read the introduction of section 2 there._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "3649e69f61d54d29252de4e2856e99b5",
+ "grade": false,
+ "grade_id": "cell-99cae01db68690dd",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "multi_family_strata <- tax_2019 %>% \n",
+ " filter(!is.na(current_land_value),\n",
+ " current_land_value > 1,\n",
+ " legal_type == \"STRATA\",\n",
+ " zone_category == \"Multiple Family Dwelling\") %>% \n",
+ " select(current_land_value)\n",
+ "head(multi_family_strata)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "9e191607b86ad6a63a39194b7543b554",
+ "grade": false,
+ "grade_id": "cell-2924b562681fb65f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.0** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Imagine you only have the resources to take a single random sample of size 10 from the population of interest. Use `rep_sample_n` with a seed of 2485 to take a single sample of size 10 from `multi_family_strata`. Select only the `current_land_value` column so your data frame has a single column.\n",
+ "\n",
+ "**Note:** we use `ungroup()` here because `rep_sample_n` returns a data frame that is grouped by `replicate`, but we want an ungrouped data frame so we can select `current_land_value` by itself! If you are curious, try commenting out the `ungroup() %>%` line to see why.\n",
+ "\n",
+ "_Assign your data frame to an object called `sample_10`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "949f1aa51d25c9b452f4d08485b8c3ea",
+ "grade": false,
+ "grade_id": "cell-83a392262f6ac62b",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2485) # DO NOT CHANGE!\n",
+ "\n",
+ "# sample_10 <- multi_family_strata %>% \n",
+ "# rep_sample_n(size = ..., replace = ...) %>%\n",
+ "# ungroup() %>% \n",
+ "# ...(...)\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "sample_10"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c2b0d03051ab69a08601ecea6b621ddb",
+ "grade": true,
+ "grade_id": "cell-cf37e3b4dbe8561a",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "49c1281a35f9e15af46e17a8d612c1fc",
+ "grade": false,
+ "grade_id": "cell-59dd69eb7fc74b9c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.1** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take 2000 bootstrap samples from the sample you just took (`sample_10`) using `rep_sample_n` and a seed of 0510. Then, calculate the mean for each bootstrap sample and name the resulting column `mean_land_value`. The resulting data frame should have two columns: `replicate` and `mean_land_value`.\n",
+ "\n",
+ "_Assign your data frame to an object called `resampled_means_10`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "36cc4b7fe0ed21a1e3c2a1760b6f4d78",
+ "grade": false,
+ "grade_id": "cell-e1bdb3abbcdf5c99",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(0510) # DO NOT CHANGE!\n",
+ "\n",
+ "# resampled_means_10 <- sample_10 %>% \n",
+ "# rep_sample_n(size = ..., reps = ..., replace = ...) %>% \n",
+ "# group_by(...) %>% \n",
+ "# summarise(mean_land_value = ...(...))\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(resampled_means_10)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "346bc403cee192f45e6f2a8333f5f149",
+ "grade": true,
+ "grade_id": "cell-02812ebacc5a610e",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "9d8a1e43e9b2b544e6b04537469b9e38",
+ "grade": false,
+ "grade_id": "cell-7d2e4bca670a3bdf",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.2** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Visualize the distribution of the sample means (the `mean_land_value` variable in `resampled_means_10`) by plotting a histogram using `geom_histogram` with the argument `binwidth = 15000`. Add a title of \"n = 10\" to the plot using `ggtitle` and ensure that the x-axis has a human-readable label.\n",
+ "\n",
+ "_Assign your plot to an object called `bootstrap_dist_10`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b96c162e48e4f585b0eba1f6e528adf1",
+ "grade": false,
+ "grade_id": "cell-e192cfc3e979b2de",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# bootstrap_dist_10 <- ... %>% \n",
+ "# ggplot(aes(x = ...)) +\n",
+ "# ...(... = ...) +\n",
+ "# xlab(\"Mean Land Value (CAD)\") +\n",
+ "# ...(\"n = 10\")\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "bootstrap_dist_10"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "14b80a4842fad51c935b10924cf4c80e",
+ "grade": true,
+ "grade_id": "cell-3015035368ebbfa5",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "b795545cf15831b0f00a3c6e737d0560",
+ "grade": false,
+ "grade_id": "cell-e7bd16fe8aea02c8",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.3** \n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "In order to produce the distribution above, we had to sample with replacement from the population many times.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.3`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ca8a114e086de3938fa25a3170f33a0b",
+ "grade": false,
+ "grade_id": "cell-e034e1d8b3ac69cc",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.3 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8487c36668fea112156c2f5f15cc1509",
+ "grade": true,
+ "grade_id": "cell-689ca07402031a13",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "130396c8ceed4b4f36f3346c3f15a2f7",
+ "grade": false,
+ "grade_id": "cell-a05dbc9672af2e83",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.4** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Imagine you only have the resources to take a single random sample of size 30 from the population of interest. Use `rep_sample_n` with a seed of `8183` to take a single sample of size 30 from `multi_family_strata`. Select only the `current_land_value` column so your data frame has a single column.\n",
+ "\n",
+ "_Assign your data frame to an object called `sample_30`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d0e1573392c019bd2bdc608e2e0b47e4",
+ "grade": false,
+ "grade_id": "cell-b225d2da00c136f1",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# set.seed(...)\n",
+ "# sample_30 <- multi_family_strata %>% \n",
+ "# rep_sample_n(size = ..., replace = ...) %>%\n",
+ "# ungroup() %>% \n",
+ "# ...(...)\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(sample_30)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "1ac976c768fb2e13db61aac7b2a6f682",
+ "grade": true,
+ "grade_id": "cell-5e16848f066c67f3",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "91e393cd562df45d9b4b00fd6e6101a3",
+ "grade": false,
+ "grade_id": "cell-0f542f85b72df1e9",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.5** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Using the same strategy as you did above, take 2000 bootstrap samples from the sample you just took (`sample_30`), but this time use the seed `7032`. Then, calculate the mean for each sample (name the new column `mean_land_value`). Lastly, visualize the distribution of the sample means you just calculated by plotting a histogram using `geom_histogram` with the argument `binwidth = 15000`. Add a title of \"n = 30\" to the plot using `ggtitle` and ensure that the x-axis has a human-readable label.\n",
+ "\n",
+ "_Assign your plot to an object called `bootstrap_dist_30`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "be930ff3667542012421313f23ff2330",
+ "grade": false,
+ "grade_id": "cell-4153c51957605ac6",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(7032) # USE A DIFFERENT SEED PER INSTRUCTION!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "bootstrap_dist_30"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "bd33c6640fb1aa2f928d1917cdcf1279",
+ "grade": true,
+ "grade_id": "cell-ae86fbe13570d25d",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.5()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f5066eb786f267d0e7340ba78acd13f5",
+ "grade": false,
+ "grade_id": "cell-7d5754b45a9fc421",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.6** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Imagine you only have the resources to take a single random sample of size 100 from the population of interest. Use `rep_sample_n` with a seed of 5029 to take a single sample of size 100 from `multi_family_strata`. Select only the `current_land_value` column so your data frame has a single column.\n",
+ "\n",
+ "_Assign your data frame to an object called `sample_100`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b981dd49c7404a9155dc8181f59e93cc",
+ "grade": false,
+ "grade_id": "cell-f4b5f6c9f6fd9cd3",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(5029) # DO NOT CHANGE!\n",
+ "\n",
+ "# sample_100 <- multi_family_strata %>% \n",
+ "# rep_sample_n(size = ..., replace = ...) %>%\n",
+ "# ungroup() %>% \n",
+ "# ...(...)\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(sample_100)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "baec50d95daae77ce910af9e4828c0d5",
+ "grade": true,
+ "grade_id": "cell-0141641c277ad8c5",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.6()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d5331aa79d7ba10513f8c6e2c32a2588",
+ "grade": false,
+ "grade_id": "cell-d92f8052dc246ca2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.7** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Using the same strategy as you did above, take 2000 bootstrap samples from the sample you just took (`sample_100`), but this time use the seed 2334. Then, calculate the mean for each sample (name the new column `mean_land_value`). Lastly, visualize the distribution of the sample means you just calculated by plotting a histogram using `geom_histogram` with the argument `binwidth = 15000`. Add a title of \"n = 100\" to the plot using `ggtitle` and ensure that the x-axis has a human-readable label.\n",
+ "\n",
+ "_Assign your plot to an object called `bootstrap_dist_100`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5d6a2971b24aa9ed3c9af725624172bf",
+ "grade": false,
+ "grade_id": "cell-a1d586c8ab8df866",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(2334) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "bootstrap_dist_100"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c4d73d1d87049ca9f0048791b549c269",
+ "grade": true,
+ "grade_id": "cell-4b14c14a2338c9b2",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.7()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "41ed2d9c2e7861b8f5a83af38658d4e6",
+ "grade": false,
+ "grade_id": "cell-f2d6ff479742e96a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "In the code cell below, we have run code that generates the same sampling distributions you produced in `worksheet_02`, and displays them in a row **below** the three bootstrap distributions that you produced. We have sorted the plots by increasing order of sample size from left to right. The red vertical line shows the location of the mean for each plot.\n",
+ "\n",
+ "**Note**: a very small number of the sample means are not visible because we manually set bounds on the x-axis so you can compare the distributions more easily. Also, the code is inside a different file (which we ran from within this worksheet with `source`) to save some vertical space in the worksheet.\n",
+ "\n",
+ "_Use the set of plots below to answer the **next two questions**._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f918b0600d171180bcbc7c986ad31ca7",
+ "grade": false,
+ "grade_id": "cell-9cd9f9cad6d53153",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "options(repr.plot.width = 15, repr.plot.height = 10)\n",
+ "source(\"section_4.R\") # Runs code to produce the sampling distributions & arrange in grid.\n",
+ "all_dist_grid"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "4a353c7faf48cc890b02ed6c233533a4",
+ "grade": false,
+ "grade_id": "cell-6c4a90e25b93fd69",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.8**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Considering the set of plots above, which statement below **is not** correct:\n",
+ "\n",
+ "A. The centre of the sampling distribution and bootstrap distributions with the same sample size are different.\n",
+ "\n",
+ "B. The width of the sampling distribution and bootstrap distributions with the same sample size are different.\n",
+ "\n",
+ "C. For both the sampling distributions and bootstrap distributions, as the sample size increase, the standard deviation decreases.\n",
+ "\n",
+ "D. For both the sampling distributions and bootstrap distributions, as the sample size increase, the distributions appear more bell-shaped.\n",
+ "\n",
+ "E. The sampling distribution and bootstrap distribution are just as different from each other, no matter the sample size.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.8`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9819d4e2949aa63c9f90e53d4b77c93a",
+ "grade": false,
+ "grade_id": "cell-cbd968352c879e51",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.8 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "72635afd8894aec2d751f6e0f887e375",
+ "grade": true,
+ "grade_id": "cell-6e8d7076805c9ed8",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.8()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3e35702f1908d3498c454982ecd88223",
+ "grade": false,
+ "grade_id": "cell-0561298f07cbc750",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.9**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "When we only have access to a single sample from the population of interest, we can obtain a useful approximation of standard error (specifically, the standard deviation of the distribution of an estimator, or more generally, how much we expect our point estimates to vary) by producing a bootstrap distribution.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.9`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "ed858e77a7303be2481bef27ff65c947",
+ "grade": false,
+ "grade_id": "cell-9786afeac35dc96a",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.9 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "266e4a8991f1e66f2ae9e5ca94f64c4e",
+ "grade": true,
+ "grade_id": "cell-9d78c06d071d02a2",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "test_4.9()"
+ ]
+ }
+ ],
+ "metadata": {
+ "docker": {
+ "latest_image_tag": "v0.4.0"
+ },
+ "jupytext": {
+ "formats": "ipynb,Rmd"
+ },
+ "kernelspec": {
+ "display_name": "R",
+ "language": "R",
+ "name": "ir"
+ },
+ "language_info": {
+ "codemirror_mode": "r",
+ "file_extension": ".r",
+ "mimetype": "text/x-r-source",
+ "name": "R",
+ "pygments_lexer": "r",
+ "version": "4.2.3"
+ }
+ },
+ "nbformat": 4,
+ "nbformat_minor": 4
+}
diff --git a/materials/worksheet_04/bootstrap_dists_worksheet_04.R b/materials/worksheet_04/bootstrap_dists_worksheet_04.R
new file mode 100644
index 0000000..dec7ab6
--- /dev/null
+++ b/materials/worksheet_04/bootstrap_dists_worksheet_04.R
@@ -0,0 +1,41 @@
+options(warn = -1)
+
+generate_bootstrap_df <- function(seed) {
+ set.seed(seed)
+ sunset_pop %>%
+ rep_sample_n(size = 24, reps = 1, replace = FALSE) %>%
+ ungroup() %>%
+ select(diameter) %>%
+ rep_sample_n(size = 24, reps = 1500, replace = TRUE) %>%
+ group_by(replicate) %>%
+ summarize(diameter_mean = mean(diameter), .groups = "drop") %>%
+ select(diameter_mean)
+}
+seeds <- c(5457, 4457, 5192, 4808, 0017, 4492, 8499, 0730, 8704, 2070)
+bootstrap_dfs <- lapply(seeds, generate_bootstrap_df)
+all_means <- unlist(bootstrap_dfs)
+max_mean <- max(all_means)
+min_mean <- min(all_means)
+
+generate_bootstrap_plots <- function(df) {
+ df %>%
+ ggplot(aes(x = diameter_mean)) +
+ geom_histogram(binwidth = 0.5) +
+ geom_vline(xintercept = pop_mean, colour = "red") +
+ labs(
+ title = "n = 24",
+ x = "Mean Diameter (cm)"
+ ) +
+ scale_x_continuous(limits = c(min_mean, max_mean))
+}
+plot_row <- plot_grid(plotlist = lapply(bootstrap_dfs, generate_bootstrap_plots), ncol = 5)
+
+title <- ggdraw() +
+ draw_label("Bootstrap Sampling Distributions (of Sample Means)",
+ fontface = "bold",
+ x = 0,
+ hjust = 0
+ ) +
+ theme(plot.margin = margin(0, 0, 0, 7))
+
+bootstrap_dists <- plot_grid(title, plot_row, ncol = 1, rel_heights = c(0.1, 1))
diff --git a/materials/worksheet_04/bootstrap_samples.csv b/materials/worksheet_04/bootstrap_samples.csv
new file mode 100644
index 0000000..1fb7871
--- /dev/null
+++ b/materials/worksheet_04/bootstrap_samples.csv
@@ -0,0 +1,30001 @@
+"sample_id","replicate","diameter"
+1,1,10.16
+1,1,7.62
+1,1,27.94
+1,1,33.02
+1,1,7.62
+1,1,7.62
+1,1,45.72
+1,1,45.72
+1,1,33.02
+1,1,33.02
+1,1,22.86
+1,1,8.89
+1,1,33.02
+1,1,7.62
+1,1,30.48
+1,1,33.02
+1,1,19.05
+1,1,81.28
+1,1,53.975
+1,1,24.13
+1,1,81.28
+1,1,7.62
+1,1,81.28
+1,1,24.13
+1,1,35.56
+1,1,63.5
+1,1,99.06
+1,1,99.06
+1,1,35.56
+1,1,35.56
+1,2,55.88
+1,2,81.28
+1,2,45.72
+1,2,99.06
+1,2,53.975
+1,2,8.89
+1,2,40.64
+1,2,81.28
+1,2,7.62
+1,2,45.72
+1,2,35.56
+1,2,7.62
+1,2,63.5
+1,2,33.02
+1,2,55.88
+1,2,33.02
+1,2,10.16
+1,2,53.975
+1,2,35.56
+1,2,7.62
+1,2,7.62
+1,2,40.64
+1,2,35.56
+1,2,35.56
+1,2,33.02
+1,2,33.02
+1,2,7.62
+1,2,40.64
+1,2,7.62
+1,2,7.62
+1,3,7.62
+1,3,7.62
+1,3,22.86
+1,3,33.02
+1,3,81.28
+1,3,8.89
+1,3,7.62
+1,3,7.62
+1,3,53.975
+1,3,24.13
+1,3,8.89
+1,3,7.62
+1,3,27.94
+1,3,53.975
+1,3,19.05
+1,3,7.62
+1,3,33.02
+1,3,81.28
+1,3,55.88
+1,3,45.72
+1,3,50.8
+1,3,27.94
+1,3,33.02
+1,3,7.62
+1,3,7.62
+1,3,30.48
+1,3,35.56
+1,3,33.02
+1,3,40.64
+1,3,55.88
+1,4,55.88
+1,4,15.24
+1,4,33.02
+1,4,40.64
+1,4,35.56
+1,4,8.89
+1,4,8.89
+1,4,40.64
+1,4,27.94
+1,4,40.64
+1,4,7.62
+1,4,22.86
+1,4,30.48
+1,4,7.62
+1,4,10.16
+1,4,40.64
+1,4,40.64
+1,4,44.45
+1,4,15.24
+1,4,22.86
+1,4,35.56
+1,4,53.975
+1,4,45.72
+1,4,40.64
+1,4,35.56
+1,4,46.355
+1,4,22.86
+1,4,45.72
+1,4,81.28
+1,4,44.45
+1,5,15.24
+1,5,50.8
+1,5,7.62
+1,5,63.5
+1,5,24.13
+1,5,7.62
+1,5,35.56
+1,5,33.02
+1,5,7.62
+1,5,81.28
+1,5,8.89
+1,5,7.62
+1,5,30.48
+1,5,35.56
+1,5,10.16
+1,5,15.24
+1,5,35.56
+1,5,10.16
+1,5,8.89
+1,5,7.62
+1,5,22.86
+1,5,33.02
+1,5,63.5
+1,5,33.02
+1,5,24.13
+1,5,33.02
+1,5,7.62
+1,5,55.88
+1,5,7.62
+1,5,10.16
+1,6,30.48
+1,6,40.64
+1,6,8.89
+1,6,7.62
+1,6,33.02
+1,6,35.56
+1,6,7.62
+1,6,63.5
+1,6,33.02
+1,6,19.05
+1,6,10.16
+1,6,63.5
+1,6,19.05
+1,6,99.06
+1,6,50.8
+1,6,7.62
+1,6,19.05
+1,6,99.06
+1,6,7.62
+1,6,53.975
+1,6,22.86
+1,6,45.72
+1,6,15.24
+1,6,7.62
+1,6,33.02
+1,6,40.64
+1,6,7.62
+1,6,33.02
+1,6,7.62
+1,6,8.89
+1,7,35.56
+1,7,8.89
+1,7,19.05
+1,7,44.45
+1,7,50.8
+1,7,7.62
+1,7,24.13
+1,7,40.64
+1,7,81.28
+1,7,8.89
+1,7,27.94
+1,7,40.64
+1,7,40.64
+1,7,8.89
+1,7,45.72
+1,7,10.16
+1,7,81.28
+1,7,10.16
+1,7,22.86
+1,7,40.64
+1,7,7.62
+1,7,24.13
+1,7,7.62
+1,7,7.62
+1,7,63.5
+1,7,7.62
+1,7,10.16
+1,7,63.5
+1,7,10.16
+1,7,7.62
+1,8,40.64
+1,8,50.8
+1,8,19.05
+1,8,7.62
+1,8,27.94
+1,8,7.62
+1,8,8.89
+1,8,45.72
+1,8,8.89
+1,8,19.05
+1,8,40.64
+1,8,44.45
+1,8,40.64
+1,8,50.8
+1,8,7.62
+1,8,7.62
+1,8,7.62
+1,8,22.86
+1,8,19.05
+1,8,19.05
+1,8,55.88
+1,8,7.62
+1,8,8.89
+1,8,7.62
+1,8,50.8
+1,8,19.05
+1,8,30.48
+1,8,99.06
+1,8,22.86
+1,8,50.8
+1,9,10.16
+1,9,7.62
+1,9,40.64
+1,9,7.62
+1,9,35.56
+1,9,40.64
+1,9,7.62
+1,9,24.13
+1,9,40.64
+1,9,45.72
+1,9,33.02
+1,9,46.355
+1,9,7.62
+1,9,40.64
+1,9,30.48
+1,9,33.02
+1,9,7.62
+1,9,7.62
+1,9,46.355
+1,9,33.02
+1,9,15.24
+1,9,10.16
+1,9,81.28
+1,9,33.02
+1,9,44.45
+1,9,22.86
+1,9,10.16
+1,9,81.28
+1,9,45.72
+1,9,45.72
+1,10,46.355
+1,10,8.89
+1,10,40.64
+1,10,50.8
+1,10,7.62
+1,10,55.88
+1,10,24.13
+1,10,7.62
+1,10,81.28
+1,10,7.62
+1,10,24.13
+1,10,33.02
+1,10,45.72
+1,10,50.8
+1,10,15.24
+1,10,55.88
+1,10,15.24
+1,10,24.13
+1,10,22.86
+1,10,45.72
+1,10,15.24
+1,10,35.56
+1,10,99.06
+1,10,10.16
+1,10,24.13
+1,10,24.13
+1,10,33.02
+1,10,35.56
+1,10,7.62
+1,10,27.94
+1,11,22.86
+1,11,27.94
+1,11,45.72
+1,11,30.48
+1,11,27.94
+1,11,40.64
+1,11,10.16
+1,11,10.16
+1,11,99.06
+1,11,44.45
+1,11,53.975
+1,11,35.56
+1,11,33.02
+1,11,63.5
+1,11,40.64
+1,11,35.56
+1,11,50.8
+1,11,99.06
+1,11,27.94
+1,11,40.64
+1,11,99.06
+1,11,24.13
+1,11,81.28
+1,11,27.94
+1,11,7.62
+1,11,7.62
+1,11,40.64
+1,11,40.64
+1,11,10.16
+1,11,55.88
+1,12,24.13
+1,12,7.62
+1,12,63.5
+1,12,7.62
+1,12,35.56
+1,12,35.56
+1,12,63.5
+1,12,35.56
+1,12,8.89
+1,12,99.06
+1,12,99.06
+1,12,33.02
+1,12,8.89
+1,12,30.48
+1,12,27.94
+1,12,55.88
+1,12,33.02
+1,12,55.88
+1,12,44.45
+1,12,44.45
+1,12,44.45
+1,12,8.89
+1,12,15.24
+1,12,81.28
+1,12,7.62
+1,12,10.16
+1,12,22.86
+1,12,27.94
+1,12,35.56
+1,12,99.06
+1,13,7.62
+1,13,55.88
+1,13,55.88
+1,13,81.28
+1,13,22.86
+1,13,44.45
+1,13,7.62
+1,13,81.28
+1,13,7.62
+1,13,44.45
+1,13,30.48
+1,13,35.56
+1,13,53.975
+1,13,7.62
+1,13,8.89
+1,13,81.28
+1,13,15.24
+1,13,63.5
+1,13,33.02
+1,13,22.86
+1,13,27.94
+1,13,46.355
+1,13,40.64
+1,13,46.355
+1,13,35.56
+1,13,33.02
+1,13,33.02
+1,13,99.06
+1,13,10.16
+1,13,10.16
+1,14,55.88
+1,14,40.64
+1,14,35.56
+1,14,33.02
+1,14,10.16
+1,14,7.62
+1,14,35.56
+1,14,40.64
+1,14,7.62
+1,14,40.64
+1,14,53.975
+1,14,53.975
+1,14,33.02
+1,14,40.64
+1,14,46.355
+1,14,63.5
+1,14,55.88
+1,14,27.94
+1,14,35.56
+1,14,8.89
+1,14,44.45
+1,14,33.02
+1,14,46.355
+1,14,44.45
+1,14,33.02
+1,14,19.05
+1,14,46.355
+1,14,33.02
+1,14,99.06
+1,14,40.64
+1,15,7.62
+1,15,8.89
+1,15,19.05
+1,15,15.24
+1,15,33.02
+1,15,30.48
+1,15,63.5
+1,15,8.89
+1,15,33.02
+1,15,33.02
+1,15,7.62
+1,15,30.48
+1,15,7.62
+1,15,7.62
+1,15,33.02
+1,15,7.62
+1,15,35.56
+1,15,22.86
+1,15,10.16
+1,15,27.94
+1,15,55.88
+1,15,24.13
+1,15,7.62
+1,15,22.86
+1,15,10.16
+1,15,19.05
+1,15,7.62
+1,15,24.13
+1,15,24.13
+1,15,7.62
+1,16,55.88
+1,16,40.64
+1,16,33.02
+1,16,7.62
+1,16,27.94
+1,16,33.02
+1,16,33.02
+1,16,7.62
+1,16,8.89
+1,16,63.5
+1,16,63.5
+1,16,40.64
+1,16,44.45
+1,16,81.28
+1,16,33.02
+1,16,44.45
+1,16,22.86
+1,16,33.02
+1,16,15.24
+1,16,24.13
+1,16,81.28
+1,16,50.8
+1,16,35.56
+1,16,33.02
+1,16,19.05
+1,16,15.24
+1,16,33.02
+1,16,50.8
+1,16,53.975
+1,16,7.62
+1,17,7.62
+1,17,7.62
+1,17,24.13
+1,17,7.62
+1,17,46.355
+1,17,40.64
+1,17,10.16
+1,17,22.86
+1,17,7.62
+1,17,27.94
+1,17,40.64
+1,17,63.5
+1,17,40.64
+1,17,35.56
+1,17,24.13
+1,17,46.355
+1,17,63.5
+1,17,35.56
+1,17,33.02
+1,17,35.56
+1,17,10.16
+1,17,55.88
+1,17,30.48
+1,17,44.45
+1,17,40.64
+1,17,55.88
+1,17,99.06
+1,17,10.16
+1,17,24.13
+1,17,15.24
+1,18,10.16
+1,18,30.48
+1,18,35.56
+1,18,55.88
+1,18,22.86
+1,18,35.56
+1,18,8.89
+1,18,33.02
+1,18,40.64
+1,18,27.94
+1,18,99.06
+1,18,40.64
+1,18,63.5
+1,18,10.16
+1,18,53.975
+1,18,27.94
+1,18,99.06
+1,18,10.16
+1,18,35.56
+1,18,7.62
+1,18,35.56
+1,18,63.5
+1,18,33.02
+1,18,7.62
+1,18,81.28
+1,18,7.62
+1,18,33.02
+1,18,35.56
+1,18,55.88
+1,18,35.56
+1,19,44.45
+1,19,44.45
+1,19,7.62
+1,19,99.06
+1,19,24.13
+1,19,33.02
+1,19,10.16
+1,19,7.62
+1,19,46.355
+1,19,7.62
+1,19,24.13
+1,19,53.975
+1,19,33.02
+1,19,7.62
+1,19,10.16
+1,19,46.355
+1,19,46.355
+1,19,7.62
+1,19,10.16
+1,19,53.975
+1,19,99.06
+1,19,30.48
+1,19,35.56
+1,19,44.45
+1,19,99.06
+1,19,8.89
+1,19,33.02
+1,19,7.62
+1,19,33.02
+1,19,53.975
+1,20,33.02
+1,20,33.02
+1,20,15.24
+1,20,22.86
+1,20,50.8
+1,20,33.02
+1,20,7.62
+1,20,22.86
+1,20,30.48
+1,20,8.89
+1,20,40.64
+1,20,24.13
+1,20,7.62
+1,20,8.89
+1,20,35.56
+1,20,7.62
+1,20,10.16
+1,20,19.05
+1,20,24.13
+1,20,33.02
+1,20,40.64
+1,20,35.56
+1,20,50.8
+1,20,10.16
+1,20,27.94
+1,20,99.06
+1,20,19.05
+1,20,50.8
+1,20,35.56
+1,20,45.72
+1,21,10.16
+1,21,35.56
+1,21,35.56
+1,21,40.64
+1,21,30.48
+1,21,55.88
+1,21,33.02
+1,21,99.06
+1,21,33.02
+1,21,63.5
+1,21,33.02
+1,21,33.02
+1,21,35.56
+1,21,10.16
+1,21,46.355
+1,21,7.62
+1,21,81.28
+1,21,7.62
+1,21,50.8
+1,21,30.48
+1,21,15.24
+1,21,19.05
+1,21,63.5
+1,21,40.64
+1,21,7.62
+1,21,81.28
+1,21,27.94
+1,21,33.02
+1,21,15.24
+1,21,44.45
+1,22,15.24
+1,22,33.02
+1,22,53.975
+1,22,30.48
+1,22,99.06
+1,22,19.05
+1,22,33.02
+1,22,44.45
+1,22,44.45
+1,22,45.72
+1,22,15.24
+1,22,44.45
+1,22,40.64
+1,22,19.05
+1,22,44.45
+1,22,15.24
+1,22,24.13
+1,22,19.05
+1,22,7.62
+1,22,30.48
+1,22,40.64
+1,22,7.62
+1,22,40.64
+1,22,7.62
+1,22,10.16
+1,22,7.62
+1,22,7.62
+1,22,7.62
+1,22,10.16
+1,22,24.13
+1,23,8.89
+1,23,10.16
+1,23,7.62
+1,23,22.86
+1,23,33.02
+1,23,7.62
+1,23,45.72
+1,23,53.975
+1,23,10.16
+1,23,7.62
+1,23,33.02
+1,23,10.16
+1,23,55.88
+1,23,44.45
+1,23,19.05
+1,23,19.05
+1,23,24.13
+1,23,7.62
+1,23,99.06
+1,23,33.02
+1,23,45.72
+1,23,7.62
+1,23,63.5
+1,23,40.64
+1,23,27.94
+1,23,30.48
+1,23,7.62
+1,23,10.16
+1,23,50.8
+1,23,7.62
+1,24,7.62
+1,24,40.64
+1,24,45.72
+1,24,7.62
+1,24,40.64
+1,24,44.45
+1,24,15.24
+1,24,7.62
+1,24,7.62
+1,24,7.62
+1,24,30.48
+1,24,22.86
+1,24,7.62
+1,24,45.72
+1,24,63.5
+1,24,99.06
+1,24,81.28
+1,24,8.89
+1,24,7.62
+1,24,15.24
+1,24,40.64
+1,24,27.94
+1,24,7.62
+1,24,7.62
+1,24,10.16
+1,24,99.06
+1,24,35.56
+1,24,35.56
+1,24,33.02
+1,24,55.88
+1,25,40.64
+1,25,10.16
+1,25,53.975
+1,25,99.06
+1,25,40.64
+1,25,35.56
+1,25,40.64
+1,25,33.02
+1,25,10.16
+1,25,8.89
+1,25,19.05
+1,25,35.56
+1,25,40.64
+1,25,40.64
+1,25,33.02
+1,25,50.8
+1,25,63.5
+1,25,53.975
+1,25,19.05
+1,25,10.16
+1,25,8.89
+1,25,10.16
+1,25,33.02
+1,25,27.94
+1,25,27.94
+1,25,33.02
+1,25,15.24
+1,25,15.24
+1,25,40.64
+1,25,27.94
+1,26,46.355
+1,26,63.5
+1,26,33.02
+1,26,33.02
+1,26,33.02
+1,26,53.975
+1,26,63.5
+1,26,63.5
+1,26,55.88
+1,26,81.28
+1,26,30.48
+1,26,7.62
+1,26,33.02
+1,26,15.24
+1,26,99.06
+1,26,50.8
+1,26,33.02
+1,26,24.13
+1,26,40.64
+1,26,55.88
+1,26,40.64
+1,26,30.48
+1,26,81.28
+1,26,7.62
+1,26,99.06
+1,26,45.72
+1,26,19.05
+1,26,7.62
+1,26,10.16
+1,26,7.62
+1,27,7.62
+1,27,27.94
+1,27,35.56
+1,27,40.64
+1,27,99.06
+1,27,33.02
+1,27,7.62
+1,27,50.8
+1,27,63.5
+1,27,99.06
+1,27,7.62
+1,27,81.28
+1,27,7.62
+1,27,8.89
+1,27,24.13
+1,27,15.24
+1,27,7.62
+1,27,81.28
+1,27,7.62
+1,27,19.05
+1,27,44.45
+1,27,50.8
+1,27,33.02
+1,27,40.64
+1,27,30.48
+1,27,46.355
+1,27,46.355
+1,27,7.62
+1,27,7.62
+1,27,35.56
+1,28,7.62
+1,28,99.06
+1,28,7.62
+1,28,44.45
+1,28,7.62
+1,28,81.28
+1,28,7.62
+1,28,35.56
+1,28,45.72
+1,28,22.86
+1,28,99.06
+1,28,27.94
+1,28,99.06
+1,28,10.16
+1,28,44.45
+1,28,46.355
+1,28,10.16
+1,28,99.06
+1,28,44.45
+1,28,7.62
+1,28,30.48
+1,28,35.56
+1,28,40.64
+1,28,7.62
+1,28,35.56
+1,28,15.24
+1,28,7.62
+1,28,7.62
+1,28,35.56
+1,28,33.02
+1,29,15.24
+1,29,53.975
+1,29,27.94
+1,29,99.06
+1,29,22.86
+1,29,8.89
+1,29,46.355
+1,29,24.13
+1,29,40.64
+1,29,22.86
+1,29,10.16
+1,29,55.88
+1,29,45.72
+1,29,55.88
+1,29,7.62
+1,29,8.89
+1,29,53.975
+1,29,10.16
+1,29,55.88
+1,29,35.56
+1,29,55.88
+1,29,24.13
+1,29,8.89
+1,29,24.13
+1,29,22.86
+1,29,53.975
+1,29,8.89
+1,29,33.02
+1,29,19.05
+1,29,15.24
+1,30,55.88
+1,30,7.62
+1,30,50.8
+1,30,7.62
+1,30,10.16
+1,30,10.16
+1,30,7.62
+1,30,27.94
+1,30,7.62
+1,30,33.02
+1,30,50.8
+1,30,45.72
+1,30,44.45
+1,30,33.02
+1,30,33.02
+1,30,40.64
+1,30,35.56
+1,30,35.56
+1,30,40.64
+1,30,33.02
+1,30,99.06
+1,30,50.8
+1,30,33.02
+1,30,63.5
+1,30,24.13
+1,30,40.64
+1,30,7.62
+1,30,22.86
+1,30,40.64
+1,30,33.02
+1,31,33.02
+1,31,33.02
+1,31,33.02
+1,31,55.88
+1,31,7.62
+1,31,40.64
+1,31,81.28
+1,31,30.48
+1,31,7.62
+1,31,7.62
+1,31,46.355
+1,31,46.355
+1,31,40.64
+1,31,53.975
+1,31,81.28
+1,31,30.48
+1,31,50.8
+1,31,27.94
+1,31,24.13
+1,31,46.355
+1,31,46.355
+1,31,7.62
+1,31,15.24
+1,31,24.13
+1,31,55.88
+1,31,7.62
+1,31,99.06
+1,31,40.64
+1,31,24.13
+1,31,7.62
+1,32,10.16
+1,32,10.16
+1,32,63.5
+1,32,7.62
+1,32,81.28
+1,32,10.16
+1,32,44.45
+1,32,24.13
+1,32,19.05
+1,32,35.56
+1,32,27.94
+1,32,35.56
+1,32,7.62
+1,32,30.48
+1,32,30.48
+1,32,7.62
+1,32,19.05
+1,32,35.56
+1,32,27.94
+1,32,15.24
+1,32,35.56
+1,32,19.05
+1,32,15.24
+1,32,35.56
+1,32,8.89
+1,32,10.16
+1,32,10.16
+1,32,27.94
+1,32,55.88
+1,32,33.02
+1,33,7.62
+1,33,27.94
+1,33,7.62
+1,33,45.72
+1,33,50.8
+1,33,19.05
+1,33,35.56
+1,33,50.8
+1,33,55.88
+1,33,19.05
+1,33,33.02
+1,33,7.62
+1,33,50.8
+1,33,46.355
+1,33,99.06
+1,33,24.13
+1,33,24.13
+1,33,63.5
+1,33,33.02
+1,33,40.64
+1,33,44.45
+1,33,35.56
+1,33,99.06
+1,33,53.975
+1,33,7.62
+1,33,44.45
+1,33,40.64
+1,33,40.64
+1,33,10.16
+1,33,24.13
+1,34,35.56
+1,34,53.975
+1,34,50.8
+1,34,30.48
+1,34,24.13
+1,34,30.48
+1,34,44.45
+1,34,81.28
+1,34,7.62
+1,34,10.16
+1,34,63.5
+1,34,10.16
+1,34,7.62
+1,34,99.06
+1,34,7.62
+1,34,35.56
+1,34,40.64
+1,34,35.56
+1,34,53.975
+1,34,22.86
+1,34,40.64
+1,34,27.94
+1,34,15.24
+1,34,53.975
+1,34,35.56
+1,34,7.62
+1,34,44.45
+1,34,44.45
+1,34,27.94
+1,34,50.8
+1,35,24.13
+1,35,63.5
+1,35,33.02
+1,35,19.05
+1,35,45.72
+1,35,10.16
+1,35,35.56
+1,35,15.24
+1,35,44.45
+1,35,27.94
+1,35,50.8
+1,35,44.45
+1,35,55.88
+1,35,30.48
+1,35,40.64
+1,35,45.72
+1,35,33.02
+1,35,10.16
+1,35,7.62
+1,35,81.28
+1,35,27.94
+1,35,44.45
+1,35,50.8
+1,35,33.02
+1,35,33.02
+1,35,19.05
+1,35,81.28
+1,35,10.16
+1,35,15.24
+1,35,99.06
+1,36,19.05
+1,36,7.62
+1,36,7.62
+1,36,45.72
+1,36,19.05
+1,36,10.16
+1,36,7.62
+1,36,24.13
+1,36,24.13
+1,36,8.89
+1,36,35.56
+1,36,35.56
+1,36,45.72
+1,36,10.16
+1,36,63.5
+1,36,30.48
+1,36,53.975
+1,36,7.62
+1,36,40.64
+1,36,53.975
+1,36,35.56
+1,36,7.62
+1,36,7.62
+1,36,7.62
+1,36,35.56
+1,36,55.88
+1,36,50.8
+1,36,7.62
+1,36,30.48
+1,36,30.48
+1,37,10.16
+1,37,45.72
+1,37,45.72
+1,37,10.16
+1,37,45.72
+1,37,7.62
+1,37,55.88
+1,37,63.5
+1,37,33.02
+1,37,7.62
+1,37,44.45
+1,37,33.02
+1,37,35.56
+1,37,99.06
+1,37,99.06
+1,37,27.94
+1,37,35.56
+1,37,27.94
+1,37,40.64
+1,37,7.62
+1,37,7.62
+1,37,7.62
+1,37,7.62
+1,37,22.86
+1,37,10.16
+1,37,7.62
+1,37,55.88
+1,37,44.45
+1,37,22.86
+1,37,27.94
+1,38,99.06
+1,38,50.8
+1,38,7.62
+1,38,7.62
+1,38,35.56
+1,38,15.24
+1,38,35.56
+1,38,35.56
+1,38,8.89
+1,38,63.5
+1,38,46.355
+1,38,63.5
+1,38,40.64
+1,38,63.5
+1,38,27.94
+1,38,33.02
+1,38,15.24
+1,38,7.62
+1,38,27.94
+1,38,50.8
+1,38,46.355
+1,38,7.62
+1,38,40.64
+1,38,33.02
+1,38,30.48
+1,38,33.02
+1,38,33.02
+1,38,8.89
+1,38,53.975
+1,38,33.02
+1,39,45.72
+1,39,33.02
+1,39,7.62
+1,39,7.62
+1,39,7.62
+1,39,33.02
+1,39,27.94
+1,39,45.72
+1,39,8.89
+1,39,7.62
+1,39,7.62
+1,39,81.28
+1,39,7.62
+1,39,7.62
+1,39,45.72
+1,39,7.62
+1,39,10.16
+1,39,55.88
+1,39,45.72
+1,39,35.56
+1,39,7.62
+1,39,81.28
+1,39,22.86
+1,39,40.64
+1,39,7.62
+1,39,19.05
+1,39,30.48
+1,39,15.24
+1,39,7.62
+1,39,33.02
+1,40,33.02
+1,40,55.88
+1,40,40.64
+1,40,7.62
+1,40,81.28
+1,40,7.62
+1,40,24.13
+1,40,50.8
+1,40,35.56
+1,40,40.64
+1,40,46.355
+1,40,22.86
+1,40,44.45
+1,40,24.13
+1,40,7.62
+1,40,63.5
+1,40,63.5
+1,40,99.06
+1,40,35.56
+1,40,50.8
+1,40,24.13
+1,40,81.28
+1,40,15.24
+1,40,24.13
+1,40,33.02
+1,40,30.48
+1,40,22.86
+1,40,8.89
+1,40,33.02
+1,40,50.8
+1,41,19.05
+1,41,10.16
+1,41,10.16
+1,41,15.24
+1,41,22.86
+1,41,44.45
+1,41,7.62
+1,41,7.62
+1,41,35.56
+1,41,33.02
+1,41,40.64
+1,41,50.8
+1,41,10.16
+1,41,40.64
+1,41,30.48
+1,41,50.8
+1,41,30.48
+1,41,27.94
+1,41,33.02
+1,41,8.89
+1,41,35.56
+1,41,63.5
+1,41,7.62
+1,41,99.06
+1,41,33.02
+1,41,35.56
+1,41,55.88
+1,41,63.5
+1,41,33.02
+1,41,30.48
+1,42,81.28
+1,42,63.5
+1,42,7.62
+1,42,30.48
+1,42,7.62
+1,42,35.56
+1,42,35.56
+1,42,81.28
+1,42,19.05
+1,42,50.8
+1,42,7.62
+1,42,99.06
+1,42,45.72
+1,42,22.86
+1,42,46.355
+1,42,81.28
+1,42,40.64
+1,42,33.02
+1,42,35.56
+1,42,7.62
+1,42,44.45
+1,42,63.5
+1,42,40.64
+1,42,7.62
+1,42,15.24
+1,42,7.62
+1,42,33.02
+1,42,10.16
+1,42,55.88
+1,42,40.64
+1,43,7.62
+1,43,7.62
+1,43,27.94
+1,43,33.02
+1,43,53.975
+1,43,33.02
+1,43,24.13
+1,43,33.02
+1,43,19.05
+1,43,35.56
+1,43,46.355
+1,43,45.72
+1,43,33.02
+1,43,30.48
+1,43,33.02
+1,43,19.05
+1,43,7.62
+1,43,10.16
+1,43,7.62
+1,43,33.02
+1,43,55.88
+1,43,30.48
+1,43,7.62
+1,43,33.02
+1,43,33.02
+1,43,33.02
+1,43,45.72
+1,43,46.355
+1,43,15.24
+1,43,53.975
+1,44,7.62
+1,44,30.48
+1,44,27.94
+1,44,40.64
+1,44,50.8
+1,44,33.02
+1,44,40.64
+1,44,53.975
+1,44,55.88
+1,44,81.28
+1,44,63.5
+1,44,40.64
+1,44,55.88
+1,44,99.06
+1,44,8.89
+1,44,27.94
+1,44,53.975
+1,44,22.86
+1,44,99.06
+1,44,19.05
+1,44,7.62
+1,44,81.28
+1,44,8.89
+1,44,46.355
+1,44,40.64
+1,44,44.45
+1,44,15.24
+1,44,30.48
+1,44,7.62
+1,44,7.62
+1,45,19.05
+1,45,46.355
+1,45,7.62
+1,45,99.06
+1,45,8.89
+1,45,46.355
+1,45,55.88
+1,45,63.5
+1,45,50.8
+1,45,22.86
+1,45,19.05
+1,45,8.89
+1,45,10.16
+1,45,81.28
+1,45,33.02
+1,45,44.45
+1,45,7.62
+1,45,53.975
+1,45,44.45
+1,45,7.62
+1,45,7.62
+1,45,46.355
+1,45,7.62
+1,45,7.62
+1,45,22.86
+1,45,44.45
+1,45,35.56
+1,45,7.62
+1,45,53.975
+1,45,35.56
+1,46,15.24
+1,46,33.02
+1,46,81.28
+1,46,33.02
+1,46,7.62
+1,46,35.56
+1,46,33.02
+1,46,30.48
+1,46,7.62
+1,46,33.02
+1,46,27.94
+1,46,27.94
+1,46,7.62
+1,46,35.56
+1,46,44.45
+1,46,53.975
+1,46,40.64
+1,46,7.62
+1,46,7.62
+1,46,10.16
+1,46,99.06
+1,46,7.62
+1,46,63.5
+1,46,27.94
+1,46,40.64
+1,46,63.5
+1,46,46.355
+1,46,33.02
+1,46,27.94
+1,46,15.24
+1,47,55.88
+1,47,35.56
+1,47,50.8
+1,47,46.355
+1,47,33.02
+1,47,27.94
+1,47,46.355
+1,47,7.62
+1,47,63.5
+1,47,10.16
+1,47,40.64
+1,47,22.86
+1,47,99.06
+1,47,99.06
+1,47,40.64
+1,47,10.16
+1,47,55.88
+1,47,40.64
+1,47,45.72
+1,47,33.02
+1,47,99.06
+1,47,81.28
+1,47,63.5
+1,47,10.16
+1,47,33.02
+1,47,35.56
+1,47,8.89
+1,47,7.62
+1,47,7.62
+1,47,7.62
+1,48,40.64
+1,48,24.13
+1,48,22.86
+1,48,10.16
+1,48,33.02
+1,48,7.62
+1,48,40.64
+1,48,33.02
+1,48,15.24
+1,48,63.5
+1,48,7.62
+1,48,7.62
+1,48,19.05
+1,48,50.8
+1,48,35.56
+1,48,7.62
+1,48,45.72
+1,48,33.02
+1,48,19.05
+1,48,7.62
+1,48,81.28
+1,48,53.975
+1,48,10.16
+1,48,44.45
+1,48,8.89
+1,48,55.88
+1,48,10.16
+1,48,7.62
+1,48,15.24
+1,48,45.72
+1,49,10.16
+1,49,50.8
+1,49,22.86
+1,49,35.56
+1,49,81.28
+1,49,33.02
+1,49,40.64
+1,49,81.28
+1,49,33.02
+1,49,10.16
+1,49,24.13
+1,49,7.62
+1,49,8.89
+1,49,15.24
+1,49,15.24
+1,49,99.06
+1,49,63.5
+1,49,44.45
+1,49,50.8
+1,49,53.975
+1,49,7.62
+1,49,99.06
+1,49,7.62
+1,49,40.64
+1,49,45.72
+1,49,10.16
+1,49,30.48
+1,49,24.13
+1,49,44.45
+1,49,35.56
+1,50,40.64
+1,50,35.56
+1,50,40.64
+1,50,30.48
+1,50,7.62
+1,50,15.24
+1,50,7.62
+1,50,19.05
+1,50,40.64
+1,50,40.64
+1,50,22.86
+1,50,33.02
+1,50,45.72
+1,50,35.56
+1,50,35.56
+1,50,27.94
+1,50,24.13
+1,50,24.13
+1,50,99.06
+1,50,7.62
+1,50,7.62
+1,50,99.06
+1,50,27.94
+1,50,33.02
+1,50,46.355
+1,50,40.64
+1,50,46.355
+1,50,15.24
+1,50,45.72
+1,50,24.13
+1,51,45.72
+1,51,22.86
+1,51,33.02
+1,51,7.62
+1,51,8.89
+1,51,27.94
+1,51,33.02
+1,51,7.62
+1,51,10.16
+1,51,19.05
+1,51,22.86
+1,51,27.94
+1,51,7.62
+1,51,40.64
+1,51,22.86
+1,51,7.62
+1,51,7.62
+1,51,55.88
+1,51,8.89
+1,51,27.94
+1,51,33.02
+1,51,7.62
+1,51,7.62
+1,51,53.975
+1,51,35.56
+1,51,63.5
+1,51,27.94
+1,51,35.56
+1,51,33.02
+1,51,63.5
+1,52,55.88
+1,52,33.02
+1,52,10.16
+1,52,33.02
+1,52,8.89
+1,52,33.02
+1,52,50.8
+1,52,40.64
+1,52,7.62
+1,52,45.72
+1,52,33.02
+1,52,55.88
+1,52,27.94
+1,52,33.02
+1,52,44.45
+1,52,44.45
+1,52,40.64
+1,52,35.56
+1,52,53.975
+1,52,33.02
+1,52,63.5
+1,52,15.24
+1,52,40.64
+1,52,99.06
+1,52,7.62
+1,52,40.64
+1,52,7.62
+1,52,44.45
+1,52,40.64
+1,52,7.62
+1,53,15.24
+1,53,40.64
+1,53,40.64
+1,53,8.89
+1,53,33.02
+1,53,7.62
+1,53,44.45
+1,53,24.13
+1,53,35.56
+1,53,81.28
+1,53,30.48
+1,53,15.24
+1,53,22.86
+1,53,40.64
+1,53,7.62
+1,53,40.64
+1,53,81.28
+1,53,33.02
+1,53,7.62
+1,53,8.89
+1,53,40.64
+1,53,53.975
+1,53,30.48
+1,53,10.16
+1,53,50.8
+1,53,7.62
+1,53,45.72
+1,53,53.975
+1,53,7.62
+1,53,33.02
+1,54,19.05
+1,54,10.16
+1,54,30.48
+1,54,7.62
+1,54,7.62
+1,54,30.48
+1,54,7.62
+1,54,35.56
+1,54,7.62
+1,54,24.13
+1,54,8.89
+1,54,33.02
+1,54,8.89
+1,54,7.62
+1,54,44.45
+1,54,7.62
+1,54,10.16
+1,54,55.88
+1,54,7.62
+1,54,24.13
+1,54,19.05
+1,54,33.02
+1,54,24.13
+1,54,7.62
+1,54,7.62
+1,54,35.56
+1,54,33.02
+1,54,10.16
+1,54,19.05
+1,54,40.64
+1,55,35.56
+1,55,35.56
+1,55,7.62
+1,55,50.8
+1,55,7.62
+1,55,35.56
+1,55,7.62
+1,55,24.13
+1,55,33.02
+1,55,7.62
+1,55,44.45
+1,55,7.62
+1,55,46.355
+1,55,35.56
+1,55,30.48
+1,55,50.8
+1,55,35.56
+1,55,10.16
+1,55,55.88
+1,55,7.62
+1,55,46.355
+1,55,7.62
+1,55,33.02
+1,55,40.64
+1,55,7.62
+1,55,10.16
+1,55,10.16
+1,55,81.28
+1,55,27.94
+1,55,7.62
+1,56,22.86
+1,56,24.13
+1,56,19.05
+1,56,33.02
+1,56,10.16
+1,56,40.64
+1,56,7.62
+1,56,53.975
+1,56,55.88
+1,56,81.28
+1,56,46.355
+1,56,10.16
+1,56,7.62
+1,56,7.62
+1,56,19.05
+1,56,35.56
+1,56,30.48
+1,56,7.62
+1,56,46.355
+1,56,7.62
+1,56,24.13
+1,56,50.8
+1,56,50.8
+1,56,22.86
+1,56,10.16
+1,56,44.45
+1,56,53.975
+1,56,35.56
+1,56,53.975
+1,56,33.02
+1,57,81.28
+1,57,10.16
+1,57,27.94
+1,57,7.62
+1,57,33.02
+1,57,33.02
+1,57,33.02
+1,57,24.13
+1,57,46.355
+1,57,7.62
+1,57,10.16
+1,57,33.02
+1,57,7.62
+1,57,27.94
+1,57,7.62
+1,57,33.02
+1,57,44.45
+1,57,15.24
+1,57,33.02
+1,57,7.62
+1,57,19.05
+1,57,50.8
+1,57,7.62
+1,57,40.64
+1,57,8.89
+1,57,33.02
+1,57,40.64
+1,57,33.02
+1,57,10.16
+1,57,7.62
+1,58,33.02
+1,58,7.62
+1,58,99.06
+1,58,7.62
+1,58,7.62
+1,58,63.5
+1,58,63.5
+1,58,7.62
+1,58,22.86
+1,58,7.62
+1,58,33.02
+1,58,50.8
+1,58,7.62
+1,58,19.05
+1,58,10.16
+1,58,81.28
+1,58,8.89
+1,58,22.86
+1,58,40.64
+1,58,99.06
+1,58,45.72
+1,58,55.88
+1,58,30.48
+1,58,35.56
+1,58,19.05
+1,58,81.28
+1,58,10.16
+1,58,45.72
+1,58,8.89
+1,58,22.86
+1,59,24.13
+1,59,53.975
+1,59,53.975
+1,59,63.5
+1,59,27.94
+1,59,44.45
+1,59,30.48
+1,59,35.56
+1,59,24.13
+1,59,7.62
+1,59,35.56
+1,59,7.62
+1,59,7.62
+1,59,35.56
+1,59,33.02
+1,59,55.88
+1,59,10.16
+1,59,15.24
+1,59,24.13
+1,59,7.62
+1,59,35.56
+1,59,8.89
+1,59,81.28
+1,59,7.62
+1,59,40.64
+1,59,27.94
+1,59,46.355
+1,59,53.975
+1,59,33.02
+1,59,35.56
+1,60,46.355
+1,60,10.16
+1,60,35.56
+1,60,8.89
+1,60,35.56
+1,60,8.89
+1,60,35.56
+1,60,30.48
+1,60,7.62
+1,60,22.86
+1,60,7.62
+1,60,7.62
+1,60,40.64
+1,60,15.24
+1,60,33.02
+1,60,53.975
+1,60,33.02
+1,60,50.8
+1,60,30.48
+1,60,53.975
+1,60,10.16
+1,60,33.02
+1,60,35.56
+1,60,45.72
+1,60,46.355
+1,60,35.56
+1,60,7.62
+1,60,40.64
+1,60,33.02
+1,60,35.56
+1,61,7.62
+1,61,24.13
+1,61,10.16
+1,61,27.94
+1,61,50.8
+1,61,22.86
+1,61,7.62
+1,61,50.8
+1,61,45.72
+1,61,30.48
+1,61,46.355
+1,61,46.355
+1,61,30.48
+1,61,7.62
+1,61,7.62
+1,61,7.62
+1,61,10.16
+1,61,7.62
+1,61,99.06
+1,61,7.62
+1,61,8.89
+1,61,44.45
+1,61,7.62
+1,61,10.16
+1,61,27.94
+1,61,24.13
+1,61,33.02
+1,61,19.05
+1,61,22.86
+1,61,55.88
+1,62,33.02
+1,62,33.02
+1,62,50.8
+1,62,19.05
+1,62,40.64
+1,62,7.62
+1,62,63.5
+1,62,7.62
+1,62,7.62
+1,62,35.56
+1,62,63.5
+1,62,15.24
+1,62,81.28
+1,62,81.28
+1,62,24.13
+1,62,44.45
+1,62,40.64
+1,62,33.02
+1,62,63.5
+1,62,22.86
+1,62,45.72
+1,62,63.5
+1,62,46.355
+1,62,19.05
+1,62,33.02
+1,62,81.28
+1,62,45.72
+1,62,7.62
+1,62,7.62
+1,62,33.02
+1,63,53.975
+1,63,63.5
+1,63,40.64
+1,63,55.88
+1,63,8.89
+1,63,55.88
+1,63,7.62
+1,63,22.86
+1,63,7.62
+1,63,7.62
+1,63,40.64
+1,63,7.62
+1,63,35.56
+1,63,33.02
+1,63,45.72
+1,63,7.62
+1,63,35.56
+1,63,53.975
+1,63,7.62
+1,63,99.06
+1,63,19.05
+1,63,81.28
+1,63,55.88
+1,63,63.5
+1,63,7.62
+1,63,7.62
+1,63,10.16
+1,63,33.02
+1,63,45.72
+1,63,7.62
+1,64,99.06
+1,64,30.48
+1,64,30.48
+1,64,45.72
+1,64,27.94
+1,64,27.94
+1,64,81.28
+1,64,63.5
+1,64,33.02
+1,64,19.05
+1,64,81.28
+1,64,40.64
+1,64,35.56
+1,64,35.56
+1,64,24.13
+1,64,15.24
+1,64,55.88
+1,64,33.02
+1,64,22.86
+1,64,15.24
+1,64,7.62
+1,64,7.62
+1,64,35.56
+1,64,63.5
+1,64,63.5
+1,64,24.13
+1,64,24.13
+1,64,50.8
+1,64,24.13
+1,64,46.355
+1,65,10.16
+1,65,46.355
+1,65,22.86
+1,65,33.02
+1,65,35.56
+1,65,10.16
+1,65,10.16
+1,65,55.88
+1,65,30.48
+1,65,45.72
+1,65,15.24
+1,65,7.62
+1,65,27.94
+1,65,8.89
+1,65,40.64
+1,65,19.05
+1,65,19.05
+1,65,7.62
+1,65,53.975
+1,65,40.64
+1,65,7.62
+1,65,44.45
+1,65,81.28
+1,65,81.28
+1,65,35.56
+1,65,15.24
+1,65,63.5
+1,65,50.8
+1,65,7.62
+1,65,40.64
+1,66,33.02
+1,66,10.16
+1,66,55.88
+1,66,46.355
+1,66,50.8
+1,66,40.64
+1,66,7.62
+1,66,35.56
+1,66,40.64
+1,66,27.94
+1,66,99.06
+1,66,7.62
+1,66,7.62
+1,66,10.16
+1,66,99.06
+1,66,33.02
+1,66,35.56
+1,66,33.02
+1,66,50.8
+1,66,46.355
+1,66,44.45
+1,66,44.45
+1,66,7.62
+1,66,8.89
+1,66,53.975
+1,66,63.5
+1,66,8.89
+1,66,35.56
+1,66,7.62
+1,66,7.62
+1,67,99.06
+1,67,27.94
+1,67,22.86
+1,67,44.45
+1,67,7.62
+1,67,55.88
+1,67,22.86
+1,67,22.86
+1,67,81.28
+1,67,7.62
+1,67,7.62
+1,67,15.24
+1,67,63.5
+1,67,33.02
+1,67,44.45
+1,67,99.06
+1,67,35.56
+1,67,46.355
+1,67,40.64
+1,67,53.975
+1,67,19.05
+1,67,55.88
+1,67,22.86
+1,67,8.89
+1,67,7.62
+1,67,8.89
+1,67,15.24
+1,67,33.02
+1,67,24.13
+1,67,33.02
+1,68,45.72
+1,68,15.24
+1,68,7.62
+1,68,35.56
+1,68,46.355
+1,68,24.13
+1,68,22.86
+1,68,81.28
+1,68,8.89
+1,68,33.02
+1,68,27.94
+1,68,33.02
+1,68,10.16
+1,68,50.8
+1,68,55.88
+1,68,33.02
+1,68,33.02
+1,68,35.56
+1,68,55.88
+1,68,45.72
+1,68,24.13
+1,68,19.05
+1,68,7.62
+1,68,50.8
+1,68,19.05
+1,68,8.89
+1,68,7.62
+1,68,33.02
+1,68,22.86
+1,68,7.62
+1,69,15.24
+1,69,7.62
+1,69,45.72
+1,69,30.48
+1,69,15.24
+1,69,7.62
+1,69,81.28
+1,69,10.16
+1,69,44.45
+1,69,7.62
+1,69,46.355
+1,69,30.48
+1,69,55.88
+1,69,7.62
+1,69,55.88
+1,69,7.62
+1,69,7.62
+1,69,46.355
+1,69,63.5
+1,69,53.975
+1,69,35.56
+1,69,35.56
+1,69,27.94
+1,69,7.62
+1,69,46.355
+1,69,10.16
+1,69,40.64
+1,69,7.62
+1,69,35.56
+1,69,40.64
+1,70,33.02
+1,70,63.5
+1,70,7.62
+1,70,81.28
+1,70,7.62
+1,70,45.72
+1,70,44.45
+1,70,35.56
+1,70,33.02
+1,70,35.56
+1,70,7.62
+1,70,27.94
+1,70,10.16
+1,70,44.45
+1,70,33.02
+1,70,8.89
+1,70,10.16
+1,70,40.64
+1,70,99.06
+1,70,63.5
+1,70,50.8
+1,70,40.64
+1,70,33.02
+1,70,19.05
+1,70,33.02
+1,70,40.64
+1,70,7.62
+1,70,50.8
+1,70,44.45
+1,70,33.02
+1,71,10.16
+1,71,33.02
+1,71,7.62
+1,71,24.13
+1,71,15.24
+1,71,15.24
+1,71,33.02
+1,71,7.62
+1,71,19.05
+1,71,55.88
+1,71,7.62
+1,71,40.64
+1,71,15.24
+1,71,99.06
+1,71,7.62
+1,71,33.02
+1,71,7.62
+1,71,46.355
+1,71,35.56
+1,71,19.05
+1,71,33.02
+1,71,50.8
+1,71,22.86
+1,71,81.28
+1,71,33.02
+1,71,15.24
+1,71,8.89
+1,71,53.975
+1,71,7.62
+1,71,46.355
+1,72,19.05
+1,72,7.62
+1,72,63.5
+1,72,63.5
+1,72,99.06
+1,72,10.16
+1,72,46.355
+1,72,10.16
+1,72,7.62
+1,72,15.24
+1,72,7.62
+1,72,35.56
+1,72,81.28
+1,72,40.64
+1,72,33.02
+1,72,40.64
+1,72,53.975
+1,72,19.05
+1,72,7.62
+1,72,35.56
+1,72,33.02
+1,72,10.16
+1,72,7.62
+1,72,15.24
+1,72,7.62
+1,72,19.05
+1,72,44.45
+1,72,7.62
+1,72,33.02
+1,72,35.56
+1,73,7.62
+1,73,99.06
+1,73,10.16
+1,73,10.16
+1,73,99.06
+1,73,30.48
+1,73,35.56
+1,73,55.88
+1,73,10.16
+1,73,55.88
+1,73,33.02
+1,73,19.05
+1,73,7.62
+1,73,10.16
+1,73,7.62
+1,73,44.45
+1,73,7.62
+1,73,63.5
+1,73,35.56
+1,73,45.72
+1,73,10.16
+1,73,33.02
+1,73,15.24
+1,73,10.16
+1,73,7.62
+1,73,35.56
+1,73,35.56
+1,73,7.62
+1,73,55.88
+1,73,99.06
+1,74,40.64
+1,74,7.62
+1,74,40.64
+1,74,10.16
+1,74,7.62
+1,74,19.05
+1,74,10.16
+1,74,50.8
+1,74,15.24
+1,74,40.64
+1,74,46.355
+1,74,33.02
+1,74,63.5
+1,74,44.45
+1,74,35.56
+1,74,7.62
+1,74,22.86
+1,74,7.62
+1,74,46.355
+1,74,30.48
+1,74,35.56
+1,74,33.02
+1,74,33.02
+1,74,33.02
+1,74,45.72
+1,74,33.02
+1,74,63.5
+1,74,33.02
+1,74,19.05
+1,74,15.24
+1,75,10.16
+1,75,19.05
+1,75,7.62
+1,75,7.62
+1,75,30.48
+1,75,33.02
+1,75,35.56
+1,75,30.48
+1,75,99.06
+1,75,24.13
+1,75,10.16
+1,75,15.24
+1,75,40.64
+1,75,35.56
+1,75,35.56
+1,75,7.62
+1,75,44.45
+1,75,10.16
+1,75,22.86
+1,75,7.62
+1,75,40.64
+1,75,53.975
+1,75,33.02
+1,75,22.86
+1,75,35.56
+1,75,55.88
+1,75,8.89
+1,75,10.16
+1,75,10.16
+1,75,45.72
+1,76,7.62
+1,76,7.62
+1,76,44.45
+1,76,24.13
+1,76,35.56
+1,76,40.64
+1,76,63.5
+1,76,46.355
+1,76,81.28
+1,76,10.16
+1,76,10.16
+1,76,7.62
+1,76,35.56
+1,76,10.16
+1,76,44.45
+1,76,7.62
+1,76,8.89
+1,76,35.56
+1,76,63.5
+1,76,10.16
+1,76,15.24
+1,76,44.45
+1,76,24.13
+1,76,35.56
+1,76,33.02
+1,76,30.48
+1,76,81.28
+1,76,55.88
+1,76,35.56
+1,76,35.56
+1,77,30.48
+1,77,55.88
+1,77,7.62
+1,77,99.06
+1,77,7.62
+1,77,45.72
+1,77,35.56
+1,77,10.16
+1,77,63.5
+1,77,19.05
+1,77,35.56
+1,77,27.94
+1,77,44.45
+1,77,7.62
+1,77,50.8
+1,77,7.62
+1,77,7.62
+1,77,81.28
+1,77,33.02
+1,77,7.62
+1,77,7.62
+1,77,35.56
+1,77,99.06
+1,77,63.5
+1,77,35.56
+1,77,7.62
+1,77,33.02
+1,77,19.05
+1,77,46.355
+1,77,50.8
+1,78,81.28
+1,78,40.64
+1,78,27.94
+1,78,33.02
+1,78,35.56
+1,78,8.89
+1,78,27.94
+1,78,99.06
+1,78,99.06
+1,78,45.72
+1,78,81.28
+1,78,46.355
+1,78,7.62
+1,78,33.02
+1,78,35.56
+1,78,7.62
+1,78,30.48
+1,78,7.62
+1,78,7.62
+1,78,10.16
+1,78,35.56
+1,78,33.02
+1,78,45.72
+1,78,45.72
+1,78,46.355
+1,78,7.62
+1,78,63.5
+1,78,40.64
+1,78,53.975
+1,78,33.02
+1,79,50.8
+1,79,7.62
+1,79,7.62
+1,79,33.02
+1,79,27.94
+1,79,22.86
+1,79,10.16
+1,79,7.62
+1,79,7.62
+1,79,44.45
+1,79,40.64
+1,79,10.16
+1,79,19.05
+1,79,33.02
+1,79,63.5
+1,79,24.13
+1,79,15.24
+1,79,40.64
+1,79,35.56
+1,79,46.355
+1,79,40.64
+1,79,24.13
+1,79,30.48
+1,79,7.62
+1,79,10.16
+1,79,35.56
+1,79,50.8
+1,79,7.62
+1,79,7.62
+1,79,19.05
+1,80,33.02
+1,80,33.02
+1,80,19.05
+1,80,27.94
+1,80,10.16
+1,80,15.24
+1,80,33.02
+1,80,10.16
+1,80,44.45
+1,80,46.355
+1,80,81.28
+1,80,63.5
+1,80,19.05
+1,80,33.02
+1,80,63.5
+1,80,7.62
+1,80,8.89
+1,80,44.45
+1,80,81.28
+1,80,33.02
+1,80,7.62
+1,80,63.5
+1,80,7.62
+1,80,7.62
+1,80,33.02
+1,80,33.02
+1,80,10.16
+1,80,50.8
+1,80,63.5
+1,80,10.16
+1,81,8.89
+1,81,53.975
+1,81,30.48
+1,81,27.94
+1,81,19.05
+1,81,81.28
+1,81,45.72
+1,81,7.62
+1,81,7.62
+1,81,22.86
+1,81,8.89
+1,81,63.5
+1,81,81.28
+1,81,10.16
+1,81,7.62
+1,81,7.62
+1,81,27.94
+1,81,53.975
+1,81,19.05
+1,81,7.62
+1,81,50.8
+1,81,35.56
+1,81,33.02
+1,81,19.05
+1,81,27.94
+1,81,45.72
+1,81,33.02
+1,81,44.45
+1,81,24.13
+1,81,10.16
+1,82,55.88
+1,82,24.13
+1,82,30.48
+1,82,24.13
+1,82,55.88
+1,82,45.72
+1,82,55.88
+1,82,46.355
+1,82,7.62
+1,82,7.62
+1,82,33.02
+1,82,27.94
+1,82,10.16
+1,82,24.13
+1,82,46.355
+1,82,7.62
+1,82,33.02
+1,82,44.45
+1,82,46.355
+1,82,81.28
+1,82,10.16
+1,82,55.88
+1,82,81.28
+1,82,10.16
+1,82,40.64
+1,82,33.02
+1,82,50.8
+1,82,24.13
+1,82,27.94
+1,82,30.48
+1,83,33.02
+1,83,45.72
+1,83,8.89
+1,83,7.62
+1,83,55.88
+1,83,45.72
+1,83,33.02
+1,83,7.62
+1,83,7.62
+1,83,22.86
+1,83,44.45
+1,83,33.02
+1,83,7.62
+1,83,35.56
+1,83,55.88
+1,83,7.62
+1,83,33.02
+1,83,33.02
+1,83,35.56
+1,83,33.02
+1,83,50.8
+1,83,8.89
+1,83,40.64
+1,83,7.62
+1,83,40.64
+1,83,22.86
+1,83,10.16
+1,83,24.13
+1,83,27.94
+1,83,46.355
+1,84,24.13
+1,84,22.86
+1,84,33.02
+1,84,30.48
+1,84,8.89
+1,84,7.62
+1,84,33.02
+1,84,7.62
+1,84,22.86
+1,84,63.5
+1,84,27.94
+1,84,8.89
+1,84,15.24
+1,84,15.24
+1,84,40.64
+1,84,35.56
+1,84,7.62
+1,84,40.64
+1,84,81.28
+1,84,46.355
+1,84,24.13
+1,84,27.94
+1,84,27.94
+1,84,40.64
+1,84,33.02
+1,84,30.48
+1,84,81.28
+1,84,81.28
+1,84,53.975
+1,84,24.13
+1,85,55.88
+1,85,40.64
+1,85,19.05
+1,85,33.02
+1,85,45.72
+1,85,7.62
+1,85,99.06
+1,85,40.64
+1,85,7.62
+1,85,15.24
+1,85,24.13
+1,85,27.94
+1,85,22.86
+1,85,35.56
+1,85,35.56
+1,85,7.62
+1,85,81.28
+1,85,7.62
+1,85,19.05
+1,85,7.62
+1,85,40.64
+1,85,10.16
+1,85,63.5
+1,85,55.88
+1,85,8.89
+1,85,45.72
+1,85,7.62
+1,85,63.5
+1,85,35.56
+1,85,45.72
+1,86,35.56
+1,86,46.355
+1,86,35.56
+1,86,7.62
+1,86,27.94
+1,86,55.88
+1,86,7.62
+1,86,7.62
+1,86,45.72
+1,86,27.94
+1,86,81.28
+1,86,53.975
+1,86,7.62
+1,86,40.64
+1,86,35.56
+1,86,45.72
+1,86,7.62
+1,86,8.89
+1,86,30.48
+1,86,45.72
+1,86,40.64
+1,86,10.16
+1,86,35.56
+1,86,44.45
+1,86,53.975
+1,86,46.355
+1,86,40.64
+1,86,44.45
+1,86,53.975
+1,86,15.24
+1,87,27.94
+1,87,10.16
+1,87,44.45
+1,87,81.28
+1,87,40.64
+1,87,19.05
+1,87,50.8
+1,87,24.13
+1,87,19.05
+1,87,7.62
+1,87,7.62
+1,87,99.06
+1,87,19.05
+1,87,53.975
+1,87,40.64
+1,87,44.45
+1,87,15.24
+1,87,24.13
+1,87,40.64
+1,87,24.13
+1,87,15.24
+1,87,15.24
+1,87,45.72
+1,87,33.02
+1,87,40.64
+1,87,63.5
+1,87,19.05
+1,87,19.05
+1,87,7.62
+1,87,7.62
+1,88,33.02
+1,88,7.62
+1,88,35.56
+1,88,40.64
+1,88,7.62
+1,88,55.88
+1,88,22.86
+1,88,40.64
+1,88,8.89
+1,88,7.62
+1,88,7.62
+1,88,50.8
+1,88,45.72
+1,88,7.62
+1,88,53.975
+1,88,33.02
+1,88,7.62
+1,88,10.16
+1,88,46.355
+1,88,53.975
+1,88,46.355
+1,88,53.975
+1,88,7.62
+1,88,99.06
+1,88,7.62
+1,88,7.62
+1,88,81.28
+1,88,55.88
+1,88,33.02
+1,88,10.16
+1,89,10.16
+1,89,40.64
+1,89,33.02
+1,89,30.48
+1,89,55.88
+1,89,27.94
+1,89,40.64
+1,89,99.06
+1,89,15.24
+1,89,7.62
+1,89,35.56
+1,89,22.86
+1,89,81.28
+1,89,33.02
+1,89,10.16
+1,89,44.45
+1,89,7.62
+1,89,19.05
+1,89,10.16
+1,89,46.355
+1,89,63.5
+1,89,46.355
+1,89,50.8
+1,89,7.62
+1,89,24.13
+1,89,22.86
+1,89,24.13
+1,89,7.62
+1,89,15.24
+1,89,10.16
+1,90,24.13
+1,90,7.62
+1,90,33.02
+1,90,99.06
+1,90,50.8
+1,90,99.06
+1,90,10.16
+1,90,8.89
+1,90,7.62
+1,90,40.64
+1,90,40.64
+1,90,10.16
+1,90,10.16
+1,90,63.5
+1,90,40.64
+1,90,40.64
+1,90,15.24
+1,90,7.62
+1,90,40.64
+1,90,10.16
+1,90,40.64
+1,90,7.62
+1,90,7.62
+1,90,33.02
+1,90,44.45
+1,90,30.48
+1,90,7.62
+1,90,55.88
+1,90,8.89
+1,90,45.72
+1,91,7.62
+1,91,40.64
+1,91,10.16
+1,91,27.94
+1,91,7.62
+1,91,7.62
+1,91,40.64
+1,91,81.28
+1,91,24.13
+1,91,15.24
+1,91,7.62
+1,91,35.56
+1,91,63.5
+1,91,44.45
+1,91,81.28
+1,91,33.02
+1,91,7.62
+1,91,35.56
+1,91,7.62
+1,91,33.02
+1,91,99.06
+1,91,7.62
+1,91,10.16
+1,91,63.5
+1,91,8.89
+1,91,99.06
+1,91,7.62
+1,91,22.86
+1,91,53.975
+1,91,35.56
+1,92,99.06
+1,92,22.86
+1,92,33.02
+1,92,30.48
+1,92,19.05
+1,92,7.62
+1,92,24.13
+1,92,40.64
+1,92,53.975
+1,92,15.24
+1,92,10.16
+1,92,55.88
+1,92,44.45
+1,92,63.5
+1,92,63.5
+1,92,99.06
+1,92,7.62
+1,92,81.28
+1,92,44.45
+1,92,8.89
+1,92,81.28
+1,92,33.02
+1,92,7.62
+1,92,40.64
+1,92,35.56
+1,92,10.16
+1,92,44.45
+1,92,53.975
+1,92,33.02
+1,92,8.89
+1,93,7.62
+1,93,33.02
+1,93,10.16
+1,93,40.64
+1,93,99.06
+1,93,40.64
+1,93,81.28
+1,93,81.28
+1,93,33.02
+1,93,50.8
+1,93,55.88
+1,93,7.62
+1,93,45.72
+1,93,45.72
+1,93,40.64
+1,93,24.13
+1,93,27.94
+1,93,10.16
+1,93,44.45
+1,93,8.89
+1,93,10.16
+1,93,10.16
+1,93,22.86
+1,93,46.355
+1,93,10.16
+1,93,22.86
+1,93,63.5
+1,93,40.64
+1,93,7.62
+1,93,46.355
+1,94,24.13
+1,94,10.16
+1,94,44.45
+1,94,10.16
+1,94,7.62
+1,94,81.28
+1,94,19.05
+1,94,33.02
+1,94,19.05
+1,94,22.86
+1,94,10.16
+1,94,81.28
+1,94,22.86
+1,94,33.02
+1,94,7.62
+1,94,40.64
+1,94,7.62
+1,94,40.64
+1,94,7.62
+1,94,46.355
+1,94,7.62
+1,94,22.86
+1,94,15.24
+1,94,27.94
+1,94,7.62
+1,94,46.355
+1,94,24.13
+1,94,50.8
+1,94,10.16
+1,94,40.64
+1,95,30.48
+1,95,7.62
+1,95,15.24
+1,95,30.48
+1,95,35.56
+1,95,44.45
+1,95,40.64
+1,95,27.94
+1,95,55.88
+1,95,10.16
+1,95,99.06
+1,95,8.89
+1,95,35.56
+1,95,55.88
+1,95,35.56
+1,95,10.16
+1,95,81.28
+1,95,40.64
+1,95,7.62
+1,95,7.62
+1,95,40.64
+1,95,10.16
+1,95,24.13
+1,95,81.28
+1,95,15.24
+1,95,50.8
+1,95,8.89
+1,95,8.89
+1,95,40.64
+1,95,10.16
+1,96,33.02
+1,96,35.56
+1,96,40.64
+1,96,24.13
+1,96,7.62
+1,96,44.45
+1,96,40.64
+1,96,7.62
+1,96,22.86
+1,96,35.56
+1,96,33.02
+1,96,33.02
+1,96,7.62
+1,96,35.56
+1,96,10.16
+1,96,35.56
+1,96,19.05
+1,96,53.975
+1,96,46.355
+1,96,10.16
+1,96,7.62
+1,96,53.975
+1,96,30.48
+1,96,50.8
+1,96,45.72
+1,96,19.05
+1,96,33.02
+1,96,33.02
+1,96,19.05
+1,96,30.48
+1,97,99.06
+1,97,63.5
+1,97,46.355
+1,97,7.62
+1,97,33.02
+1,97,40.64
+1,97,7.62
+1,97,46.355
+1,97,45.72
+1,97,7.62
+1,97,44.45
+1,97,33.02
+1,97,33.02
+1,97,55.88
+1,97,53.975
+1,97,33.02
+1,97,50.8
+1,97,7.62
+1,97,40.64
+1,97,33.02
+1,97,81.28
+1,97,8.89
+1,97,63.5
+1,97,19.05
+1,97,7.62
+1,97,24.13
+1,97,81.28
+1,97,7.62
+1,97,19.05
+1,97,24.13
+1,98,7.62
+1,98,81.28
+1,98,40.64
+1,98,15.24
+1,98,30.48
+1,98,22.86
+1,98,35.56
+1,98,24.13
+1,98,45.72
+1,98,10.16
+1,98,10.16
+1,98,7.62
+1,98,44.45
+1,98,7.62
+1,98,45.72
+1,98,7.62
+1,98,19.05
+1,98,50.8
+1,98,53.975
+1,98,7.62
+1,98,10.16
+1,98,10.16
+1,98,7.62
+1,98,15.24
+1,98,45.72
+1,98,33.02
+1,98,24.13
+1,98,33.02
+1,98,81.28
+1,98,19.05
+1,99,19.05
+1,99,46.355
+1,99,35.56
+1,99,7.62
+1,99,55.88
+1,99,40.64
+1,99,27.94
+1,99,24.13
+1,99,63.5
+1,99,44.45
+1,99,10.16
+1,99,7.62
+1,99,40.64
+1,99,40.64
+1,99,81.28
+1,99,33.02
+1,99,7.62
+1,99,7.62
+1,99,7.62
+1,99,22.86
+1,99,33.02
+1,99,81.28
+1,99,53.975
+1,99,35.56
+1,99,10.16
+1,99,53.975
+1,99,46.355
+1,99,19.05
+1,99,45.72
+1,99,10.16
+1,100,45.72
+1,100,7.62
+1,100,46.355
+1,100,30.48
+1,100,24.13
+1,100,45.72
+1,100,8.89
+1,100,7.62
+1,100,7.62
+1,100,33.02
+1,100,7.62
+1,100,7.62
+1,100,63.5
+1,100,33.02
+1,100,35.56
+1,100,24.13
+1,100,99.06
+1,100,53.975
+1,100,15.24
+1,100,15.24
+1,100,7.62
+1,100,53.975
+1,100,30.48
+1,100,35.56
+1,100,7.62
+1,100,55.88
+1,100,22.86
+1,100,99.06
+1,100,22.86
+1,100,55.88
+1,101,35.56
+1,101,10.16
+1,101,7.62
+1,101,35.56
+1,101,19.05
+1,101,22.86
+1,101,35.56
+1,101,40.64
+1,101,22.86
+1,101,7.62
+1,101,8.89
+1,101,22.86
+1,101,10.16
+1,101,40.64
+1,101,10.16
+1,101,7.62
+1,101,33.02
+1,101,44.45
+1,101,22.86
+1,101,50.8
+1,101,33.02
+1,101,22.86
+1,101,24.13
+1,101,50.8
+1,101,7.62
+1,101,7.62
+1,101,30.48
+1,101,33.02
+1,101,81.28
+1,101,33.02
+1,102,40.64
+1,102,24.13
+1,102,7.62
+1,102,40.64
+1,102,63.5
+1,102,45.72
+1,102,7.62
+1,102,40.64
+1,102,7.62
+1,102,44.45
+1,102,19.05
+1,102,53.975
+1,102,99.06
+1,102,27.94
+1,102,7.62
+1,102,7.62
+1,102,10.16
+1,102,63.5
+1,102,40.64
+1,102,30.48
+1,102,45.72
+1,102,55.88
+1,102,35.56
+1,102,7.62
+1,102,45.72
+1,102,35.56
+1,102,15.24
+1,102,53.975
+1,102,7.62
+1,102,8.89
+1,103,10.16
+1,103,50.8
+1,103,8.89
+1,103,7.62
+1,103,35.56
+1,103,27.94
+1,103,10.16
+1,103,30.48
+1,103,7.62
+1,103,40.64
+1,103,81.28
+1,103,33.02
+1,103,7.62
+1,103,7.62
+1,103,99.06
+1,103,19.05
+1,103,35.56
+1,103,33.02
+1,103,19.05
+1,103,7.62
+1,103,10.16
+1,103,33.02
+1,103,35.56
+1,103,55.88
+1,103,19.05
+1,103,8.89
+1,103,33.02
+1,103,33.02
+1,103,7.62
+1,103,50.8
+1,104,99.06
+1,104,27.94
+1,104,8.89
+1,104,10.16
+1,104,33.02
+1,104,44.45
+1,104,55.88
+1,104,15.24
+1,104,63.5
+1,104,55.88
+1,104,7.62
+1,104,46.355
+1,104,22.86
+1,104,55.88
+1,104,7.62
+1,104,30.48
+1,104,8.89
+1,104,7.62
+1,104,7.62
+1,104,40.64
+1,104,27.94
+1,104,44.45
+1,104,33.02
+1,104,50.8
+1,104,30.48
+1,104,7.62
+1,104,24.13
+1,104,10.16
+1,104,99.06
+1,104,10.16
+1,105,7.62
+1,105,35.56
+1,105,35.56
+1,105,7.62
+1,105,10.16
+1,105,10.16
+1,105,50.8
+1,105,19.05
+1,105,24.13
+1,105,33.02
+1,105,7.62
+1,105,63.5
+1,105,10.16
+1,105,81.28
+1,105,81.28
+1,105,40.64
+1,105,7.62
+1,105,33.02
+1,105,27.94
+1,105,15.24
+1,105,8.89
+1,105,55.88
+1,105,40.64
+1,105,27.94
+1,105,33.02
+1,105,24.13
+1,105,50.8
+1,105,35.56
+1,105,50.8
+1,105,44.45
+1,106,46.355
+1,106,44.45
+1,106,33.02
+1,106,44.45
+1,106,8.89
+1,106,46.355
+1,106,45.72
+1,106,35.56
+1,106,45.72
+1,106,24.13
+1,106,40.64
+1,106,45.72
+1,106,35.56
+1,106,40.64
+1,106,7.62
+1,106,22.86
+1,106,7.62
+1,106,81.28
+1,106,27.94
+1,106,33.02
+1,106,50.8
+1,106,33.02
+1,106,55.88
+1,106,63.5
+1,106,35.56
+1,106,10.16
+1,106,7.62
+1,106,33.02
+1,106,40.64
+1,106,7.62
+1,107,7.62
+1,107,7.62
+1,107,40.64
+1,107,33.02
+1,107,19.05
+1,107,7.62
+1,107,33.02
+1,107,33.02
+1,107,7.62
+1,107,55.88
+1,107,30.48
+1,107,33.02
+1,107,33.02
+1,107,35.56
+1,107,8.89
+1,107,24.13
+1,107,22.86
+1,107,53.975
+1,107,81.28
+1,107,22.86
+1,107,30.48
+1,107,35.56
+1,107,7.62
+1,107,10.16
+1,107,7.62
+1,107,44.45
+1,107,22.86
+1,107,45.72
+1,107,33.02
+1,107,81.28
+1,108,7.62
+1,108,10.16
+1,108,7.62
+1,108,99.06
+1,108,99.06
+1,108,24.13
+1,108,50.8
+1,108,10.16
+1,108,10.16
+1,108,10.16
+1,108,24.13
+1,108,8.89
+1,108,81.28
+1,108,7.62
+1,108,40.64
+1,108,7.62
+1,108,33.02
+1,108,7.62
+1,108,7.62
+1,108,63.5
+1,108,53.975
+1,108,8.89
+1,108,10.16
+1,108,10.16
+1,108,40.64
+1,108,8.89
+1,108,63.5
+1,108,45.72
+1,108,45.72
+1,108,50.8
+1,109,81.28
+1,109,19.05
+1,109,27.94
+1,109,46.355
+1,109,7.62
+1,109,15.24
+1,109,44.45
+1,109,63.5
+1,109,7.62
+1,109,15.24
+1,109,40.64
+1,109,45.72
+1,109,40.64
+1,109,27.94
+1,109,7.62
+1,109,10.16
+1,109,7.62
+1,109,35.56
+1,109,40.64
+1,109,33.02
+1,109,7.62
+1,109,81.28
+1,109,7.62
+1,109,10.16
+1,109,33.02
+1,109,40.64
+1,109,40.64
+1,109,7.62
+1,109,55.88
+1,109,30.48
+1,110,63.5
+1,110,7.62
+1,110,55.88
+1,110,45.72
+1,110,45.72
+1,110,40.64
+1,110,35.56
+1,110,35.56
+1,110,7.62
+1,110,99.06
+1,110,33.02
+1,110,44.45
+1,110,53.975
+1,110,81.28
+1,110,40.64
+1,110,99.06
+1,110,19.05
+1,110,15.24
+1,110,45.72
+1,110,99.06
+1,110,46.355
+1,110,40.64
+1,110,15.24
+1,110,53.975
+1,110,10.16
+1,110,46.355
+1,110,8.89
+1,110,22.86
+1,110,19.05
+1,110,7.62
+1,111,7.62
+1,111,30.48
+1,111,81.28
+1,111,8.89
+1,111,46.355
+1,111,7.62
+1,111,7.62
+1,111,19.05
+1,111,7.62
+1,111,35.56
+1,111,30.48
+1,111,81.28
+1,111,40.64
+1,111,27.94
+1,111,50.8
+1,111,63.5
+1,111,33.02
+1,111,19.05
+1,111,7.62
+1,111,99.06
+1,111,46.355
+1,111,27.94
+1,111,10.16
+1,111,99.06
+1,111,53.975
+1,111,53.975
+1,111,35.56
+1,111,8.89
+1,111,33.02
+1,111,22.86
+1,112,55.88
+1,112,19.05
+1,112,27.94
+1,112,81.28
+1,112,44.45
+1,112,8.89
+1,112,7.62
+1,112,53.975
+1,112,46.355
+1,112,30.48
+1,112,63.5
+1,112,55.88
+1,112,35.56
+1,112,55.88
+1,112,7.62
+1,112,46.355
+1,112,50.8
+1,112,35.56
+1,112,33.02
+1,112,46.355
+1,112,27.94
+1,112,10.16
+1,112,27.94
+1,112,27.94
+1,112,10.16
+1,112,10.16
+1,112,81.28
+1,112,53.975
+1,112,7.62
+1,112,99.06
+1,113,22.86
+1,113,33.02
+1,113,33.02
+1,113,22.86
+1,113,40.64
+1,113,24.13
+1,113,7.62
+1,113,40.64
+1,113,22.86
+1,113,46.355
+1,113,81.28
+1,113,33.02
+1,113,27.94
+1,113,45.72
+1,113,45.72
+1,113,24.13
+1,113,24.13
+1,113,35.56
+1,113,55.88
+1,113,7.62
+1,113,7.62
+1,113,7.62
+1,113,10.16
+1,113,19.05
+1,113,45.72
+1,113,33.02
+1,113,63.5
+1,113,7.62
+1,113,8.89
+1,113,53.975
+1,114,10.16
+1,114,35.56
+1,114,7.62
+1,114,10.16
+1,114,24.13
+1,114,33.02
+1,114,19.05
+1,114,50.8
+1,114,99.06
+1,114,7.62
+1,114,27.94
+1,114,7.62
+1,114,7.62
+1,114,45.72
+1,114,63.5
+1,114,22.86
+1,114,33.02
+1,114,7.62
+1,114,40.64
+1,114,7.62
+1,114,7.62
+1,114,55.88
+1,114,40.64
+1,114,27.94
+1,114,7.62
+1,114,7.62
+1,114,7.62
+1,114,63.5
+1,114,30.48
+1,114,15.24
+1,115,7.62
+1,115,99.06
+1,115,33.02
+1,115,33.02
+1,115,35.56
+1,115,45.72
+1,115,50.8
+1,115,24.13
+1,115,15.24
+1,115,40.64
+1,115,10.16
+1,115,33.02
+1,115,55.88
+1,115,33.02
+1,115,10.16
+1,115,33.02
+1,115,7.62
+1,115,46.355
+1,115,63.5
+1,115,63.5
+1,115,10.16
+1,115,15.24
+1,115,44.45
+1,115,30.48
+1,115,50.8
+1,115,7.62
+1,115,40.64
+1,115,81.28
+1,115,15.24
+1,115,99.06
+1,116,8.89
+1,116,40.64
+1,116,33.02
+1,116,27.94
+1,116,44.45
+1,116,33.02
+1,116,15.24
+1,116,55.88
+1,116,27.94
+1,116,40.64
+1,116,40.64
+1,116,7.62
+1,116,19.05
+1,116,7.62
+1,116,8.89
+1,116,45.72
+1,116,46.355
+1,116,45.72
+1,116,7.62
+1,116,35.56
+1,116,7.62
+1,116,35.56
+1,116,24.13
+1,116,99.06
+1,116,7.62
+1,116,33.02
+1,116,24.13
+1,116,35.56
+1,116,7.62
+1,116,33.02
+1,117,10.16
+1,117,35.56
+1,117,33.02
+1,117,8.89
+1,117,33.02
+1,117,81.28
+1,117,33.02
+1,117,33.02
+1,117,53.975
+1,117,15.24
+1,117,40.64
+1,117,22.86
+1,117,19.05
+1,117,22.86
+1,117,10.16
+1,117,7.62
+1,117,40.64
+1,117,63.5
+1,117,44.45
+1,117,44.45
+1,117,7.62
+1,117,15.24
+1,117,33.02
+1,117,40.64
+1,117,33.02
+1,117,35.56
+1,117,35.56
+1,117,46.355
+1,117,15.24
+1,117,22.86
+1,118,35.56
+1,118,19.05
+1,118,46.355
+1,118,8.89
+1,118,53.975
+1,118,7.62
+1,118,44.45
+1,118,53.975
+1,118,40.64
+1,118,35.56
+1,118,10.16
+1,118,50.8
+1,118,22.86
+1,118,7.62
+1,118,99.06
+1,118,24.13
+1,118,46.355
+1,118,7.62
+1,118,35.56
+1,118,7.62
+1,118,46.355
+1,118,53.975
+1,118,35.56
+1,118,44.45
+1,118,7.62
+1,118,33.02
+1,118,35.56
+1,118,30.48
+1,118,44.45
+1,118,99.06
+1,119,24.13
+1,119,33.02
+1,119,8.89
+1,119,30.48
+1,119,33.02
+1,119,27.94
+1,119,7.62
+1,119,24.13
+1,119,44.45
+1,119,24.13
+1,119,33.02
+1,119,27.94
+1,119,33.02
+1,119,24.13
+1,119,24.13
+1,119,46.355
+1,119,30.48
+1,119,24.13
+1,119,10.16
+1,119,40.64
+1,119,7.62
+1,119,99.06
+1,119,33.02
+1,119,30.48
+1,119,10.16
+1,119,53.975
+1,119,35.56
+1,119,81.28
+1,119,35.56
+1,119,45.72
+1,120,7.62
+1,120,53.975
+1,120,15.24
+1,120,27.94
+1,120,15.24
+1,120,40.64
+1,120,40.64
+1,120,33.02
+1,120,40.64
+1,120,55.88
+1,120,10.16
+1,120,44.45
+1,120,15.24
+1,120,7.62
+1,120,40.64
+1,120,53.975
+1,120,81.28
+1,120,55.88
+1,120,7.62
+1,120,50.8
+1,120,40.64
+1,120,55.88
+1,120,40.64
+1,120,33.02
+1,120,53.975
+1,120,99.06
+1,120,7.62
+1,120,44.45
+1,120,8.89
+1,120,45.72
+1,121,50.8
+1,121,53.975
+1,121,30.48
+1,121,30.48
+1,121,7.62
+1,121,40.64
+1,121,10.16
+1,121,63.5
+1,121,15.24
+1,121,53.975
+1,121,99.06
+1,121,7.62
+1,121,33.02
+1,121,35.56
+1,121,55.88
+1,121,99.06
+1,121,19.05
+1,121,35.56
+1,121,22.86
+1,121,7.62
+1,121,99.06
+1,121,24.13
+1,121,35.56
+1,121,10.16
+1,121,8.89
+1,121,99.06
+1,121,35.56
+1,121,24.13
+1,121,46.355
+1,121,27.94
+1,122,99.06
+1,122,15.24
+1,122,35.56
+1,122,19.05
+1,122,24.13
+1,122,27.94
+1,122,7.62
+1,122,7.62
+1,122,99.06
+1,122,35.56
+1,122,50.8
+1,122,33.02
+1,122,30.48
+1,122,10.16
+1,122,7.62
+1,122,35.56
+1,122,45.72
+1,122,99.06
+1,122,10.16
+1,122,40.64
+1,122,99.06
+1,122,27.94
+1,122,10.16
+1,122,22.86
+1,122,40.64
+1,122,7.62
+1,122,7.62
+1,122,7.62
+1,122,8.89
+1,122,7.62
+1,123,50.8
+1,123,7.62
+1,123,33.02
+1,123,40.64
+1,123,30.48
+1,123,7.62
+1,123,33.02
+1,123,24.13
+1,123,55.88
+1,123,50.8
+1,123,40.64
+1,123,35.56
+1,123,7.62
+1,123,10.16
+1,123,10.16
+1,123,44.45
+1,123,10.16
+1,123,35.56
+1,123,7.62
+1,123,53.975
+1,123,7.62
+1,123,44.45
+1,123,8.89
+1,123,35.56
+1,123,8.89
+1,123,10.16
+1,123,33.02
+1,123,10.16
+1,123,40.64
+1,123,33.02
+1,124,30.48
+1,124,27.94
+1,124,46.355
+1,124,30.48
+1,124,33.02
+1,124,50.8
+1,124,7.62
+1,124,44.45
+1,124,24.13
+1,124,7.62
+1,124,40.64
+1,124,22.86
+1,124,27.94
+1,124,99.06
+1,124,35.56
+1,124,45.72
+1,124,15.24
+1,124,44.45
+1,124,35.56
+1,124,7.62
+1,124,50.8
+1,124,27.94
+1,124,7.62
+1,124,63.5
+1,124,7.62
+1,124,7.62
+1,124,30.48
+1,124,10.16
+1,124,7.62
+1,124,99.06
+1,125,40.64
+1,125,55.88
+1,125,40.64
+1,125,33.02
+1,125,19.05
+1,125,50.8
+1,125,50.8
+1,125,50.8
+1,125,63.5
+1,125,99.06
+1,125,22.86
+1,125,45.72
+1,125,10.16
+1,125,40.64
+1,125,19.05
+1,125,22.86
+1,125,7.62
+1,125,7.62
+1,125,40.64
+1,125,7.62
+1,125,10.16
+1,125,81.28
+1,125,7.62
+1,125,19.05
+1,125,46.355
+1,125,81.28
+1,125,35.56
+1,125,45.72
+1,125,50.8
+1,125,10.16
+1,126,19.05
+1,126,50.8
+1,126,22.86
+1,126,7.62
+1,126,40.64
+1,126,33.02
+1,126,33.02
+1,126,27.94
+1,126,81.28
+1,126,35.56
+1,126,10.16
+1,126,24.13
+1,126,33.02
+1,126,40.64
+1,126,53.975
+1,126,7.62
+1,126,7.62
+1,126,35.56
+1,126,45.72
+1,126,8.89
+1,126,35.56
+1,126,15.24
+1,126,44.45
+1,126,99.06
+1,126,7.62
+1,126,81.28
+1,126,45.72
+1,126,10.16
+1,126,81.28
+1,126,15.24
+1,127,44.45
+1,127,63.5
+1,127,27.94
+1,127,53.975
+1,127,35.56
+1,127,55.88
+1,127,7.62
+1,127,10.16
+1,127,50.8
+1,127,10.16
+1,127,7.62
+1,127,50.8
+1,127,33.02
+1,127,33.02
+1,127,30.48
+1,127,7.62
+1,127,33.02
+1,127,44.45
+1,127,44.45
+1,127,15.24
+1,127,7.62
+1,127,7.62
+1,127,8.89
+1,127,33.02
+1,127,22.86
+1,127,10.16
+1,127,35.56
+1,127,35.56
+1,127,35.56
+1,127,40.64
+1,128,7.62
+1,128,10.16
+1,128,44.45
+1,128,40.64
+1,128,27.94
+1,128,99.06
+1,128,40.64
+1,128,27.94
+1,128,22.86
+1,128,33.02
+1,128,7.62
+1,128,10.16
+1,128,55.88
+1,128,19.05
+1,128,40.64
+1,128,8.89
+1,128,35.56
+1,128,55.88
+1,128,50.8
+1,128,81.28
+1,128,35.56
+1,128,46.355
+1,128,19.05
+1,128,53.975
+1,128,7.62
+1,128,53.975
+1,128,7.62
+1,128,55.88
+1,128,24.13
+1,128,7.62
+1,129,53.975
+1,129,27.94
+1,129,19.05
+1,129,35.56
+1,129,27.94
+1,129,22.86
+1,129,81.28
+1,129,15.24
+1,129,10.16
+1,129,53.975
+1,129,50.8
+1,129,81.28
+1,129,35.56
+1,129,99.06
+1,129,55.88
+1,129,7.62
+1,129,24.13
+1,129,7.62
+1,129,33.02
+1,129,50.8
+1,129,50.8
+1,129,7.62
+1,129,24.13
+1,129,55.88
+1,129,44.45
+1,129,10.16
+1,129,40.64
+1,129,7.62
+1,129,81.28
+1,129,19.05
+1,130,7.62
+1,130,7.62
+1,130,7.62
+1,130,8.89
+1,130,33.02
+1,130,99.06
+1,130,24.13
+1,130,7.62
+1,130,46.355
+1,130,55.88
+1,130,55.88
+1,130,15.24
+1,130,30.48
+1,130,33.02
+1,130,53.975
+1,130,44.45
+1,130,50.8
+1,130,35.56
+1,130,7.62
+1,130,63.5
+1,130,33.02
+1,130,10.16
+1,130,7.62
+1,130,81.28
+1,130,55.88
+1,130,40.64
+1,130,19.05
+1,130,40.64
+1,130,30.48
+1,130,33.02
+1,131,44.45
+1,131,33.02
+1,131,7.62
+1,131,8.89
+1,131,35.56
+1,131,22.86
+1,131,27.94
+1,131,81.28
+1,131,45.72
+1,131,7.62
+1,131,7.62
+1,131,27.94
+1,131,24.13
+1,131,7.62
+1,131,33.02
+1,131,33.02
+1,131,50.8
+1,131,22.86
+1,131,33.02
+1,131,35.56
+1,131,44.45
+1,131,44.45
+1,131,33.02
+1,131,63.5
+1,131,44.45
+1,131,99.06
+1,131,7.62
+1,131,19.05
+1,131,7.62
+1,131,45.72
+1,132,19.05
+1,132,40.64
+1,132,40.64
+1,132,40.64
+1,132,10.16
+1,132,30.48
+1,132,33.02
+1,132,33.02
+1,132,35.56
+1,132,40.64
+1,132,7.62
+1,132,7.62
+1,132,33.02
+1,132,10.16
+1,132,15.24
+1,132,27.94
+1,132,10.16
+1,132,44.45
+1,132,40.64
+1,132,7.62
+1,132,24.13
+1,132,63.5
+1,132,55.88
+1,132,40.64
+1,132,33.02
+1,132,8.89
+1,132,50.8
+1,132,35.56
+1,132,10.16
+1,132,40.64
+1,133,33.02
+1,133,7.62
+1,133,63.5
+1,133,10.16
+1,133,8.89
+1,133,35.56
+1,133,33.02
+1,133,27.94
+1,133,50.8
+1,133,50.8
+1,133,7.62
+1,133,30.48
+1,133,53.975
+1,133,7.62
+1,133,27.94
+1,133,45.72
+1,133,63.5
+1,133,46.355
+1,133,53.975
+1,133,33.02
+1,133,46.355
+1,133,53.975
+1,133,45.72
+1,133,99.06
+1,133,7.62
+1,133,45.72
+1,133,33.02
+1,133,81.28
+1,133,45.72
+1,133,81.28
+1,134,27.94
+1,134,50.8
+1,134,35.56
+1,134,33.02
+1,134,24.13
+1,134,63.5
+1,134,30.48
+1,134,81.28
+1,134,33.02
+1,134,53.975
+1,134,35.56
+1,134,19.05
+1,134,35.56
+1,134,55.88
+1,134,10.16
+1,134,10.16
+1,134,45.72
+1,134,7.62
+1,134,10.16
+1,134,7.62
+1,134,81.28
+1,134,30.48
+1,134,35.56
+1,134,22.86
+1,134,24.13
+1,134,40.64
+1,134,7.62
+1,134,81.28
+1,134,81.28
+1,134,7.62
+1,135,19.05
+1,135,99.06
+1,135,53.975
+1,135,19.05
+1,135,19.05
+1,135,7.62
+1,135,24.13
+1,135,55.88
+1,135,99.06
+1,135,27.94
+1,135,33.02
+1,135,22.86
+1,135,44.45
+1,135,27.94
+1,135,7.62
+1,135,22.86
+1,135,8.89
+1,135,24.13
+1,135,7.62
+1,135,7.62
+1,135,7.62
+1,135,35.56
+1,135,7.62
+1,135,55.88
+1,135,27.94
+1,135,81.28
+1,135,27.94
+1,135,33.02
+1,135,45.72
+1,135,33.02
+1,136,99.06
+1,136,35.56
+1,136,22.86
+1,136,22.86
+1,136,40.64
+1,136,7.62
+1,136,33.02
+1,136,22.86
+1,136,40.64
+1,136,44.45
+1,136,99.06
+1,136,99.06
+1,136,15.24
+1,136,7.62
+1,136,7.62
+1,136,50.8
+1,136,55.88
+1,136,63.5
+1,136,46.355
+1,136,63.5
+1,136,10.16
+1,136,35.56
+1,136,33.02
+1,136,8.89
+1,136,46.355
+1,136,46.355
+1,136,8.89
+1,136,7.62
+1,136,7.62
+1,136,53.975
+1,137,22.86
+1,137,50.8
+1,137,19.05
+1,137,22.86
+1,137,24.13
+1,137,99.06
+1,137,7.62
+1,137,50.8
+1,137,44.45
+1,137,63.5
+1,137,7.62
+1,137,35.56
+1,137,46.355
+1,137,15.24
+1,137,33.02
+1,137,50.8
+1,137,50.8
+1,137,19.05
+1,137,30.48
+1,137,53.975
+1,137,81.28
+1,137,35.56
+1,137,27.94
+1,137,44.45
+1,137,46.355
+1,137,7.62
+1,137,7.62
+1,137,22.86
+1,137,81.28
+1,137,55.88
+1,138,30.48
+1,138,19.05
+1,138,46.355
+1,138,7.62
+1,138,99.06
+1,138,33.02
+1,138,10.16
+1,138,7.62
+1,138,44.45
+1,138,46.355
+1,138,33.02
+1,138,10.16
+1,138,44.45
+1,138,33.02
+1,138,63.5
+1,138,81.28
+1,138,40.64
+1,138,19.05
+1,138,33.02
+1,138,27.94
+1,138,53.975
+1,138,7.62
+1,138,7.62
+1,138,99.06
+1,138,19.05
+1,138,45.72
+1,138,19.05
+1,138,99.06
+1,138,45.72
+1,138,35.56
+1,139,7.62
+1,139,35.56
+1,139,40.64
+1,139,7.62
+1,139,35.56
+1,139,30.48
+1,139,33.02
+1,139,50.8
+1,139,33.02
+1,139,7.62
+1,139,33.02
+1,139,7.62
+1,139,46.355
+1,139,22.86
+1,139,33.02
+1,139,81.28
+1,139,7.62
+1,139,63.5
+1,139,30.48
+1,139,63.5
+1,139,7.62
+1,139,33.02
+1,139,19.05
+1,139,33.02
+1,139,7.62
+1,139,30.48
+1,139,15.24
+1,139,10.16
+1,139,22.86
+1,139,46.355
+1,140,46.355
+1,140,46.355
+1,140,24.13
+1,140,15.24
+1,140,35.56
+1,140,55.88
+1,140,7.62
+1,140,7.62
+1,140,63.5
+1,140,8.89
+1,140,7.62
+1,140,19.05
+1,140,7.62
+1,140,27.94
+1,140,53.975
+1,140,8.89
+1,140,22.86
+1,140,33.02
+1,140,50.8
+1,140,24.13
+1,140,33.02
+1,140,81.28
+1,140,30.48
+1,140,7.62
+1,140,99.06
+1,140,8.89
+1,140,10.16
+1,140,55.88
+1,140,33.02
+1,140,45.72
+1,141,53.975
+1,141,7.62
+1,141,46.355
+1,141,46.355
+1,141,7.62
+1,141,7.62
+1,141,81.28
+1,141,15.24
+1,141,7.62
+1,141,63.5
+1,141,19.05
+1,141,55.88
+1,141,45.72
+1,141,33.02
+1,141,63.5
+1,141,46.355
+1,141,44.45
+1,141,19.05
+1,141,24.13
+1,141,44.45
+1,141,27.94
+1,141,7.62
+1,141,30.48
+1,141,50.8
+1,141,35.56
+1,141,45.72
+1,141,7.62
+1,141,19.05
+1,141,35.56
+1,141,50.8
+1,142,33.02
+1,142,45.72
+1,142,99.06
+1,142,33.02
+1,142,8.89
+1,142,24.13
+1,142,8.89
+1,142,81.28
+1,142,24.13
+1,142,53.975
+1,142,10.16
+1,142,19.05
+1,142,7.62
+1,142,33.02
+1,142,45.72
+1,142,19.05
+1,142,7.62
+1,142,45.72
+1,142,8.89
+1,142,15.24
+1,142,53.975
+1,142,33.02
+1,142,27.94
+1,142,33.02
+1,142,33.02
+1,142,10.16
+1,142,81.28
+1,142,45.72
+1,142,63.5
+1,142,15.24
+1,143,7.62
+1,143,19.05
+1,143,19.05
+1,143,30.48
+1,143,40.64
+1,143,45.72
+1,143,45.72
+1,143,99.06
+1,143,35.56
+1,143,22.86
+1,143,27.94
+1,143,10.16
+1,143,15.24
+1,143,7.62
+1,143,10.16
+1,143,24.13
+1,143,10.16
+1,143,24.13
+1,143,19.05
+1,143,33.02
+1,143,33.02
+1,143,63.5
+1,143,24.13
+1,143,10.16
+1,143,33.02
+1,143,40.64
+1,143,10.16
+1,143,10.16
+1,143,7.62
+1,143,7.62
+1,144,7.62
+1,144,8.89
+1,144,7.62
+1,144,46.355
+1,144,10.16
+1,144,10.16
+1,144,24.13
+1,144,15.24
+1,144,27.94
+1,144,10.16
+1,144,7.62
+1,144,7.62
+1,144,46.355
+1,144,7.62
+1,144,44.45
+1,144,99.06
+1,144,45.72
+1,144,40.64
+1,144,33.02
+1,144,33.02
+1,144,55.88
+1,144,55.88
+1,144,7.62
+1,144,40.64
+1,144,15.24
+1,144,99.06
+1,144,7.62
+1,144,46.355
+1,144,19.05
+1,144,19.05
+1,145,40.64
+1,145,7.62
+1,145,33.02
+1,145,63.5
+1,145,24.13
+1,145,81.28
+1,145,40.64
+1,145,99.06
+1,145,7.62
+1,145,63.5
+1,145,53.975
+1,145,7.62
+1,145,50.8
+1,145,7.62
+1,145,30.48
+1,145,53.975
+1,145,7.62
+1,145,30.48
+1,145,63.5
+1,145,40.64
+1,145,24.13
+1,145,63.5
+1,145,81.28
+1,145,63.5
+1,145,30.48
+1,145,8.89
+1,145,35.56
+1,145,8.89
+1,145,19.05
+1,145,8.89
+1,146,53.975
+1,146,7.62
+1,146,35.56
+1,146,10.16
+1,146,50.8
+1,146,27.94
+1,146,7.62
+1,146,50.8
+1,146,40.64
+1,146,63.5
+1,146,33.02
+1,146,19.05
+1,146,19.05
+1,146,50.8
+1,146,33.02
+1,146,81.28
+1,146,10.16
+1,146,7.62
+1,146,46.355
+1,146,7.62
+1,146,33.02
+1,146,33.02
+1,146,27.94
+1,146,7.62
+1,146,99.06
+1,146,10.16
+1,146,99.06
+1,146,10.16
+1,146,53.975
+1,146,55.88
+1,147,27.94
+1,147,10.16
+1,147,30.48
+1,147,8.89
+1,147,15.24
+1,147,8.89
+1,147,10.16
+1,147,46.355
+1,147,7.62
+1,147,81.28
+1,147,50.8
+1,147,30.48
+1,147,99.06
+1,147,63.5
+1,147,33.02
+1,147,33.02
+1,147,22.86
+1,147,99.06
+1,147,7.62
+1,147,24.13
+1,147,19.05
+1,147,30.48
+1,147,35.56
+1,147,40.64
+1,147,19.05
+1,147,30.48
+1,147,19.05
+1,147,45.72
+1,147,10.16
+1,147,53.975
+1,148,35.56
+1,148,99.06
+1,148,7.62
+1,148,55.88
+1,148,7.62
+1,148,24.13
+1,148,30.48
+1,148,7.62
+1,148,33.02
+1,148,33.02
+1,148,7.62
+1,148,7.62
+1,148,10.16
+1,148,7.62
+1,148,19.05
+1,148,35.56
+1,148,10.16
+1,148,24.13
+1,148,99.06
+1,148,10.16
+1,148,55.88
+1,148,63.5
+1,148,7.62
+1,148,24.13
+1,148,7.62
+1,148,8.89
+1,148,46.355
+1,148,40.64
+1,148,19.05
+1,148,53.975
+1,149,27.94
+1,149,55.88
+1,149,63.5
+1,149,8.89
+1,149,7.62
+1,149,19.05
+1,149,7.62
+1,149,22.86
+1,149,7.62
+1,149,7.62
+1,149,33.02
+1,149,33.02
+1,149,81.28
+1,149,33.02
+1,149,35.56
+1,149,7.62
+1,149,27.94
+1,149,46.355
+1,149,15.24
+1,149,44.45
+1,149,46.355
+1,149,53.975
+1,149,10.16
+1,149,99.06
+1,149,30.48
+1,149,33.02
+1,149,10.16
+1,149,40.64
+1,149,45.72
+1,149,33.02
+1,150,33.02
+1,150,8.89
+1,150,10.16
+1,150,44.45
+1,150,63.5
+1,150,7.62
+1,150,81.28
+1,150,7.62
+1,150,50.8
+1,150,45.72
+1,150,7.62
+1,150,33.02
+1,150,7.62
+1,150,15.24
+1,150,33.02
+1,150,55.88
+1,150,55.88
+1,150,33.02
+1,150,27.94
+1,150,8.89
+1,150,45.72
+1,150,63.5
+1,150,50.8
+1,150,40.64
+1,150,99.06
+1,150,22.86
+1,150,45.72
+1,150,8.89
+1,150,53.975
+1,150,15.24
+1,151,35.56
+1,151,22.86
+1,151,40.64
+1,151,24.13
+1,151,8.89
+1,151,7.62
+1,151,7.62
+1,151,46.355
+1,151,33.02
+1,151,44.45
+1,151,46.355
+1,151,40.64
+1,151,50.8
+1,151,30.48
+1,151,7.62
+1,151,33.02
+1,151,35.56
+1,151,10.16
+1,151,15.24
+1,151,35.56
+1,151,30.48
+1,151,55.88
+1,151,7.62
+1,151,99.06
+1,151,22.86
+1,151,50.8
+1,151,63.5
+1,151,81.28
+1,151,24.13
+1,151,22.86
+1,152,10.16
+1,152,27.94
+1,152,7.62
+1,152,33.02
+1,152,15.24
+1,152,8.89
+1,152,33.02
+1,152,7.62
+1,152,22.86
+1,152,99.06
+1,152,10.16
+1,152,55.88
+1,152,40.64
+1,152,8.89
+1,152,99.06
+1,152,33.02
+1,152,44.45
+1,152,63.5
+1,152,10.16
+1,152,44.45
+1,152,63.5
+1,152,50.8
+1,152,55.88
+1,152,24.13
+1,152,30.48
+1,152,53.975
+1,152,81.28
+1,152,7.62
+1,152,7.62
+1,152,30.48
+1,153,22.86
+1,153,44.45
+1,153,8.89
+1,153,19.05
+1,153,15.24
+1,153,8.89
+1,153,33.02
+1,153,33.02
+1,153,99.06
+1,153,33.02
+1,153,30.48
+1,153,7.62
+1,153,19.05
+1,153,10.16
+1,153,55.88
+1,153,7.62
+1,153,50.8
+1,153,33.02
+1,153,63.5
+1,153,53.975
+1,153,63.5
+1,153,19.05
+1,153,30.48
+1,153,46.355
+1,153,10.16
+1,153,35.56
+1,153,30.48
+1,153,46.355
+1,153,7.62
+1,153,7.62
+1,154,45.72
+1,154,40.64
+1,154,33.02
+1,154,33.02
+1,154,7.62
+1,154,15.24
+1,154,7.62
+1,154,10.16
+1,154,10.16
+1,154,99.06
+1,154,8.89
+1,154,7.62
+1,154,10.16
+1,154,53.975
+1,154,63.5
+1,154,99.06
+1,154,10.16
+1,154,8.89
+1,154,24.13
+1,154,44.45
+1,154,8.89
+1,154,33.02
+1,154,55.88
+1,154,55.88
+1,154,7.62
+1,154,8.89
+1,154,44.45
+1,154,44.45
+1,154,10.16
+1,154,40.64
+1,155,33.02
+1,155,8.89
+1,155,10.16
+1,155,8.89
+1,155,33.02
+1,155,99.06
+1,155,7.62
+1,155,50.8
+1,155,15.24
+1,155,45.72
+1,155,24.13
+1,155,8.89
+1,155,15.24
+1,155,7.62
+1,155,27.94
+1,155,7.62
+1,155,10.16
+1,155,40.64
+1,155,7.62
+1,155,33.02
+1,155,15.24
+1,155,8.89
+1,155,40.64
+1,155,45.72
+1,155,8.89
+1,155,7.62
+1,155,33.02
+1,155,30.48
+1,155,19.05
+1,155,81.28
+1,156,33.02
+1,156,50.8
+1,156,99.06
+1,156,63.5
+1,156,7.62
+1,156,44.45
+1,156,44.45
+1,156,10.16
+1,156,7.62
+1,156,19.05
+1,156,63.5
+1,156,45.72
+1,156,33.02
+1,156,22.86
+1,156,40.64
+1,156,7.62
+1,156,33.02
+1,156,15.24
+1,156,7.62
+1,156,7.62
+1,156,63.5
+1,156,33.02
+1,156,55.88
+1,156,40.64
+1,156,50.8
+1,156,24.13
+1,156,33.02
+1,156,81.28
+1,156,30.48
+1,156,7.62
+1,157,50.8
+1,157,81.28
+1,157,10.16
+1,157,55.88
+1,157,99.06
+1,157,40.64
+1,157,10.16
+1,157,10.16
+1,157,40.64
+1,157,45.72
+1,157,46.355
+1,157,33.02
+1,157,15.24
+1,157,35.56
+1,157,24.13
+1,157,8.89
+1,157,7.62
+1,157,33.02
+1,157,35.56
+1,157,8.89
+1,157,35.56
+1,157,10.16
+1,157,7.62
+1,157,45.72
+1,157,44.45
+1,157,10.16
+1,157,53.975
+1,157,40.64
+1,157,10.16
+1,157,44.45
+1,158,7.62
+1,158,33.02
+1,158,53.975
+1,158,53.975
+1,158,8.89
+1,158,7.62
+1,158,7.62
+1,158,22.86
+1,158,81.28
+1,158,33.02
+1,158,7.62
+1,158,19.05
+1,158,63.5
+1,158,27.94
+1,158,27.94
+1,158,8.89
+1,158,24.13
+1,158,10.16
+1,158,35.56
+1,158,50.8
+1,158,40.64
+1,158,46.355
+1,158,44.45
+1,158,7.62
+1,158,99.06
+1,158,24.13
+1,158,33.02
+1,158,27.94
+1,158,33.02
+1,158,46.355
+1,159,10.16
+1,159,22.86
+1,159,7.62
+1,159,7.62
+1,159,33.02
+1,159,30.48
+1,159,35.56
+1,159,24.13
+1,159,33.02
+1,159,33.02
+1,159,10.16
+1,159,30.48
+1,159,27.94
+1,159,19.05
+1,159,7.62
+1,159,7.62
+1,159,50.8
+1,159,10.16
+1,159,40.64
+1,159,44.45
+1,159,35.56
+1,159,46.355
+1,159,33.02
+1,159,15.24
+1,159,40.64
+1,159,33.02
+1,159,10.16
+1,159,10.16
+1,159,33.02
+1,159,55.88
+1,160,30.48
+1,160,27.94
+1,160,7.62
+1,160,7.62
+1,160,33.02
+1,160,7.62
+1,160,7.62
+1,160,27.94
+1,160,33.02
+1,160,7.62
+1,160,7.62
+1,160,30.48
+1,160,40.64
+1,160,7.62
+1,160,45.72
+1,160,33.02
+1,160,50.8
+1,160,50.8
+1,160,35.56
+1,160,33.02
+1,160,55.88
+1,160,30.48
+1,160,53.975
+1,160,7.62
+1,160,10.16
+1,160,19.05
+1,160,10.16
+1,160,30.48
+1,160,99.06
+1,160,7.62
+1,161,19.05
+1,161,19.05
+1,161,35.56
+1,161,40.64
+1,161,7.62
+1,161,10.16
+1,161,44.45
+1,161,44.45
+1,161,10.16
+1,161,19.05
+1,161,99.06
+1,161,55.88
+1,161,99.06
+1,161,35.56
+1,161,53.975
+1,161,35.56
+1,161,55.88
+1,161,33.02
+1,161,46.355
+1,161,7.62
+1,161,24.13
+1,161,7.62
+1,161,35.56
+1,161,10.16
+1,161,46.355
+1,161,15.24
+1,161,7.62
+1,161,30.48
+1,161,19.05
+1,161,7.62
+1,162,33.02
+1,162,55.88
+1,162,22.86
+1,162,15.24
+1,162,53.975
+1,162,35.56
+1,162,45.72
+1,162,33.02
+1,162,10.16
+1,162,33.02
+1,162,7.62
+1,162,55.88
+1,162,33.02
+1,162,7.62
+1,162,10.16
+1,162,10.16
+1,162,10.16
+1,162,10.16
+1,162,27.94
+1,162,46.355
+1,162,10.16
+1,162,7.62
+1,162,24.13
+1,162,7.62
+1,162,7.62
+1,162,7.62
+1,162,33.02
+1,162,44.45
+1,162,45.72
+1,162,15.24
+1,163,33.02
+1,163,30.48
+1,163,27.94
+1,163,7.62
+1,163,10.16
+1,163,22.86
+1,163,35.56
+1,163,8.89
+1,163,35.56
+1,163,24.13
+1,163,24.13
+1,163,55.88
+1,163,55.88
+1,163,40.64
+1,163,30.48
+1,163,7.62
+1,163,99.06
+1,163,44.45
+1,163,33.02
+1,163,63.5
+1,163,40.64
+1,163,99.06
+1,163,35.56
+1,163,27.94
+1,163,46.355
+1,163,7.62
+1,163,8.89
+1,163,35.56
+1,163,19.05
+1,163,55.88
+1,164,8.89
+1,164,53.975
+1,164,10.16
+1,164,27.94
+1,164,81.28
+1,164,24.13
+1,164,7.62
+1,164,24.13
+1,164,35.56
+1,164,15.24
+1,164,19.05
+1,164,33.02
+1,164,19.05
+1,164,55.88
+1,164,35.56
+1,164,10.16
+1,164,33.02
+1,164,99.06
+1,164,30.48
+1,164,7.62
+1,164,24.13
+1,164,46.355
+1,164,63.5
+1,164,55.88
+1,164,33.02
+1,164,7.62
+1,164,7.62
+1,164,10.16
+1,164,22.86
+1,164,63.5
+1,165,30.48
+1,165,50.8
+1,165,45.72
+1,165,33.02
+1,165,7.62
+1,165,46.355
+1,165,7.62
+1,165,33.02
+1,165,15.24
+1,165,30.48
+1,165,33.02
+1,165,24.13
+1,165,27.94
+1,165,7.62
+1,165,7.62
+1,165,99.06
+1,165,44.45
+1,165,53.975
+1,165,99.06
+1,165,50.8
+1,165,45.72
+1,165,22.86
+1,165,40.64
+1,165,53.975
+1,165,99.06
+1,165,7.62
+1,165,19.05
+1,165,22.86
+1,165,40.64
+1,165,81.28
+1,166,33.02
+1,166,33.02
+1,166,44.45
+1,166,33.02
+1,166,33.02
+1,166,27.94
+1,166,99.06
+1,166,81.28
+1,166,7.62
+1,166,45.72
+1,166,7.62
+1,166,30.48
+1,166,35.56
+1,166,10.16
+1,166,63.5
+1,166,33.02
+1,166,35.56
+1,166,35.56
+1,166,40.64
+1,166,33.02
+1,166,19.05
+1,166,27.94
+1,166,33.02
+1,166,7.62
+1,166,10.16
+1,166,30.48
+1,166,7.62
+1,166,22.86
+1,166,30.48
+1,166,27.94
+1,167,99.06
+1,167,8.89
+1,167,7.62
+1,167,27.94
+1,167,40.64
+1,167,40.64
+1,167,35.56
+1,167,45.72
+1,167,35.56
+1,167,33.02
+1,167,40.64
+1,167,30.48
+1,167,7.62
+1,167,33.02
+1,167,10.16
+1,167,27.94
+1,167,81.28
+1,167,46.355
+1,167,45.72
+1,167,10.16
+1,167,33.02
+1,167,7.62
+1,167,44.45
+1,167,15.24
+1,167,7.62
+1,167,7.62
+1,167,53.975
+1,167,10.16
+1,167,27.94
+1,167,55.88
+1,168,81.28
+1,168,30.48
+1,168,50.8
+1,168,63.5
+1,168,7.62
+1,168,7.62
+1,168,7.62
+1,168,40.64
+1,168,46.355
+1,168,33.02
+1,168,40.64
+1,168,44.45
+1,168,19.05
+1,168,53.975
+1,168,7.62
+1,168,40.64
+1,168,19.05
+1,168,81.28
+1,168,81.28
+1,168,45.72
+1,168,55.88
+1,168,7.62
+1,168,50.8
+1,168,55.88
+1,168,35.56
+1,168,40.64
+1,168,63.5
+1,168,50.8
+1,168,10.16
+1,168,35.56
+1,169,10.16
+1,169,35.56
+1,169,7.62
+1,169,35.56
+1,169,7.62
+1,169,30.48
+1,169,55.88
+1,169,53.975
+1,169,27.94
+1,169,7.62
+1,169,10.16
+1,169,35.56
+1,169,27.94
+1,169,33.02
+1,169,10.16
+1,169,7.62
+1,169,33.02
+1,169,55.88
+1,169,35.56
+1,169,33.02
+1,169,63.5
+1,169,35.56
+1,169,24.13
+1,169,7.62
+1,169,35.56
+1,169,45.72
+1,169,30.48
+1,169,24.13
+1,169,22.86
+1,169,53.975
+1,170,53.975
+1,170,45.72
+1,170,50.8
+1,170,33.02
+1,170,22.86
+1,170,81.28
+1,170,15.24
+1,170,19.05
+1,170,40.64
+1,170,46.355
+1,170,7.62
+1,170,22.86
+1,170,99.06
+1,170,35.56
+1,170,35.56
+1,170,99.06
+1,170,10.16
+1,170,24.13
+1,170,50.8
+1,170,35.56
+1,170,24.13
+1,170,50.8
+1,170,7.62
+1,170,33.02
+1,170,22.86
+1,170,33.02
+1,170,7.62
+1,170,19.05
+1,170,19.05
+1,170,15.24
+1,171,55.88
+1,171,33.02
+1,171,15.24
+1,171,7.62
+1,171,53.975
+1,171,46.355
+1,171,10.16
+1,171,99.06
+1,171,40.64
+1,171,27.94
+1,171,7.62
+1,171,53.975
+1,171,22.86
+1,171,81.28
+1,171,45.72
+1,171,35.56
+1,171,19.05
+1,171,35.56
+1,171,24.13
+1,171,40.64
+1,171,7.62
+1,171,10.16
+1,171,40.64
+1,171,53.975
+1,171,40.64
+1,171,27.94
+1,171,7.62
+1,171,7.62
+1,171,45.72
+1,171,99.06
+1,172,10.16
+1,172,10.16
+1,172,33.02
+1,172,15.24
+1,172,19.05
+1,172,33.02
+1,172,46.355
+1,172,35.56
+1,172,55.88
+1,172,10.16
+1,172,81.28
+1,172,7.62
+1,172,10.16
+1,172,40.64
+1,172,7.62
+1,172,63.5
+1,172,46.355
+1,172,40.64
+1,172,99.06
+1,172,45.72
+1,172,7.62
+1,172,40.64
+1,172,7.62
+1,172,8.89
+1,172,53.975
+1,172,7.62
+1,172,50.8
+1,172,55.88
+1,172,7.62
+1,172,27.94
+1,173,46.355
+1,173,35.56
+1,173,35.56
+1,173,10.16
+1,173,8.89
+1,173,19.05
+1,173,24.13
+1,173,30.48
+1,173,30.48
+1,173,45.72
+1,173,7.62
+1,173,46.355
+1,173,53.975
+1,173,40.64
+1,173,7.62
+1,173,24.13
+1,173,50.8
+1,173,7.62
+1,173,35.56
+1,173,15.24
+1,173,8.89
+1,173,55.88
+1,173,81.28
+1,173,35.56
+1,173,35.56
+1,173,30.48
+1,173,40.64
+1,173,40.64
+1,173,27.94
+1,173,45.72
+1,174,15.24
+1,174,99.06
+1,174,46.355
+1,174,10.16
+1,174,35.56
+1,174,30.48
+1,174,46.355
+1,174,63.5
+1,174,46.355
+1,174,7.62
+1,174,53.975
+1,174,7.62
+1,174,35.56
+1,174,45.72
+1,174,33.02
+1,174,44.45
+1,174,99.06
+1,174,7.62
+1,174,33.02
+1,174,40.64
+1,174,7.62
+1,174,40.64
+1,174,53.975
+1,174,8.89
+1,174,50.8
+1,174,33.02
+1,174,46.355
+1,174,27.94
+1,174,10.16
+1,174,7.62
+1,175,33.02
+1,175,15.24
+1,175,40.64
+1,175,35.56
+1,175,35.56
+1,175,46.355
+1,175,7.62
+1,175,15.24
+1,175,24.13
+1,175,63.5
+1,175,7.62
+1,175,50.8
+1,175,7.62
+1,175,33.02
+1,175,7.62
+1,175,30.48
+1,175,7.62
+1,175,81.28
+1,175,8.89
+1,175,33.02
+1,175,63.5
+1,175,55.88
+1,175,10.16
+1,175,35.56
+1,175,55.88
+1,175,46.355
+1,175,44.45
+1,175,35.56
+1,175,81.28
+1,175,35.56
+1,176,53.975
+1,176,15.24
+1,176,10.16
+1,176,40.64
+1,176,81.28
+1,176,44.45
+1,176,99.06
+1,176,10.16
+1,176,30.48
+1,176,10.16
+1,176,22.86
+1,176,33.02
+1,176,40.64
+1,176,53.975
+1,176,10.16
+1,176,33.02
+1,176,15.24
+1,176,27.94
+1,176,45.72
+1,176,44.45
+1,176,44.45
+1,176,24.13
+1,176,99.06
+1,176,7.62
+1,176,33.02
+1,176,15.24
+1,176,46.355
+1,176,33.02
+1,176,81.28
+1,176,45.72
+1,177,19.05
+1,177,24.13
+1,177,45.72
+1,177,40.64
+1,177,46.355
+1,177,81.28
+1,177,24.13
+1,177,45.72
+1,177,55.88
+1,177,33.02
+1,177,33.02
+1,177,99.06
+1,177,7.62
+1,177,30.48
+1,177,7.62
+1,177,44.45
+1,177,99.06
+1,177,7.62
+1,177,27.94
+1,177,50.8
+1,177,8.89
+1,177,33.02
+1,177,44.45
+1,177,7.62
+1,177,35.56
+1,177,22.86
+1,177,33.02
+1,177,40.64
+1,177,30.48
+1,177,33.02
+1,178,7.62
+1,178,50.8
+1,178,55.88
+1,178,45.72
+1,178,50.8
+1,178,7.62
+1,178,40.64
+1,178,53.975
+1,178,40.64
+1,178,19.05
+1,178,8.89
+1,178,40.64
+1,178,7.62
+1,178,10.16
+1,178,81.28
+1,178,35.56
+1,178,81.28
+1,178,55.88
+1,178,33.02
+1,178,33.02
+1,178,33.02
+1,178,40.64
+1,178,19.05
+1,178,24.13
+1,178,8.89
+1,178,81.28
+1,178,40.64
+1,178,33.02
+1,178,7.62
+1,178,24.13
+1,179,33.02
+1,179,8.89
+1,179,19.05
+1,179,40.64
+1,179,35.56
+1,179,7.62
+1,179,33.02
+1,179,24.13
+1,179,81.28
+1,179,40.64
+1,179,33.02
+1,179,30.48
+1,179,10.16
+1,179,33.02
+1,179,63.5
+1,179,33.02
+1,179,27.94
+1,179,45.72
+1,179,7.62
+1,179,33.02
+1,179,33.02
+1,179,19.05
+1,179,33.02
+1,179,7.62
+1,179,33.02
+1,179,46.355
+1,179,40.64
+1,179,33.02
+1,179,35.56
+1,179,15.24
+1,180,99.06
+1,180,22.86
+1,180,7.62
+1,180,10.16
+1,180,10.16
+1,180,22.86
+1,180,7.62
+1,180,45.72
+1,180,40.64
+1,180,7.62
+1,180,27.94
+1,180,30.48
+1,180,35.56
+1,180,35.56
+1,180,99.06
+1,180,30.48
+1,180,33.02
+1,180,40.64
+1,180,33.02
+1,180,7.62
+1,180,30.48
+1,180,7.62
+1,180,15.24
+1,180,19.05
+1,180,33.02
+1,180,99.06
+1,180,10.16
+1,180,10.16
+1,180,33.02
+1,180,7.62
+1,181,40.64
+1,181,7.62
+1,181,45.72
+1,181,53.975
+1,181,33.02
+1,181,46.355
+1,181,53.975
+1,181,35.56
+1,181,33.02
+1,181,33.02
+1,181,55.88
+1,181,7.62
+1,181,33.02
+1,181,10.16
+1,181,35.56
+1,181,33.02
+1,181,10.16
+1,181,30.48
+1,181,99.06
+1,181,8.89
+1,181,27.94
+1,181,33.02
+1,181,10.16
+1,181,10.16
+1,181,15.24
+1,181,40.64
+1,181,33.02
+1,181,40.64
+1,181,7.62
+1,181,7.62
+1,182,55.88
+1,182,33.02
+1,182,45.72
+1,182,55.88
+1,182,63.5
+1,182,99.06
+1,182,19.05
+1,182,50.8
+1,182,27.94
+1,182,10.16
+1,182,40.64
+1,182,7.62
+1,182,35.56
+1,182,7.62
+1,182,40.64
+1,182,33.02
+1,182,15.24
+1,182,55.88
+1,182,19.05
+1,182,7.62
+1,182,99.06
+1,182,19.05
+1,182,7.62
+1,182,27.94
+1,182,7.62
+1,182,55.88
+1,182,44.45
+1,182,7.62
+1,182,27.94
+1,182,45.72
+1,183,50.8
+1,183,40.64
+1,183,24.13
+1,183,24.13
+1,183,7.62
+1,183,8.89
+1,183,7.62
+1,183,40.64
+1,183,35.56
+1,183,40.64
+1,183,7.62
+1,183,7.62
+1,183,45.72
+1,183,8.89
+1,183,55.88
+1,183,50.8
+1,183,53.975
+1,183,45.72
+1,183,7.62
+1,183,40.64
+1,183,46.355
+1,183,35.56
+1,183,7.62
+1,183,40.64
+1,183,55.88
+1,183,7.62
+1,183,7.62
+1,183,7.62
+1,183,40.64
+1,183,46.355
+1,184,46.355
+1,184,81.28
+1,184,50.8
+1,184,81.28
+1,184,45.72
+1,184,24.13
+1,184,15.24
+1,184,7.62
+1,184,27.94
+1,184,40.64
+1,184,7.62
+1,184,7.62
+1,184,45.72
+1,184,10.16
+1,184,7.62
+1,184,40.64
+1,184,44.45
+1,184,10.16
+1,184,27.94
+1,184,30.48
+1,184,7.62
+1,184,19.05
+1,184,24.13
+1,184,45.72
+1,184,99.06
+1,184,99.06
+1,184,55.88
+1,184,33.02
+1,184,44.45
+1,184,7.62
+1,185,8.89
+1,185,53.975
+1,185,45.72
+1,185,22.86
+1,185,10.16
+1,185,27.94
+1,185,33.02
+1,185,53.975
+1,185,7.62
+1,185,7.62
+1,185,81.28
+1,185,81.28
+1,185,30.48
+1,185,15.24
+1,185,22.86
+1,185,40.64
+1,185,45.72
+1,185,30.48
+1,185,33.02
+1,185,46.355
+1,185,33.02
+1,185,33.02
+1,185,24.13
+1,185,33.02
+1,185,35.56
+1,185,24.13
+1,185,10.16
+1,185,40.64
+1,185,35.56
+1,185,30.48
+1,186,7.62
+1,186,7.62
+1,186,8.89
+1,186,7.62
+1,186,35.56
+1,186,45.72
+1,186,35.56
+1,186,7.62
+1,186,35.56
+1,186,15.24
+1,186,44.45
+1,186,35.56
+1,186,50.8
+1,186,55.88
+1,186,63.5
+1,186,33.02
+1,186,33.02
+1,186,40.64
+1,186,7.62
+1,186,10.16
+1,186,45.72
+1,186,7.62
+1,186,53.975
+1,186,27.94
+1,186,44.45
+1,186,35.56
+1,186,22.86
+1,186,15.24
+1,186,8.89
+1,186,15.24
+1,187,46.355
+1,187,44.45
+1,187,27.94
+1,187,33.02
+1,187,40.64
+1,187,27.94
+1,187,33.02
+1,187,10.16
+1,187,19.05
+1,187,63.5
+1,187,22.86
+1,187,33.02
+1,187,46.355
+1,187,45.72
+1,187,63.5
+1,187,19.05
+1,187,10.16
+1,187,33.02
+1,187,10.16
+1,187,22.86
+1,187,46.355
+1,187,33.02
+1,187,33.02
+1,187,55.88
+1,187,45.72
+1,187,44.45
+1,187,45.72
+1,187,7.62
+1,187,24.13
+1,187,33.02
+1,188,30.48
+1,188,63.5
+1,188,7.62
+1,188,30.48
+1,188,27.94
+1,188,33.02
+1,188,30.48
+1,188,35.56
+1,188,10.16
+1,188,27.94
+1,188,10.16
+1,188,35.56
+1,188,40.64
+1,188,46.355
+1,188,19.05
+1,188,46.355
+1,188,19.05
+1,188,50.8
+1,188,10.16
+1,188,22.86
+1,188,7.62
+1,188,35.56
+1,188,81.28
+1,188,40.64
+1,188,45.72
+1,188,33.02
+1,188,22.86
+1,188,22.86
+1,188,7.62
+1,188,33.02
+1,189,55.88
+1,189,22.86
+1,189,7.62
+1,189,24.13
+1,189,30.48
+1,189,15.24
+1,189,7.62
+1,189,7.62
+1,189,22.86
+1,189,50.8
+1,189,53.975
+1,189,45.72
+1,189,10.16
+1,189,8.89
+1,189,35.56
+1,189,35.56
+1,189,33.02
+1,189,33.02
+1,189,8.89
+1,189,10.16
+1,189,40.64
+1,189,40.64
+1,189,19.05
+1,189,22.86
+1,189,7.62
+1,189,46.355
+1,189,46.355
+1,189,7.62
+1,189,45.72
+1,189,15.24
+1,190,63.5
+1,190,53.975
+1,190,7.62
+1,190,10.16
+1,190,50.8
+1,190,7.62
+1,190,99.06
+1,190,35.56
+1,190,35.56
+1,190,27.94
+1,190,7.62
+1,190,7.62
+1,190,7.62
+1,190,46.355
+1,190,7.62
+1,190,8.89
+1,190,10.16
+1,190,10.16
+1,190,15.24
+1,190,22.86
+1,190,33.02
+1,190,10.16
+1,190,33.02
+1,190,99.06
+1,190,33.02
+1,190,7.62
+1,190,45.72
+1,190,10.16
+1,190,10.16
+1,190,7.62
+1,191,53.975
+1,191,27.94
+1,191,33.02
+1,191,35.56
+1,191,7.62
+1,191,10.16
+1,191,35.56
+1,191,10.16
+1,191,8.89
+1,191,81.28
+1,191,33.02
+1,191,19.05
+1,191,55.88
+1,191,63.5
+1,191,19.05
+1,191,8.89
+1,191,10.16
+1,191,7.62
+1,191,50.8
+1,191,55.88
+1,191,8.89
+1,191,40.64
+1,191,7.62
+1,191,63.5
+1,191,40.64
+1,191,15.24
+1,191,24.13
+1,191,7.62
+1,191,33.02
+1,191,33.02
+1,192,44.45
+1,192,40.64
+1,192,24.13
+1,192,35.56
+1,192,50.8
+1,192,33.02
+1,192,19.05
+1,192,46.355
+1,192,7.62
+1,192,30.48
+1,192,35.56
+1,192,7.62
+1,192,33.02
+1,192,45.72
+1,192,15.24
+1,192,35.56
+1,192,33.02
+1,192,7.62
+1,192,33.02
+1,192,15.24
+1,192,30.48
+1,192,35.56
+1,192,63.5
+1,192,7.62
+1,192,40.64
+1,192,15.24
+1,192,99.06
+1,192,81.28
+1,192,35.56
+1,192,35.56
+1,193,55.88
+1,193,15.24
+1,193,81.28
+1,193,45.72
+1,193,24.13
+1,193,44.45
+1,193,7.62
+1,193,40.64
+1,193,81.28
+1,193,99.06
+1,193,24.13
+1,193,99.06
+1,193,53.975
+1,193,35.56
+1,193,7.62
+1,193,24.13
+1,193,33.02
+1,193,8.89
+1,193,27.94
+1,193,19.05
+1,193,53.975
+1,193,15.24
+1,193,50.8
+1,193,55.88
+1,193,46.355
+1,193,8.89
+1,193,24.13
+1,193,7.62
+1,193,19.05
+1,193,35.56
+1,194,50.8
+1,194,33.02
+1,194,33.02
+1,194,50.8
+1,194,22.86
+1,194,45.72
+1,194,55.88
+1,194,44.45
+1,194,63.5
+1,194,33.02
+1,194,7.62
+1,194,55.88
+1,194,55.88
+1,194,44.45
+1,194,81.28
+1,194,8.89
+1,194,33.02
+1,194,81.28
+1,194,53.975
+1,194,27.94
+1,194,63.5
+1,194,99.06
+1,194,10.16
+1,194,7.62
+1,194,8.89
+1,194,46.355
+1,194,7.62
+1,194,40.64
+1,194,10.16
+1,194,50.8
+1,195,40.64
+1,195,55.88
+1,195,7.62
+1,195,35.56
+1,195,7.62
+1,195,22.86
+1,195,35.56
+1,195,22.86
+1,195,8.89
+1,195,10.16
+1,195,7.62
+1,195,7.62
+1,195,30.48
+1,195,63.5
+1,195,81.28
+1,195,53.975
+1,195,45.72
+1,195,24.13
+1,195,53.975
+1,195,22.86
+1,195,46.355
+1,195,30.48
+1,195,7.62
+1,195,8.89
+1,195,46.355
+1,195,33.02
+1,195,35.56
+1,195,10.16
+1,195,33.02
+1,195,46.355
+1,196,30.48
+1,196,7.62
+1,196,33.02
+1,196,15.24
+1,196,7.62
+1,196,24.13
+1,196,44.45
+1,196,81.28
+1,196,99.06
+1,196,7.62
+1,196,7.62
+1,196,50.8
+1,196,44.45
+1,196,45.72
+1,196,45.72
+1,196,33.02
+1,196,27.94
+1,196,81.28
+1,196,40.64
+1,196,7.62
+1,196,7.62
+1,196,7.62
+1,196,7.62
+1,196,33.02
+1,196,22.86
+1,196,81.28
+1,196,22.86
+1,196,7.62
+1,196,45.72
+1,196,33.02
+1,197,22.86
+1,197,7.62
+1,197,24.13
+1,197,15.24
+1,197,33.02
+1,197,35.56
+1,197,45.72
+1,197,35.56
+1,197,8.89
+1,197,40.64
+1,197,10.16
+1,197,7.62
+1,197,10.16
+1,197,7.62
+1,197,35.56
+1,197,22.86
+1,197,33.02
+1,197,53.975
+1,197,7.62
+1,197,99.06
+1,197,45.72
+1,197,7.62
+1,197,99.06
+1,197,7.62
+1,197,63.5
+1,197,46.355
+1,197,44.45
+1,197,33.02
+1,197,50.8
+1,197,35.56
+1,198,40.64
+1,198,24.13
+1,198,8.89
+1,198,35.56
+1,198,81.28
+1,198,53.975
+1,198,7.62
+1,198,10.16
+1,198,33.02
+1,198,53.975
+1,198,63.5
+1,198,8.89
+1,198,99.06
+1,198,45.72
+1,198,63.5
+1,198,63.5
+1,198,53.975
+1,198,10.16
+1,198,22.86
+1,198,40.64
+1,198,7.62
+1,198,7.62
+1,198,30.48
+1,198,33.02
+1,198,40.64
+1,198,35.56
+1,198,63.5
+1,198,7.62
+1,198,35.56
+1,198,33.02
+1,199,30.48
+1,199,33.02
+1,199,33.02
+1,199,22.86
+1,199,19.05
+1,199,35.56
+1,199,22.86
+1,199,50.8
+1,199,40.64
+1,199,7.62
+1,199,10.16
+1,199,7.62
+1,199,33.02
+1,199,63.5
+1,199,55.88
+1,199,10.16
+1,199,55.88
+1,199,7.62
+1,199,45.72
+1,199,7.62
+1,199,53.975
+1,199,8.89
+1,199,55.88
+1,199,40.64
+1,199,81.28
+1,199,7.62
+1,199,10.16
+1,199,44.45
+1,199,50.8
+1,199,27.94
+1,200,33.02
+1,200,19.05
+1,200,7.62
+1,200,35.56
+1,200,33.02
+1,200,24.13
+1,200,22.86
+1,200,27.94
+1,200,35.56
+1,200,81.28
+1,200,7.62
+1,200,46.355
+1,200,53.975
+1,200,81.28
+1,200,8.89
+1,200,30.48
+1,200,7.62
+1,200,53.975
+1,200,7.62
+1,200,7.62
+1,200,45.72
+1,200,22.86
+1,200,30.48
+1,200,35.56
+1,200,7.62
+1,200,33.02
+1,200,15.24
+1,200,7.62
+1,200,15.24
+1,200,27.94
+1,201,30.48
+1,201,45.72
+1,201,99.06
+1,201,24.13
+1,201,99.06
+1,201,10.16
+1,201,7.62
+1,201,99.06
+1,201,27.94
+1,201,10.16
+1,201,50.8
+1,201,45.72
+1,201,8.89
+1,201,27.94
+1,201,46.355
+1,201,50.8
+1,201,8.89
+1,201,7.62
+1,201,45.72
+1,201,33.02
+1,201,99.06
+1,201,81.28
+1,201,55.88
+1,201,7.62
+1,201,19.05
+1,201,30.48
+1,201,10.16
+1,201,19.05
+1,201,40.64
+1,201,63.5
+1,202,7.62
+1,202,7.62
+1,202,81.28
+1,202,45.72
+1,202,30.48
+1,202,15.24
+1,202,35.56
+1,202,99.06
+1,202,7.62
+1,202,40.64
+1,202,40.64
+1,202,35.56
+1,202,8.89
+1,202,33.02
+1,202,10.16
+1,202,27.94
+1,202,10.16
+1,202,99.06
+1,202,46.355
+1,202,22.86
+1,202,35.56
+1,202,46.355
+1,202,30.48
+1,202,27.94
+1,202,46.355
+1,202,53.975
+1,202,81.28
+1,202,7.62
+1,202,53.975
+1,202,44.45
+1,203,7.62
+1,203,27.94
+1,203,33.02
+1,203,15.24
+1,203,10.16
+1,203,40.64
+1,203,7.62
+1,203,44.45
+1,203,40.64
+1,203,53.975
+1,203,10.16
+1,203,10.16
+1,203,10.16
+1,203,30.48
+1,203,10.16
+1,203,33.02
+1,203,50.8
+1,203,24.13
+1,203,33.02
+1,203,10.16
+1,203,8.89
+1,203,53.975
+1,203,7.62
+1,203,44.45
+1,203,63.5
+1,203,55.88
+1,203,44.45
+1,203,27.94
+1,203,35.56
+1,203,10.16
+1,204,40.64
+1,204,7.62
+1,204,33.02
+1,204,22.86
+1,204,7.62
+1,204,99.06
+1,204,22.86
+1,204,55.88
+1,204,35.56
+1,204,7.62
+1,204,35.56
+1,204,81.28
+1,204,8.89
+1,204,50.8
+1,204,7.62
+1,204,10.16
+1,204,24.13
+1,204,35.56
+1,204,53.975
+1,204,46.355
+1,204,22.86
+1,204,63.5
+1,204,33.02
+1,204,81.28
+1,204,35.56
+1,204,27.94
+1,204,45.72
+1,204,7.62
+1,204,7.62
+1,204,35.56
+1,205,7.62
+1,205,30.48
+1,205,7.62
+1,205,35.56
+1,205,99.06
+1,205,55.88
+1,205,45.72
+1,205,19.05
+1,205,7.62
+1,205,53.975
+1,205,45.72
+1,205,7.62
+1,205,33.02
+1,205,44.45
+1,205,53.975
+1,205,33.02
+1,205,99.06
+1,205,7.62
+1,205,81.28
+1,205,7.62
+1,205,99.06
+1,205,33.02
+1,205,53.975
+1,205,10.16
+1,205,7.62
+1,205,35.56
+1,205,10.16
+1,205,30.48
+1,205,10.16
+1,205,53.975
+1,206,35.56
+1,206,35.56
+1,206,33.02
+1,206,24.13
+1,206,55.88
+1,206,35.56
+1,206,7.62
+1,206,45.72
+1,206,63.5
+1,206,7.62
+1,206,35.56
+1,206,7.62
+1,206,30.48
+1,206,63.5
+1,206,15.24
+1,206,44.45
+1,206,99.06
+1,206,99.06
+1,206,33.02
+1,206,35.56
+1,206,19.05
+1,206,22.86
+1,206,10.16
+1,206,22.86
+1,206,7.62
+1,206,81.28
+1,206,27.94
+1,206,15.24
+1,206,53.975
+1,206,7.62
+1,207,7.62
+1,207,7.62
+1,207,33.02
+1,207,50.8
+1,207,33.02
+1,207,8.89
+1,207,22.86
+1,207,7.62
+1,207,7.62
+1,207,45.72
+1,207,35.56
+1,207,63.5
+1,207,81.28
+1,207,10.16
+1,207,46.355
+1,207,19.05
+1,207,22.86
+1,207,15.24
+1,207,10.16
+1,207,10.16
+1,207,15.24
+1,207,15.24
+1,207,10.16
+1,207,33.02
+1,207,40.64
+1,207,7.62
+1,207,50.8
+1,207,50.8
+1,207,7.62
+1,207,81.28
+1,208,19.05
+1,208,7.62
+1,208,24.13
+1,208,7.62
+1,208,53.975
+1,208,30.48
+1,208,81.28
+1,208,22.86
+1,208,10.16
+1,208,15.24
+1,208,33.02
+1,208,8.89
+1,208,30.48
+1,208,7.62
+1,208,15.24
+1,208,7.62
+1,208,7.62
+1,208,7.62
+1,208,10.16
+1,208,10.16
+1,208,10.16
+1,208,33.02
+1,208,45.72
+1,208,27.94
+1,208,40.64
+1,208,10.16
+1,208,10.16
+1,208,40.64
+1,208,7.62
+1,208,10.16
+1,209,22.86
+1,209,19.05
+1,209,99.06
+1,209,19.05
+1,209,35.56
+1,209,22.86
+1,209,33.02
+1,209,33.02
+1,209,45.72
+1,209,24.13
+1,209,50.8
+1,209,50.8
+1,209,15.24
+1,209,33.02
+1,209,7.62
+1,209,30.48
+1,209,7.62
+1,209,7.62
+1,209,35.56
+1,209,46.355
+1,209,27.94
+1,209,44.45
+1,209,33.02
+1,209,55.88
+1,209,44.45
+1,209,19.05
+1,209,35.56
+1,209,46.355
+1,209,33.02
+1,209,7.62
+1,210,15.24
+1,210,7.62
+1,210,40.64
+1,210,50.8
+1,210,63.5
+1,210,8.89
+1,210,7.62
+1,210,33.02
+1,210,33.02
+1,210,33.02
+1,210,7.62
+1,210,99.06
+1,210,30.48
+1,210,33.02
+1,210,40.64
+1,210,27.94
+1,210,81.28
+1,210,35.56
+1,210,44.45
+1,210,30.48
+1,210,7.62
+1,210,22.86
+1,210,10.16
+1,210,7.62
+1,210,24.13
+1,210,8.89
+1,210,33.02
+1,210,7.62
+1,210,7.62
+1,210,45.72
+1,211,15.24
+1,211,8.89
+1,211,33.02
+1,211,33.02
+1,211,24.13
+1,211,46.355
+1,211,19.05
+1,211,50.8
+1,211,8.89
+1,211,7.62
+1,211,44.45
+1,211,24.13
+1,211,10.16
+1,211,40.64
+1,211,33.02
+1,211,7.62
+1,211,24.13
+1,211,99.06
+1,211,7.62
+1,211,7.62
+1,211,55.88
+1,211,53.975
+1,211,8.89
+1,211,15.24
+1,211,53.975
+1,211,45.72
+1,211,7.62
+1,211,40.64
+1,211,40.64
+1,211,15.24
+1,212,53.975
+1,212,45.72
+1,212,35.56
+1,212,40.64
+1,212,50.8
+1,212,10.16
+1,212,53.975
+1,212,10.16
+1,212,35.56
+1,212,99.06
+1,212,46.355
+1,212,7.62
+1,212,45.72
+1,212,30.48
+1,212,46.355
+1,212,27.94
+1,212,24.13
+1,212,33.02
+1,212,40.64
+1,212,35.56
+1,212,33.02
+1,212,30.48
+1,212,19.05
+1,212,10.16
+1,212,19.05
+1,212,46.355
+1,212,99.06
+1,212,19.05
+1,212,40.64
+1,212,22.86
+1,213,7.62
+1,213,63.5
+1,213,63.5
+1,213,50.8
+1,213,24.13
+1,213,33.02
+1,213,35.56
+1,213,46.355
+1,213,15.24
+1,213,33.02
+1,213,53.975
+1,213,30.48
+1,213,10.16
+1,213,35.56
+1,213,10.16
+1,213,55.88
+1,213,40.64
+1,213,7.62
+1,213,35.56
+1,213,53.975
+1,213,45.72
+1,213,50.8
+1,213,24.13
+1,213,45.72
+1,213,55.88
+1,213,35.56
+1,213,19.05
+1,213,33.02
+1,213,10.16
+1,213,24.13
+1,214,7.62
+1,214,15.24
+1,214,33.02
+1,214,81.28
+1,214,33.02
+1,214,15.24
+1,214,10.16
+1,214,22.86
+1,214,8.89
+1,214,45.72
+1,214,10.16
+1,214,10.16
+1,214,7.62
+1,214,33.02
+1,214,50.8
+1,214,7.62
+1,214,45.72
+1,214,22.86
+1,214,50.8
+1,214,7.62
+1,214,33.02
+1,214,50.8
+1,214,8.89
+1,214,35.56
+1,214,7.62
+1,214,63.5
+1,214,45.72
+1,214,19.05
+1,214,50.8
+1,214,19.05
+1,215,8.89
+1,215,53.975
+1,215,27.94
+1,215,40.64
+1,215,33.02
+1,215,63.5
+1,215,7.62
+1,215,53.975
+1,215,7.62
+1,215,81.28
+1,215,63.5
+1,215,7.62
+1,215,15.24
+1,215,10.16
+1,215,45.72
+1,215,81.28
+1,215,8.89
+1,215,10.16
+1,215,15.24
+1,215,33.02
+1,215,15.24
+1,215,33.02
+1,215,7.62
+1,215,63.5
+1,215,35.56
+1,215,46.355
+1,215,53.975
+1,215,63.5
+1,215,45.72
+1,215,35.56
+1,216,45.72
+1,216,10.16
+1,216,7.62
+1,216,19.05
+1,216,81.28
+1,216,10.16
+1,216,22.86
+1,216,40.64
+1,216,40.64
+1,216,35.56
+1,216,99.06
+1,216,10.16
+1,216,50.8
+1,216,35.56
+1,216,7.62
+1,216,63.5
+1,216,7.62
+1,216,7.62
+1,216,10.16
+1,216,35.56
+1,216,10.16
+1,216,15.24
+1,216,8.89
+1,216,8.89
+1,216,53.975
+1,216,99.06
+1,216,7.62
+1,216,40.64
+1,216,81.28
+1,216,33.02
+1,217,63.5
+1,217,30.48
+1,217,45.72
+1,217,30.48
+1,217,7.62
+1,217,10.16
+1,217,7.62
+1,217,19.05
+1,217,40.64
+1,217,7.62
+1,217,55.88
+1,217,27.94
+1,217,27.94
+1,217,45.72
+1,217,33.02
+1,217,46.355
+1,217,50.8
+1,217,33.02
+1,217,33.02
+1,217,53.975
+1,217,40.64
+1,217,44.45
+1,217,19.05
+1,217,44.45
+1,217,24.13
+1,217,15.24
+1,217,7.62
+1,217,33.02
+1,217,7.62
+1,217,50.8
+1,218,33.02
+1,218,7.62
+1,218,8.89
+1,218,40.64
+1,218,40.64
+1,218,15.24
+1,218,35.56
+1,218,8.89
+1,218,35.56
+1,218,15.24
+1,218,10.16
+1,218,33.02
+1,218,81.28
+1,218,7.62
+1,218,63.5
+1,218,15.24
+1,218,24.13
+1,218,8.89
+1,218,40.64
+1,218,27.94
+1,218,7.62
+1,218,7.62
+1,218,19.05
+1,218,24.13
+1,218,33.02
+1,218,35.56
+1,218,45.72
+1,218,27.94
+1,218,99.06
+1,218,40.64
+1,219,10.16
+1,219,50.8
+1,219,81.28
+1,219,81.28
+1,219,44.45
+1,219,7.62
+1,219,35.56
+1,219,81.28
+1,219,19.05
+1,219,40.64
+1,219,24.13
+1,219,15.24
+1,219,30.48
+1,219,35.56
+1,219,27.94
+1,219,33.02
+1,219,19.05
+1,219,8.89
+1,219,10.16
+1,219,10.16
+1,219,55.88
+1,219,19.05
+1,219,33.02
+1,219,33.02
+1,219,33.02
+1,219,15.24
+1,219,10.16
+1,219,30.48
+1,219,40.64
+1,219,53.975
+1,220,35.56
+1,220,33.02
+1,220,45.72
+1,220,19.05
+1,220,35.56
+1,220,35.56
+1,220,33.02
+1,220,7.62
+1,220,40.64
+1,220,33.02
+1,220,7.62
+1,220,15.24
+1,220,40.64
+1,220,33.02
+1,220,7.62
+1,220,53.975
+1,220,7.62
+1,220,22.86
+1,220,50.8
+1,220,30.48
+1,220,24.13
+1,220,63.5
+1,220,33.02
+1,220,24.13
+1,220,99.06
+1,220,33.02
+1,220,46.355
+1,220,10.16
+1,220,10.16
+1,220,30.48
+1,221,24.13
+1,221,10.16
+1,221,40.64
+1,221,40.64
+1,221,35.56
+1,221,53.975
+1,221,19.05
+1,221,40.64
+1,221,7.62
+1,221,33.02
+1,221,81.28
+1,221,19.05
+1,221,35.56
+1,221,99.06
+1,221,35.56
+1,221,22.86
+1,221,19.05
+1,221,7.62
+1,221,40.64
+1,221,27.94
+1,221,8.89
+1,221,63.5
+1,221,40.64
+1,221,7.62
+1,221,45.72
+1,221,33.02
+1,221,7.62
+1,221,7.62
+1,221,8.89
+1,221,46.355
+1,222,45.72
+1,222,7.62
+1,222,44.45
+1,222,7.62
+1,222,19.05
+1,222,33.02
+1,222,40.64
+1,222,33.02
+1,222,45.72
+1,222,19.05
+1,222,35.56
+1,222,22.86
+1,222,63.5
+1,222,22.86
+1,222,33.02
+1,222,44.45
+1,222,33.02
+1,222,15.24
+1,222,15.24
+1,222,15.24
+1,222,30.48
+1,222,8.89
+1,222,35.56
+1,222,7.62
+1,222,7.62
+1,222,40.64
+1,222,35.56
+1,222,35.56
+1,222,15.24
+1,222,27.94
+1,223,10.16
+1,223,30.48
+1,223,7.62
+1,223,33.02
+1,223,7.62
+1,223,33.02
+1,223,7.62
+1,223,33.02
+1,223,81.28
+1,223,22.86
+1,223,7.62
+1,223,10.16
+1,223,99.06
+1,223,40.64
+1,223,33.02
+1,223,7.62
+1,223,46.355
+1,223,33.02
+1,223,99.06
+1,223,7.62
+1,223,99.06
+1,223,7.62
+1,223,55.88
+1,223,40.64
+1,223,22.86
+1,223,63.5
+1,223,40.64
+1,223,10.16
+1,223,81.28
+1,223,7.62
+1,224,40.64
+1,224,46.355
+1,224,44.45
+1,224,10.16
+1,224,33.02
+1,224,33.02
+1,224,30.48
+1,224,40.64
+1,224,63.5
+1,224,55.88
+1,224,50.8
+1,224,35.56
+1,224,15.24
+1,224,7.62
+1,224,7.62
+1,224,7.62
+1,224,10.16
+1,224,10.16
+1,224,7.62
+1,224,7.62
+1,224,15.24
+1,224,63.5
+1,224,35.56
+1,224,55.88
+1,224,7.62
+1,224,8.89
+1,224,7.62
+1,224,27.94
+1,224,27.94
+1,224,7.62
+1,225,8.89
+1,225,7.62
+1,225,33.02
+1,225,8.89
+1,225,33.02
+1,225,33.02
+1,225,53.975
+1,225,22.86
+1,225,53.975
+1,225,22.86
+1,225,15.24
+1,225,44.45
+1,225,46.355
+1,225,15.24
+1,225,45.72
+1,225,7.62
+1,225,7.62
+1,225,7.62
+1,225,45.72
+1,225,7.62
+1,225,8.89
+1,225,50.8
+1,225,7.62
+1,225,63.5
+1,225,7.62
+1,225,7.62
+1,225,35.56
+1,225,7.62
+1,225,33.02
+1,225,30.48
+1,226,19.05
+1,226,7.62
+1,226,7.62
+1,226,45.72
+1,226,7.62
+1,226,35.56
+1,226,81.28
+1,226,7.62
+1,226,99.06
+1,226,35.56
+1,226,33.02
+1,226,15.24
+1,226,81.28
+1,226,7.62
+1,226,63.5
+1,226,35.56
+1,226,33.02
+1,226,30.48
+1,226,15.24
+1,226,30.48
+1,226,15.24
+1,226,45.72
+1,226,53.975
+1,226,33.02
+1,226,19.05
+1,226,22.86
+1,226,40.64
+1,226,7.62
+1,226,15.24
+1,226,19.05
+1,227,45.72
+1,227,15.24
+1,227,7.62
+1,227,44.45
+1,227,81.28
+1,227,35.56
+1,227,81.28
+1,227,15.24
+1,227,30.48
+1,227,40.64
+1,227,53.975
+1,227,10.16
+1,227,99.06
+1,227,7.62
+1,227,7.62
+1,227,33.02
+1,227,19.05
+1,227,22.86
+1,227,10.16
+1,227,35.56
+1,227,7.62
+1,227,27.94
+1,227,22.86
+1,227,7.62
+1,227,33.02
+1,227,99.06
+1,227,27.94
+1,227,33.02
+1,227,10.16
+1,227,40.64
+1,228,35.56
+1,228,40.64
+1,228,7.62
+1,228,55.88
+1,228,40.64
+1,228,40.64
+1,228,33.02
+1,228,10.16
+1,228,45.72
+1,228,24.13
+1,228,7.62
+1,228,46.355
+1,228,7.62
+1,228,27.94
+1,228,7.62
+1,228,35.56
+1,228,15.24
+1,228,55.88
+1,228,7.62
+1,228,27.94
+1,228,7.62
+1,228,33.02
+1,228,33.02
+1,228,8.89
+1,228,99.06
+1,228,7.62
+1,228,24.13
+1,228,8.89
+1,228,33.02
+1,228,7.62
+1,229,27.94
+1,229,8.89
+1,229,7.62
+1,229,63.5
+1,229,15.24
+1,229,35.56
+1,229,24.13
+1,229,46.355
+1,229,8.89
+1,229,40.64
+1,229,8.89
+1,229,7.62
+1,229,40.64
+1,229,44.45
+1,229,40.64
+1,229,45.72
+1,229,63.5
+1,229,27.94
+1,229,81.28
+1,229,27.94
+1,229,40.64
+1,229,19.05
+1,229,63.5
+1,229,19.05
+1,229,46.355
+1,229,8.89
+1,229,63.5
+1,229,50.8
+1,229,33.02
+1,229,8.89
+1,230,7.62
+1,230,35.56
+1,230,35.56
+1,230,22.86
+1,230,40.64
+1,230,24.13
+1,230,33.02
+1,230,19.05
+1,230,22.86
+1,230,19.05
+1,230,7.62
+1,230,81.28
+1,230,35.56
+1,230,10.16
+1,230,7.62
+1,230,8.89
+1,230,7.62
+1,230,7.62
+1,230,99.06
+1,230,33.02
+1,230,24.13
+1,230,30.48
+1,230,7.62
+1,230,8.89
+1,230,63.5
+1,230,35.56
+1,230,27.94
+1,230,27.94
+1,230,10.16
+1,230,27.94
+1,231,7.62
+1,231,22.86
+1,231,10.16
+1,231,10.16
+1,231,10.16
+1,231,55.88
+1,231,35.56
+1,231,35.56
+1,231,7.62
+1,231,27.94
+1,231,53.975
+1,231,8.89
+1,231,40.64
+1,231,33.02
+1,231,55.88
+1,231,40.64
+1,231,10.16
+1,231,35.56
+1,231,10.16
+1,231,7.62
+1,231,7.62
+1,231,33.02
+1,231,10.16
+1,231,81.28
+1,231,33.02
+1,231,35.56
+1,231,7.62
+1,231,35.56
+1,231,33.02
+1,231,10.16
+1,232,7.62
+1,232,63.5
+1,232,63.5
+1,232,10.16
+1,232,46.355
+1,232,7.62
+1,232,15.24
+1,232,15.24
+1,232,46.355
+1,232,44.45
+1,232,19.05
+1,232,53.975
+1,232,22.86
+1,232,7.62
+1,232,33.02
+1,232,35.56
+1,232,7.62
+1,232,24.13
+1,232,7.62
+1,232,50.8
+1,232,40.64
+1,232,55.88
+1,232,24.13
+1,232,50.8
+1,232,53.975
+1,232,99.06
+1,232,40.64
+1,232,63.5
+1,232,24.13
+1,232,7.62
+1,233,7.62
+1,233,40.64
+1,233,7.62
+1,233,40.64
+1,233,10.16
+1,233,10.16
+1,233,46.355
+1,233,81.28
+1,233,7.62
+1,233,81.28
+1,233,40.64
+1,233,35.56
+1,233,22.86
+1,233,7.62
+1,233,55.88
+1,233,30.48
+1,233,55.88
+1,233,7.62
+1,233,33.02
+1,233,22.86
+1,233,8.89
+1,233,55.88
+1,233,35.56
+1,233,7.62
+1,233,24.13
+1,233,33.02
+1,233,35.56
+1,233,50.8
+1,233,35.56
+1,233,40.64
+1,234,63.5
+1,234,35.56
+1,234,40.64
+1,234,53.975
+1,234,27.94
+1,234,40.64
+1,234,46.355
+1,234,30.48
+1,234,44.45
+1,234,55.88
+1,234,7.62
+1,234,55.88
+1,234,44.45
+1,234,7.62
+1,234,19.05
+1,234,7.62
+1,234,81.28
+1,234,35.56
+1,234,7.62
+1,234,35.56
+1,234,53.975
+1,234,7.62
+1,234,40.64
+1,234,19.05
+1,234,35.56
+1,234,27.94
+1,234,33.02
+1,234,45.72
+1,234,30.48
+1,234,10.16
+1,235,7.62
+1,235,81.28
+1,235,63.5
+1,235,53.975
+1,235,33.02
+1,235,63.5
+1,235,24.13
+1,235,7.62
+1,235,7.62
+1,235,50.8
+1,235,33.02
+1,235,50.8
+1,235,33.02
+1,235,7.62
+1,235,63.5
+1,235,35.56
+1,235,33.02
+1,235,24.13
+1,235,7.62
+1,235,35.56
+1,235,33.02
+1,235,33.02
+1,235,44.45
+1,235,7.62
+1,235,53.975
+1,235,81.28
+1,235,46.355
+1,235,24.13
+1,235,53.975
+1,235,7.62
+1,236,55.88
+1,236,33.02
+1,236,24.13
+1,236,81.28
+1,236,40.64
+1,236,63.5
+1,236,7.62
+1,236,30.48
+1,236,40.64
+1,236,50.8
+1,236,7.62
+1,236,53.975
+1,236,55.88
+1,236,30.48
+1,236,35.56
+1,236,50.8
+1,236,10.16
+1,236,33.02
+1,236,24.13
+1,236,40.64
+1,236,45.72
+1,236,30.48
+1,236,19.05
+1,236,7.62
+1,236,27.94
+1,236,22.86
+1,236,10.16
+1,236,7.62
+1,236,10.16
+1,236,27.94
+1,237,27.94
+1,237,10.16
+1,237,8.89
+1,237,35.56
+1,237,46.355
+1,237,8.89
+1,237,7.62
+1,237,55.88
+1,237,19.05
+1,237,15.24
+1,237,63.5
+1,237,46.355
+1,237,99.06
+1,237,40.64
+1,237,53.975
+1,237,44.45
+1,237,81.28
+1,237,24.13
+1,237,40.64
+1,237,7.62
+1,237,19.05
+1,237,33.02
+1,237,7.62
+1,237,33.02
+1,237,7.62
+1,237,10.16
+1,237,27.94
+1,237,33.02
+1,237,30.48
+1,237,35.56
+1,238,30.48
+1,238,46.355
+1,238,7.62
+1,238,33.02
+1,238,40.64
+1,238,33.02
+1,238,22.86
+1,238,53.975
+1,238,53.975
+1,238,33.02
+1,238,10.16
+1,238,7.62
+1,238,27.94
+1,238,24.13
+1,238,40.64
+1,238,40.64
+1,238,35.56
+1,238,35.56
+1,238,46.355
+1,238,50.8
+1,238,27.94
+1,238,8.89
+1,238,22.86
+1,238,44.45
+1,238,33.02
+1,238,30.48
+1,238,15.24
+1,238,7.62
+1,238,10.16
+1,238,55.88
+1,239,99.06
+1,239,40.64
+1,239,33.02
+1,239,40.64
+1,239,7.62
+1,239,8.89
+1,239,99.06
+1,239,8.89
+1,239,35.56
+1,239,24.13
+1,239,63.5
+1,239,99.06
+1,239,7.62
+1,239,35.56
+1,239,7.62
+1,239,81.28
+1,239,63.5
+1,239,7.62
+1,239,7.62
+1,239,50.8
+1,239,99.06
+1,239,99.06
+1,239,22.86
+1,239,50.8
+1,239,24.13
+1,239,7.62
+1,239,7.62
+1,239,55.88
+1,239,99.06
+1,239,33.02
+1,240,8.89
+1,240,15.24
+1,240,63.5
+1,240,8.89
+1,240,35.56
+1,240,7.62
+1,240,33.02
+1,240,22.86
+1,240,7.62
+1,240,33.02
+1,240,7.62
+1,240,55.88
+1,240,33.02
+1,240,45.72
+1,240,33.02
+1,240,7.62
+1,240,33.02
+1,240,45.72
+1,240,99.06
+1,240,99.06
+1,240,33.02
+1,240,10.16
+1,240,24.13
+1,240,19.05
+1,240,33.02
+1,240,44.45
+1,240,27.94
+1,240,55.88
+1,240,50.8
+1,240,7.62
+1,241,15.24
+1,241,7.62
+1,241,40.64
+1,241,33.02
+1,241,15.24
+1,241,7.62
+1,241,27.94
+1,241,55.88
+1,241,33.02
+1,241,33.02
+1,241,7.62
+1,241,99.06
+1,241,35.56
+1,241,35.56
+1,241,7.62
+1,241,33.02
+1,241,35.56
+1,241,10.16
+1,241,99.06
+1,241,10.16
+1,241,30.48
+1,241,8.89
+1,241,7.62
+1,241,7.62
+1,241,44.45
+1,241,7.62
+1,241,7.62
+1,241,63.5
+1,241,40.64
+1,241,50.8
+1,242,40.64
+1,242,33.02
+1,242,10.16
+1,242,15.24
+1,242,45.72
+1,242,33.02
+1,242,22.86
+1,242,50.8
+1,242,81.28
+1,242,63.5
+1,242,35.56
+1,242,33.02
+1,242,30.48
+1,242,44.45
+1,242,8.89
+1,242,99.06
+1,242,10.16
+1,242,22.86
+1,242,81.28
+1,242,44.45
+1,242,22.86
+1,242,7.62
+1,242,99.06
+1,242,50.8
+1,242,99.06
+1,242,40.64
+1,242,35.56
+1,242,63.5
+1,242,27.94
+1,242,27.94
+1,243,33.02
+1,243,30.48
+1,243,22.86
+1,243,27.94
+1,243,10.16
+1,243,10.16
+1,243,8.89
+1,243,27.94
+1,243,8.89
+1,243,30.48
+1,243,27.94
+1,243,22.86
+1,243,55.88
+1,243,27.94
+1,243,45.72
+1,243,55.88
+1,243,55.88
+1,243,27.94
+1,243,10.16
+1,243,15.24
+1,243,44.45
+1,243,10.16
+1,243,22.86
+1,243,46.355
+1,243,19.05
+1,243,40.64
+1,243,40.64
+1,243,22.86
+1,243,35.56
+1,243,81.28
+1,244,7.62
+1,244,46.355
+1,244,7.62
+1,244,40.64
+1,244,15.24
+1,244,7.62
+1,244,24.13
+1,244,33.02
+1,244,53.975
+1,244,7.62
+1,244,40.64
+1,244,81.28
+1,244,45.72
+1,244,8.89
+1,244,53.975
+1,244,53.975
+1,244,7.62
+1,244,19.05
+1,244,8.89
+1,244,40.64
+1,244,99.06
+1,244,50.8
+1,244,7.62
+1,244,22.86
+1,244,8.89
+1,244,63.5
+1,244,81.28
+1,244,50.8
+1,244,10.16
+1,244,30.48
+1,245,55.88
+1,245,55.88
+1,245,35.56
+1,245,8.89
+1,245,7.62
+1,245,50.8
+1,245,7.62
+1,245,10.16
+1,245,33.02
+1,245,22.86
+1,245,40.64
+1,245,10.16
+1,245,33.02
+1,245,7.62
+1,245,7.62
+1,245,99.06
+1,245,40.64
+1,245,45.72
+1,245,7.62
+1,245,10.16
+1,245,33.02
+1,245,33.02
+1,245,15.24
+1,245,50.8
+1,245,24.13
+1,245,55.88
+1,245,53.975
+1,245,45.72
+1,245,15.24
+1,245,7.62
+1,246,10.16
+1,246,53.975
+1,246,15.24
+1,246,15.24
+1,246,30.48
+1,246,10.16
+1,246,63.5
+1,246,19.05
+1,246,40.64
+1,246,30.48
+1,246,35.56
+1,246,40.64
+1,246,10.16
+1,246,33.02
+1,246,55.88
+1,246,45.72
+1,246,30.48
+1,246,7.62
+1,246,27.94
+1,246,33.02
+1,246,81.28
+1,246,55.88
+1,246,81.28
+1,246,30.48
+1,246,30.48
+1,246,53.975
+1,246,40.64
+1,246,81.28
+1,246,7.62
+1,246,15.24
+1,247,19.05
+1,247,30.48
+1,247,19.05
+1,247,35.56
+1,247,7.62
+1,247,40.64
+1,247,81.28
+1,247,35.56
+1,247,46.355
+1,247,24.13
+1,247,53.975
+1,247,40.64
+1,247,7.62
+1,247,33.02
+1,247,40.64
+1,247,40.64
+1,247,27.94
+1,247,27.94
+1,247,55.88
+1,247,7.62
+1,247,27.94
+1,247,30.48
+1,247,50.8
+1,247,30.48
+1,247,63.5
+1,247,7.62
+1,247,40.64
+1,247,7.62
+1,247,27.94
+1,247,55.88
+1,248,63.5
+1,248,7.62
+1,248,22.86
+1,248,33.02
+1,248,10.16
+1,248,35.56
+1,248,35.56
+1,248,45.72
+1,248,8.89
+1,248,35.56
+1,248,10.16
+1,248,7.62
+1,248,45.72
+1,248,45.72
+1,248,81.28
+1,248,27.94
+1,248,55.88
+1,248,33.02
+1,248,30.48
+1,248,19.05
+1,248,7.62
+1,248,44.45
+1,248,24.13
+1,248,30.48
+1,248,10.16
+1,248,55.88
+1,248,40.64
+1,248,40.64
+1,248,63.5
+1,248,35.56
+1,249,10.16
+1,249,55.88
+1,249,7.62
+1,249,35.56
+1,249,55.88
+1,249,53.975
+1,249,7.62
+1,249,53.975
+1,249,24.13
+1,249,99.06
+1,249,8.89
+1,249,7.62
+1,249,7.62
+1,249,7.62
+1,249,44.45
+1,249,7.62
+1,249,33.02
+1,249,7.62
+1,249,55.88
+1,249,63.5
+1,249,35.56
+1,249,44.45
+1,249,8.89
+1,249,33.02
+1,249,50.8
+1,249,30.48
+1,249,33.02
+1,249,63.5
+1,249,53.975
+1,249,8.89
+1,250,33.02
+1,250,27.94
+1,250,7.62
+1,250,8.89
+1,250,24.13
+1,250,40.64
+1,250,24.13
+1,250,33.02
+1,250,33.02
+1,250,10.16
+1,250,24.13
+1,250,35.56
+1,250,40.64
+1,250,33.02
+1,250,46.355
+1,250,40.64
+1,250,40.64
+1,250,15.24
+1,250,40.64
+1,250,8.89
+1,250,7.62
+1,250,63.5
+1,250,7.62
+1,250,33.02
+1,250,7.62
+1,250,99.06
+1,250,24.13
+1,250,45.72
+1,250,99.06
+1,250,7.62
+1,251,40.64
+1,251,40.64
+1,251,33.02
+1,251,7.62
+1,251,7.62
+1,251,10.16
+1,251,33.02
+1,251,45.72
+1,251,7.62
+1,251,46.355
+1,251,35.56
+1,251,30.48
+1,251,15.24
+1,251,35.56
+1,251,33.02
+1,251,10.16
+1,251,50.8
+1,251,35.56
+1,251,8.89
+1,251,15.24
+1,251,24.13
+1,251,55.88
+1,251,7.62
+1,251,7.62
+1,251,10.16
+1,251,44.45
+1,251,27.94
+1,251,24.13
+1,251,7.62
+1,251,55.88
+1,252,40.64
+1,252,33.02
+1,252,8.89
+1,252,27.94
+1,252,55.88
+1,252,99.06
+1,252,44.45
+1,252,33.02
+1,252,33.02
+1,252,99.06
+1,252,7.62
+1,252,53.975
+1,252,30.48
+1,252,7.62
+1,252,53.975
+1,252,46.355
+1,252,33.02
+1,252,7.62
+1,252,81.28
+1,252,35.56
+1,252,44.45
+1,252,27.94
+1,252,7.62
+1,252,19.05
+1,252,35.56
+1,252,33.02
+1,252,10.16
+1,252,24.13
+1,252,35.56
+1,252,33.02
+1,253,22.86
+1,253,33.02
+1,253,33.02
+1,253,63.5
+1,253,27.94
+1,253,53.975
+1,253,33.02
+1,253,33.02
+1,253,46.355
+1,253,10.16
+1,253,27.94
+1,253,45.72
+1,253,7.62
+1,253,40.64
+1,253,15.24
+1,253,33.02
+1,253,44.45
+1,253,63.5
+1,253,40.64
+1,253,24.13
+1,253,35.56
+1,253,10.16
+1,253,22.86
+1,253,35.56
+1,253,15.24
+1,253,81.28
+1,253,35.56
+1,253,7.62
+1,253,40.64
+1,253,44.45
+1,254,27.94
+1,254,33.02
+1,254,7.62
+1,254,55.88
+1,254,35.56
+1,254,22.86
+1,254,50.8
+1,254,10.16
+1,254,50.8
+1,254,7.62
+1,254,40.64
+1,254,10.16
+1,254,53.975
+1,254,40.64
+1,254,45.72
+1,254,55.88
+1,254,40.64
+1,254,33.02
+1,254,7.62
+1,254,44.45
+1,254,55.88
+1,254,44.45
+1,254,35.56
+1,254,7.62
+1,254,35.56
+1,254,7.62
+1,254,35.56
+1,254,45.72
+1,254,35.56
+1,254,99.06
+1,255,81.28
+1,255,10.16
+1,255,7.62
+1,255,99.06
+1,255,10.16
+1,255,7.62
+1,255,99.06
+1,255,33.02
+1,255,50.8
+1,255,10.16
+1,255,99.06
+1,255,7.62
+1,255,55.88
+1,255,10.16
+1,255,10.16
+1,255,44.45
+1,255,63.5
+1,255,44.45
+1,255,7.62
+1,255,15.24
+1,255,24.13
+1,255,7.62
+1,255,40.64
+1,255,99.06
+1,255,10.16
+1,255,7.62
+1,255,7.62
+1,255,7.62
+1,255,19.05
+1,255,53.975
+1,256,40.64
+1,256,7.62
+1,256,8.89
+1,256,10.16
+1,256,15.24
+1,256,7.62
+1,256,30.48
+1,256,40.64
+1,256,81.28
+1,256,55.88
+1,256,22.86
+1,256,15.24
+1,256,10.16
+1,256,7.62
+1,256,7.62
+1,256,55.88
+1,256,50.8
+1,256,15.24
+1,256,24.13
+1,256,55.88
+1,256,99.06
+1,256,7.62
+1,256,33.02
+1,256,7.62
+1,256,7.62
+1,256,40.64
+1,256,10.16
+1,256,81.28
+1,256,7.62
+1,256,50.8
+1,257,7.62
+1,257,50.8
+1,257,53.975
+1,257,7.62
+1,257,55.88
+1,257,33.02
+1,257,8.89
+1,257,15.24
+1,257,24.13
+1,257,7.62
+1,257,7.62
+1,257,40.64
+1,257,46.355
+1,257,7.62
+1,257,7.62
+1,257,40.64
+1,257,44.45
+1,257,22.86
+1,257,7.62
+1,257,30.48
+1,257,10.16
+1,257,7.62
+1,257,10.16
+1,257,35.56
+1,257,81.28
+1,257,7.62
+1,257,99.06
+1,257,44.45
+1,257,81.28
+1,257,24.13
+1,258,35.56
+1,258,55.88
+1,258,10.16
+1,258,22.86
+1,258,33.02
+1,258,99.06
+1,258,35.56
+1,258,99.06
+1,258,24.13
+1,258,7.62
+1,258,35.56
+1,258,55.88
+1,258,33.02
+1,258,63.5
+1,258,30.48
+1,258,99.06
+1,258,53.975
+1,258,10.16
+1,258,10.16
+1,258,30.48
+1,258,40.64
+1,258,50.8
+1,258,35.56
+1,258,99.06
+1,258,8.89
+1,258,10.16
+1,258,44.45
+1,258,33.02
+1,258,7.62
+1,258,10.16
+1,259,15.24
+1,259,7.62
+1,259,35.56
+1,259,7.62
+1,259,45.72
+1,259,40.64
+1,259,19.05
+1,259,7.62
+1,259,33.02
+1,259,40.64
+1,259,53.975
+1,259,33.02
+1,259,22.86
+1,259,7.62
+1,259,22.86
+1,259,19.05
+1,259,63.5
+1,259,10.16
+1,259,8.89
+1,259,35.56
+1,259,46.355
+1,259,7.62
+1,259,40.64
+1,259,81.28
+1,259,7.62
+1,259,46.355
+1,259,35.56
+1,259,40.64
+1,259,7.62
+1,259,33.02
+1,260,33.02
+1,260,33.02
+1,260,8.89
+1,260,33.02
+1,260,50.8
+1,260,7.62
+1,260,35.56
+1,260,33.02
+1,260,40.64
+1,260,35.56
+1,260,53.975
+1,260,10.16
+1,260,27.94
+1,260,24.13
+1,260,10.16
+1,260,24.13
+1,260,35.56
+1,260,7.62
+1,260,8.89
+1,260,81.28
+1,260,63.5
+1,260,63.5
+1,260,10.16
+1,260,10.16
+1,260,30.48
+1,260,7.62
+1,260,35.56
+1,260,7.62
+1,260,19.05
+1,260,33.02
+1,261,10.16
+1,261,44.45
+1,261,7.62
+1,261,33.02
+1,261,24.13
+1,261,7.62
+1,261,45.72
+1,261,30.48
+1,261,40.64
+1,261,33.02
+1,261,7.62
+1,261,7.62
+1,261,50.8
+1,261,63.5
+1,261,7.62
+1,261,44.45
+1,261,35.56
+1,261,15.24
+1,261,7.62
+1,261,63.5
+1,261,35.56
+1,261,15.24
+1,261,44.45
+1,261,40.64
+1,261,99.06
+1,261,44.45
+1,261,7.62
+1,261,33.02
+1,261,30.48
+1,261,33.02
+1,262,33.02
+1,262,24.13
+1,262,33.02
+1,262,33.02
+1,262,35.56
+1,262,35.56
+1,262,55.88
+1,262,24.13
+1,262,7.62
+1,262,63.5
+1,262,45.72
+1,262,8.89
+1,262,63.5
+1,262,44.45
+1,262,40.64
+1,262,19.05
+1,262,40.64
+1,262,40.64
+1,262,40.64
+1,262,22.86
+1,262,44.45
+1,262,44.45
+1,262,22.86
+1,262,46.355
+1,262,33.02
+1,262,15.24
+1,262,33.02
+1,262,46.355
+1,262,44.45
+1,262,7.62
+1,263,8.89
+1,263,19.05
+1,263,7.62
+1,263,53.975
+1,263,63.5
+1,263,7.62
+1,263,35.56
+1,263,45.72
+1,263,46.355
+1,263,24.13
+1,263,53.975
+1,263,7.62
+1,263,63.5
+1,263,35.56
+1,263,33.02
+1,263,44.45
+1,263,7.62
+1,263,40.64
+1,263,81.28
+1,263,19.05
+1,263,24.13
+1,263,33.02
+1,263,27.94
+1,263,63.5
+1,263,7.62
+1,263,27.94
+1,263,7.62
+1,263,7.62
+1,263,15.24
+1,263,7.62
+1,264,7.62
+1,264,46.355
+1,264,33.02
+1,264,10.16
+1,264,7.62
+1,264,99.06
+1,264,8.89
+1,264,27.94
+1,264,15.24
+1,264,7.62
+1,264,7.62
+1,264,10.16
+1,264,7.62
+1,264,99.06
+1,264,8.89
+1,264,35.56
+1,264,45.72
+1,264,44.45
+1,264,22.86
+1,264,45.72
+1,264,15.24
+1,264,35.56
+1,264,7.62
+1,264,7.62
+1,264,40.64
+1,264,15.24
+1,264,7.62
+1,264,22.86
+1,264,33.02
+1,264,63.5
+1,265,40.64
+1,265,33.02
+1,265,33.02
+1,265,8.89
+1,265,33.02
+1,265,19.05
+1,265,50.8
+1,265,40.64
+1,265,33.02
+1,265,7.62
+1,265,33.02
+1,265,35.56
+1,265,7.62
+1,265,45.72
+1,265,7.62
+1,265,99.06
+1,265,10.16
+1,265,40.64
+1,265,8.89
+1,265,81.28
+1,265,63.5
+1,265,10.16
+1,265,30.48
+1,265,15.24
+1,265,81.28
+1,265,7.62
+1,265,8.89
+1,265,46.355
+1,265,63.5
+1,265,33.02
+1,266,35.56
+1,266,30.48
+1,266,81.28
+1,266,50.8
+1,266,81.28
+1,266,50.8
+1,266,7.62
+1,266,55.88
+1,266,44.45
+1,266,35.56
+1,266,53.975
+1,266,46.355
+1,266,40.64
+1,266,10.16
+1,266,7.62
+1,266,33.02
+1,266,27.94
+1,266,33.02
+1,266,8.89
+1,266,24.13
+1,266,22.86
+1,266,55.88
+1,266,63.5
+1,266,15.24
+1,266,35.56
+1,266,33.02
+1,266,35.56
+1,266,7.62
+1,266,15.24
+1,266,53.975
+1,267,10.16
+1,267,15.24
+1,267,24.13
+1,267,27.94
+1,267,7.62
+1,267,35.56
+1,267,8.89
+1,267,40.64
+1,267,35.56
+1,267,15.24
+1,267,50.8
+1,267,33.02
+1,267,50.8
+1,267,50.8
+1,267,7.62
+1,267,33.02
+1,267,40.64
+1,267,45.72
+1,267,81.28
+1,267,53.975
+1,267,33.02
+1,267,45.72
+1,267,46.355
+1,267,30.48
+1,267,22.86
+1,267,7.62
+1,267,81.28
+1,267,53.975
+1,267,33.02
+1,267,40.64
+1,268,45.72
+1,268,19.05
+1,268,30.48
+1,268,24.13
+1,268,27.94
+1,268,81.28
+1,268,63.5
+1,268,40.64
+1,268,99.06
+1,268,22.86
+1,268,24.13
+1,268,10.16
+1,268,35.56
+1,268,19.05
+1,268,50.8
+1,268,44.45
+1,268,46.355
+1,268,7.62
+1,268,15.24
+1,268,55.88
+1,268,10.16
+1,268,50.8
+1,268,22.86
+1,268,53.975
+1,268,53.975
+1,268,40.64
+1,268,10.16
+1,268,27.94
+1,268,27.94
+1,268,53.975
+1,269,30.48
+1,269,22.86
+1,269,27.94
+1,269,27.94
+1,269,7.62
+1,269,22.86
+1,269,8.89
+1,269,7.62
+1,269,53.975
+1,269,10.16
+1,269,7.62
+1,269,7.62
+1,269,7.62
+1,269,53.975
+1,269,15.24
+1,269,8.89
+1,269,40.64
+1,269,33.02
+1,269,45.72
+1,269,15.24
+1,269,40.64
+1,269,35.56
+1,269,33.02
+1,269,24.13
+1,269,15.24
+1,269,7.62
+1,269,33.02
+1,269,19.05
+1,269,7.62
+1,269,30.48
+1,270,55.88
+1,270,40.64
+1,270,7.62
+1,270,30.48
+1,270,10.16
+1,270,55.88
+1,270,27.94
+1,270,10.16
+1,270,40.64
+1,270,53.975
+1,270,63.5
+1,270,33.02
+1,270,50.8
+1,270,7.62
+1,270,44.45
+1,270,10.16
+1,270,7.62
+1,270,7.62
+1,270,7.62
+1,270,33.02
+1,270,7.62
+1,270,44.45
+1,270,46.355
+1,270,53.975
+1,270,24.13
+1,270,19.05
+1,270,63.5
+1,270,7.62
+1,270,33.02
+1,270,46.355
+1,271,33.02
+1,271,63.5
+1,271,55.88
+1,271,7.62
+1,271,19.05
+1,271,33.02
+1,271,46.355
+1,271,33.02
+1,271,10.16
+1,271,35.56
+1,271,40.64
+1,271,7.62
+1,271,22.86
+1,271,7.62
+1,271,10.16
+1,271,22.86
+1,271,10.16
+1,271,33.02
+1,271,19.05
+1,271,35.56
+1,271,81.28
+1,271,45.72
+1,271,15.24
+1,271,7.62
+1,271,35.56
+1,271,45.72
+1,271,55.88
+1,271,7.62
+1,271,35.56
+1,271,7.62
+1,272,55.88
+1,272,7.62
+1,272,40.64
+1,272,7.62
+1,272,99.06
+1,272,40.64
+1,272,24.13
+1,272,40.64
+1,272,46.355
+1,272,27.94
+1,272,40.64
+1,272,7.62
+1,272,40.64
+1,272,53.975
+1,272,99.06
+1,272,33.02
+1,272,22.86
+1,272,10.16
+1,272,81.28
+1,272,81.28
+1,272,10.16
+1,272,30.48
+1,272,81.28
+1,272,63.5
+1,272,55.88
+1,272,27.94
+1,272,81.28
+1,272,7.62
+1,272,27.94
+1,272,45.72
+1,273,7.62
+1,273,40.64
+1,273,45.72
+1,273,22.86
+1,273,81.28
+1,273,35.56
+1,273,15.24
+1,273,10.16
+1,273,7.62
+1,273,7.62
+1,273,27.94
+1,273,24.13
+1,273,35.56
+1,273,50.8
+1,273,46.355
+1,273,7.62
+1,273,33.02
+1,273,50.8
+1,273,55.88
+1,273,19.05
+1,273,33.02
+1,273,7.62
+1,273,46.355
+1,273,10.16
+1,273,30.48
+1,273,33.02
+1,273,10.16
+1,273,44.45
+1,273,40.64
+1,273,99.06
+1,274,8.89
+1,274,10.16
+1,274,7.62
+1,274,33.02
+1,274,24.13
+1,274,7.62
+1,274,15.24
+1,274,35.56
+1,274,33.02
+1,274,10.16
+1,274,55.88
+1,274,81.28
+1,274,7.62
+1,274,15.24
+1,274,40.64
+1,274,27.94
+1,274,44.45
+1,274,99.06
+1,274,40.64
+1,274,15.24
+1,274,40.64
+1,274,81.28
+1,274,40.64
+1,274,35.56
+1,274,10.16
+1,274,22.86
+1,274,10.16
+1,274,81.28
+1,274,7.62
+1,274,7.62
+1,275,63.5
+1,275,50.8
+1,275,33.02
+1,275,15.24
+1,275,7.62
+1,275,33.02
+1,275,55.88
+1,275,40.64
+1,275,10.16
+1,275,22.86
+1,275,15.24
+1,275,33.02
+1,275,81.28
+1,275,46.355
+1,275,15.24
+1,275,53.975
+1,275,35.56
+1,275,50.8
+1,275,10.16
+1,275,40.64
+1,275,22.86
+1,275,55.88
+1,275,40.64
+1,275,99.06
+1,275,35.56
+1,275,22.86
+1,275,63.5
+1,275,33.02
+1,275,40.64
+1,275,63.5
+1,276,7.62
+1,276,10.16
+1,276,27.94
+1,276,44.45
+1,276,30.48
+1,276,81.28
+1,276,81.28
+1,276,44.45
+1,276,45.72
+1,276,40.64
+1,276,8.89
+1,276,8.89
+1,276,22.86
+1,276,35.56
+1,276,53.975
+1,276,7.62
+1,276,19.05
+1,276,40.64
+1,276,24.13
+1,276,40.64
+1,276,46.355
+1,276,55.88
+1,276,7.62
+1,276,24.13
+1,276,7.62
+1,276,7.62
+1,276,55.88
+1,276,81.28
+1,276,50.8
+1,276,33.02
+1,277,35.56
+1,277,10.16
+1,277,63.5
+1,277,24.13
+1,277,22.86
+1,277,99.06
+1,277,7.62
+1,277,30.48
+1,277,40.64
+1,277,99.06
+1,277,19.05
+1,277,19.05
+1,277,7.62
+1,277,40.64
+1,277,19.05
+1,277,53.975
+1,277,46.355
+1,277,15.24
+1,277,7.62
+1,277,7.62
+1,277,22.86
+1,277,46.355
+1,277,50.8
+1,277,99.06
+1,277,27.94
+1,277,10.16
+1,277,30.48
+1,277,33.02
+1,277,7.62
+1,277,40.64
+1,278,40.64
+1,278,33.02
+1,278,7.62
+1,278,24.13
+1,278,35.56
+1,278,40.64
+1,278,7.62
+1,278,7.62
+1,278,7.62
+1,278,81.28
+1,278,7.62
+1,278,22.86
+1,278,44.45
+1,278,7.62
+1,278,7.62
+1,278,35.56
+1,278,35.56
+1,278,7.62
+1,278,33.02
+1,278,7.62
+1,278,44.45
+1,278,50.8
+1,278,40.64
+1,278,19.05
+1,278,7.62
+1,278,15.24
+1,278,22.86
+1,278,15.24
+1,278,10.16
+1,278,19.05
+1,279,40.64
+1,279,35.56
+1,279,22.86
+1,279,10.16
+1,279,33.02
+1,279,46.355
+1,279,45.72
+1,279,7.62
+1,279,46.355
+1,279,81.28
+1,279,81.28
+1,279,50.8
+1,279,10.16
+1,279,45.72
+1,279,46.355
+1,279,33.02
+1,279,7.62
+1,279,8.89
+1,279,55.88
+1,279,10.16
+1,279,35.56
+1,279,33.02
+1,279,10.16
+1,279,24.13
+1,279,33.02
+1,279,24.13
+1,279,22.86
+1,279,24.13
+1,279,7.62
+1,279,45.72
+1,280,44.45
+1,280,99.06
+1,280,33.02
+1,280,46.355
+1,280,40.64
+1,280,40.64
+1,280,45.72
+1,280,24.13
+1,280,44.45
+1,280,40.64
+1,280,30.48
+1,280,30.48
+1,280,27.94
+1,280,22.86
+1,280,30.48
+1,280,33.02
+1,280,63.5
+1,280,35.56
+1,280,30.48
+1,280,81.28
+1,280,7.62
+1,280,15.24
+1,280,81.28
+1,280,46.355
+1,280,55.88
+1,280,10.16
+1,280,22.86
+1,280,30.48
+1,280,55.88
+1,280,22.86
+1,281,33.02
+1,281,33.02
+1,281,55.88
+1,281,10.16
+1,281,15.24
+1,281,35.56
+1,281,46.355
+1,281,45.72
+1,281,46.355
+1,281,27.94
+1,281,19.05
+1,281,35.56
+1,281,33.02
+1,281,7.62
+1,281,10.16
+1,281,33.02
+1,281,63.5
+1,281,33.02
+1,281,8.89
+1,281,33.02
+1,281,7.62
+1,281,81.28
+1,281,7.62
+1,281,33.02
+1,281,10.16
+1,281,24.13
+1,281,10.16
+1,281,7.62
+1,281,19.05
+1,281,33.02
+1,282,53.975
+1,282,63.5
+1,282,19.05
+1,282,7.62
+1,282,40.64
+1,282,33.02
+1,282,15.24
+1,282,33.02
+1,282,15.24
+1,282,7.62
+1,282,7.62
+1,282,46.355
+1,282,10.16
+1,282,7.62
+1,282,53.975
+1,282,35.56
+1,282,22.86
+1,282,35.56
+1,282,7.62
+1,282,45.72
+1,282,50.8
+1,282,53.975
+1,282,7.62
+1,282,55.88
+1,282,7.62
+1,282,63.5
+1,282,40.64
+1,282,7.62
+1,282,15.24
+1,282,81.28
+1,283,63.5
+1,283,33.02
+1,283,8.89
+1,283,55.88
+1,283,99.06
+1,283,10.16
+1,283,45.72
+1,283,19.05
+1,283,7.62
+1,283,44.45
+1,283,99.06
+1,283,35.56
+1,283,50.8
+1,283,7.62
+1,283,33.02
+1,283,7.62
+1,283,63.5
+1,283,7.62
+1,283,55.88
+1,283,46.355
+1,283,22.86
+1,283,45.72
+1,283,30.48
+1,283,7.62
+1,283,53.975
+1,283,33.02
+1,283,46.355
+1,283,7.62
+1,283,30.48
+1,283,15.24
+1,284,40.64
+1,284,99.06
+1,284,35.56
+1,284,63.5
+1,284,30.48
+1,284,19.05
+1,284,81.28
+1,284,22.86
+1,284,19.05
+1,284,55.88
+1,284,30.48
+1,284,22.86
+1,284,19.05
+1,284,22.86
+1,284,44.45
+1,284,15.24
+1,284,15.24
+1,284,19.05
+1,284,19.05
+1,284,46.355
+1,284,7.62
+1,284,50.8
+1,284,15.24
+1,284,7.62
+1,284,7.62
+1,284,10.16
+1,284,81.28
+1,284,7.62
+1,284,55.88
+1,284,46.355
+1,285,27.94
+1,285,55.88
+1,285,81.28
+1,285,7.62
+1,285,63.5
+1,285,63.5
+1,285,44.45
+1,285,45.72
+1,285,7.62
+1,285,81.28
+1,285,63.5
+1,285,33.02
+1,285,10.16
+1,285,55.88
+1,285,50.8
+1,285,53.975
+1,285,8.89
+1,285,33.02
+1,285,7.62
+1,285,30.48
+1,285,35.56
+1,285,35.56
+1,285,40.64
+1,285,46.355
+1,285,10.16
+1,285,7.62
+1,285,10.16
+1,285,22.86
+1,285,40.64
+1,285,7.62
+1,286,7.62
+1,286,99.06
+1,286,7.62
+1,286,33.02
+1,286,27.94
+1,286,24.13
+1,286,55.88
+1,286,40.64
+1,286,7.62
+1,286,46.355
+1,286,35.56
+1,286,7.62
+1,286,33.02
+1,286,40.64
+1,286,35.56
+1,286,15.24
+1,286,8.89
+1,286,40.64
+1,286,53.975
+1,286,33.02
+1,286,55.88
+1,286,27.94
+1,286,10.16
+1,286,40.64
+1,286,7.62
+1,286,24.13
+1,286,63.5
+1,286,19.05
+1,286,35.56
+1,286,53.975
+1,287,7.62
+1,287,40.64
+1,287,45.72
+1,287,19.05
+1,287,7.62
+1,287,63.5
+1,287,7.62
+1,287,7.62
+1,287,33.02
+1,287,40.64
+1,287,33.02
+1,287,99.06
+1,287,40.64
+1,287,99.06
+1,287,8.89
+1,287,63.5
+1,287,63.5
+1,287,53.975
+1,287,81.28
+1,287,7.62
+1,287,7.62
+1,287,7.62
+1,287,33.02
+1,287,45.72
+1,287,63.5
+1,287,45.72
+1,287,44.45
+1,287,24.13
+1,287,44.45
+1,287,40.64
+1,288,81.28
+1,288,35.56
+1,288,44.45
+1,288,35.56
+1,288,45.72
+1,288,35.56
+1,288,22.86
+1,288,15.24
+1,288,8.89
+1,288,7.62
+1,288,63.5
+1,288,22.86
+1,288,7.62
+1,288,53.975
+1,288,33.02
+1,288,35.56
+1,288,55.88
+1,288,55.88
+1,288,19.05
+1,288,33.02
+1,288,7.62
+1,288,33.02
+1,288,19.05
+1,288,33.02
+1,288,7.62
+1,288,55.88
+1,288,99.06
+1,288,35.56
+1,288,7.62
+1,288,50.8
+1,289,7.62
+1,289,10.16
+1,289,7.62
+1,289,8.89
+1,289,53.975
+1,289,99.06
+1,289,53.975
+1,289,99.06
+1,289,63.5
+1,289,24.13
+1,289,40.64
+1,289,63.5
+1,289,46.355
+1,289,40.64
+1,289,30.48
+1,289,63.5
+1,289,44.45
+1,289,22.86
+1,289,7.62
+1,289,35.56
+1,289,10.16
+1,289,10.16
+1,289,7.62
+1,289,55.88
+1,289,81.28
+1,289,44.45
+1,289,40.64
+1,289,35.56
+1,289,44.45
+1,289,15.24
+1,290,33.02
+1,290,44.45
+1,290,99.06
+1,290,8.89
+1,290,7.62
+1,290,35.56
+1,290,15.24
+1,290,19.05
+1,290,10.16
+1,290,22.86
+1,290,24.13
+1,290,33.02
+1,290,99.06
+1,290,35.56
+1,290,35.56
+1,290,33.02
+1,290,33.02
+1,290,15.24
+1,290,15.24
+1,290,99.06
+1,290,46.355
+1,290,44.45
+1,290,22.86
+1,290,7.62
+1,290,7.62
+1,290,15.24
+1,290,50.8
+1,290,24.13
+1,290,22.86
+1,290,30.48
+1,291,7.62
+1,291,7.62
+1,291,30.48
+1,291,50.8
+1,291,40.64
+1,291,19.05
+1,291,63.5
+1,291,44.45
+1,291,24.13
+1,291,55.88
+1,291,7.62
+1,291,44.45
+1,291,63.5
+1,291,81.28
+1,291,33.02
+1,291,35.56
+1,291,8.89
+1,291,24.13
+1,291,30.48
+1,291,33.02
+1,291,35.56
+1,291,45.72
+1,291,53.975
+1,291,7.62
+1,291,10.16
+1,291,7.62
+1,291,30.48
+1,291,35.56
+1,291,45.72
+1,291,55.88
+1,292,33.02
+1,292,10.16
+1,292,35.56
+1,292,35.56
+1,292,55.88
+1,292,7.62
+1,292,99.06
+1,292,15.24
+1,292,7.62
+1,292,33.02
+1,292,33.02
+1,292,22.86
+1,292,55.88
+1,292,46.355
+1,292,45.72
+1,292,7.62
+1,292,63.5
+1,292,45.72
+1,292,15.24
+1,292,45.72
+1,292,63.5
+1,292,15.24
+1,292,33.02
+1,292,33.02
+1,292,7.62
+1,292,46.355
+1,292,7.62
+1,292,63.5
+1,292,55.88
+1,292,40.64
+1,293,33.02
+1,293,19.05
+1,293,33.02
+1,293,24.13
+1,293,33.02
+1,293,33.02
+1,293,53.975
+1,293,7.62
+1,293,99.06
+1,293,33.02
+1,293,44.45
+1,293,35.56
+1,293,24.13
+1,293,99.06
+1,293,33.02
+1,293,7.62
+1,293,7.62
+1,293,15.24
+1,293,44.45
+1,293,33.02
+1,293,7.62
+1,293,81.28
+1,293,19.05
+1,293,8.89
+1,293,22.86
+1,293,19.05
+1,293,45.72
+1,293,10.16
+1,293,50.8
+1,293,24.13
+1,294,30.48
+1,294,7.62
+1,294,7.62
+1,294,40.64
+1,294,7.62
+1,294,44.45
+1,294,99.06
+1,294,63.5
+1,294,30.48
+1,294,35.56
+1,294,7.62
+1,294,99.06
+1,294,7.62
+1,294,7.62
+1,294,33.02
+1,294,99.06
+1,294,7.62
+1,294,55.88
+1,294,35.56
+1,294,99.06
+1,294,24.13
+1,294,7.62
+1,294,63.5
+1,294,33.02
+1,294,55.88
+1,294,33.02
+1,294,19.05
+1,294,7.62
+1,294,53.975
+1,294,99.06
+1,295,55.88
+1,295,45.72
+1,295,63.5
+1,295,33.02
+1,295,45.72
+1,295,35.56
+1,295,27.94
+1,295,7.62
+1,295,44.45
+1,295,33.02
+1,295,50.8
+1,295,35.56
+1,295,30.48
+1,295,24.13
+1,295,33.02
+1,295,30.48
+1,295,63.5
+1,295,27.94
+1,295,7.62
+1,295,24.13
+1,295,35.56
+1,295,7.62
+1,295,40.64
+1,295,33.02
+1,295,35.56
+1,295,99.06
+1,295,7.62
+1,295,63.5
+1,295,33.02
+1,295,40.64
+1,296,19.05
+1,296,63.5
+1,296,7.62
+1,296,10.16
+1,296,7.62
+1,296,40.64
+1,296,99.06
+1,296,27.94
+1,296,8.89
+1,296,40.64
+1,296,10.16
+1,296,15.24
+1,296,33.02
+1,296,7.62
+1,296,10.16
+1,296,53.975
+1,296,46.355
+1,296,7.62
+1,296,33.02
+1,296,46.355
+1,296,33.02
+1,296,50.8
+1,296,7.62
+1,296,40.64
+1,296,10.16
+1,296,7.62
+1,296,99.06
+1,296,19.05
+1,296,15.24
+1,296,33.02
+1,297,81.28
+1,297,33.02
+1,297,55.88
+1,297,40.64
+1,297,10.16
+1,297,19.05
+1,297,45.72
+1,297,45.72
+1,297,40.64
+1,297,15.24
+1,297,50.8
+1,297,99.06
+1,297,35.56
+1,297,46.355
+1,297,7.62
+1,297,55.88
+1,297,63.5
+1,297,10.16
+1,297,40.64
+1,297,10.16
+1,297,81.28
+1,297,7.62
+1,297,7.62
+1,297,10.16
+1,297,10.16
+1,297,40.64
+1,297,10.16
+1,297,8.89
+1,297,45.72
+1,297,7.62
+1,298,24.13
+1,298,7.62
+1,298,40.64
+1,298,35.56
+1,298,35.56
+1,298,99.06
+1,298,50.8
+1,298,55.88
+1,298,10.16
+1,298,24.13
+1,298,44.45
+1,298,7.62
+1,298,46.355
+1,298,63.5
+1,298,10.16
+1,298,7.62
+1,298,27.94
+1,298,7.62
+1,298,35.56
+1,298,40.64
+1,298,7.62
+1,298,7.62
+1,298,33.02
+1,298,40.64
+1,298,24.13
+1,298,7.62
+1,298,7.62
+1,298,10.16
+1,298,81.28
+1,298,7.62
+1,299,46.355
+1,299,10.16
+1,299,81.28
+1,299,22.86
+1,299,35.56
+1,299,40.64
+1,299,22.86
+1,299,50.8
+1,299,35.56
+1,299,8.89
+1,299,24.13
+1,299,10.16
+1,299,35.56
+1,299,10.16
+1,299,24.13
+1,299,53.975
+1,299,63.5
+1,299,45.72
+1,299,7.62
+1,299,19.05
+1,299,33.02
+1,299,7.62
+1,299,40.64
+1,299,27.94
+1,299,63.5
+1,299,27.94
+1,299,40.64
+1,299,35.56
+1,299,33.02
+1,299,40.64
+1,300,19.05
+1,300,35.56
+1,300,7.62
+1,300,30.48
+1,300,15.24
+1,300,19.05
+1,300,44.45
+1,300,40.64
+1,300,35.56
+1,300,33.02
+1,300,7.62
+1,300,33.02
+1,300,99.06
+1,300,35.56
+1,300,7.62
+1,300,40.64
+1,300,44.45
+1,300,99.06
+1,300,22.86
+1,300,7.62
+1,300,44.45
+1,300,99.06
+1,300,10.16
+1,300,33.02
+1,300,55.88
+1,300,19.05
+1,300,99.06
+1,300,35.56
+1,300,40.64
+1,300,7.62
+1,301,7.62
+1,301,10.16
+1,301,7.62
+1,301,50.8
+1,301,22.86
+1,301,46.355
+1,301,7.62
+1,301,35.56
+1,301,81.28
+1,301,81.28
+1,301,19.05
+1,301,50.8
+1,301,40.64
+1,301,10.16
+1,301,99.06
+1,301,45.72
+1,301,81.28
+1,301,30.48
+1,301,7.62
+1,301,40.64
+1,301,30.48
+1,301,53.975
+1,301,44.45
+1,301,63.5
+1,301,44.45
+1,301,40.64
+1,301,63.5
+1,301,7.62
+1,301,7.62
+1,301,40.64
+1,302,7.62
+1,302,44.45
+1,302,7.62
+1,302,50.8
+1,302,7.62
+1,302,35.56
+1,302,33.02
+1,302,27.94
+1,302,19.05
+1,302,19.05
+1,302,63.5
+1,302,7.62
+1,302,27.94
+1,302,45.72
+1,302,30.48
+1,302,7.62
+1,302,7.62
+1,302,33.02
+1,302,40.64
+1,302,15.24
+1,302,27.94
+1,302,55.88
+1,302,40.64
+1,302,45.72
+1,302,10.16
+1,302,24.13
+1,302,7.62
+1,302,81.28
+1,302,7.62
+1,302,40.64
+1,303,24.13
+1,303,7.62
+1,303,33.02
+1,303,40.64
+1,303,7.62
+1,303,22.86
+1,303,53.975
+1,303,44.45
+1,303,50.8
+1,303,33.02
+1,303,45.72
+1,303,53.975
+1,303,10.16
+1,303,44.45
+1,303,33.02
+1,303,7.62
+1,303,33.02
+1,303,81.28
+1,303,7.62
+1,303,50.8
+1,303,35.56
+1,303,27.94
+1,303,63.5
+1,303,53.975
+1,303,44.45
+1,303,24.13
+1,303,45.72
+1,303,7.62
+1,303,81.28
+1,303,46.355
+1,304,7.62
+1,304,30.48
+1,304,27.94
+1,304,27.94
+1,304,30.48
+1,304,50.8
+1,304,44.45
+1,304,7.62
+1,304,99.06
+1,304,99.06
+1,304,19.05
+1,304,44.45
+1,304,50.8
+1,304,45.72
+1,304,7.62
+1,304,35.56
+1,304,7.62
+1,304,55.88
+1,304,19.05
+1,304,10.16
+1,304,81.28
+1,304,7.62
+1,304,40.64
+1,304,45.72
+1,304,33.02
+1,304,27.94
+1,304,44.45
+1,304,44.45
+1,304,7.62
+1,304,7.62
+1,305,7.62
+1,305,35.56
+1,305,7.62
+1,305,7.62
+1,305,33.02
+1,305,53.975
+1,305,44.45
+1,305,19.05
+1,305,55.88
+1,305,33.02
+1,305,7.62
+1,305,10.16
+1,305,45.72
+1,305,7.62
+1,305,8.89
+1,305,7.62
+1,305,10.16
+1,305,99.06
+1,305,8.89
+1,305,53.975
+1,305,53.975
+1,305,7.62
+1,305,7.62
+1,305,19.05
+1,305,81.28
+1,305,22.86
+1,305,53.975
+1,305,55.88
+1,305,53.975
+1,305,7.62
+1,306,53.975
+1,306,7.62
+1,306,24.13
+1,306,35.56
+1,306,33.02
+1,306,7.62
+1,306,10.16
+1,306,27.94
+1,306,46.355
+1,306,27.94
+1,306,35.56
+1,306,7.62
+1,306,7.62
+1,306,46.355
+1,306,8.89
+1,306,15.24
+1,306,99.06
+1,306,7.62
+1,306,7.62
+1,306,7.62
+1,306,40.64
+1,306,7.62
+1,306,99.06
+1,306,10.16
+1,306,7.62
+1,306,35.56
+1,306,45.72
+1,306,27.94
+1,306,7.62
+1,306,55.88
+1,307,10.16
+1,307,15.24
+1,307,33.02
+1,307,50.8
+1,307,55.88
+1,307,44.45
+1,307,35.56
+1,307,46.355
+1,307,22.86
+1,307,40.64
+1,307,99.06
+1,307,7.62
+1,307,33.02
+1,307,27.94
+1,307,81.28
+1,307,35.56
+1,307,81.28
+1,307,33.02
+1,307,81.28
+1,307,7.62
+1,307,7.62
+1,307,7.62
+1,307,7.62
+1,307,35.56
+1,307,7.62
+1,307,24.13
+1,307,27.94
+1,307,10.16
+1,307,22.86
+1,307,50.8
+1,308,33.02
+1,308,44.45
+1,308,40.64
+1,308,63.5
+1,308,24.13
+1,308,33.02
+1,308,7.62
+1,308,40.64
+1,308,10.16
+1,308,40.64
+1,308,7.62
+1,308,46.355
+1,308,55.88
+1,308,46.355
+1,308,30.48
+1,308,7.62
+1,308,35.56
+1,308,50.8
+1,308,33.02
+1,308,35.56
+1,308,50.8
+1,308,33.02
+1,308,46.355
+1,308,99.06
+1,308,99.06
+1,308,35.56
+1,308,10.16
+1,308,35.56
+1,308,33.02
+1,308,45.72
+1,309,81.28
+1,309,53.975
+1,309,7.62
+1,309,50.8
+1,309,81.28
+1,309,7.62
+1,309,81.28
+1,309,35.56
+1,309,15.24
+1,309,33.02
+1,309,50.8
+1,309,40.64
+1,309,33.02
+1,309,24.13
+1,309,99.06
+1,309,19.05
+1,309,10.16
+1,309,7.62
+1,309,45.72
+1,309,81.28
+1,309,50.8
+1,309,7.62
+1,309,33.02
+1,309,8.89
+1,309,15.24
+1,309,8.89
+1,309,35.56
+1,309,22.86
+1,309,10.16
+1,309,99.06
+1,310,99.06
+1,310,27.94
+1,310,44.45
+1,310,40.64
+1,310,44.45
+1,310,10.16
+1,310,10.16
+1,310,50.8
+1,310,7.62
+1,310,22.86
+1,310,7.62
+1,310,15.24
+1,310,46.355
+1,310,7.62
+1,310,33.02
+1,310,15.24
+1,310,7.62
+1,310,63.5
+1,310,27.94
+1,310,45.72
+1,310,19.05
+1,310,55.88
+1,310,50.8
+1,310,35.56
+1,310,22.86
+1,310,15.24
+1,310,44.45
+1,310,46.355
+1,310,55.88
+1,310,10.16
+1,311,40.64
+1,311,45.72
+1,311,53.975
+1,311,53.975
+1,311,35.56
+1,311,7.62
+1,311,7.62
+1,311,35.56
+1,311,53.975
+1,311,33.02
+1,311,22.86
+1,311,45.72
+1,311,35.56
+1,311,81.28
+1,311,10.16
+1,311,55.88
+1,311,53.975
+1,311,44.45
+1,311,53.975
+1,311,40.64
+1,311,40.64
+1,311,8.89
+1,311,99.06
+1,311,8.89
+1,311,10.16
+1,311,24.13
+1,311,81.28
+1,311,50.8
+1,311,81.28
+1,311,24.13
+1,312,10.16
+1,312,50.8
+1,312,44.45
+1,312,99.06
+1,312,53.975
+1,312,7.62
+1,312,45.72
+1,312,7.62
+1,312,8.89
+1,312,7.62
+1,312,7.62
+1,312,19.05
+1,312,53.975
+1,312,50.8
+1,312,15.24
+1,312,19.05
+1,312,40.64
+1,312,63.5
+1,312,22.86
+1,312,40.64
+1,312,24.13
+1,312,46.355
+1,312,7.62
+1,312,46.355
+1,312,81.28
+1,312,33.02
+1,312,27.94
+1,312,27.94
+1,312,30.48
+1,312,44.45
+1,313,19.05
+1,313,8.89
+1,313,40.64
+1,313,33.02
+1,313,7.62
+1,313,10.16
+1,313,53.975
+1,313,55.88
+1,313,45.72
+1,313,19.05
+1,313,24.13
+1,313,8.89
+1,313,46.355
+1,313,55.88
+1,313,63.5
+1,313,27.94
+1,313,50.8
+1,313,35.56
+1,313,33.02
+1,313,27.94
+1,313,63.5
+1,313,10.16
+1,313,35.56
+1,313,40.64
+1,313,40.64
+1,313,27.94
+1,313,33.02
+1,313,33.02
+1,313,7.62
+1,313,40.64
+1,314,35.56
+1,314,7.62
+1,314,22.86
+1,314,7.62
+1,314,81.28
+1,314,30.48
+1,314,7.62
+1,314,40.64
+1,314,7.62
+1,314,45.72
+1,314,7.62
+1,314,15.24
+1,314,7.62
+1,314,33.02
+1,314,53.975
+1,314,30.48
+1,314,40.64
+1,314,7.62
+1,314,30.48
+1,314,99.06
+1,314,55.88
+1,314,22.86
+1,314,7.62
+1,314,30.48
+1,314,35.56
+1,314,8.89
+1,314,35.56
+1,314,35.56
+1,314,40.64
+1,314,33.02
+1,315,53.975
+1,315,50.8
+1,315,7.62
+1,315,7.62
+1,315,22.86
+1,315,33.02
+1,315,99.06
+1,315,33.02
+1,315,35.56
+1,315,10.16
+1,315,7.62
+1,315,44.45
+1,315,22.86
+1,315,99.06
+1,315,50.8
+1,315,33.02
+1,315,8.89
+1,315,44.45
+1,315,35.56
+1,315,35.56
+1,315,33.02
+1,315,7.62
+1,315,55.88
+1,315,50.8
+1,315,7.62
+1,315,99.06
+1,315,55.88
+1,315,15.24
+1,315,30.48
+1,315,10.16
+1,316,35.56
+1,316,10.16
+1,316,15.24
+1,316,33.02
+1,316,15.24
+1,316,55.88
+1,316,99.06
+1,316,55.88
+1,316,10.16
+1,316,53.975
+1,316,55.88
+1,316,7.62
+1,316,50.8
+1,316,33.02
+1,316,22.86
+1,316,40.64
+1,316,44.45
+1,316,63.5
+1,316,33.02
+1,316,33.02
+1,316,7.62
+1,316,10.16
+1,316,10.16
+1,316,19.05
+1,316,7.62
+1,316,35.56
+1,316,19.05
+1,316,8.89
+1,316,81.28
+1,316,7.62
+1,317,35.56
+1,317,7.62
+1,317,10.16
+1,317,7.62
+1,317,33.02
+1,317,46.355
+1,317,44.45
+1,317,35.56
+1,317,45.72
+1,317,10.16
+1,317,45.72
+1,317,19.05
+1,317,7.62
+1,317,7.62
+1,317,22.86
+1,317,7.62
+1,317,10.16
+1,317,40.64
+1,317,46.355
+1,317,24.13
+1,317,81.28
+1,317,10.16
+1,317,19.05
+1,317,55.88
+1,317,44.45
+1,317,33.02
+1,317,46.355
+1,317,81.28
+1,317,7.62
+1,317,27.94
+1,318,19.05
+1,318,53.975
+1,318,10.16
+1,318,33.02
+1,318,35.56
+1,318,24.13
+1,318,40.64
+1,318,55.88
+1,318,35.56
+1,318,44.45
+1,318,30.48
+1,318,81.28
+1,318,30.48
+1,318,7.62
+1,318,7.62
+1,318,44.45
+1,318,63.5
+1,318,35.56
+1,318,99.06
+1,318,45.72
+1,318,10.16
+1,318,46.355
+1,318,53.975
+1,318,33.02
+1,318,8.89
+1,318,22.86
+1,318,99.06
+1,318,63.5
+1,318,33.02
+1,318,10.16
+1,319,30.48
+1,319,63.5
+1,319,24.13
+1,319,7.62
+1,319,35.56
+1,319,35.56
+1,319,30.48
+1,319,27.94
+1,319,33.02
+1,319,63.5
+1,319,8.89
+1,319,99.06
+1,319,8.89
+1,319,24.13
+1,319,8.89
+1,319,63.5
+1,319,40.64
+1,319,19.05
+1,319,24.13
+1,319,7.62
+1,319,10.16
+1,319,7.62
+1,319,7.62
+1,319,7.62
+1,319,99.06
+1,319,35.56
+1,319,24.13
+1,319,24.13
+1,319,53.975
+1,319,33.02
+1,320,35.56
+1,320,53.975
+1,320,81.28
+1,320,33.02
+1,320,15.24
+1,320,46.355
+1,320,46.355
+1,320,99.06
+1,320,45.72
+1,320,30.48
+1,320,50.8
+1,320,33.02
+1,320,33.02
+1,320,40.64
+1,320,45.72
+1,320,7.62
+1,320,22.86
+1,320,81.28
+1,320,46.355
+1,320,15.24
+1,320,81.28
+1,320,10.16
+1,320,46.355
+1,320,7.62
+1,320,45.72
+1,320,33.02
+1,320,35.56
+1,320,33.02
+1,320,55.88
+1,320,35.56
+1,321,33.02
+1,321,81.28
+1,321,7.62
+1,321,7.62
+1,321,19.05
+1,321,24.13
+1,321,33.02
+1,321,7.62
+1,321,33.02
+1,321,44.45
+1,321,55.88
+1,321,35.56
+1,321,10.16
+1,321,63.5
+1,321,7.62
+1,321,24.13
+1,321,10.16
+1,321,50.8
+1,321,50.8
+1,321,81.28
+1,321,7.62
+1,321,53.975
+1,321,7.62
+1,321,7.62
+1,321,40.64
+1,321,81.28
+1,321,53.975
+1,321,40.64
+1,321,15.24
+1,321,19.05
+1,322,35.56
+1,322,46.355
+1,322,35.56
+1,322,81.28
+1,322,7.62
+1,322,7.62
+1,322,33.02
+1,322,63.5
+1,322,50.8
+1,322,7.62
+1,322,46.355
+1,322,33.02
+1,322,7.62
+1,322,53.975
+1,322,7.62
+1,322,35.56
+1,322,7.62
+1,322,19.05
+1,322,30.48
+1,322,33.02
+1,322,8.89
+1,322,63.5
+1,322,27.94
+1,322,24.13
+1,322,10.16
+1,322,40.64
+1,322,99.06
+1,322,7.62
+1,322,22.86
+1,322,8.89
+1,323,15.24
+1,323,15.24
+1,323,7.62
+1,323,27.94
+1,323,46.355
+1,323,30.48
+1,323,33.02
+1,323,33.02
+1,323,45.72
+1,323,33.02
+1,323,7.62
+1,323,35.56
+1,323,7.62
+1,323,8.89
+1,323,46.355
+1,323,63.5
+1,323,33.02
+1,323,50.8
+1,323,7.62
+1,323,40.64
+1,323,10.16
+1,323,10.16
+1,323,81.28
+1,323,19.05
+1,323,8.89
+1,323,33.02
+1,323,40.64
+1,323,35.56
+1,323,7.62
+1,323,40.64
+1,324,24.13
+1,324,27.94
+1,324,53.975
+1,324,35.56
+1,324,7.62
+1,324,7.62
+1,324,7.62
+1,324,7.62
+1,324,7.62
+1,324,10.16
+1,324,7.62
+1,324,7.62
+1,324,15.24
+1,324,45.72
+1,324,8.89
+1,324,7.62
+1,324,35.56
+1,324,33.02
+1,324,63.5
+1,324,99.06
+1,324,33.02
+1,324,35.56
+1,324,33.02
+1,324,46.355
+1,324,40.64
+1,324,63.5
+1,324,45.72
+1,324,81.28
+1,324,24.13
+1,324,24.13
+1,325,63.5
+1,325,7.62
+1,325,10.16
+1,325,27.94
+1,325,10.16
+1,325,8.89
+1,325,44.45
+1,325,10.16
+1,325,33.02
+1,325,7.62
+1,325,44.45
+1,325,30.48
+1,325,33.02
+1,325,81.28
+1,325,46.355
+1,325,33.02
+1,325,19.05
+1,325,99.06
+1,325,40.64
+1,325,53.975
+1,325,33.02
+1,325,33.02
+1,325,10.16
+1,325,33.02
+1,325,8.89
+1,325,7.62
+1,325,35.56
+1,325,46.355
+1,325,7.62
+1,325,46.355
+1,326,99.06
+1,326,40.64
+1,326,50.8
+1,326,40.64
+1,326,22.86
+1,326,40.64
+1,326,45.72
+1,326,55.88
+1,326,24.13
+1,326,22.86
+1,326,40.64
+1,326,33.02
+1,326,63.5
+1,326,7.62
+1,326,27.94
+1,326,63.5
+1,326,35.56
+1,326,10.16
+1,326,81.28
+1,326,10.16
+1,326,40.64
+1,326,8.89
+1,326,33.02
+1,326,45.72
+1,326,40.64
+1,326,81.28
+1,326,46.355
+1,326,40.64
+1,326,22.86
+1,326,33.02
+1,327,40.64
+1,327,22.86
+1,327,63.5
+1,327,99.06
+1,327,24.13
+1,327,7.62
+1,327,10.16
+1,327,7.62
+1,327,30.48
+1,327,7.62
+1,327,10.16
+1,327,35.56
+1,327,30.48
+1,327,24.13
+1,327,24.13
+1,327,99.06
+1,327,63.5
+1,327,45.72
+1,327,40.64
+1,327,63.5
+1,327,33.02
+1,327,33.02
+1,327,10.16
+1,327,35.56
+1,327,35.56
+1,327,7.62
+1,327,7.62
+1,327,22.86
+1,327,44.45
+1,327,33.02
+1,328,44.45
+1,328,24.13
+1,328,40.64
+1,328,7.62
+1,328,8.89
+1,328,45.72
+1,328,45.72
+1,328,7.62
+1,328,7.62
+1,328,27.94
+1,328,45.72
+1,328,10.16
+1,328,7.62
+1,328,7.62
+1,328,33.02
+1,328,8.89
+1,328,40.64
+1,328,44.45
+1,328,8.89
+1,328,50.8
+1,328,30.48
+1,328,15.24
+1,328,44.45
+1,328,33.02
+1,328,10.16
+1,328,46.355
+1,328,27.94
+1,328,63.5
+1,328,81.28
+1,328,45.72
+1,329,24.13
+1,329,22.86
+1,329,53.975
+1,329,44.45
+1,329,44.45
+1,329,7.62
+1,329,8.89
+1,329,7.62
+1,329,46.355
+1,329,22.86
+1,329,10.16
+1,329,7.62
+1,329,44.45
+1,329,55.88
+1,329,50.8
+1,329,10.16
+1,329,99.06
+1,329,33.02
+1,329,35.56
+1,329,10.16
+1,329,35.56
+1,329,81.28
+1,329,33.02
+1,329,7.62
+1,329,50.8
+1,329,27.94
+1,329,45.72
+1,329,7.62
+1,329,10.16
+1,329,22.86
+1,330,40.64
+1,330,40.64
+1,330,33.02
+1,330,7.62
+1,330,22.86
+1,330,55.88
+1,330,40.64
+1,330,45.72
+1,330,46.355
+1,330,10.16
+1,330,8.89
+1,330,33.02
+1,330,45.72
+1,330,33.02
+1,330,45.72
+1,330,7.62
+1,330,33.02
+1,330,30.48
+1,330,7.62
+1,330,81.28
+1,330,8.89
+1,330,7.62
+1,330,10.16
+1,330,46.355
+1,330,99.06
+1,330,22.86
+1,330,22.86
+1,330,46.355
+1,330,46.355
+1,330,40.64
+1,331,33.02
+1,331,27.94
+1,331,40.64
+1,331,10.16
+1,331,44.45
+1,331,63.5
+1,331,45.72
+1,331,24.13
+1,331,8.89
+1,331,7.62
+1,331,44.45
+1,331,7.62
+1,331,10.16
+1,331,44.45
+1,331,10.16
+1,331,33.02
+1,331,10.16
+1,331,35.56
+1,331,7.62
+1,331,35.56
+1,331,45.72
+1,331,8.89
+1,331,45.72
+1,331,7.62
+1,331,44.45
+1,331,35.56
+1,331,10.16
+1,331,15.24
+1,331,7.62
+1,331,55.88
+1,332,53.975
+1,332,22.86
+1,332,35.56
+1,332,63.5
+1,332,35.56
+1,332,8.89
+1,332,46.355
+1,332,63.5
+1,332,40.64
+1,332,81.28
+1,332,35.56
+1,332,40.64
+1,332,33.02
+1,332,7.62
+1,332,30.48
+1,332,8.89
+1,332,55.88
+1,332,81.28
+1,332,33.02
+1,332,50.8
+1,332,40.64
+1,332,8.89
+1,332,8.89
+1,332,63.5
+1,332,46.355
+1,332,33.02
+1,332,53.975
+1,332,10.16
+1,332,19.05
+1,332,15.24
+1,333,24.13
+1,333,40.64
+1,333,40.64
+1,333,33.02
+1,333,45.72
+1,333,7.62
+1,333,35.56
+1,333,7.62
+1,333,33.02
+1,333,63.5
+1,333,30.48
+1,333,40.64
+1,333,45.72
+1,333,81.28
+1,333,45.72
+1,333,8.89
+1,333,33.02
+1,333,27.94
+1,333,40.64
+1,333,7.62
+1,333,35.56
+1,333,27.94
+1,333,44.45
+1,333,10.16
+1,333,8.89
+1,333,40.64
+1,333,44.45
+1,333,7.62
+1,333,35.56
+1,333,7.62
+1,334,33.02
+1,334,44.45
+1,334,22.86
+1,334,7.62
+1,334,44.45
+1,334,30.48
+1,334,63.5
+1,334,27.94
+1,334,44.45
+1,334,30.48
+1,334,35.56
+1,334,30.48
+1,334,19.05
+1,334,81.28
+1,334,7.62
+1,334,7.62
+1,334,30.48
+1,334,8.89
+1,334,35.56
+1,334,33.02
+1,334,40.64
+1,334,81.28
+1,334,99.06
+1,334,40.64
+1,334,33.02
+1,334,50.8
+1,334,22.86
+1,334,99.06
+1,334,7.62
+1,334,22.86
+1,335,33.02
+1,335,10.16
+1,335,15.24
+1,335,8.89
+1,335,46.355
+1,335,27.94
+1,335,24.13
+1,335,24.13
+1,335,22.86
+1,335,15.24
+1,335,33.02
+1,335,19.05
+1,335,50.8
+1,335,50.8
+1,335,63.5
+1,335,33.02
+1,335,46.355
+1,335,22.86
+1,335,15.24
+1,335,46.355
+1,335,63.5
+1,335,35.56
+1,335,19.05
+1,335,40.64
+1,335,10.16
+1,335,7.62
+1,335,33.02
+1,335,40.64
+1,335,40.64
+1,335,63.5
+1,336,10.16
+1,336,35.56
+1,336,10.16
+1,336,40.64
+1,336,19.05
+1,336,30.48
+1,336,40.64
+1,336,50.8
+1,336,10.16
+1,336,46.355
+1,336,10.16
+1,336,55.88
+1,336,53.975
+1,336,40.64
+1,336,35.56
+1,336,44.45
+1,336,63.5
+1,336,7.62
+1,336,7.62
+1,336,7.62
+1,336,7.62
+1,336,7.62
+1,336,10.16
+1,336,63.5
+1,336,8.89
+1,336,7.62
+1,336,99.06
+1,336,40.64
+1,336,15.24
+1,336,19.05
+1,337,81.28
+1,337,22.86
+1,337,63.5
+1,337,10.16
+1,337,45.72
+1,337,35.56
+1,337,81.28
+1,337,30.48
+1,337,10.16
+1,337,50.8
+1,337,7.62
+1,337,7.62
+1,337,33.02
+1,337,53.975
+1,337,7.62
+1,337,7.62
+1,337,33.02
+1,337,33.02
+1,337,10.16
+1,337,7.62
+1,337,35.56
+1,337,24.13
+1,337,99.06
+1,337,30.48
+1,337,44.45
+1,337,10.16
+1,337,8.89
+1,337,27.94
+1,337,45.72
+1,337,7.62
+1,338,8.89
+1,338,35.56
+1,338,46.355
+1,338,53.975
+1,338,27.94
+1,338,44.45
+1,338,10.16
+1,338,27.94
+1,338,63.5
+1,338,50.8
+1,338,10.16
+1,338,81.28
+1,338,33.02
+1,338,45.72
+1,338,81.28
+1,338,35.56
+1,338,7.62
+1,338,22.86
+1,338,15.24
+1,338,10.16
+1,338,7.62
+1,338,35.56
+1,338,24.13
+1,338,45.72
+1,338,8.89
+1,338,7.62
+1,338,33.02
+1,338,7.62
+1,338,8.89
+1,338,7.62
+1,339,33.02
+1,339,53.975
+1,339,63.5
+1,339,24.13
+1,339,53.975
+1,339,7.62
+1,339,35.56
+1,339,44.45
+1,339,8.89
+1,339,22.86
+1,339,30.48
+1,339,33.02
+1,339,10.16
+1,339,81.28
+1,339,33.02
+1,339,7.62
+1,339,24.13
+1,339,33.02
+1,339,7.62
+1,339,33.02
+1,339,99.06
+1,339,27.94
+1,339,44.45
+1,339,46.355
+1,339,40.64
+1,339,40.64
+1,339,24.13
+1,339,35.56
+1,339,7.62
+1,339,81.28
+1,340,7.62
+1,340,7.62
+1,340,40.64
+1,340,7.62
+1,340,7.62
+1,340,44.45
+1,340,10.16
+1,340,22.86
+1,340,81.28
+1,340,22.86
+1,340,35.56
+1,340,15.24
+1,340,15.24
+1,340,10.16
+1,340,35.56
+1,340,55.88
+1,340,50.8
+1,340,46.355
+1,340,15.24
+1,340,33.02
+1,340,7.62
+1,340,53.975
+1,340,10.16
+1,340,22.86
+1,340,63.5
+1,340,10.16
+1,340,7.62
+1,340,7.62
+1,340,22.86
+1,340,35.56
+1,341,99.06
+1,341,53.975
+1,341,35.56
+1,341,33.02
+1,341,35.56
+1,341,7.62
+1,341,35.56
+1,341,24.13
+1,341,10.16
+1,341,35.56
+1,341,8.89
+1,341,10.16
+1,341,7.62
+1,341,10.16
+1,341,33.02
+1,341,35.56
+1,341,35.56
+1,341,15.24
+1,341,44.45
+1,341,30.48
+1,341,30.48
+1,341,46.355
+1,341,40.64
+1,341,10.16
+1,341,22.86
+1,341,19.05
+1,341,33.02
+1,341,63.5
+1,341,10.16
+1,341,22.86
+1,342,7.62
+1,342,44.45
+1,342,7.62
+1,342,50.8
+1,342,10.16
+1,342,40.64
+1,342,55.88
+1,342,7.62
+1,342,63.5
+1,342,35.56
+1,342,30.48
+1,342,44.45
+1,342,50.8
+1,342,50.8
+1,342,46.355
+1,342,33.02
+1,342,7.62
+1,342,46.355
+1,342,46.355
+1,342,24.13
+1,342,33.02
+1,342,33.02
+1,342,46.355
+1,342,45.72
+1,342,63.5
+1,342,53.975
+1,342,63.5
+1,342,45.72
+1,342,10.16
+1,342,7.62
+1,343,40.64
+1,343,40.64
+1,343,33.02
+1,343,15.24
+1,343,7.62
+1,343,22.86
+1,343,27.94
+1,343,7.62
+1,343,46.355
+1,343,7.62
+1,343,44.45
+1,343,19.05
+1,343,45.72
+1,343,33.02
+1,343,44.45
+1,343,10.16
+1,343,10.16
+1,343,40.64
+1,343,33.02
+1,343,7.62
+1,343,19.05
+1,343,8.89
+1,343,33.02
+1,343,27.94
+1,343,7.62
+1,343,35.56
+1,343,30.48
+1,343,81.28
+1,343,22.86
+1,343,35.56
+1,344,53.975
+1,344,46.355
+1,344,24.13
+1,344,46.355
+1,344,40.64
+1,344,46.355
+1,344,30.48
+1,344,44.45
+1,344,24.13
+1,344,7.62
+1,344,40.64
+1,344,15.24
+1,344,35.56
+1,344,40.64
+1,344,33.02
+1,344,7.62
+1,344,55.88
+1,344,24.13
+1,344,33.02
+1,344,10.16
+1,344,7.62
+1,344,7.62
+1,344,7.62
+1,344,15.24
+1,344,24.13
+1,344,30.48
+1,344,55.88
+1,344,7.62
+1,344,30.48
+1,344,19.05
+1,345,22.86
+1,345,7.62
+1,345,22.86
+1,345,63.5
+1,345,27.94
+1,345,63.5
+1,345,33.02
+1,345,30.48
+1,345,55.88
+1,345,44.45
+1,345,7.62
+1,345,40.64
+1,345,8.89
+1,345,8.89
+1,345,53.975
+1,345,35.56
+1,345,33.02
+1,345,40.64
+1,345,35.56
+1,345,33.02
+1,345,7.62
+1,345,45.72
+1,345,55.88
+1,345,7.62
+1,345,35.56
+1,345,63.5
+1,345,44.45
+1,345,19.05
+1,345,15.24
+1,345,27.94
+1,346,33.02
+1,346,35.56
+1,346,7.62
+1,346,44.45
+1,346,33.02
+1,346,81.28
+1,346,24.13
+1,346,15.24
+1,346,33.02
+1,346,35.56
+1,346,46.355
+1,346,45.72
+1,346,30.48
+1,346,50.8
+1,346,7.62
+1,346,35.56
+1,346,27.94
+1,346,15.24
+1,346,81.28
+1,346,22.86
+1,346,30.48
+1,346,45.72
+1,346,15.24
+1,346,45.72
+1,346,53.975
+1,346,35.56
+1,346,46.355
+1,346,40.64
+1,346,33.02
+1,346,46.355
+1,347,35.56
+1,347,7.62
+1,347,81.28
+1,347,19.05
+1,347,7.62
+1,347,40.64
+1,347,99.06
+1,347,63.5
+1,347,7.62
+1,347,50.8
+1,347,7.62
+1,347,33.02
+1,347,55.88
+1,347,19.05
+1,347,8.89
+1,347,33.02
+1,347,35.56
+1,347,7.62
+1,347,10.16
+1,347,46.355
+1,347,24.13
+1,347,7.62
+1,347,40.64
+1,347,35.56
+1,347,7.62
+1,347,7.62
+1,347,22.86
+1,347,44.45
+1,347,35.56
+1,347,7.62
+1,348,10.16
+1,348,44.45
+1,348,8.89
+1,348,19.05
+1,348,45.72
+1,348,63.5
+1,348,7.62
+1,348,7.62
+1,348,53.975
+1,348,10.16
+1,348,53.975
+1,348,8.89
+1,348,40.64
+1,348,40.64
+1,348,19.05
+1,348,7.62
+1,348,8.89
+1,348,7.62
+1,348,55.88
+1,348,33.02
+1,348,7.62
+1,348,10.16
+1,348,33.02
+1,348,22.86
+1,348,10.16
+1,348,55.88
+1,348,7.62
+1,348,7.62
+1,348,7.62
+1,348,33.02
+1,349,7.62
+1,349,8.89
+1,349,40.64
+1,349,33.02
+1,349,40.64
+1,349,33.02
+1,349,63.5
+1,349,30.48
+1,349,45.72
+1,349,35.56
+1,349,10.16
+1,349,15.24
+1,349,35.56
+1,349,30.48
+1,349,19.05
+1,349,35.56
+1,349,7.62
+1,349,10.16
+1,349,40.64
+1,349,45.72
+1,349,27.94
+1,349,45.72
+1,349,7.62
+1,349,22.86
+1,349,7.62
+1,349,27.94
+1,349,35.56
+1,349,45.72
+1,349,15.24
+1,349,33.02
+1,350,7.62
+1,350,35.56
+1,350,7.62
+1,350,99.06
+1,350,7.62
+1,350,63.5
+1,350,35.56
+1,350,35.56
+1,350,30.48
+1,350,24.13
+1,350,24.13
+1,350,7.62
+1,350,40.64
+1,350,53.975
+1,350,10.16
+1,350,55.88
+1,350,33.02
+1,350,63.5
+1,350,35.56
+1,350,50.8
+1,350,63.5
+1,350,10.16
+1,350,81.28
+1,350,24.13
+1,350,7.62
+1,350,50.8
+1,350,46.355
+1,350,19.05
+1,350,40.64
+1,350,7.62
+1,351,22.86
+1,351,33.02
+1,351,55.88
+1,351,44.45
+1,351,22.86
+1,351,7.62
+1,351,33.02
+1,351,7.62
+1,351,22.86
+1,351,15.24
+1,351,55.88
+1,351,19.05
+1,351,50.8
+1,351,33.02
+1,351,30.48
+1,351,99.06
+1,351,99.06
+1,351,45.72
+1,351,35.56
+1,351,10.16
+1,351,7.62
+1,351,7.62
+1,351,81.28
+1,351,81.28
+1,351,7.62
+1,351,19.05
+1,351,7.62
+1,351,81.28
+1,351,10.16
+1,351,40.64
+1,352,24.13
+1,352,8.89
+1,352,35.56
+1,352,40.64
+1,352,27.94
+1,352,44.45
+1,352,10.16
+1,352,7.62
+1,352,7.62
+1,352,7.62
+1,352,40.64
+1,352,46.355
+1,352,15.24
+1,352,63.5
+1,352,81.28
+1,352,22.86
+1,352,81.28
+1,352,53.975
+1,352,50.8
+1,352,53.975
+1,352,99.06
+1,352,33.02
+1,352,35.56
+1,352,22.86
+1,352,24.13
+1,352,33.02
+1,352,50.8
+1,352,40.64
+1,352,7.62
+1,352,99.06
+1,353,10.16
+1,353,50.8
+1,353,7.62
+1,353,55.88
+1,353,7.62
+1,353,7.62
+1,353,53.975
+1,353,30.48
+1,353,24.13
+1,353,50.8
+1,353,63.5
+1,353,50.8
+1,353,44.45
+1,353,7.62
+1,353,53.975
+1,353,33.02
+1,353,24.13
+1,353,24.13
+1,353,7.62
+1,353,40.64
+1,353,81.28
+1,353,10.16
+1,353,55.88
+1,353,33.02
+1,353,40.64
+1,353,63.5
+1,353,35.56
+1,353,53.975
+1,353,30.48
+1,353,7.62
+1,354,33.02
+1,354,10.16
+1,354,46.355
+1,354,81.28
+1,354,33.02
+1,354,7.62
+1,354,33.02
+1,354,50.8
+1,354,33.02
+1,354,50.8
+1,354,7.62
+1,354,7.62
+1,354,33.02
+1,354,33.02
+1,354,33.02
+1,354,99.06
+1,354,7.62
+1,354,40.64
+1,354,30.48
+1,354,40.64
+1,354,99.06
+1,354,40.64
+1,354,10.16
+1,354,33.02
+1,354,50.8
+1,354,45.72
+1,354,63.5
+1,354,19.05
+1,354,44.45
+1,354,53.975
+1,355,81.28
+1,355,44.45
+1,355,10.16
+1,355,7.62
+1,355,63.5
+1,355,15.24
+1,355,7.62
+1,355,35.56
+1,355,63.5
+1,355,55.88
+1,355,33.02
+1,355,24.13
+1,355,40.64
+1,355,35.56
+1,355,45.72
+1,355,55.88
+1,355,10.16
+1,355,7.62
+1,355,24.13
+1,355,10.16
+1,355,33.02
+1,355,15.24
+1,355,33.02
+1,355,24.13
+1,355,63.5
+1,355,45.72
+1,355,7.62
+1,355,40.64
+1,355,33.02
+1,355,44.45
+1,356,7.62
+1,356,99.06
+1,356,40.64
+1,356,40.64
+1,356,22.86
+1,356,99.06
+1,356,50.8
+1,356,33.02
+1,356,33.02
+1,356,46.355
+1,356,7.62
+1,356,7.62
+1,356,44.45
+1,356,33.02
+1,356,7.62
+1,356,7.62
+1,356,63.5
+1,356,33.02
+1,356,15.24
+1,356,10.16
+1,356,33.02
+1,356,35.56
+1,356,35.56
+1,356,22.86
+1,356,33.02
+1,356,35.56
+1,356,15.24
+1,356,45.72
+1,356,81.28
+1,356,7.62
+1,357,50.8
+1,357,45.72
+1,357,55.88
+1,357,81.28
+1,357,7.62
+1,357,35.56
+1,357,19.05
+1,357,99.06
+1,357,19.05
+1,357,99.06
+1,357,30.48
+1,357,81.28
+1,357,35.56
+1,357,27.94
+1,357,7.62
+1,357,50.8
+1,357,44.45
+1,357,46.355
+1,357,55.88
+1,357,45.72
+1,357,7.62
+1,357,7.62
+1,357,55.88
+1,357,15.24
+1,357,40.64
+1,357,35.56
+1,357,46.355
+1,357,35.56
+1,357,55.88
+1,357,55.88
+1,358,8.89
+1,358,7.62
+1,358,63.5
+1,358,7.62
+1,358,22.86
+1,358,44.45
+1,358,7.62
+1,358,40.64
+1,358,27.94
+1,358,33.02
+1,358,8.89
+1,358,8.89
+1,358,45.72
+1,358,35.56
+1,358,10.16
+1,358,50.8
+1,358,35.56
+1,358,55.88
+1,358,10.16
+1,358,33.02
+1,358,7.62
+1,358,19.05
+1,358,7.62
+1,358,40.64
+1,358,7.62
+1,358,8.89
+1,358,7.62
+1,358,35.56
+1,358,8.89
+1,358,40.64
+1,359,53.975
+1,359,15.24
+1,359,99.06
+1,359,63.5
+1,359,46.355
+1,359,30.48
+1,359,99.06
+1,359,46.355
+1,359,7.62
+1,359,33.02
+1,359,33.02
+1,359,7.62
+1,359,7.62
+1,359,7.62
+1,359,81.28
+1,359,7.62
+1,359,22.86
+1,359,8.89
+1,359,81.28
+1,359,10.16
+1,359,53.975
+1,359,19.05
+1,359,7.62
+1,359,81.28
+1,359,50.8
+1,359,33.02
+1,359,53.975
+1,359,10.16
+1,359,46.355
+1,359,7.62
+1,360,33.02
+1,360,33.02
+1,360,35.56
+1,360,7.62
+1,360,40.64
+1,360,8.89
+1,360,30.48
+1,360,53.975
+1,360,46.355
+1,360,55.88
+1,360,33.02
+1,360,24.13
+1,360,46.355
+1,360,81.28
+1,360,50.8
+1,360,7.62
+1,360,19.05
+1,360,33.02
+1,360,99.06
+1,360,30.48
+1,360,22.86
+1,360,15.24
+1,360,8.89
+1,360,7.62
+1,360,40.64
+1,360,45.72
+1,360,40.64
+1,360,44.45
+1,360,35.56
+1,360,10.16
+1,361,44.45
+1,361,33.02
+1,361,10.16
+1,361,10.16
+1,361,7.62
+1,361,99.06
+1,361,7.62
+1,361,81.28
+1,361,81.28
+1,361,45.72
+1,361,8.89
+1,361,40.64
+1,361,7.62
+1,361,99.06
+1,361,7.62
+1,361,35.56
+1,361,33.02
+1,361,81.28
+1,361,8.89
+1,361,10.16
+1,361,33.02
+1,361,7.62
+1,361,40.64
+1,361,8.89
+1,361,35.56
+1,361,7.62
+1,361,19.05
+1,361,40.64
+1,361,27.94
+1,361,10.16
+1,362,53.975
+1,362,7.62
+1,362,46.355
+1,362,19.05
+1,362,53.975
+1,362,10.16
+1,362,81.28
+1,362,24.13
+1,362,81.28
+1,362,27.94
+1,362,53.975
+1,362,10.16
+1,362,53.975
+1,362,30.48
+1,362,7.62
+1,362,22.86
+1,362,7.62
+1,362,22.86
+1,362,7.62
+1,362,50.8
+1,362,10.16
+1,362,53.975
+1,362,40.64
+1,362,46.355
+1,362,24.13
+1,362,15.24
+1,362,7.62
+1,362,35.56
+1,362,44.45
+1,362,81.28
+1,363,19.05
+1,363,44.45
+1,363,15.24
+1,363,7.62
+1,363,7.62
+1,363,35.56
+1,363,30.48
+1,363,46.355
+1,363,33.02
+1,363,24.13
+1,363,50.8
+1,363,40.64
+1,363,81.28
+1,363,81.28
+1,363,15.24
+1,363,40.64
+1,363,33.02
+1,363,10.16
+1,363,33.02
+1,363,81.28
+1,363,33.02
+1,363,7.62
+1,363,30.48
+1,363,44.45
+1,363,7.62
+1,363,7.62
+1,363,7.62
+1,363,40.64
+1,363,33.02
+1,363,19.05
+1,364,35.56
+1,364,99.06
+1,364,44.45
+1,364,10.16
+1,364,22.86
+1,364,7.62
+1,364,7.62
+1,364,15.24
+1,364,44.45
+1,364,8.89
+1,364,22.86
+1,364,40.64
+1,364,63.5
+1,364,33.02
+1,364,33.02
+1,364,99.06
+1,364,46.355
+1,364,10.16
+1,364,30.48
+1,364,44.45
+1,364,45.72
+1,364,44.45
+1,364,63.5
+1,364,99.06
+1,364,7.62
+1,364,33.02
+1,364,30.48
+1,364,33.02
+1,364,40.64
+1,364,63.5
+1,365,22.86
+1,365,7.62
+1,365,46.355
+1,365,63.5
+1,365,10.16
+1,365,15.24
+1,365,15.24
+1,365,7.62
+1,365,50.8
+1,365,45.72
+1,365,50.8
+1,365,45.72
+1,365,35.56
+1,365,53.975
+1,365,7.62
+1,365,35.56
+1,365,46.355
+1,365,44.45
+1,365,33.02
+1,365,33.02
+1,365,55.88
+1,365,8.89
+1,365,7.62
+1,365,33.02
+1,365,46.355
+1,365,45.72
+1,365,33.02
+1,365,7.62
+1,365,22.86
+1,365,8.89
+1,366,63.5
+1,366,8.89
+1,366,7.62
+1,366,35.56
+1,366,63.5
+1,366,30.48
+1,366,7.62
+1,366,40.64
+1,366,7.62
+1,366,30.48
+1,366,33.02
+1,366,22.86
+1,366,53.975
+1,366,15.24
+1,366,24.13
+1,366,46.355
+1,366,7.62
+1,366,99.06
+1,366,40.64
+1,366,46.355
+1,366,45.72
+1,366,7.62
+1,366,40.64
+1,366,8.89
+1,366,99.06
+1,366,8.89
+1,366,63.5
+1,366,50.8
+1,366,15.24
+1,366,7.62
+1,367,55.88
+1,367,33.02
+1,367,10.16
+1,367,63.5
+1,367,7.62
+1,367,30.48
+1,367,40.64
+1,367,10.16
+1,367,7.62
+1,367,24.13
+1,367,8.89
+1,367,27.94
+1,367,8.89
+1,367,35.56
+1,367,99.06
+1,367,7.62
+1,367,63.5
+1,367,55.88
+1,367,44.45
+1,367,35.56
+1,367,35.56
+1,367,50.8
+1,367,33.02
+1,367,44.45
+1,367,45.72
+1,367,7.62
+1,367,99.06
+1,367,99.06
+1,367,27.94
+1,367,24.13
+1,368,55.88
+1,368,50.8
+1,368,63.5
+1,368,99.06
+1,368,33.02
+1,368,44.45
+1,368,7.62
+1,368,10.16
+1,368,19.05
+1,368,40.64
+1,368,10.16
+1,368,35.56
+1,368,22.86
+1,368,30.48
+1,368,27.94
+1,368,22.86
+1,368,33.02
+1,368,15.24
+1,368,8.89
+1,368,27.94
+1,368,7.62
+1,368,7.62
+1,368,35.56
+1,368,45.72
+1,368,15.24
+1,368,45.72
+1,368,7.62
+1,368,46.355
+1,368,81.28
+1,368,81.28
+1,369,44.45
+1,369,22.86
+1,369,7.62
+1,369,10.16
+1,369,19.05
+1,369,63.5
+1,369,50.8
+1,369,33.02
+1,369,35.56
+1,369,10.16
+1,369,46.355
+1,369,99.06
+1,369,7.62
+1,369,30.48
+1,369,10.16
+1,369,44.45
+1,369,7.62
+1,369,7.62
+1,369,53.975
+1,369,55.88
+1,369,7.62
+1,369,53.975
+1,369,50.8
+1,369,24.13
+1,369,7.62
+1,369,27.94
+1,369,7.62
+1,369,53.975
+1,369,44.45
+1,369,8.89
+1,370,45.72
+1,370,15.24
+1,370,33.02
+1,370,7.62
+1,370,81.28
+1,370,7.62
+1,370,24.13
+1,370,63.5
+1,370,44.45
+1,370,63.5
+1,370,45.72
+1,370,7.62
+1,370,33.02
+1,370,40.64
+1,370,50.8
+1,370,99.06
+1,370,15.24
+1,370,8.89
+1,370,45.72
+1,370,10.16
+1,370,53.975
+1,370,15.24
+1,370,40.64
+1,370,22.86
+1,370,81.28
+1,370,81.28
+1,370,10.16
+1,370,22.86
+1,370,45.72
+1,370,24.13
+1,371,99.06
+1,371,33.02
+1,371,46.355
+1,371,40.64
+1,371,45.72
+1,371,30.48
+1,371,44.45
+1,371,55.88
+1,371,45.72
+1,371,30.48
+1,371,45.72
+1,371,33.02
+1,371,7.62
+1,371,55.88
+1,371,40.64
+1,371,35.56
+1,371,10.16
+1,371,45.72
+1,371,22.86
+1,371,19.05
+1,371,50.8
+1,371,8.89
+1,371,53.975
+1,371,10.16
+1,371,53.975
+1,371,45.72
+1,371,63.5
+1,371,30.48
+1,371,7.62
+1,371,22.86
+1,372,7.62
+1,372,7.62
+1,372,44.45
+1,372,7.62
+1,372,40.64
+1,372,99.06
+1,372,63.5
+1,372,81.28
+1,372,7.62
+1,372,35.56
+1,372,10.16
+1,372,35.56
+1,372,53.975
+1,372,7.62
+1,372,44.45
+1,372,15.24
+1,372,33.02
+1,372,46.355
+1,372,40.64
+1,372,55.88
+1,372,10.16
+1,372,19.05
+1,372,33.02
+1,372,50.8
+1,372,7.62
+1,372,27.94
+1,372,7.62
+1,372,63.5
+1,372,24.13
+1,372,7.62
+1,373,19.05
+1,373,30.48
+1,373,44.45
+1,373,40.64
+1,373,33.02
+1,373,46.355
+1,373,45.72
+1,373,7.62
+1,373,7.62
+1,373,35.56
+1,373,63.5
+1,373,8.89
+1,373,8.89
+1,373,10.16
+1,373,55.88
+1,373,10.16
+1,373,33.02
+1,373,35.56
+1,373,7.62
+1,373,40.64
+1,373,50.8
+1,373,46.355
+1,373,7.62
+1,373,45.72
+1,373,7.62
+1,373,19.05
+1,373,8.89
+1,373,46.355
+1,373,8.89
+1,373,15.24
+1,374,15.24
+1,374,24.13
+1,374,7.62
+1,374,10.16
+1,374,40.64
+1,374,53.975
+1,374,7.62
+1,374,40.64
+1,374,81.28
+1,374,46.355
+1,374,33.02
+1,374,33.02
+1,374,33.02
+1,374,40.64
+1,374,50.8
+1,374,55.88
+1,374,35.56
+1,374,33.02
+1,374,44.45
+1,374,33.02
+1,374,50.8
+1,374,15.24
+1,374,7.62
+1,374,50.8
+1,374,7.62
+1,374,35.56
+1,374,50.8
+1,374,44.45
+1,374,8.89
+1,374,35.56
+1,375,10.16
+1,375,35.56
+1,375,63.5
+1,375,7.62
+1,375,24.13
+1,375,35.56
+1,375,10.16
+1,375,27.94
+1,375,50.8
+1,375,55.88
+1,375,50.8
+1,375,33.02
+1,375,10.16
+1,375,33.02
+1,375,30.48
+1,375,44.45
+1,375,22.86
+1,375,35.56
+1,375,19.05
+1,375,44.45
+1,375,10.16
+1,375,40.64
+1,375,40.64
+1,375,33.02
+1,375,15.24
+1,375,55.88
+1,375,10.16
+1,375,33.02
+1,375,7.62
+1,375,10.16
+1,376,50.8
+1,376,8.89
+1,376,8.89
+1,376,7.62
+1,376,8.89
+1,376,33.02
+1,376,45.72
+1,376,46.355
+1,376,7.62
+1,376,7.62
+1,376,50.8
+1,376,7.62
+1,376,22.86
+1,376,44.45
+1,376,8.89
+1,376,53.975
+1,376,33.02
+1,376,35.56
+1,376,7.62
+1,376,19.05
+1,376,7.62
+1,376,55.88
+1,376,30.48
+1,376,19.05
+1,376,7.62
+1,376,27.94
+1,376,10.16
+1,376,33.02
+1,376,7.62
+1,376,50.8
+1,377,63.5
+1,377,7.62
+1,377,30.48
+1,377,7.62
+1,377,35.56
+1,377,22.86
+1,377,35.56
+1,377,50.8
+1,377,8.89
+1,377,33.02
+1,377,7.62
+1,377,40.64
+1,377,33.02
+1,377,40.64
+1,377,53.975
+1,377,35.56
+1,377,81.28
+1,377,27.94
+1,377,55.88
+1,377,7.62
+1,377,55.88
+1,377,7.62
+1,377,27.94
+1,377,40.64
+1,377,27.94
+1,377,40.64
+1,377,15.24
+1,377,35.56
+1,377,19.05
+1,377,7.62
+1,378,7.62
+1,378,8.89
+1,378,81.28
+1,378,30.48
+1,378,15.24
+1,378,35.56
+1,378,7.62
+1,378,35.56
+1,378,10.16
+1,378,33.02
+1,378,15.24
+1,378,10.16
+1,378,33.02
+1,378,10.16
+1,378,7.62
+1,378,35.56
+1,378,30.48
+1,378,40.64
+1,378,81.28
+1,378,35.56
+1,378,7.62
+1,378,10.16
+1,378,7.62
+1,378,10.16
+1,378,27.94
+1,378,33.02
+1,378,27.94
+1,378,35.56
+1,378,7.62
+1,378,81.28
+1,379,10.16
+1,379,35.56
+1,379,44.45
+1,379,10.16
+1,379,10.16
+1,379,50.8
+1,379,33.02
+1,379,19.05
+1,379,19.05
+1,379,10.16
+1,379,81.28
+1,379,33.02
+1,379,33.02
+1,379,55.88
+1,379,22.86
+1,379,44.45
+1,379,7.62
+1,379,50.8
+1,379,27.94
+1,379,19.05
+1,379,10.16
+1,379,44.45
+1,379,22.86
+1,379,24.13
+1,379,63.5
+1,379,44.45
+1,379,7.62
+1,379,30.48
+1,379,19.05
+1,379,7.62
+1,380,81.28
+1,380,7.62
+1,380,53.975
+1,380,44.45
+1,380,15.24
+1,380,7.62
+1,380,63.5
+1,380,7.62
+1,380,40.64
+1,380,35.56
+1,380,33.02
+1,380,63.5
+1,380,45.72
+1,380,55.88
+1,380,63.5
+1,380,50.8
+1,380,81.28
+1,380,53.975
+1,380,33.02
+1,380,19.05
+1,380,10.16
+1,380,55.88
+1,380,40.64
+1,380,46.355
+1,380,19.05
+1,380,33.02
+1,380,40.64
+1,380,40.64
+1,380,7.62
+1,380,53.975
+1,381,7.62
+1,381,7.62
+1,381,35.56
+1,381,7.62
+1,381,40.64
+1,381,8.89
+1,381,22.86
+1,381,10.16
+1,381,22.86
+1,381,40.64
+1,381,33.02
+1,381,81.28
+1,381,7.62
+1,381,27.94
+1,381,10.16
+1,381,10.16
+1,381,33.02
+1,381,33.02
+1,381,46.355
+1,381,45.72
+1,381,27.94
+1,381,22.86
+1,381,7.62
+1,381,19.05
+1,381,99.06
+1,381,44.45
+1,381,27.94
+1,381,33.02
+1,381,46.355
+1,381,63.5
+1,382,35.56
+1,382,8.89
+1,382,40.64
+1,382,27.94
+1,382,35.56
+1,382,30.48
+1,382,45.72
+1,382,44.45
+1,382,10.16
+1,382,15.24
+1,382,40.64
+1,382,10.16
+1,382,22.86
+1,382,8.89
+1,382,55.88
+1,382,33.02
+1,382,50.8
+1,382,10.16
+1,382,10.16
+1,382,7.62
+1,382,40.64
+1,382,24.13
+1,382,22.86
+1,382,33.02
+1,382,7.62
+1,382,35.56
+1,382,44.45
+1,382,7.62
+1,382,99.06
+1,382,7.62
+1,383,7.62
+1,383,35.56
+1,383,33.02
+1,383,53.975
+1,383,99.06
+1,383,81.28
+1,383,22.86
+1,383,99.06
+1,383,7.62
+1,383,44.45
+1,383,30.48
+1,383,7.62
+1,383,10.16
+1,383,15.24
+1,383,7.62
+1,383,19.05
+1,383,8.89
+1,383,33.02
+1,383,81.28
+1,383,10.16
+1,383,33.02
+1,383,99.06
+1,383,50.8
+1,383,40.64
+1,383,7.62
+1,383,7.62
+1,383,81.28
+1,383,46.355
+1,383,53.975
+1,383,19.05
+1,384,63.5
+1,384,81.28
+1,384,55.88
+1,384,7.62
+1,384,45.72
+1,384,7.62
+1,384,46.355
+1,384,22.86
+1,384,7.62
+1,384,46.355
+1,384,53.975
+1,384,10.16
+1,384,45.72
+1,384,33.02
+1,384,27.94
+1,384,15.24
+1,384,7.62
+1,384,50.8
+1,384,33.02
+1,384,35.56
+1,384,8.89
+1,384,10.16
+1,384,8.89
+1,384,19.05
+1,384,63.5
+1,384,33.02
+1,384,10.16
+1,384,10.16
+1,384,33.02
+1,384,33.02
+1,385,35.56
+1,385,7.62
+1,385,24.13
+1,385,10.16
+1,385,24.13
+1,385,63.5
+1,385,44.45
+1,385,81.28
+1,385,40.64
+1,385,53.975
+1,385,10.16
+1,385,10.16
+1,385,7.62
+1,385,46.355
+1,385,19.05
+1,385,33.02
+1,385,30.48
+1,385,7.62
+1,385,55.88
+1,385,35.56
+1,385,33.02
+1,385,22.86
+1,385,19.05
+1,385,35.56
+1,385,8.89
+1,385,10.16
+1,385,7.62
+1,385,55.88
+1,385,40.64
+1,385,7.62
+1,386,22.86
+1,386,7.62
+1,386,63.5
+1,386,33.02
+1,386,22.86
+1,386,35.56
+1,386,33.02
+1,386,35.56
+1,386,7.62
+1,386,35.56
+1,386,33.02
+1,386,24.13
+1,386,30.48
+1,386,15.24
+1,386,22.86
+1,386,44.45
+1,386,8.89
+1,386,10.16
+1,386,7.62
+1,386,81.28
+1,386,19.05
+1,386,7.62
+1,386,7.62
+1,386,63.5
+1,386,35.56
+1,386,81.28
+1,386,35.56
+1,386,40.64
+1,386,10.16
+1,386,50.8
+1,387,63.5
+1,387,10.16
+1,387,22.86
+1,387,50.8
+1,387,7.62
+1,387,35.56
+1,387,15.24
+1,387,7.62
+1,387,44.45
+1,387,7.62
+1,387,10.16
+1,387,7.62
+1,387,7.62
+1,387,19.05
+1,387,35.56
+1,387,44.45
+1,387,35.56
+1,387,55.88
+1,387,10.16
+1,387,7.62
+1,387,45.72
+1,387,30.48
+1,387,30.48
+1,387,55.88
+1,387,10.16
+1,387,40.64
+1,387,7.62
+1,387,7.62
+1,387,10.16
+1,387,53.975
+1,388,63.5
+1,388,99.06
+1,388,10.16
+1,388,7.62
+1,388,7.62
+1,388,55.88
+1,388,7.62
+1,388,81.28
+1,388,50.8
+1,388,7.62
+1,388,7.62
+1,388,50.8
+1,388,7.62
+1,388,22.86
+1,388,33.02
+1,388,35.56
+1,388,24.13
+1,388,10.16
+1,388,40.64
+1,388,27.94
+1,388,15.24
+1,388,22.86
+1,388,10.16
+1,388,24.13
+1,388,40.64
+1,388,7.62
+1,388,8.89
+1,388,7.62
+1,388,35.56
+1,388,45.72
+1,389,7.62
+1,389,7.62
+1,389,33.02
+1,389,35.56
+1,389,27.94
+1,389,40.64
+1,389,7.62
+1,389,19.05
+1,389,19.05
+1,389,40.64
+1,389,7.62
+1,389,22.86
+1,389,7.62
+1,389,7.62
+1,389,55.88
+1,389,33.02
+1,389,19.05
+1,389,7.62
+1,389,55.88
+1,389,8.89
+1,389,7.62
+1,389,50.8
+1,389,46.355
+1,389,22.86
+1,389,7.62
+1,389,7.62
+1,389,24.13
+1,389,44.45
+1,389,99.06
+1,389,40.64
+1,390,44.45
+1,390,27.94
+1,390,44.45
+1,390,7.62
+1,390,40.64
+1,390,33.02
+1,390,35.56
+1,390,35.56
+1,390,19.05
+1,390,15.24
+1,390,7.62
+1,390,55.88
+1,390,7.62
+1,390,46.355
+1,390,35.56
+1,390,63.5
+1,390,35.56
+1,390,7.62
+1,390,7.62
+1,390,15.24
+1,390,33.02
+1,390,10.16
+1,390,10.16
+1,390,50.8
+1,390,44.45
+1,390,10.16
+1,390,8.89
+1,390,22.86
+1,390,40.64
+1,390,7.62
+1,391,44.45
+1,391,22.86
+1,391,33.02
+1,391,81.28
+1,391,50.8
+1,391,63.5
+1,391,40.64
+1,391,8.89
+1,391,27.94
+1,391,7.62
+1,391,10.16
+1,391,40.64
+1,391,19.05
+1,391,35.56
+1,391,33.02
+1,391,7.62
+1,391,55.88
+1,391,99.06
+1,391,10.16
+1,391,30.48
+1,391,35.56
+1,391,99.06
+1,391,35.56
+1,391,81.28
+1,391,33.02
+1,391,53.975
+1,391,8.89
+1,391,33.02
+1,391,46.355
+1,391,81.28
+1,392,35.56
+1,392,44.45
+1,392,10.16
+1,392,7.62
+1,392,27.94
+1,392,35.56
+1,392,63.5
+1,392,10.16
+1,392,33.02
+1,392,15.24
+1,392,7.62
+1,392,50.8
+1,392,40.64
+1,392,81.28
+1,392,7.62
+1,392,8.89
+1,392,46.355
+1,392,63.5
+1,392,35.56
+1,392,40.64
+1,392,55.88
+1,392,55.88
+1,392,24.13
+1,392,40.64
+1,392,24.13
+1,392,40.64
+1,392,99.06
+1,392,46.355
+1,392,50.8
+1,392,10.16
+1,393,45.72
+1,393,55.88
+1,393,40.64
+1,393,15.24
+1,393,44.45
+1,393,15.24
+1,393,24.13
+1,393,50.8
+1,393,30.48
+1,393,8.89
+1,393,53.975
+1,393,53.975
+1,393,7.62
+1,393,99.06
+1,393,15.24
+1,393,46.355
+1,393,53.975
+1,393,53.975
+1,393,10.16
+1,393,10.16
+1,393,7.62
+1,393,35.56
+1,393,7.62
+1,393,10.16
+1,393,30.48
+1,393,33.02
+1,393,33.02
+1,393,33.02
+1,393,55.88
+1,393,22.86
+1,394,30.48
+1,394,81.28
+1,394,30.48
+1,394,22.86
+1,394,7.62
+1,394,53.975
+1,394,44.45
+1,394,46.355
+1,394,10.16
+1,394,10.16
+1,394,30.48
+1,394,50.8
+1,394,81.28
+1,394,10.16
+1,394,7.62
+1,394,33.02
+1,394,33.02
+1,394,10.16
+1,394,99.06
+1,394,33.02
+1,394,30.48
+1,394,19.05
+1,394,35.56
+1,394,99.06
+1,394,33.02
+1,394,55.88
+1,394,46.355
+1,394,63.5
+1,394,30.48
+1,394,99.06
+1,395,22.86
+1,395,55.88
+1,395,50.8
+1,395,35.56
+1,395,33.02
+1,395,24.13
+1,395,15.24
+1,395,55.88
+1,395,40.64
+1,395,15.24
+1,395,55.88
+1,395,35.56
+1,395,53.975
+1,395,63.5
+1,395,40.64
+1,395,10.16
+1,395,40.64
+1,395,63.5
+1,395,33.02
+1,395,35.56
+1,395,22.86
+1,395,7.62
+1,395,45.72
+1,395,33.02
+1,395,15.24
+1,395,24.13
+1,395,55.88
+1,395,46.355
+1,395,81.28
+1,395,15.24
+1,396,35.56
+1,396,53.975
+1,396,7.62
+1,396,46.355
+1,396,40.64
+1,396,19.05
+1,396,55.88
+1,396,81.28
+1,396,55.88
+1,396,33.02
+1,396,35.56
+1,396,55.88
+1,396,35.56
+1,396,8.89
+1,396,7.62
+1,396,35.56
+1,396,55.88
+1,396,40.64
+1,396,33.02
+1,396,7.62
+1,396,22.86
+1,396,40.64
+1,396,10.16
+1,396,15.24
+1,396,81.28
+1,396,24.13
+1,396,99.06
+1,396,10.16
+1,396,22.86
+1,396,7.62
+1,397,27.94
+1,397,81.28
+1,397,81.28
+1,397,7.62
+1,397,33.02
+1,397,24.13
+1,397,55.88
+1,397,45.72
+1,397,50.8
+1,397,30.48
+1,397,7.62
+1,397,55.88
+1,397,27.94
+1,397,8.89
+1,397,7.62
+1,397,40.64
+1,397,50.8
+1,397,81.28
+1,397,63.5
+1,397,7.62
+1,397,40.64
+1,397,40.64
+1,397,8.89
+1,397,35.56
+1,397,7.62
+1,397,27.94
+1,397,33.02
+1,397,33.02
+1,397,22.86
+1,397,99.06
+1,398,33.02
+1,398,63.5
+1,398,15.24
+1,398,63.5
+1,398,7.62
+1,398,45.72
+1,398,46.355
+1,398,19.05
+1,398,30.48
+1,398,33.02
+1,398,15.24
+1,398,10.16
+1,398,44.45
+1,398,40.64
+1,398,33.02
+1,398,46.355
+1,398,99.06
+1,398,45.72
+1,398,15.24
+1,398,33.02
+1,398,7.62
+1,398,15.24
+1,398,40.64
+1,398,53.975
+1,398,22.86
+1,398,7.62
+1,398,30.48
+1,398,15.24
+1,398,55.88
+1,398,19.05
+1,399,33.02
+1,399,22.86
+1,399,99.06
+1,399,19.05
+1,399,7.62
+1,399,15.24
+1,399,40.64
+1,399,8.89
+1,399,19.05
+1,399,24.13
+1,399,50.8
+1,399,30.48
+1,399,99.06
+1,399,44.45
+1,399,63.5
+1,399,44.45
+1,399,24.13
+1,399,7.62
+1,399,55.88
+1,399,19.05
+1,399,19.05
+1,399,10.16
+1,399,33.02
+1,399,44.45
+1,399,19.05
+1,399,35.56
+1,399,44.45
+1,399,15.24
+1,399,22.86
+1,399,10.16
+1,400,30.48
+1,400,8.89
+1,400,55.88
+1,400,30.48
+1,400,55.88
+1,400,15.24
+1,400,7.62
+1,400,7.62
+1,400,44.45
+1,400,40.64
+1,400,81.28
+1,400,35.56
+1,400,7.62
+1,400,44.45
+1,400,10.16
+1,400,40.64
+1,400,40.64
+1,400,33.02
+1,400,40.64
+1,400,50.8
+1,400,35.56
+1,400,22.86
+1,400,10.16
+1,400,27.94
+1,400,7.62
+1,400,7.62
+1,400,24.13
+1,400,10.16
+1,400,44.45
+1,400,40.64
+1,401,10.16
+1,401,55.88
+1,401,27.94
+1,401,40.64
+1,401,35.56
+1,401,33.02
+1,401,19.05
+1,401,53.975
+1,401,19.05
+1,401,24.13
+1,401,99.06
+1,401,7.62
+1,401,19.05
+1,401,27.94
+1,401,46.355
+1,401,33.02
+1,401,7.62
+1,401,7.62
+1,401,81.28
+1,401,10.16
+1,401,22.86
+1,401,10.16
+1,401,7.62
+1,401,8.89
+1,401,7.62
+1,401,15.24
+1,401,15.24
+1,401,22.86
+1,401,33.02
+1,401,50.8
+1,402,99.06
+1,402,45.72
+1,402,7.62
+1,402,7.62
+1,402,35.56
+1,402,10.16
+1,402,8.89
+1,402,40.64
+1,402,24.13
+1,402,55.88
+1,402,7.62
+1,402,40.64
+1,402,44.45
+1,402,46.355
+1,402,63.5
+1,402,33.02
+1,402,33.02
+1,402,44.45
+1,402,45.72
+1,402,44.45
+1,402,22.86
+1,402,30.48
+1,402,40.64
+1,402,63.5
+1,402,33.02
+1,402,30.48
+1,402,7.62
+1,402,8.89
+1,402,7.62
+1,402,30.48
+1,403,35.56
+1,403,10.16
+1,403,45.72
+1,403,7.62
+1,403,33.02
+1,403,53.975
+1,403,40.64
+1,403,7.62
+1,403,27.94
+1,403,44.45
+1,403,7.62
+1,403,10.16
+1,403,7.62
+1,403,7.62
+1,403,99.06
+1,403,35.56
+1,403,44.45
+1,403,24.13
+1,403,35.56
+1,403,30.48
+1,403,27.94
+1,403,40.64
+1,403,8.89
+1,403,81.28
+1,403,81.28
+1,403,30.48
+1,403,81.28
+1,403,33.02
+1,403,44.45
+1,403,7.62
+1,404,22.86
+1,404,7.62
+1,404,33.02
+1,404,81.28
+1,404,22.86
+1,404,8.89
+1,404,33.02
+1,404,81.28
+1,404,19.05
+1,404,63.5
+1,404,63.5
+1,404,50.8
+1,404,7.62
+1,404,46.355
+1,404,46.355
+1,404,35.56
+1,404,10.16
+1,404,46.355
+1,404,40.64
+1,404,33.02
+1,404,10.16
+1,404,35.56
+1,404,55.88
+1,404,55.88
+1,404,7.62
+1,404,81.28
+1,404,35.56
+1,404,30.48
+1,404,55.88
+1,404,33.02
+1,405,35.56
+1,405,44.45
+1,405,22.86
+1,405,24.13
+1,405,33.02
+1,405,27.94
+1,405,19.05
+1,405,33.02
+1,405,99.06
+1,405,35.56
+1,405,99.06
+1,405,44.45
+1,405,10.16
+1,405,7.62
+1,405,81.28
+1,405,35.56
+1,405,50.8
+1,405,7.62
+1,405,7.62
+1,405,33.02
+1,405,10.16
+1,405,22.86
+1,405,7.62
+1,405,40.64
+1,405,10.16
+1,405,33.02
+1,405,10.16
+1,405,7.62
+1,405,50.8
+1,405,46.355
+1,406,7.62
+1,406,22.86
+1,406,7.62
+1,406,7.62
+1,406,50.8
+1,406,35.56
+1,406,35.56
+1,406,22.86
+1,406,45.72
+1,406,7.62
+1,406,45.72
+1,406,99.06
+1,406,22.86
+1,406,7.62
+1,406,40.64
+1,406,35.56
+1,406,24.13
+1,406,53.975
+1,406,10.16
+1,406,24.13
+1,406,35.56
+1,406,50.8
+1,406,33.02
+1,406,24.13
+1,406,24.13
+1,406,50.8
+1,406,45.72
+1,406,63.5
+1,406,7.62
+1,406,10.16
+1,407,33.02
+1,407,33.02
+1,407,19.05
+1,407,35.56
+1,407,10.16
+1,407,27.94
+1,407,10.16
+1,407,10.16
+1,407,81.28
+1,407,33.02
+1,407,8.89
+1,407,30.48
+1,407,35.56
+1,407,45.72
+1,407,7.62
+1,407,8.89
+1,407,35.56
+1,407,40.64
+1,407,15.24
+1,407,8.89
+1,407,7.62
+1,407,7.62
+1,407,7.62
+1,407,55.88
+1,407,7.62
+1,407,30.48
+1,407,33.02
+1,407,7.62
+1,407,10.16
+1,407,19.05
+1,408,33.02
+1,408,7.62
+1,408,7.62
+1,408,81.28
+1,408,7.62
+1,408,40.64
+1,408,40.64
+1,408,22.86
+1,408,46.355
+1,408,7.62
+1,408,33.02
+1,408,10.16
+1,408,10.16
+1,408,8.89
+1,408,7.62
+1,408,19.05
+1,408,7.62
+1,408,44.45
+1,408,33.02
+1,408,33.02
+1,408,30.48
+1,408,15.24
+1,408,33.02
+1,408,7.62
+1,408,10.16
+1,408,7.62
+1,408,22.86
+1,408,50.8
+1,408,99.06
+1,408,8.89
+1,409,30.48
+1,409,30.48
+1,409,46.355
+1,409,40.64
+1,409,35.56
+1,409,24.13
+1,409,15.24
+1,409,33.02
+1,409,7.62
+1,409,50.8
+1,409,40.64
+1,409,8.89
+1,409,19.05
+1,409,55.88
+1,409,7.62
+1,409,7.62
+1,409,50.8
+1,409,7.62
+1,409,7.62
+1,409,40.64
+1,409,7.62
+1,409,33.02
+1,409,15.24
+1,409,27.94
+1,409,40.64
+1,409,24.13
+1,409,8.89
+1,409,8.89
+1,409,63.5
+1,409,8.89
+1,410,24.13
+1,410,35.56
+1,410,33.02
+1,410,27.94
+1,410,7.62
+1,410,45.72
+1,410,33.02
+1,410,7.62
+1,410,7.62
+1,410,40.64
+1,410,7.62
+1,410,46.355
+1,410,22.86
+1,410,50.8
+1,410,33.02
+1,410,50.8
+1,410,19.05
+1,410,33.02
+1,410,7.62
+1,410,7.62
+1,410,33.02
+1,410,40.64
+1,410,27.94
+1,410,10.16
+1,410,33.02
+1,410,7.62
+1,410,55.88
+1,410,7.62
+1,410,7.62
+1,410,10.16
+1,411,7.62
+1,411,22.86
+1,411,7.62
+1,411,63.5
+1,411,19.05
+1,411,40.64
+1,411,40.64
+1,411,35.56
+1,411,33.02
+1,411,40.64
+1,411,45.72
+1,411,45.72
+1,411,44.45
+1,411,50.8
+1,411,15.24
+1,411,7.62
+1,411,35.56
+1,411,22.86
+1,411,50.8
+1,411,27.94
+1,411,19.05
+1,411,55.88
+1,411,7.62
+1,411,53.975
+1,411,10.16
+1,411,15.24
+1,411,99.06
+1,411,45.72
+1,411,10.16
+1,411,7.62
+1,412,7.62
+1,412,27.94
+1,412,44.45
+1,412,8.89
+1,412,63.5
+1,412,63.5
+1,412,24.13
+1,412,81.28
+1,412,7.62
+1,412,53.975
+1,412,30.48
+1,412,24.13
+1,412,8.89
+1,412,7.62
+1,412,10.16
+1,412,33.02
+1,412,99.06
+1,412,24.13
+1,412,40.64
+1,412,63.5
+1,412,33.02
+1,412,44.45
+1,412,99.06
+1,412,27.94
+1,412,7.62
+1,412,7.62
+1,412,33.02
+1,412,63.5
+1,412,30.48
+1,412,7.62
+1,413,55.88
+1,413,63.5
+1,413,63.5
+1,413,55.88
+1,413,35.56
+1,413,40.64
+1,413,81.28
+1,413,33.02
+1,413,27.94
+1,413,35.56
+1,413,19.05
+1,413,8.89
+1,413,33.02
+1,413,33.02
+1,413,40.64
+1,413,22.86
+1,413,22.86
+1,413,7.62
+1,413,15.24
+1,413,81.28
+1,413,46.355
+1,413,7.62
+1,413,53.975
+1,413,45.72
+1,413,99.06
+1,413,50.8
+1,413,7.62
+1,413,44.45
+1,413,8.89
+1,413,50.8
+1,414,27.94
+1,414,7.62
+1,414,10.16
+1,414,35.56
+1,414,99.06
+1,414,24.13
+1,414,10.16
+1,414,10.16
+1,414,45.72
+1,414,7.62
+1,414,8.89
+1,414,40.64
+1,414,53.975
+1,414,50.8
+1,414,63.5
+1,414,7.62
+1,414,10.16
+1,414,33.02
+1,414,46.355
+1,414,30.48
+1,414,24.13
+1,414,7.62
+1,414,33.02
+1,414,33.02
+1,414,7.62
+1,414,50.8
+1,414,40.64
+1,414,35.56
+1,414,19.05
+1,414,35.56
+1,415,53.975
+1,415,81.28
+1,415,35.56
+1,415,53.975
+1,415,45.72
+1,415,7.62
+1,415,46.355
+1,415,7.62
+1,415,33.02
+1,415,7.62
+1,415,22.86
+1,415,81.28
+1,415,7.62
+1,415,7.62
+1,415,53.975
+1,415,46.355
+1,415,55.88
+1,415,81.28
+1,415,24.13
+1,415,33.02
+1,415,53.975
+1,415,81.28
+1,415,46.355
+1,415,19.05
+1,415,53.975
+1,415,7.62
+1,415,55.88
+1,415,27.94
+1,415,22.86
+1,415,53.975
+1,416,7.62
+1,416,19.05
+1,416,10.16
+1,416,15.24
+1,416,63.5
+1,416,40.64
+1,416,45.72
+1,416,19.05
+1,416,19.05
+1,416,7.62
+1,416,99.06
+1,416,7.62
+1,416,81.28
+1,416,35.56
+1,416,10.16
+1,416,7.62
+1,416,81.28
+1,416,33.02
+1,416,24.13
+1,416,30.48
+1,416,10.16
+1,416,7.62
+1,416,10.16
+1,416,30.48
+1,416,35.56
+1,416,33.02
+1,416,8.89
+1,416,33.02
+1,416,27.94
+1,416,53.975
+1,417,7.62
+1,417,7.62
+1,417,33.02
+1,417,40.64
+1,417,24.13
+1,417,45.72
+1,417,30.48
+1,417,35.56
+1,417,53.975
+1,417,99.06
+1,417,7.62
+1,417,55.88
+1,417,99.06
+1,417,55.88
+1,417,7.62
+1,417,27.94
+1,417,35.56
+1,417,99.06
+1,417,81.28
+1,417,33.02
+1,417,10.16
+1,417,53.975
+1,417,35.56
+1,417,40.64
+1,417,46.355
+1,417,24.13
+1,417,30.48
+1,417,33.02
+1,417,7.62
+1,417,55.88
+1,418,7.62
+1,418,55.88
+1,418,99.06
+1,418,10.16
+1,418,44.45
+1,418,33.02
+1,418,45.72
+1,418,10.16
+1,418,22.86
+1,418,45.72
+1,418,40.64
+1,418,81.28
+1,418,7.62
+1,418,63.5
+1,418,46.355
+1,418,45.72
+1,418,35.56
+1,418,99.06
+1,418,35.56
+1,418,15.24
+1,418,7.62
+1,418,7.62
+1,418,10.16
+1,418,7.62
+1,418,7.62
+1,418,7.62
+1,418,24.13
+1,418,40.64
+1,418,40.64
+1,418,40.64
+1,419,7.62
+1,419,7.62
+1,419,19.05
+1,419,10.16
+1,419,33.02
+1,419,40.64
+1,419,35.56
+1,419,7.62
+1,419,35.56
+1,419,46.355
+1,419,19.05
+1,419,35.56
+1,419,55.88
+1,419,35.56
+1,419,63.5
+1,419,55.88
+1,419,33.02
+1,419,10.16
+1,419,35.56
+1,419,10.16
+1,419,63.5
+1,419,15.24
+1,419,99.06
+1,419,46.355
+1,419,33.02
+1,419,15.24
+1,419,33.02
+1,419,45.72
+1,419,19.05
+1,419,7.62
+1,420,7.62
+1,420,44.45
+1,420,35.56
+1,420,33.02
+1,420,44.45
+1,420,7.62
+1,420,33.02
+1,420,19.05
+1,420,7.62
+1,420,15.24
+1,420,7.62
+1,420,50.8
+1,420,33.02
+1,420,7.62
+1,420,15.24
+1,420,8.89
+1,420,63.5
+1,420,81.28
+1,420,7.62
+1,420,45.72
+1,420,27.94
+1,420,22.86
+1,420,7.62
+1,420,50.8
+1,420,10.16
+1,420,19.05
+1,420,55.88
+1,420,63.5
+1,420,33.02
+1,420,10.16
+1,421,81.28
+1,421,81.28
+1,421,7.62
+1,421,33.02
+1,421,44.45
+1,421,53.975
+1,421,81.28
+1,421,7.62
+1,421,7.62
+1,421,24.13
+1,421,15.24
+1,421,45.72
+1,421,50.8
+1,421,63.5
+1,421,55.88
+1,421,7.62
+1,421,30.48
+1,421,45.72
+1,421,15.24
+1,421,40.64
+1,421,8.89
+1,421,7.62
+1,421,35.56
+1,421,99.06
+1,421,24.13
+1,421,45.72
+1,421,7.62
+1,421,55.88
+1,421,35.56
+1,421,35.56
+1,422,22.86
+1,422,33.02
+1,422,10.16
+1,422,33.02
+1,422,35.56
+1,422,63.5
+1,422,24.13
+1,422,45.72
+1,422,53.975
+1,422,40.64
+1,422,33.02
+1,422,35.56
+1,422,7.62
+1,422,10.16
+1,422,40.64
+1,422,45.72
+1,422,15.24
+1,422,27.94
+1,422,81.28
+1,422,81.28
+1,422,50.8
+1,422,24.13
+1,422,33.02
+1,422,7.62
+1,422,40.64
+1,422,40.64
+1,422,81.28
+1,422,55.88
+1,422,40.64
+1,422,44.45
+1,423,7.62
+1,423,53.975
+1,423,7.62
+1,423,7.62
+1,423,35.56
+1,423,33.02
+1,423,33.02
+1,423,40.64
+1,423,33.02
+1,423,7.62
+1,423,7.62
+1,423,33.02
+1,423,24.13
+1,423,55.88
+1,423,81.28
+1,423,81.28
+1,423,35.56
+1,423,10.16
+1,423,22.86
+1,423,46.355
+1,423,33.02
+1,423,44.45
+1,423,44.45
+1,423,15.24
+1,423,45.72
+1,423,7.62
+1,423,22.86
+1,423,81.28
+1,423,33.02
+1,423,7.62
+1,424,63.5
+1,424,33.02
+1,424,33.02
+1,424,46.355
+1,424,15.24
+1,424,7.62
+1,424,40.64
+1,424,55.88
+1,424,22.86
+1,424,35.56
+1,424,99.06
+1,424,33.02
+1,424,27.94
+1,424,22.86
+1,424,7.62
+1,424,33.02
+1,424,7.62
+1,424,24.13
+1,424,7.62
+1,424,10.16
+1,424,24.13
+1,424,46.355
+1,424,81.28
+1,424,50.8
+1,424,46.355
+1,424,33.02
+1,424,55.88
+1,424,44.45
+1,424,30.48
+1,424,53.975
+1,425,40.64
+1,425,33.02
+1,425,7.62
+1,425,8.89
+1,425,53.975
+1,425,33.02
+1,425,33.02
+1,425,44.45
+1,425,40.64
+1,425,33.02
+1,425,10.16
+1,425,81.28
+1,425,27.94
+1,425,27.94
+1,425,27.94
+1,425,45.72
+1,425,33.02
+1,425,33.02
+1,425,30.48
+1,425,81.28
+1,425,24.13
+1,425,35.56
+1,425,27.94
+1,425,27.94
+1,425,22.86
+1,425,15.24
+1,425,7.62
+1,425,7.62
+1,425,44.45
+1,425,35.56
+1,426,63.5
+1,426,63.5
+1,426,35.56
+1,426,7.62
+1,426,55.88
+1,426,7.62
+1,426,10.16
+1,426,7.62
+1,426,7.62
+1,426,19.05
+1,426,30.48
+1,426,22.86
+1,426,50.8
+1,426,27.94
+1,426,44.45
+1,426,50.8
+1,426,7.62
+1,426,24.13
+1,426,7.62
+1,426,7.62
+1,426,33.02
+1,426,35.56
+1,426,44.45
+1,426,40.64
+1,426,19.05
+1,426,40.64
+1,426,10.16
+1,426,27.94
+1,426,8.89
+1,426,35.56
+1,427,8.89
+1,427,30.48
+1,427,33.02
+1,427,33.02
+1,427,24.13
+1,427,33.02
+1,427,63.5
+1,427,44.45
+1,427,53.975
+1,427,24.13
+1,427,7.62
+1,427,7.62
+1,427,7.62
+1,427,40.64
+1,427,7.62
+1,427,7.62
+1,427,33.02
+1,427,63.5
+1,427,7.62
+1,427,35.56
+1,427,50.8
+1,427,10.16
+1,427,33.02
+1,427,7.62
+1,427,35.56
+1,427,7.62
+1,427,53.975
+1,427,27.94
+1,427,50.8
+1,427,27.94
+1,428,35.56
+1,428,15.24
+1,428,33.02
+1,428,7.62
+1,428,50.8
+1,428,33.02
+1,428,35.56
+1,428,99.06
+1,428,7.62
+1,428,7.62
+1,428,19.05
+1,428,35.56
+1,428,27.94
+1,428,44.45
+1,428,15.24
+1,428,22.86
+1,428,40.64
+1,428,81.28
+1,428,45.72
+1,428,19.05
+1,428,55.88
+1,428,22.86
+1,428,44.45
+1,428,15.24
+1,428,45.72
+1,428,10.16
+1,428,33.02
+1,428,10.16
+1,428,22.86
+1,428,50.8
+1,429,81.28
+1,429,44.45
+1,429,50.8
+1,429,33.02
+1,429,19.05
+1,429,50.8
+1,429,19.05
+1,429,33.02
+1,429,7.62
+1,429,35.56
+1,429,63.5
+1,429,7.62
+1,429,30.48
+1,429,45.72
+1,429,7.62
+1,429,30.48
+1,429,40.64
+1,429,53.975
+1,429,7.62
+1,429,40.64
+1,429,7.62
+1,429,22.86
+1,429,7.62
+1,429,40.64
+1,429,40.64
+1,429,7.62
+1,429,19.05
+1,429,50.8
+1,429,7.62
+1,429,55.88
+1,430,15.24
+1,430,33.02
+1,430,7.62
+1,430,22.86
+1,430,7.62
+1,430,50.8
+1,430,35.56
+1,430,33.02
+1,430,22.86
+1,430,27.94
+1,430,7.62
+1,430,40.64
+1,430,44.45
+1,430,10.16
+1,430,10.16
+1,430,63.5
+1,430,30.48
+1,430,63.5
+1,430,22.86
+1,430,46.355
+1,430,33.02
+1,430,99.06
+1,430,45.72
+1,430,55.88
+1,430,53.975
+1,430,22.86
+1,430,50.8
+1,430,53.975
+1,430,30.48
+1,430,55.88
+1,431,8.89
+1,431,22.86
+1,431,33.02
+1,431,40.64
+1,431,40.64
+1,431,27.94
+1,431,7.62
+1,431,55.88
+1,431,7.62
+1,431,50.8
+1,431,35.56
+1,431,7.62
+1,431,15.24
+1,431,10.16
+1,431,33.02
+1,431,7.62
+1,431,24.13
+1,431,10.16
+1,431,45.72
+1,431,99.06
+1,431,40.64
+1,431,35.56
+1,431,7.62
+1,431,10.16
+1,431,33.02
+1,431,7.62
+1,431,99.06
+1,431,44.45
+1,431,53.975
+1,431,7.62
+1,432,40.64
+1,432,35.56
+1,432,99.06
+1,432,33.02
+1,432,63.5
+1,432,40.64
+1,432,33.02
+1,432,81.28
+1,432,30.48
+1,432,15.24
+1,432,81.28
+1,432,7.62
+1,432,40.64
+1,432,81.28
+1,432,55.88
+1,432,53.975
+1,432,15.24
+1,432,7.62
+1,432,45.72
+1,432,40.64
+1,432,8.89
+1,432,81.28
+1,432,99.06
+1,432,40.64
+1,432,33.02
+1,432,24.13
+1,432,15.24
+1,432,30.48
+1,432,15.24
+1,432,63.5
+1,433,46.355
+1,433,45.72
+1,433,8.89
+1,433,81.28
+1,433,53.975
+1,433,7.62
+1,433,7.62
+1,433,50.8
+1,433,63.5
+1,433,81.28
+1,433,27.94
+1,433,22.86
+1,433,33.02
+1,433,46.355
+1,433,7.62
+1,433,40.64
+1,433,81.28
+1,433,15.24
+1,433,27.94
+1,433,7.62
+1,433,81.28
+1,433,40.64
+1,433,7.62
+1,433,50.8
+1,433,30.48
+1,433,10.16
+1,433,33.02
+1,433,35.56
+1,433,15.24
+1,433,7.62
+1,434,33.02
+1,434,7.62
+1,434,30.48
+1,434,7.62
+1,434,33.02
+1,434,19.05
+1,434,33.02
+1,434,81.28
+1,434,7.62
+1,434,19.05
+1,434,8.89
+1,434,99.06
+1,434,99.06
+1,434,27.94
+1,434,46.355
+1,434,7.62
+1,434,33.02
+1,434,19.05
+1,434,7.62
+1,434,30.48
+1,434,10.16
+1,434,55.88
+1,434,45.72
+1,434,35.56
+1,434,35.56
+1,434,45.72
+1,434,22.86
+1,434,63.5
+1,434,22.86
+1,434,19.05
+1,435,7.62
+1,435,33.02
+1,435,33.02
+1,435,7.62
+1,435,7.62
+1,435,30.48
+1,435,40.64
+1,435,33.02
+1,435,55.88
+1,435,7.62
+1,435,81.28
+1,435,33.02
+1,435,7.62
+1,435,24.13
+1,435,10.16
+1,435,35.56
+1,435,81.28
+1,435,15.24
+1,435,7.62
+1,435,81.28
+1,435,30.48
+1,435,99.06
+1,435,27.94
+1,435,33.02
+1,435,7.62
+1,435,30.48
+1,435,15.24
+1,435,99.06
+1,435,10.16
+1,435,35.56
+1,436,7.62
+1,436,7.62
+1,436,40.64
+1,436,99.06
+1,436,35.56
+1,436,40.64
+1,436,35.56
+1,436,10.16
+1,436,53.975
+1,436,7.62
+1,436,10.16
+1,436,35.56
+1,436,46.355
+1,436,35.56
+1,436,33.02
+1,436,22.86
+1,436,7.62
+1,436,45.72
+1,436,7.62
+1,436,44.45
+1,436,7.62
+1,436,99.06
+1,436,33.02
+1,436,19.05
+1,436,10.16
+1,436,33.02
+1,436,33.02
+1,436,30.48
+1,436,30.48
+1,436,7.62
+1,437,10.16
+1,437,81.28
+1,437,22.86
+1,437,7.62
+1,437,46.355
+1,437,99.06
+1,437,33.02
+1,437,35.56
+1,437,40.64
+1,437,10.16
+1,437,22.86
+1,437,44.45
+1,437,33.02
+1,437,24.13
+1,437,63.5
+1,437,53.975
+1,437,33.02
+1,437,33.02
+1,437,33.02
+1,437,33.02
+1,437,33.02
+1,437,35.56
+1,437,40.64
+1,437,7.62
+1,437,7.62
+1,437,22.86
+1,437,50.8
+1,437,63.5
+1,437,33.02
+1,437,45.72
+1,438,44.45
+1,438,15.24
+1,438,44.45
+1,438,46.355
+1,438,99.06
+1,438,22.86
+1,438,24.13
+1,438,40.64
+1,438,27.94
+1,438,33.02
+1,438,35.56
+1,438,45.72
+1,438,35.56
+1,438,55.88
+1,438,10.16
+1,438,50.8
+1,438,22.86
+1,438,30.48
+1,438,63.5
+1,438,7.62
+1,438,50.8
+1,438,44.45
+1,438,10.16
+1,438,35.56
+1,438,33.02
+1,438,24.13
+1,438,35.56
+1,438,81.28
+1,438,7.62
+1,438,10.16
+1,439,24.13
+1,439,63.5
+1,439,27.94
+1,439,19.05
+1,439,7.62
+1,439,7.62
+1,439,10.16
+1,439,81.28
+1,439,19.05
+1,439,19.05
+1,439,7.62
+1,439,30.48
+1,439,53.975
+1,439,33.02
+1,439,7.62
+1,439,55.88
+1,439,45.72
+1,439,27.94
+1,439,44.45
+1,439,24.13
+1,439,35.56
+1,439,35.56
+1,439,99.06
+1,439,7.62
+1,439,24.13
+1,439,53.975
+1,439,7.62
+1,439,7.62
+1,439,45.72
+1,439,10.16
+1,440,7.62
+1,440,35.56
+1,440,27.94
+1,440,10.16
+1,440,10.16
+1,440,30.48
+1,440,55.88
+1,440,81.28
+1,440,45.72
+1,440,15.24
+1,440,27.94
+1,440,19.05
+1,440,10.16
+1,440,50.8
+1,440,24.13
+1,440,15.24
+1,440,10.16
+1,440,81.28
+1,440,7.62
+1,440,7.62
+1,440,40.64
+1,440,50.8
+1,440,33.02
+1,440,19.05
+1,440,63.5
+1,440,33.02
+1,440,33.02
+1,440,33.02
+1,440,7.62
+1,440,7.62
+1,441,63.5
+1,441,63.5
+1,441,19.05
+1,441,19.05
+1,441,45.72
+1,441,15.24
+1,441,10.16
+1,441,7.62
+1,441,81.28
+1,441,35.56
+1,441,33.02
+1,441,7.62
+1,441,8.89
+1,441,7.62
+1,441,46.355
+1,441,33.02
+1,441,40.64
+1,441,81.28
+1,441,19.05
+1,441,44.45
+1,441,10.16
+1,441,7.62
+1,441,35.56
+1,441,63.5
+1,441,10.16
+1,441,40.64
+1,441,8.89
+1,441,35.56
+1,441,33.02
+1,441,19.05
+1,442,19.05
+1,442,55.88
+1,442,46.355
+1,442,33.02
+1,442,10.16
+1,442,15.24
+1,442,7.62
+1,442,44.45
+1,442,22.86
+1,442,40.64
+1,442,7.62
+1,442,7.62
+1,442,53.975
+1,442,7.62
+1,442,55.88
+1,442,40.64
+1,442,7.62
+1,442,10.16
+1,442,7.62
+1,442,44.45
+1,442,35.56
+1,442,53.975
+1,442,45.72
+1,442,30.48
+1,442,7.62
+1,442,50.8
+1,442,45.72
+1,442,30.48
+1,442,7.62
+1,442,30.48
+1,443,10.16
+1,443,7.62
+1,443,10.16
+1,443,7.62
+1,443,33.02
+1,443,7.62
+1,443,22.86
+1,443,15.24
+1,443,63.5
+1,443,7.62
+1,443,19.05
+1,443,35.56
+1,443,44.45
+1,443,35.56
+1,443,33.02
+1,443,7.62
+1,443,7.62
+1,443,7.62
+1,443,10.16
+1,443,19.05
+1,443,35.56
+1,443,50.8
+1,443,63.5
+1,443,7.62
+1,443,33.02
+1,443,10.16
+1,443,35.56
+1,443,55.88
+1,443,8.89
+1,443,35.56
+1,444,7.62
+1,444,7.62
+1,444,33.02
+1,444,46.355
+1,444,35.56
+1,444,46.355
+1,444,7.62
+1,444,7.62
+1,444,55.88
+1,444,46.355
+1,444,24.13
+1,444,7.62
+1,444,44.45
+1,444,7.62
+1,444,7.62
+1,444,33.02
+1,444,33.02
+1,444,24.13
+1,444,40.64
+1,444,27.94
+1,444,63.5
+1,444,53.975
+1,444,7.62
+1,444,7.62
+1,444,53.975
+1,444,40.64
+1,444,45.72
+1,444,40.64
+1,444,33.02
+1,444,10.16
+1,445,55.88
+1,445,53.975
+1,445,33.02
+1,445,33.02
+1,445,7.62
+1,445,35.56
+1,445,46.355
+1,445,19.05
+1,445,81.28
+1,445,99.06
+1,445,33.02
+1,445,10.16
+1,445,22.86
+1,445,35.56
+1,445,27.94
+1,445,53.975
+1,445,81.28
+1,445,99.06
+1,445,99.06
+1,445,33.02
+1,445,33.02
+1,445,7.62
+1,445,24.13
+1,445,19.05
+1,445,7.62
+1,445,50.8
+1,445,33.02
+1,445,15.24
+1,445,44.45
+1,445,10.16
+1,446,19.05
+1,446,33.02
+1,446,35.56
+1,446,40.64
+1,446,35.56
+1,446,63.5
+1,446,27.94
+1,446,15.24
+1,446,99.06
+1,446,7.62
+1,446,35.56
+1,446,81.28
+1,446,7.62
+1,446,7.62
+1,446,53.975
+1,446,8.89
+1,446,8.89
+1,446,81.28
+1,446,35.56
+1,446,8.89
+1,446,99.06
+1,446,7.62
+1,446,40.64
+1,446,55.88
+1,446,8.89
+1,446,81.28
+1,446,53.975
+1,446,55.88
+1,446,81.28
+1,446,7.62
+1,447,55.88
+1,447,44.45
+1,447,33.02
+1,447,44.45
+1,447,19.05
+1,447,7.62
+1,447,19.05
+1,447,53.975
+1,447,55.88
+1,447,99.06
+1,447,33.02
+1,447,63.5
+1,447,15.24
+1,447,33.02
+1,447,7.62
+1,447,24.13
+1,447,50.8
+1,447,33.02
+1,447,33.02
+1,447,30.48
+1,447,46.355
+1,447,44.45
+1,447,7.62
+1,447,30.48
+1,447,46.355
+1,447,7.62
+1,447,99.06
+1,447,55.88
+1,447,19.05
+1,447,40.64
+1,448,50.8
+1,448,53.975
+1,448,35.56
+1,448,35.56
+1,448,24.13
+1,448,53.975
+1,448,33.02
+1,448,7.62
+1,448,46.355
+1,448,15.24
+1,448,81.28
+1,448,10.16
+1,448,7.62
+1,448,33.02
+1,448,7.62
+1,448,24.13
+1,448,46.355
+1,448,35.56
+1,448,63.5
+1,448,10.16
+1,448,30.48
+1,448,30.48
+1,448,15.24
+1,448,27.94
+1,448,44.45
+1,448,33.02
+1,448,8.89
+1,448,7.62
+1,448,46.355
+1,448,24.13
+1,449,30.48
+1,449,27.94
+1,449,53.975
+1,449,35.56
+1,449,19.05
+1,449,99.06
+1,449,50.8
+1,449,99.06
+1,449,8.89
+1,449,27.94
+1,449,40.64
+1,449,63.5
+1,449,7.62
+1,449,40.64
+1,449,99.06
+1,449,10.16
+1,449,33.02
+1,449,33.02
+1,449,33.02
+1,449,46.355
+1,449,46.355
+1,449,7.62
+1,449,33.02
+1,449,40.64
+1,449,7.62
+1,449,7.62
+1,449,50.8
+1,449,10.16
+1,449,46.355
+1,449,33.02
+1,450,22.86
+1,450,22.86
+1,450,10.16
+1,450,40.64
+1,450,7.62
+1,450,27.94
+1,450,7.62
+1,450,10.16
+1,450,22.86
+1,450,7.62
+1,450,99.06
+1,450,19.05
+1,450,50.8
+1,450,30.48
+1,450,99.06
+1,450,99.06
+1,450,10.16
+1,450,35.56
+1,450,44.45
+1,450,7.62
+1,450,33.02
+1,450,63.5
+1,450,22.86
+1,450,33.02
+1,450,46.355
+1,450,10.16
+1,450,40.64
+1,450,35.56
+1,450,40.64
+1,450,35.56
+1,451,33.02
+1,451,55.88
+1,451,46.355
+1,451,40.64
+1,451,7.62
+1,451,99.06
+1,451,15.24
+1,451,30.48
+1,451,40.64
+1,451,7.62
+1,451,50.8
+1,451,46.355
+1,451,50.8
+1,451,55.88
+1,451,19.05
+1,451,50.8
+1,451,46.355
+1,451,15.24
+1,451,33.02
+1,451,46.355
+1,451,27.94
+1,451,7.62
+1,451,40.64
+1,451,33.02
+1,451,40.64
+1,451,10.16
+1,451,35.56
+1,451,50.8
+1,451,50.8
+1,451,8.89
+1,452,33.02
+1,452,7.62
+1,452,63.5
+1,452,19.05
+1,452,33.02
+1,452,7.62
+1,452,22.86
+1,452,45.72
+1,452,8.89
+1,452,10.16
+1,452,33.02
+1,452,10.16
+1,452,7.62
+1,452,33.02
+1,452,7.62
+1,452,7.62
+1,452,22.86
+1,452,19.05
+1,452,40.64
+1,452,7.62
+1,452,7.62
+1,452,7.62
+1,452,15.24
+1,452,7.62
+1,452,55.88
+1,452,44.45
+1,452,33.02
+1,452,24.13
+1,452,19.05
+1,452,10.16
+1,453,7.62
+1,453,53.975
+1,453,7.62
+1,453,33.02
+1,453,10.16
+1,453,24.13
+1,453,81.28
+1,453,40.64
+1,453,7.62
+1,453,7.62
+1,453,40.64
+1,453,50.8
+1,453,19.05
+1,453,46.355
+1,453,8.89
+1,453,10.16
+1,453,40.64
+1,453,7.62
+1,453,33.02
+1,453,7.62
+1,453,27.94
+1,453,55.88
+1,453,7.62
+1,453,10.16
+1,453,63.5
+1,453,63.5
+1,453,7.62
+1,453,44.45
+1,453,8.89
+1,453,45.72
+1,454,35.56
+1,454,44.45
+1,454,33.02
+1,454,10.16
+1,454,63.5
+1,454,33.02
+1,454,33.02
+1,454,99.06
+1,454,10.16
+1,454,46.355
+1,454,45.72
+1,454,7.62
+1,454,22.86
+1,454,8.89
+1,454,8.89
+1,454,55.88
+1,454,27.94
+1,454,27.94
+1,454,19.05
+1,454,22.86
+1,454,7.62
+1,454,40.64
+1,454,40.64
+1,454,63.5
+1,454,55.88
+1,454,99.06
+1,454,10.16
+1,454,7.62
+1,454,46.355
+1,454,7.62
+1,455,45.72
+1,455,40.64
+1,455,99.06
+1,455,40.64
+1,455,99.06
+1,455,50.8
+1,455,35.56
+1,455,15.24
+1,455,15.24
+1,455,7.62
+1,455,8.89
+1,455,30.48
+1,455,99.06
+1,455,15.24
+1,455,22.86
+1,455,7.62
+1,455,55.88
+1,455,35.56
+1,455,15.24
+1,455,30.48
+1,455,7.62
+1,455,53.975
+1,455,35.56
+1,455,40.64
+1,455,33.02
+1,455,55.88
+1,455,40.64
+1,455,19.05
+1,455,33.02
+1,455,7.62
+1,456,33.02
+1,456,55.88
+1,456,19.05
+1,456,33.02
+1,456,15.24
+1,456,30.48
+1,456,10.16
+1,456,15.24
+1,456,30.48
+1,456,63.5
+1,456,7.62
+1,456,50.8
+1,456,63.5
+1,456,7.62
+1,456,33.02
+1,456,27.94
+1,456,8.89
+1,456,35.56
+1,456,7.62
+1,456,33.02
+1,456,44.45
+1,456,50.8
+1,456,99.06
+1,456,33.02
+1,456,44.45
+1,456,24.13
+1,456,22.86
+1,456,7.62
+1,456,8.89
+1,456,33.02
+1,457,30.48
+1,457,33.02
+1,457,45.72
+1,457,27.94
+1,457,53.975
+1,457,27.94
+1,457,10.16
+1,457,24.13
+1,457,44.45
+1,457,81.28
+1,457,27.94
+1,457,33.02
+1,457,46.355
+1,457,7.62
+1,457,46.355
+1,457,7.62
+1,457,40.64
+1,457,33.02
+1,457,33.02
+1,457,7.62
+1,457,27.94
+1,457,33.02
+1,457,24.13
+1,457,44.45
+1,457,15.24
+1,457,99.06
+1,457,63.5
+1,457,15.24
+1,457,40.64
+1,457,35.56
+1,458,15.24
+1,458,35.56
+1,458,15.24
+1,458,44.45
+1,458,7.62
+1,458,7.62
+1,458,40.64
+1,458,7.62
+1,458,7.62
+1,458,53.975
+1,458,7.62
+1,458,27.94
+1,458,7.62
+1,458,8.89
+1,458,10.16
+1,458,44.45
+1,458,27.94
+1,458,46.355
+1,458,81.28
+1,458,81.28
+1,458,15.24
+1,458,50.8
+1,458,15.24
+1,458,44.45
+1,458,24.13
+1,458,53.975
+1,458,7.62
+1,458,33.02
+1,458,50.8
+1,458,63.5
+1,459,7.62
+1,459,46.355
+1,459,27.94
+1,459,99.06
+1,459,33.02
+1,459,45.72
+1,459,35.56
+1,459,33.02
+1,459,40.64
+1,459,35.56
+1,459,81.28
+1,459,8.89
+1,459,7.62
+1,459,15.24
+1,459,7.62
+1,459,10.16
+1,459,15.24
+1,459,55.88
+1,459,63.5
+1,459,50.8
+1,459,55.88
+1,459,8.89
+1,459,81.28
+1,459,99.06
+1,459,7.62
+1,459,81.28
+1,459,44.45
+1,459,7.62
+1,459,63.5
+1,459,27.94
+1,460,46.355
+1,460,50.8
+1,460,40.64
+1,460,63.5
+1,460,7.62
+1,460,24.13
+1,460,44.45
+1,460,33.02
+1,460,81.28
+1,460,44.45
+1,460,99.06
+1,460,27.94
+1,460,7.62
+1,460,8.89
+1,460,45.72
+1,460,7.62
+1,460,10.16
+1,460,35.56
+1,460,27.94
+1,460,7.62
+1,460,53.975
+1,460,30.48
+1,460,33.02
+1,460,8.89
+1,460,63.5
+1,460,99.06
+1,460,24.13
+1,460,50.8
+1,460,7.62
+1,460,99.06
+1,461,22.86
+1,461,30.48
+1,461,33.02
+1,461,46.355
+1,461,55.88
+1,461,10.16
+1,461,10.16
+1,461,35.56
+1,461,53.975
+1,461,81.28
+1,461,10.16
+1,461,40.64
+1,461,7.62
+1,461,27.94
+1,461,30.48
+1,461,35.56
+1,461,35.56
+1,461,8.89
+1,461,27.94
+1,461,33.02
+1,461,81.28
+1,461,8.89
+1,461,45.72
+1,461,10.16
+1,461,53.975
+1,461,22.86
+1,461,81.28
+1,461,33.02
+1,461,40.64
+1,461,35.56
+1,462,45.72
+1,462,30.48
+1,462,10.16
+1,462,8.89
+1,462,33.02
+1,462,7.62
+1,462,7.62
+1,462,40.64
+1,462,46.355
+1,462,44.45
+1,462,35.56
+1,462,22.86
+1,462,10.16
+1,462,63.5
+1,462,46.355
+1,462,40.64
+1,462,7.62
+1,462,81.28
+1,462,7.62
+1,462,53.975
+1,462,33.02
+1,462,40.64
+1,462,10.16
+1,462,99.06
+1,462,7.62
+1,462,35.56
+1,462,33.02
+1,462,63.5
+1,462,40.64
+1,462,33.02
+1,463,10.16
+1,463,53.975
+1,463,45.72
+1,463,22.86
+1,463,33.02
+1,463,33.02
+1,463,46.355
+1,463,33.02
+1,463,63.5
+1,463,7.62
+1,463,33.02
+1,463,40.64
+1,463,7.62
+1,463,33.02
+1,463,7.62
+1,463,81.28
+1,463,24.13
+1,463,46.355
+1,463,33.02
+1,463,10.16
+1,463,55.88
+1,463,24.13
+1,463,30.48
+1,463,8.89
+1,463,35.56
+1,463,27.94
+1,463,27.94
+1,463,7.62
+1,463,99.06
+1,463,15.24
+1,464,7.62
+1,464,22.86
+1,464,33.02
+1,464,45.72
+1,464,15.24
+1,464,15.24
+1,464,40.64
+1,464,33.02
+1,464,40.64
+1,464,50.8
+1,464,7.62
+1,464,19.05
+1,464,40.64
+1,464,44.45
+1,464,10.16
+1,464,53.975
+1,464,24.13
+1,464,27.94
+1,464,44.45
+1,464,55.88
+1,464,8.89
+1,464,19.05
+1,464,33.02
+1,464,44.45
+1,464,81.28
+1,464,63.5
+1,464,50.8
+1,464,30.48
+1,464,53.975
+1,464,40.64
+1,465,10.16
+1,465,15.24
+1,465,99.06
+1,465,22.86
+1,465,40.64
+1,465,35.56
+1,465,7.62
+1,465,99.06
+1,465,53.975
+1,465,27.94
+1,465,53.975
+1,465,45.72
+1,465,30.48
+1,465,99.06
+1,465,55.88
+1,465,40.64
+1,465,24.13
+1,465,7.62
+1,465,33.02
+1,465,35.56
+1,465,50.8
+1,465,99.06
+1,465,63.5
+1,465,7.62
+1,465,50.8
+1,465,7.62
+1,465,99.06
+1,465,55.88
+1,465,7.62
+1,465,7.62
+1,466,33.02
+1,466,40.64
+1,466,81.28
+1,466,33.02
+1,466,45.72
+1,466,53.975
+1,466,7.62
+1,466,7.62
+1,466,44.45
+1,466,50.8
+1,466,40.64
+1,466,10.16
+1,466,50.8
+1,466,50.8
+1,466,22.86
+1,466,22.86
+1,466,45.72
+1,466,50.8
+1,466,44.45
+1,466,27.94
+1,466,8.89
+1,466,99.06
+1,466,27.94
+1,466,7.62
+1,466,99.06
+1,466,24.13
+1,466,15.24
+1,466,35.56
+1,466,33.02
+1,466,8.89
+1,467,44.45
+1,467,99.06
+1,467,27.94
+1,467,7.62
+1,467,35.56
+1,467,33.02
+1,467,7.62
+1,467,81.28
+1,467,30.48
+1,467,45.72
+1,467,7.62
+1,467,10.16
+1,467,63.5
+1,467,10.16
+1,467,8.89
+1,467,33.02
+1,467,7.62
+1,467,81.28
+1,467,40.64
+1,467,35.56
+1,467,22.86
+1,467,10.16
+1,467,33.02
+1,467,81.28
+1,467,63.5
+1,467,7.62
+1,467,63.5
+1,467,81.28
+1,467,35.56
+1,467,7.62
+1,468,22.86
+1,468,33.02
+1,468,15.24
+1,468,99.06
+1,468,35.56
+1,468,22.86
+1,468,8.89
+1,468,8.89
+1,468,55.88
+1,468,55.88
+1,468,40.64
+1,468,15.24
+1,468,10.16
+1,468,8.89
+1,468,30.48
+1,468,40.64
+1,468,99.06
+1,468,19.05
+1,468,40.64
+1,468,46.355
+1,468,7.62
+1,468,24.13
+1,468,33.02
+1,468,35.56
+1,468,44.45
+1,468,81.28
+1,468,81.28
+1,468,10.16
+1,468,24.13
+1,468,10.16
+1,469,53.975
+1,469,35.56
+1,469,53.975
+1,469,81.28
+1,469,8.89
+1,469,45.72
+1,469,63.5
+1,469,24.13
+1,469,7.62
+1,469,46.355
+1,469,24.13
+1,469,40.64
+1,469,40.64
+1,469,53.975
+1,469,30.48
+1,469,30.48
+1,469,22.86
+1,469,50.8
+1,469,7.62
+1,469,35.56
+1,469,10.16
+1,469,40.64
+1,469,10.16
+1,469,40.64
+1,469,22.86
+1,469,7.62
+1,469,10.16
+1,469,33.02
+1,469,30.48
+1,469,7.62
+1,470,7.62
+1,470,7.62
+1,470,44.45
+1,470,7.62
+1,470,15.24
+1,470,30.48
+1,470,10.16
+1,470,19.05
+1,470,99.06
+1,470,27.94
+1,470,53.975
+1,470,19.05
+1,470,24.13
+1,470,44.45
+1,470,33.02
+1,470,15.24
+1,470,35.56
+1,470,22.86
+1,470,33.02
+1,470,46.355
+1,470,7.62
+1,470,27.94
+1,470,7.62
+1,470,45.72
+1,470,33.02
+1,470,7.62
+1,470,45.72
+1,470,7.62
+1,470,50.8
+1,470,33.02
+1,471,15.24
+1,471,81.28
+1,471,63.5
+1,471,24.13
+1,471,81.28
+1,471,7.62
+1,471,24.13
+1,471,10.16
+1,471,22.86
+1,471,99.06
+1,471,81.28
+1,471,33.02
+1,471,53.975
+1,471,8.89
+1,471,63.5
+1,471,33.02
+1,471,33.02
+1,471,46.355
+1,471,8.89
+1,471,7.62
+1,471,99.06
+1,471,44.45
+1,471,53.975
+1,471,33.02
+1,471,46.355
+1,471,46.355
+1,471,53.975
+1,471,7.62
+1,471,7.62
+1,471,55.88
+1,472,35.56
+1,472,35.56
+1,472,35.56
+1,472,7.62
+1,472,24.13
+1,472,35.56
+1,472,10.16
+1,472,7.62
+1,472,10.16
+1,472,35.56
+1,472,8.89
+1,472,27.94
+1,472,99.06
+1,472,35.56
+1,472,33.02
+1,472,53.975
+1,472,7.62
+1,472,30.48
+1,472,33.02
+1,472,7.62
+1,472,81.28
+1,472,15.24
+1,472,7.62
+1,472,63.5
+1,472,27.94
+1,472,33.02
+1,472,40.64
+1,472,30.48
+1,472,33.02
+1,472,50.8
+1,473,33.02
+1,473,22.86
+1,473,33.02
+1,473,24.13
+1,473,15.24
+1,473,10.16
+1,473,50.8
+1,473,33.02
+1,473,35.56
+1,473,7.62
+1,473,7.62
+1,473,40.64
+1,473,7.62
+1,473,8.89
+1,473,8.89
+1,473,35.56
+1,473,45.72
+1,473,50.8
+1,473,50.8
+1,473,81.28
+1,473,40.64
+1,473,40.64
+1,473,33.02
+1,473,50.8
+1,473,99.06
+1,473,27.94
+1,473,10.16
+1,473,63.5
+1,473,63.5
+1,473,27.94
+1,474,35.56
+1,474,10.16
+1,474,10.16
+1,474,35.56
+1,474,40.64
+1,474,81.28
+1,474,15.24
+1,474,40.64
+1,474,53.975
+1,474,8.89
+1,474,7.62
+1,474,7.62
+1,474,46.355
+1,474,44.45
+1,474,10.16
+1,474,10.16
+1,474,35.56
+1,474,33.02
+1,474,45.72
+1,474,10.16
+1,474,33.02
+1,474,33.02
+1,474,7.62
+1,474,10.16
+1,474,10.16
+1,474,10.16
+1,474,8.89
+1,474,19.05
+1,474,45.72
+1,474,7.62
+1,475,7.62
+1,475,45.72
+1,475,33.02
+1,475,30.48
+1,475,40.64
+1,475,40.64
+1,475,7.62
+1,475,35.56
+1,475,44.45
+1,475,99.06
+1,475,99.06
+1,475,10.16
+1,475,44.45
+1,475,7.62
+1,475,33.02
+1,475,7.62
+1,475,35.56
+1,475,8.89
+1,475,33.02
+1,475,7.62
+1,475,10.16
+1,475,19.05
+1,475,33.02
+1,475,55.88
+1,475,7.62
+1,475,19.05
+1,475,7.62
+1,475,10.16
+1,475,7.62
+1,475,24.13
+1,476,40.64
+1,476,40.64
+1,476,46.355
+1,476,99.06
+1,476,7.62
+1,476,55.88
+1,476,33.02
+1,476,40.64
+1,476,40.64
+1,476,8.89
+1,476,10.16
+1,476,46.355
+1,476,63.5
+1,476,7.62
+1,476,40.64
+1,476,53.975
+1,476,46.355
+1,476,63.5
+1,476,35.56
+1,476,33.02
+1,476,40.64
+1,476,30.48
+1,476,27.94
+1,476,7.62
+1,476,7.62
+1,476,50.8
+1,476,7.62
+1,476,10.16
+1,476,33.02
+1,476,46.355
+1,477,15.24
+1,477,33.02
+1,477,99.06
+1,477,8.89
+1,477,8.89
+1,477,99.06
+1,477,10.16
+1,477,33.02
+1,477,30.48
+1,477,55.88
+1,477,10.16
+1,477,35.56
+1,477,22.86
+1,477,7.62
+1,477,40.64
+1,477,44.45
+1,477,45.72
+1,477,19.05
+1,477,44.45
+1,477,33.02
+1,477,8.89
+1,477,33.02
+1,477,46.355
+1,477,50.8
+1,477,35.56
+1,477,15.24
+1,477,7.62
+1,477,30.48
+1,477,35.56
+1,477,15.24
+1,478,33.02
+1,478,81.28
+1,478,55.88
+1,478,7.62
+1,478,63.5
+1,478,7.62
+1,478,7.62
+1,478,50.8
+1,478,81.28
+1,478,7.62
+1,478,7.62
+1,478,46.355
+1,478,99.06
+1,478,53.975
+1,478,40.64
+1,478,7.62
+1,478,30.48
+1,478,7.62
+1,478,8.89
+1,478,15.24
+1,478,81.28
+1,478,7.62
+1,478,7.62
+1,478,10.16
+1,478,45.72
+1,478,33.02
+1,478,27.94
+1,478,63.5
+1,478,30.48
+1,478,50.8
+1,479,15.24
+1,479,53.975
+1,479,30.48
+1,479,7.62
+1,479,15.24
+1,479,46.355
+1,479,35.56
+1,479,10.16
+1,479,30.48
+1,479,44.45
+1,479,7.62
+1,479,15.24
+1,479,40.64
+1,479,22.86
+1,479,33.02
+1,479,7.62
+1,479,7.62
+1,479,30.48
+1,479,33.02
+1,479,24.13
+1,479,7.62
+1,479,10.16
+1,479,8.89
+1,479,7.62
+1,479,10.16
+1,479,10.16
+1,479,99.06
+1,479,81.28
+1,479,40.64
+1,479,10.16
+1,480,63.5
+1,480,99.06
+1,480,24.13
+1,480,99.06
+1,480,40.64
+1,480,46.355
+1,480,10.16
+1,480,40.64
+1,480,33.02
+1,480,35.56
+1,480,7.62
+1,480,40.64
+1,480,33.02
+1,480,63.5
+1,480,33.02
+1,480,35.56
+1,480,8.89
+1,480,8.89
+1,480,40.64
+1,480,19.05
+1,480,99.06
+1,480,22.86
+1,480,15.24
+1,480,46.355
+1,480,10.16
+1,480,7.62
+1,480,8.89
+1,480,35.56
+1,480,33.02
+1,480,35.56
+1,481,7.62
+1,481,10.16
+1,481,7.62
+1,481,33.02
+1,481,53.975
+1,481,46.355
+1,481,63.5
+1,481,99.06
+1,481,19.05
+1,481,7.62
+1,481,8.89
+1,481,40.64
+1,481,33.02
+1,481,27.94
+1,481,7.62
+1,481,24.13
+1,481,15.24
+1,481,19.05
+1,481,10.16
+1,481,40.64
+1,481,63.5
+1,481,99.06
+1,481,63.5
+1,481,40.64
+1,481,45.72
+1,481,22.86
+1,481,22.86
+1,481,35.56
+1,481,46.355
+1,481,50.8
+1,482,7.62
+1,482,22.86
+1,482,10.16
+1,482,45.72
+1,482,35.56
+1,482,15.24
+1,482,45.72
+1,482,10.16
+1,482,7.62
+1,482,46.355
+1,482,40.64
+1,482,33.02
+1,482,81.28
+1,482,33.02
+1,482,8.89
+1,482,7.62
+1,482,50.8
+1,482,7.62
+1,482,7.62
+1,482,33.02
+1,482,44.45
+1,482,45.72
+1,482,40.64
+1,482,10.16
+1,482,10.16
+1,482,40.64
+1,482,44.45
+1,482,7.62
+1,482,10.16
+1,482,15.24
+1,483,33.02
+1,483,33.02
+1,483,33.02
+1,483,10.16
+1,483,33.02
+1,483,40.64
+1,483,7.62
+1,483,30.48
+1,483,33.02
+1,483,35.56
+1,483,7.62
+1,483,7.62
+1,483,55.88
+1,483,22.86
+1,483,22.86
+1,483,8.89
+1,483,22.86
+1,483,10.16
+1,483,63.5
+1,483,10.16
+1,483,44.45
+1,483,40.64
+1,483,44.45
+1,483,10.16
+1,483,44.45
+1,483,24.13
+1,483,7.62
+1,483,10.16
+1,483,99.06
+1,483,15.24
+1,484,63.5
+1,484,15.24
+1,484,7.62
+1,484,35.56
+1,484,27.94
+1,484,8.89
+1,484,35.56
+1,484,27.94
+1,484,7.62
+1,484,15.24
+1,484,27.94
+1,484,7.62
+1,484,55.88
+1,484,27.94
+1,484,99.06
+1,484,15.24
+1,484,50.8
+1,484,50.8
+1,484,22.86
+1,484,35.56
+1,484,7.62
+1,484,53.975
+1,484,35.56
+1,484,46.355
+1,484,33.02
+1,484,35.56
+1,484,7.62
+1,484,44.45
+1,484,10.16
+1,484,7.62
+1,485,7.62
+1,485,46.355
+1,485,33.02
+1,485,33.02
+1,485,24.13
+1,485,44.45
+1,485,33.02
+1,485,33.02
+1,485,22.86
+1,485,63.5
+1,485,33.02
+1,485,10.16
+1,485,63.5
+1,485,53.975
+1,485,7.62
+1,485,63.5
+1,485,24.13
+1,485,33.02
+1,485,44.45
+1,485,40.64
+1,485,40.64
+1,485,22.86
+1,485,27.94
+1,485,45.72
+1,485,45.72
+1,485,81.28
+1,485,10.16
+1,485,7.62
+1,485,40.64
+1,485,53.975
+1,486,10.16
+1,486,53.975
+1,486,24.13
+1,486,19.05
+1,486,22.86
+1,486,7.62
+1,486,30.48
+1,486,33.02
+1,486,19.05
+1,486,10.16
+1,486,35.56
+1,486,15.24
+1,486,7.62
+1,486,10.16
+1,486,63.5
+1,486,8.89
+1,486,53.975
+1,486,35.56
+1,486,30.48
+1,486,7.62
+1,486,53.975
+1,486,81.28
+1,486,40.64
+1,486,40.64
+1,486,33.02
+1,486,35.56
+1,486,15.24
+1,486,50.8
+1,486,19.05
+1,486,7.62
+1,487,10.16
+1,487,24.13
+1,487,19.05
+1,487,33.02
+1,487,46.355
+1,487,7.62
+1,487,40.64
+1,487,40.64
+1,487,19.05
+1,487,7.62
+1,487,7.62
+1,487,22.86
+1,487,40.64
+1,487,7.62
+1,487,63.5
+1,487,10.16
+1,487,7.62
+1,487,33.02
+1,487,33.02
+1,487,7.62
+1,487,30.48
+1,487,50.8
+1,487,81.28
+1,487,35.56
+1,487,46.355
+1,487,24.13
+1,487,7.62
+1,487,7.62
+1,487,10.16
+1,487,10.16
+1,488,50.8
+1,488,55.88
+1,488,35.56
+1,488,30.48
+1,488,7.62
+1,488,27.94
+1,488,7.62
+1,488,53.975
+1,488,46.355
+1,488,55.88
+1,488,7.62
+1,488,7.62
+1,488,81.28
+1,488,33.02
+1,488,8.89
+1,488,24.13
+1,488,27.94
+1,488,46.355
+1,488,19.05
+1,488,10.16
+1,488,55.88
+1,488,15.24
+1,488,19.05
+1,488,22.86
+1,488,27.94
+1,488,35.56
+1,488,55.88
+1,488,81.28
+1,488,45.72
+1,488,7.62
+1,489,81.28
+1,489,33.02
+1,489,24.13
+1,489,45.72
+1,489,53.975
+1,489,30.48
+1,489,19.05
+1,489,7.62
+1,489,46.355
+1,489,7.62
+1,489,35.56
+1,489,40.64
+1,489,40.64
+1,489,40.64
+1,489,24.13
+1,489,7.62
+1,489,7.62
+1,489,40.64
+1,489,35.56
+1,489,7.62
+1,489,50.8
+1,489,35.56
+1,489,53.975
+1,489,46.355
+1,489,35.56
+1,489,33.02
+1,489,81.28
+1,489,35.56
+1,489,33.02
+1,489,33.02
+1,490,40.64
+1,490,53.975
+1,490,33.02
+1,490,53.975
+1,490,24.13
+1,490,7.62
+1,490,53.975
+1,490,7.62
+1,490,35.56
+1,490,7.62
+1,490,10.16
+1,490,22.86
+1,490,7.62
+1,490,53.975
+1,490,44.45
+1,490,40.64
+1,490,15.24
+1,490,45.72
+1,490,40.64
+1,490,10.16
+1,490,10.16
+1,490,35.56
+1,490,27.94
+1,490,46.355
+1,490,81.28
+1,490,19.05
+1,490,63.5
+1,490,10.16
+1,490,35.56
+1,490,7.62
+1,491,40.64
+1,491,7.62
+1,491,27.94
+1,491,30.48
+1,491,7.62
+1,491,24.13
+1,491,99.06
+1,491,10.16
+1,491,33.02
+1,491,24.13
+1,491,46.355
+1,491,22.86
+1,491,19.05
+1,491,15.24
+1,491,81.28
+1,491,27.94
+1,491,40.64
+1,491,30.48
+1,491,8.89
+1,491,55.88
+1,491,44.45
+1,491,7.62
+1,491,35.56
+1,491,44.45
+1,491,99.06
+1,491,44.45
+1,491,46.355
+1,491,40.64
+1,491,7.62
+1,491,15.24
+1,492,24.13
+1,492,33.02
+1,492,10.16
+1,492,33.02
+1,492,33.02
+1,492,46.355
+1,492,46.355
+1,492,15.24
+1,492,35.56
+1,492,22.86
+1,492,81.28
+1,492,7.62
+1,492,10.16
+1,492,33.02
+1,492,46.355
+1,492,50.8
+1,492,7.62
+1,492,35.56
+1,492,55.88
+1,492,40.64
+1,492,7.62
+1,492,35.56
+1,492,33.02
+1,492,10.16
+1,492,50.8
+1,492,8.89
+1,492,7.62
+1,492,24.13
+1,492,81.28
+1,492,33.02
+1,493,10.16
+1,493,7.62
+1,493,44.45
+1,493,15.24
+1,493,10.16
+1,493,22.86
+1,493,99.06
+1,493,40.64
+1,493,7.62
+1,493,45.72
+1,493,46.355
+1,493,35.56
+1,493,19.05
+1,493,8.89
+1,493,81.28
+1,493,8.89
+1,493,33.02
+1,493,33.02
+1,493,30.48
+1,493,19.05
+1,493,53.975
+1,493,10.16
+1,493,7.62
+1,493,30.48
+1,493,40.64
+1,493,45.72
+1,493,33.02
+1,493,19.05
+1,493,35.56
+1,493,30.48
+1,494,30.48
+1,494,7.62
+1,494,40.64
+1,494,7.62
+1,494,30.48
+1,494,55.88
+1,494,7.62
+1,494,15.24
+1,494,50.8
+1,494,81.28
+1,494,7.62
+1,494,81.28
+1,494,35.56
+1,494,7.62
+1,494,35.56
+1,494,27.94
+1,494,7.62
+1,494,19.05
+1,494,81.28
+1,494,40.64
+1,494,33.02
+1,494,7.62
+1,494,40.64
+1,494,55.88
+1,494,45.72
+1,494,10.16
+1,494,27.94
+1,494,33.02
+1,494,44.45
+1,494,10.16
+1,495,40.64
+1,495,40.64
+1,495,10.16
+1,495,30.48
+1,495,8.89
+1,495,7.62
+1,495,10.16
+1,495,35.56
+1,495,99.06
+1,495,7.62
+1,495,10.16
+1,495,81.28
+1,495,40.64
+1,495,40.64
+1,495,22.86
+1,495,81.28
+1,495,46.355
+1,495,81.28
+1,495,7.62
+1,495,10.16
+1,495,8.89
+1,495,55.88
+1,495,7.62
+1,495,40.64
+1,495,40.64
+1,495,27.94
+1,495,15.24
+1,495,55.88
+1,495,40.64
+1,495,8.89
+1,496,33.02
+1,496,45.72
+1,496,10.16
+1,496,7.62
+1,496,63.5
+1,496,33.02
+1,496,33.02
+1,496,19.05
+1,496,50.8
+1,496,35.56
+1,496,15.24
+1,496,44.45
+1,496,30.48
+1,496,7.62
+1,496,10.16
+1,496,99.06
+1,496,7.62
+1,496,8.89
+1,496,10.16
+1,496,30.48
+1,496,19.05
+1,496,15.24
+1,496,24.13
+1,496,24.13
+1,496,8.89
+1,496,10.16
+1,496,81.28
+1,496,55.88
+1,496,7.62
+1,496,7.62
+1,497,99.06
+1,497,15.24
+1,497,55.88
+1,497,30.48
+1,497,24.13
+1,497,10.16
+1,497,40.64
+1,497,45.72
+1,497,10.16
+1,497,35.56
+1,497,45.72
+1,497,99.06
+1,497,30.48
+1,497,24.13
+1,497,81.28
+1,497,10.16
+1,497,99.06
+1,497,10.16
+1,497,7.62
+1,497,8.89
+1,497,8.89
+1,497,45.72
+1,497,24.13
+1,497,7.62
+1,497,40.64
+1,497,33.02
+1,497,55.88
+1,497,8.89
+1,497,45.72
+1,497,22.86
+1,498,27.94
+1,498,35.56
+1,498,10.16
+1,498,24.13
+1,498,7.62
+1,498,10.16
+1,498,35.56
+1,498,30.48
+1,498,44.45
+1,498,33.02
+1,498,10.16
+1,498,7.62
+1,498,55.88
+1,498,35.56
+1,498,63.5
+1,498,7.62
+1,498,7.62
+1,498,22.86
+1,498,81.28
+1,498,8.89
+1,498,22.86
+1,498,24.13
+1,498,45.72
+1,498,81.28
+1,498,33.02
+1,498,10.16
+1,498,7.62
+1,498,10.16
+1,498,33.02
+1,498,10.16
+1,499,10.16
+1,499,53.975
+1,499,10.16
+1,499,15.24
+1,499,33.02
+1,499,45.72
+1,499,46.355
+1,499,44.45
+1,499,30.48
+1,499,7.62
+1,499,19.05
+1,499,55.88
+1,499,35.56
+1,499,10.16
+1,499,15.24
+1,499,10.16
+1,499,44.45
+1,499,81.28
+1,499,7.62
+1,499,33.02
+1,499,27.94
+1,499,8.89
+1,499,44.45
+1,499,15.24
+1,499,33.02
+1,499,7.62
+1,499,33.02
+1,499,7.62
+1,499,63.5
+1,499,99.06
+1,500,55.88
+1,500,63.5
+1,500,33.02
+1,500,7.62
+1,500,30.48
+1,500,19.05
+1,500,33.02
+1,500,10.16
+1,500,10.16
+1,500,53.975
+1,500,7.62
+1,500,46.355
+1,500,53.975
+1,500,22.86
+1,500,40.64
+1,500,45.72
+1,500,24.13
+1,500,27.94
+1,500,24.13
+1,500,33.02
+1,500,19.05
+1,500,45.72
+1,500,44.45
+1,500,7.62
+1,500,10.16
+1,500,55.88
+1,500,33.02
+1,500,35.56
+1,500,40.64
+1,500,27.94
+1,501,99.06
+1,501,8.89
+1,501,44.45
+1,501,63.5
+1,501,50.8
+1,501,27.94
+1,501,53.975
+1,501,7.62
+1,501,7.62
+1,501,40.64
+1,501,22.86
+1,501,40.64
+1,501,46.355
+1,501,33.02
+1,501,7.62
+1,501,7.62
+1,501,7.62
+1,501,40.64
+1,501,33.02
+1,501,55.88
+1,501,45.72
+1,501,53.975
+1,501,7.62
+1,501,7.62
+1,501,10.16
+1,501,99.06
+1,501,27.94
+1,501,7.62
+1,501,24.13
+1,501,33.02
+1,502,46.355
+1,502,10.16
+1,502,35.56
+1,502,19.05
+1,502,27.94
+1,502,46.355
+1,502,8.89
+1,502,40.64
+1,502,50.8
+1,502,81.28
+1,502,15.24
+1,502,10.16
+1,502,33.02
+1,502,99.06
+1,502,44.45
+1,502,35.56
+1,502,40.64
+1,502,10.16
+1,502,27.94
+1,502,7.62
+1,502,10.16
+1,502,81.28
+1,502,35.56
+1,502,24.13
+1,502,99.06
+1,502,7.62
+1,502,30.48
+1,502,40.64
+1,502,40.64
+1,502,35.56
+1,503,7.62
+1,503,53.975
+1,503,24.13
+1,503,33.02
+1,503,10.16
+1,503,81.28
+1,503,10.16
+1,503,44.45
+1,503,7.62
+1,503,44.45
+1,503,10.16
+1,503,30.48
+1,503,45.72
+1,503,7.62
+1,503,7.62
+1,503,40.64
+1,503,81.28
+1,503,40.64
+1,503,19.05
+1,503,10.16
+1,503,27.94
+1,503,35.56
+1,503,33.02
+1,503,19.05
+1,503,40.64
+1,503,7.62
+1,503,40.64
+1,503,7.62
+1,503,27.94
+1,503,10.16
+1,504,15.24
+1,504,10.16
+1,504,35.56
+1,504,30.48
+1,504,15.24
+1,504,7.62
+1,504,45.72
+1,504,63.5
+1,504,55.88
+1,504,10.16
+1,504,7.62
+1,504,46.355
+1,504,99.06
+1,504,10.16
+1,504,10.16
+1,504,55.88
+1,504,33.02
+1,504,53.975
+1,504,8.89
+1,504,55.88
+1,504,7.62
+1,504,15.24
+1,504,7.62
+1,504,24.13
+1,504,81.28
+1,504,35.56
+1,504,35.56
+1,504,99.06
+1,504,7.62
+1,504,45.72
+1,505,35.56
+1,505,53.975
+1,505,99.06
+1,505,24.13
+1,505,10.16
+1,505,53.975
+1,505,40.64
+1,505,33.02
+1,505,81.28
+1,505,7.62
+1,505,35.56
+1,505,40.64
+1,505,63.5
+1,505,50.8
+1,505,50.8
+1,505,7.62
+1,505,27.94
+1,505,53.975
+1,505,24.13
+1,505,10.16
+1,505,10.16
+1,505,35.56
+1,505,10.16
+1,505,10.16
+1,505,81.28
+1,505,33.02
+1,505,7.62
+1,505,19.05
+1,505,53.975
+1,505,10.16
+1,506,7.62
+1,506,10.16
+1,506,44.45
+1,506,55.88
+1,506,7.62
+1,506,35.56
+1,506,55.88
+1,506,33.02
+1,506,40.64
+1,506,24.13
+1,506,15.24
+1,506,30.48
+1,506,50.8
+1,506,99.06
+1,506,19.05
+1,506,7.62
+1,506,10.16
+1,506,10.16
+1,506,10.16
+1,506,63.5
+1,506,81.28
+1,506,81.28
+1,506,35.56
+1,506,8.89
+1,506,22.86
+1,506,35.56
+1,506,22.86
+1,506,44.45
+1,506,22.86
+1,506,24.13
+1,507,33.02
+1,507,81.28
+1,507,7.62
+1,507,35.56
+1,507,10.16
+1,507,33.02
+1,507,7.62
+1,507,53.975
+1,507,7.62
+1,507,22.86
+1,507,7.62
+1,507,10.16
+1,507,7.62
+1,507,27.94
+1,507,35.56
+1,507,24.13
+1,507,40.64
+1,507,33.02
+1,507,7.62
+1,507,7.62
+1,507,55.88
+1,507,7.62
+1,507,35.56
+1,507,8.89
+1,507,7.62
+1,507,22.86
+1,507,22.86
+1,507,15.24
+1,507,35.56
+1,507,50.8
+1,508,50.8
+1,508,99.06
+1,508,7.62
+1,508,35.56
+1,508,81.28
+1,508,45.72
+1,508,10.16
+1,508,10.16
+1,508,27.94
+1,508,27.94
+1,508,33.02
+1,508,15.24
+1,508,7.62
+1,508,55.88
+1,508,24.13
+1,508,24.13
+1,508,81.28
+1,508,53.975
+1,508,7.62
+1,508,27.94
+1,508,63.5
+1,508,10.16
+1,508,35.56
+1,508,81.28
+1,508,19.05
+1,508,7.62
+1,508,33.02
+1,508,7.62
+1,508,50.8
+1,508,53.975
+1,509,24.13
+1,509,19.05
+1,509,7.62
+1,509,7.62
+1,509,22.86
+1,509,7.62
+1,509,55.88
+1,509,50.8
+1,509,19.05
+1,509,33.02
+1,509,55.88
+1,509,35.56
+1,509,7.62
+1,509,40.64
+1,509,15.24
+1,509,10.16
+1,509,22.86
+1,509,10.16
+1,509,19.05
+1,509,45.72
+1,509,8.89
+1,509,15.24
+1,509,46.355
+1,509,15.24
+1,509,53.975
+1,509,19.05
+1,509,15.24
+1,509,30.48
+1,509,35.56
+1,509,45.72
+1,510,7.62
+1,510,7.62
+1,510,10.16
+1,510,50.8
+1,510,7.62
+1,510,50.8
+1,510,7.62
+1,510,99.06
+1,510,24.13
+1,510,10.16
+1,510,46.355
+1,510,63.5
+1,510,7.62
+1,510,10.16
+1,510,33.02
+1,510,50.8
+1,510,7.62
+1,510,50.8
+1,510,33.02
+1,510,10.16
+1,510,45.72
+1,510,35.56
+1,510,81.28
+1,510,33.02
+1,510,40.64
+1,510,7.62
+1,510,99.06
+1,510,7.62
+1,510,19.05
+1,510,33.02
+1,511,19.05
+1,511,24.13
+1,511,33.02
+1,511,99.06
+1,511,33.02
+1,511,81.28
+1,511,35.56
+1,511,40.64
+1,511,15.24
+1,511,30.48
+1,511,99.06
+1,511,40.64
+1,511,30.48
+1,511,10.16
+1,511,10.16
+1,511,35.56
+1,511,40.64
+1,511,7.62
+1,511,44.45
+1,511,33.02
+1,511,33.02
+1,511,19.05
+1,511,40.64
+1,511,35.56
+1,511,7.62
+1,511,33.02
+1,511,33.02
+1,511,40.64
+1,511,10.16
+1,511,40.64
+1,512,46.355
+1,512,19.05
+1,512,8.89
+1,512,30.48
+1,512,19.05
+1,512,55.88
+1,512,35.56
+1,512,24.13
+1,512,33.02
+1,512,63.5
+1,512,10.16
+1,512,10.16
+1,512,33.02
+1,512,63.5
+1,512,8.89
+1,512,7.62
+1,512,45.72
+1,512,22.86
+1,512,7.62
+1,512,50.8
+1,512,24.13
+1,512,81.28
+1,512,81.28
+1,512,8.89
+1,512,99.06
+1,512,7.62
+1,512,33.02
+1,512,7.62
+1,512,33.02
+1,512,15.24
+1,513,19.05
+1,513,35.56
+1,513,24.13
+1,513,7.62
+1,513,10.16
+1,513,33.02
+1,513,30.48
+1,513,27.94
+1,513,7.62
+1,513,15.24
+1,513,22.86
+1,513,53.975
+1,513,8.89
+1,513,53.975
+1,513,35.56
+1,513,10.16
+1,513,7.62
+1,513,46.355
+1,513,33.02
+1,513,33.02
+1,513,15.24
+1,513,27.94
+1,513,50.8
+1,513,24.13
+1,513,40.64
+1,513,63.5
+1,513,33.02
+1,513,63.5
+1,513,30.48
+1,513,63.5
+1,514,7.62
+1,514,45.72
+1,514,27.94
+1,514,46.355
+1,514,45.72
+1,514,55.88
+1,514,33.02
+1,514,33.02
+1,514,7.62
+1,514,7.62
+1,514,10.16
+1,514,7.62
+1,514,46.355
+1,514,40.64
+1,514,40.64
+1,514,7.62
+1,514,19.05
+1,514,35.56
+1,514,99.06
+1,514,8.89
+1,514,27.94
+1,514,30.48
+1,514,33.02
+1,514,27.94
+1,514,15.24
+1,514,7.62
+1,514,30.48
+1,514,99.06
+1,514,40.64
+1,514,15.24
+1,515,81.28
+1,515,19.05
+1,515,40.64
+1,515,35.56
+1,515,35.56
+1,515,24.13
+1,515,33.02
+1,515,8.89
+1,515,33.02
+1,515,40.64
+1,515,33.02
+1,515,40.64
+1,515,63.5
+1,515,45.72
+1,515,63.5
+1,515,10.16
+1,515,7.62
+1,515,7.62
+1,515,35.56
+1,515,19.05
+1,515,7.62
+1,515,8.89
+1,515,7.62
+1,515,33.02
+1,515,10.16
+1,515,7.62
+1,515,63.5
+1,515,45.72
+1,515,53.975
+1,515,27.94
+1,516,33.02
+1,516,19.05
+1,516,45.72
+1,516,10.16
+1,516,24.13
+1,516,55.88
+1,516,81.28
+1,516,24.13
+1,516,22.86
+1,516,40.64
+1,516,10.16
+1,516,35.56
+1,516,46.355
+1,516,63.5
+1,516,55.88
+1,516,40.64
+1,516,7.62
+1,516,81.28
+1,516,40.64
+1,516,7.62
+1,516,46.355
+1,516,22.86
+1,516,55.88
+1,516,7.62
+1,516,44.45
+1,516,27.94
+1,516,35.56
+1,516,40.64
+1,516,7.62
+1,516,7.62
+1,517,7.62
+1,517,22.86
+1,517,7.62
+1,517,22.86
+1,517,33.02
+1,517,40.64
+1,517,8.89
+1,517,7.62
+1,517,10.16
+1,517,63.5
+1,517,45.72
+1,517,40.64
+1,517,8.89
+1,517,99.06
+1,517,33.02
+1,517,15.24
+1,517,40.64
+1,517,33.02
+1,517,35.56
+1,517,22.86
+1,517,15.24
+1,517,10.16
+1,517,33.02
+1,517,50.8
+1,517,30.48
+1,517,99.06
+1,517,22.86
+1,517,15.24
+1,517,55.88
+1,517,7.62
+1,518,33.02
+1,518,22.86
+1,518,24.13
+1,518,53.975
+1,518,40.64
+1,518,8.89
+1,518,35.56
+1,518,99.06
+1,518,53.975
+1,518,63.5
+1,518,33.02
+1,518,33.02
+1,518,99.06
+1,518,27.94
+1,518,33.02
+1,518,35.56
+1,518,53.975
+1,518,33.02
+1,518,33.02
+1,518,53.975
+1,518,7.62
+1,518,7.62
+1,518,53.975
+1,518,7.62
+1,518,40.64
+1,518,33.02
+1,518,63.5
+1,518,50.8
+1,518,50.8
+1,518,7.62
+1,519,24.13
+1,519,7.62
+1,519,7.62
+1,519,7.62
+1,519,30.48
+1,519,33.02
+1,519,7.62
+1,519,46.355
+1,519,55.88
+1,519,44.45
+1,519,35.56
+1,519,53.975
+1,519,46.355
+1,519,27.94
+1,519,7.62
+1,519,7.62
+1,519,81.28
+1,519,10.16
+1,519,81.28
+1,519,24.13
+1,519,8.89
+1,519,99.06
+1,519,27.94
+1,519,33.02
+1,519,7.62
+1,519,33.02
+1,519,35.56
+1,519,46.355
+1,519,27.94
+1,519,7.62
+1,520,33.02
+1,520,8.89
+1,520,7.62
+1,520,19.05
+1,520,53.975
+1,520,81.28
+1,520,33.02
+1,520,40.64
+1,520,7.62
+1,520,50.8
+1,520,8.89
+1,520,10.16
+1,520,27.94
+1,520,81.28
+1,520,27.94
+1,520,53.975
+1,520,10.16
+1,520,40.64
+1,520,24.13
+1,520,45.72
+1,520,55.88
+1,520,35.56
+1,520,40.64
+1,520,10.16
+1,520,33.02
+1,520,8.89
+1,520,46.355
+1,520,10.16
+1,520,44.45
+1,520,33.02
+1,521,15.24
+1,521,7.62
+1,521,35.56
+1,521,7.62
+1,521,10.16
+1,521,7.62
+1,521,22.86
+1,521,24.13
+1,521,46.355
+1,521,24.13
+1,521,8.89
+1,521,15.24
+1,521,7.62
+1,521,44.45
+1,521,35.56
+1,521,33.02
+1,521,33.02
+1,521,55.88
+1,521,30.48
+1,521,35.56
+1,521,33.02
+1,521,33.02
+1,521,40.64
+1,521,10.16
+1,521,8.89
+1,521,81.28
+1,521,7.62
+1,521,45.72
+1,521,33.02
+1,521,7.62
+1,522,19.05
+1,522,7.62
+1,522,33.02
+1,522,7.62
+1,522,35.56
+1,522,19.05
+1,522,19.05
+1,522,40.64
+1,522,45.72
+1,522,46.355
+1,522,7.62
+1,522,10.16
+1,522,7.62
+1,522,7.62
+1,522,15.24
+1,522,33.02
+1,522,7.62
+1,522,7.62
+1,522,63.5
+1,522,99.06
+1,522,7.62
+1,522,55.88
+1,522,55.88
+1,522,24.13
+1,522,22.86
+1,522,8.89
+1,522,30.48
+1,522,35.56
+1,522,40.64
+1,522,33.02
+1,523,10.16
+1,523,55.88
+1,523,40.64
+1,523,99.06
+1,523,33.02
+1,523,44.45
+1,523,15.24
+1,523,7.62
+1,523,27.94
+1,523,35.56
+1,523,15.24
+1,523,81.28
+1,523,7.62
+1,523,40.64
+1,523,7.62
+1,523,7.62
+1,523,10.16
+1,523,24.13
+1,523,30.48
+1,523,35.56
+1,523,7.62
+1,523,44.45
+1,523,27.94
+1,523,40.64
+1,523,55.88
+1,523,10.16
+1,523,45.72
+1,523,10.16
+1,523,24.13
+1,523,45.72
+1,524,33.02
+1,524,81.28
+1,524,33.02
+1,524,7.62
+1,524,27.94
+1,524,10.16
+1,524,10.16
+1,524,15.24
+1,524,81.28
+1,524,19.05
+1,524,7.62
+1,524,30.48
+1,524,8.89
+1,524,19.05
+1,524,45.72
+1,524,10.16
+1,524,35.56
+1,524,22.86
+1,524,15.24
+1,524,50.8
+1,524,45.72
+1,524,24.13
+1,524,24.13
+1,524,10.16
+1,524,24.13
+1,524,45.72
+1,524,33.02
+1,524,81.28
+1,524,10.16
+1,524,55.88
+1,525,10.16
+1,525,7.62
+1,525,19.05
+1,525,7.62
+1,525,24.13
+1,525,7.62
+1,525,22.86
+1,525,10.16
+1,525,55.88
+1,525,50.8
+1,525,35.56
+1,525,35.56
+1,525,33.02
+1,525,40.64
+1,525,7.62
+1,525,40.64
+1,525,7.62
+1,525,7.62
+1,525,63.5
+1,525,7.62
+1,525,10.16
+1,525,7.62
+1,525,15.24
+1,525,55.88
+1,525,45.72
+1,525,99.06
+1,525,10.16
+1,525,15.24
+1,525,40.64
+1,525,33.02
+1,526,7.62
+1,526,35.56
+1,526,7.62
+1,526,8.89
+1,526,10.16
+1,526,33.02
+1,526,35.56
+1,526,44.45
+1,526,15.24
+1,526,22.86
+1,526,53.975
+1,526,24.13
+1,526,40.64
+1,526,22.86
+1,526,10.16
+1,526,15.24
+1,526,10.16
+1,526,53.975
+1,526,99.06
+1,526,45.72
+1,526,30.48
+1,526,45.72
+1,526,46.355
+1,526,19.05
+1,526,7.62
+1,526,45.72
+1,526,35.56
+1,526,24.13
+1,526,10.16
+1,526,99.06
+1,527,19.05
+1,527,19.05
+1,527,7.62
+1,527,33.02
+1,527,63.5
+1,527,63.5
+1,527,53.975
+1,527,10.16
+1,527,27.94
+1,527,35.56
+1,527,27.94
+1,527,33.02
+1,527,10.16
+1,527,50.8
+1,527,40.64
+1,527,33.02
+1,527,35.56
+1,527,40.64
+1,527,7.62
+1,527,50.8
+1,527,27.94
+1,527,19.05
+1,527,40.64
+1,527,8.89
+1,527,22.86
+1,527,8.89
+1,527,7.62
+1,527,27.94
+1,527,53.975
+1,527,8.89
+1,528,10.16
+1,528,35.56
+1,528,33.02
+1,528,55.88
+1,528,81.28
+1,528,45.72
+1,528,8.89
+1,528,33.02
+1,528,35.56
+1,528,50.8
+1,528,7.62
+1,528,10.16
+1,528,46.355
+1,528,8.89
+1,528,24.13
+1,528,7.62
+1,528,99.06
+1,528,7.62
+1,528,33.02
+1,528,10.16
+1,528,53.975
+1,528,7.62
+1,528,46.355
+1,528,40.64
+1,528,19.05
+1,528,99.06
+1,528,30.48
+1,528,7.62
+1,528,40.64
+1,528,24.13
+1,529,35.56
+1,529,15.24
+1,529,35.56
+1,529,53.975
+1,529,33.02
+1,529,7.62
+1,529,35.56
+1,529,30.48
+1,529,99.06
+1,529,50.8
+1,529,55.88
+1,529,7.62
+1,529,10.16
+1,529,46.355
+1,529,10.16
+1,529,35.56
+1,529,24.13
+1,529,10.16
+1,529,10.16
+1,529,30.48
+1,529,30.48
+1,529,44.45
+1,529,33.02
+1,529,53.975
+1,529,63.5
+1,529,46.355
+1,529,35.56
+1,529,33.02
+1,529,7.62
+1,529,35.56
+1,530,7.62
+1,530,99.06
+1,530,30.48
+1,530,7.62
+1,530,35.56
+1,530,40.64
+1,530,27.94
+1,530,45.72
+1,530,7.62
+1,530,33.02
+1,530,15.24
+1,530,10.16
+1,530,55.88
+1,530,50.8
+1,530,81.28
+1,530,33.02
+1,530,7.62
+1,530,10.16
+1,530,40.64
+1,530,46.355
+1,530,44.45
+1,530,45.72
+1,530,19.05
+1,530,55.88
+1,530,15.24
+1,530,35.56
+1,530,35.56
+1,530,33.02
+1,530,33.02
+1,530,40.64
+1,531,55.88
+1,531,7.62
+1,531,27.94
+1,531,50.8
+1,531,10.16
+1,531,24.13
+1,531,40.64
+1,531,30.48
+1,531,35.56
+1,531,7.62
+1,531,10.16
+1,531,35.56
+1,531,50.8
+1,531,24.13
+1,531,19.05
+1,531,7.62
+1,531,99.06
+1,531,10.16
+1,531,44.45
+1,531,8.89
+1,531,10.16
+1,531,81.28
+1,531,8.89
+1,531,35.56
+1,531,81.28
+1,531,7.62
+1,531,19.05
+1,531,99.06
+1,531,33.02
+1,531,19.05
+1,532,10.16
+1,532,40.64
+1,532,35.56
+1,532,50.8
+1,532,35.56
+1,532,19.05
+1,532,40.64
+1,532,44.45
+1,532,19.05
+1,532,40.64
+1,532,50.8
+1,532,8.89
+1,532,33.02
+1,532,22.86
+1,532,7.62
+1,532,35.56
+1,532,27.94
+1,532,81.28
+1,532,15.24
+1,532,10.16
+1,532,7.62
+1,532,15.24
+1,532,8.89
+1,532,35.56
+1,532,19.05
+1,532,33.02
+1,532,44.45
+1,532,7.62
+1,532,7.62
+1,532,35.56
+1,533,7.62
+1,533,27.94
+1,533,27.94
+1,533,22.86
+1,533,15.24
+1,533,45.72
+1,533,33.02
+1,533,33.02
+1,533,7.62
+1,533,19.05
+1,533,33.02
+1,533,40.64
+1,533,46.355
+1,533,44.45
+1,533,10.16
+1,533,35.56
+1,533,22.86
+1,533,30.48
+1,533,45.72
+1,533,7.62
+1,533,40.64
+1,533,10.16
+1,533,40.64
+1,533,46.355
+1,533,63.5
+1,533,44.45
+1,533,33.02
+1,533,7.62
+1,533,7.62
+1,533,8.89
+1,534,40.64
+1,534,99.06
+1,534,40.64
+1,534,7.62
+1,534,33.02
+1,534,33.02
+1,534,30.48
+1,534,33.02
+1,534,99.06
+1,534,99.06
+1,534,50.8
+1,534,40.64
+1,534,33.02
+1,534,33.02
+1,534,53.975
+1,534,33.02
+1,534,30.48
+1,534,46.355
+1,534,35.56
+1,534,33.02
+1,534,35.56
+1,534,45.72
+1,534,7.62
+1,534,7.62
+1,534,10.16
+1,534,40.64
+1,534,45.72
+1,534,40.64
+1,534,35.56
+1,534,35.56
+1,535,22.86
+1,535,63.5
+1,535,15.24
+1,535,7.62
+1,535,81.28
+1,535,50.8
+1,535,55.88
+1,535,53.975
+1,535,10.16
+1,535,63.5
+1,535,46.355
+1,535,44.45
+1,535,27.94
+1,535,33.02
+1,535,30.48
+1,535,46.355
+1,535,55.88
+1,535,45.72
+1,535,27.94
+1,535,40.64
+1,535,7.62
+1,535,53.975
+1,535,99.06
+1,535,19.05
+1,535,81.28
+1,535,44.45
+1,535,35.56
+1,535,7.62
+1,535,8.89
+1,535,7.62
+1,536,27.94
+1,536,55.88
+1,536,10.16
+1,536,15.24
+1,536,7.62
+1,536,7.62
+1,536,10.16
+1,536,55.88
+1,536,33.02
+1,536,27.94
+1,536,7.62
+1,536,10.16
+1,536,7.62
+1,536,33.02
+1,536,53.975
+1,536,24.13
+1,536,99.06
+1,536,55.88
+1,536,7.62
+1,536,63.5
+1,536,53.975
+1,536,46.355
+1,536,7.62
+1,536,44.45
+1,536,10.16
+1,536,7.62
+1,536,35.56
+1,536,35.56
+1,536,81.28
+1,536,63.5
+1,537,7.62
+1,537,22.86
+1,537,7.62
+1,537,27.94
+1,537,53.975
+1,537,55.88
+1,537,24.13
+1,537,7.62
+1,537,33.02
+1,537,40.64
+1,537,55.88
+1,537,19.05
+1,537,46.355
+1,537,44.45
+1,537,7.62
+1,537,7.62
+1,537,7.62
+1,537,81.28
+1,537,8.89
+1,537,50.8
+1,537,33.02
+1,537,7.62
+1,537,8.89
+1,537,99.06
+1,537,24.13
+1,537,7.62
+1,537,35.56
+1,537,10.16
+1,537,50.8
+1,537,7.62
+1,538,33.02
+1,538,40.64
+1,538,7.62
+1,538,33.02
+1,538,19.05
+1,538,33.02
+1,538,15.24
+1,538,24.13
+1,538,45.72
+1,538,7.62
+1,538,99.06
+1,538,33.02
+1,538,33.02
+1,538,8.89
+1,538,7.62
+1,538,33.02
+1,538,99.06
+1,538,35.56
+1,538,40.64
+1,538,33.02
+1,538,7.62
+1,538,7.62
+1,538,15.24
+1,538,40.64
+1,538,7.62
+1,538,35.56
+1,538,7.62
+1,538,53.975
+1,538,8.89
+1,538,22.86
+1,539,7.62
+1,539,7.62
+1,539,55.88
+1,539,40.64
+1,539,33.02
+1,539,27.94
+1,539,22.86
+1,539,35.56
+1,539,10.16
+1,539,7.62
+1,539,53.975
+1,539,63.5
+1,539,10.16
+1,539,53.975
+1,539,7.62
+1,539,7.62
+1,539,35.56
+1,539,7.62
+1,539,24.13
+1,539,81.28
+1,539,19.05
+1,539,55.88
+1,539,19.05
+1,539,7.62
+1,539,7.62
+1,539,33.02
+1,539,7.62
+1,539,81.28
+1,539,55.88
+1,539,19.05
+1,540,33.02
+1,540,19.05
+1,540,44.45
+1,540,7.62
+1,540,50.8
+1,540,33.02
+1,540,24.13
+1,540,45.72
+1,540,40.64
+1,540,10.16
+1,540,30.48
+1,540,24.13
+1,540,15.24
+1,540,7.62
+1,540,63.5
+1,540,10.16
+1,540,53.975
+1,540,15.24
+1,540,45.72
+1,540,15.24
+1,540,24.13
+1,540,15.24
+1,540,53.975
+1,540,63.5
+1,540,55.88
+1,540,35.56
+1,540,53.975
+1,540,40.64
+1,540,46.355
+1,540,10.16
+1,541,55.88
+1,541,63.5
+1,541,33.02
+1,541,30.48
+1,541,7.62
+1,541,7.62
+1,541,22.86
+1,541,35.56
+1,541,33.02
+1,541,81.28
+1,541,35.56
+1,541,27.94
+1,541,55.88
+1,541,7.62
+1,541,99.06
+1,541,33.02
+1,541,81.28
+1,541,7.62
+1,541,7.62
+1,541,15.24
+1,541,40.64
+1,541,99.06
+1,541,35.56
+1,541,24.13
+1,541,63.5
+1,541,35.56
+1,541,33.02
+1,541,7.62
+1,541,27.94
+1,541,44.45
+1,542,7.62
+1,542,44.45
+1,542,24.13
+1,542,33.02
+1,542,45.72
+1,542,33.02
+1,542,7.62
+1,542,33.02
+1,542,8.89
+1,542,10.16
+1,542,33.02
+1,542,22.86
+1,542,53.975
+1,542,45.72
+1,542,24.13
+1,542,81.28
+1,542,45.72
+1,542,46.355
+1,542,55.88
+1,542,35.56
+1,542,35.56
+1,542,7.62
+1,542,22.86
+1,542,81.28
+1,542,7.62
+1,542,24.13
+1,542,7.62
+1,542,55.88
+1,542,35.56
+1,542,53.975
+1,543,30.48
+1,543,27.94
+1,543,44.45
+1,543,99.06
+1,543,33.02
+1,543,33.02
+1,543,33.02
+1,543,7.62
+1,543,46.355
+1,543,40.64
+1,543,33.02
+1,543,40.64
+1,543,33.02
+1,543,46.355
+1,543,33.02
+1,543,33.02
+1,543,15.24
+1,543,81.28
+1,543,33.02
+1,543,99.06
+1,543,27.94
+1,543,55.88
+1,543,22.86
+1,543,40.64
+1,543,30.48
+1,543,40.64
+1,543,33.02
+1,543,50.8
+1,543,55.88
+1,543,50.8
+1,544,40.64
+1,544,40.64
+1,544,63.5
+1,544,19.05
+1,544,45.72
+1,544,7.62
+1,544,10.16
+1,544,53.975
+1,544,40.64
+1,544,7.62
+1,544,45.72
+1,544,7.62
+1,544,15.24
+1,544,8.89
+1,544,27.94
+1,544,10.16
+1,544,40.64
+1,544,30.48
+1,544,33.02
+1,544,33.02
+1,544,7.62
+1,544,50.8
+1,544,27.94
+1,544,22.86
+1,544,45.72
+1,544,35.56
+1,544,15.24
+1,544,45.72
+1,544,10.16
+1,544,8.89
+1,545,22.86
+1,545,7.62
+1,545,22.86
+1,545,10.16
+1,545,30.48
+1,545,55.88
+1,545,8.89
+1,545,53.975
+1,545,7.62
+1,545,8.89
+1,545,63.5
+1,545,35.56
+1,545,33.02
+1,545,53.975
+1,545,35.56
+1,545,50.8
+1,545,22.86
+1,545,7.62
+1,545,50.8
+1,545,53.975
+1,545,55.88
+1,545,35.56
+1,545,27.94
+1,545,7.62
+1,545,7.62
+1,545,99.06
+1,545,46.355
+1,545,50.8
+1,545,7.62
+1,545,7.62
+1,546,46.355
+1,546,22.86
+1,546,7.62
+1,546,24.13
+1,546,33.02
+1,546,10.16
+1,546,24.13
+1,546,50.8
+1,546,55.88
+1,546,7.62
+1,546,81.28
+1,546,40.64
+1,546,33.02
+1,546,50.8
+1,546,15.24
+1,546,7.62
+1,546,63.5
+1,546,81.28
+1,546,22.86
+1,546,10.16
+1,546,46.355
+1,546,53.975
+1,546,35.56
+1,546,81.28
+1,546,7.62
+1,546,30.48
+1,546,81.28
+1,546,7.62
+1,546,99.06
+1,546,15.24
+1,547,7.62
+1,547,8.89
+1,547,7.62
+1,547,22.86
+1,547,10.16
+1,547,30.48
+1,547,30.48
+1,547,46.355
+1,547,8.89
+1,547,30.48
+1,547,40.64
+1,547,33.02
+1,547,50.8
+1,547,7.62
+1,547,35.56
+1,547,53.975
+1,547,24.13
+1,547,46.355
+1,547,8.89
+1,547,44.45
+1,547,15.24
+1,547,50.8
+1,547,35.56
+1,547,81.28
+1,547,8.89
+1,547,10.16
+1,547,15.24
+1,547,40.64
+1,547,81.28
+1,547,10.16
+1,548,44.45
+1,548,27.94
+1,548,22.86
+1,548,53.975
+1,548,33.02
+1,548,45.72
+1,548,33.02
+1,548,7.62
+1,548,99.06
+1,548,30.48
+1,548,40.64
+1,548,33.02
+1,548,10.16
+1,548,22.86
+1,548,19.05
+1,548,7.62
+1,548,33.02
+1,548,44.45
+1,548,33.02
+1,548,33.02
+1,548,35.56
+1,548,7.62
+1,548,7.62
+1,548,22.86
+1,548,27.94
+1,548,27.94
+1,548,63.5
+1,548,33.02
+1,548,33.02
+1,548,45.72
+1,549,7.62
+1,549,10.16
+1,549,8.89
+1,549,33.02
+1,549,7.62
+1,549,40.64
+1,549,30.48
+1,549,53.975
+1,549,35.56
+1,549,35.56
+1,549,30.48
+1,549,63.5
+1,549,7.62
+1,549,7.62
+1,549,33.02
+1,549,10.16
+1,549,10.16
+1,549,99.06
+1,549,81.28
+1,549,45.72
+1,549,50.8
+1,549,7.62
+1,549,63.5
+1,549,7.62
+1,549,33.02
+1,549,19.05
+1,549,24.13
+1,549,40.64
+1,549,35.56
+1,549,27.94
+1,550,40.64
+1,550,33.02
+1,550,46.355
+1,550,33.02
+1,550,55.88
+1,550,7.62
+1,550,7.62
+1,550,24.13
+1,550,44.45
+1,550,99.06
+1,550,63.5
+1,550,27.94
+1,550,53.975
+1,550,7.62
+1,550,24.13
+1,550,10.16
+1,550,22.86
+1,550,44.45
+1,550,27.94
+1,550,45.72
+1,550,35.56
+1,550,15.24
+1,550,33.02
+1,550,8.89
+1,550,7.62
+1,550,46.355
+1,550,7.62
+1,550,33.02
+1,550,44.45
+1,550,99.06
+1,551,50.8
+1,551,46.355
+1,551,7.62
+1,551,7.62
+1,551,10.16
+1,551,15.24
+1,551,44.45
+1,551,81.28
+1,551,81.28
+1,551,10.16
+1,551,55.88
+1,551,33.02
+1,551,35.56
+1,551,30.48
+1,551,35.56
+1,551,40.64
+1,551,7.62
+1,551,7.62
+1,551,46.355
+1,551,81.28
+1,551,46.355
+1,551,53.975
+1,551,35.56
+1,551,40.64
+1,551,35.56
+1,551,35.56
+1,551,44.45
+1,551,33.02
+1,551,27.94
+1,551,40.64
+1,552,55.88
+1,552,7.62
+1,552,63.5
+1,552,33.02
+1,552,22.86
+1,552,10.16
+1,552,35.56
+1,552,7.62
+1,552,27.94
+1,552,22.86
+1,552,7.62
+1,552,50.8
+1,552,33.02
+1,552,33.02
+1,552,10.16
+1,552,30.48
+1,552,40.64
+1,552,55.88
+1,552,24.13
+1,552,33.02
+1,552,7.62
+1,552,8.89
+1,552,7.62
+1,552,40.64
+1,552,10.16
+1,552,44.45
+1,552,35.56
+1,552,7.62
+1,552,46.355
+1,552,40.64
+1,553,7.62
+1,553,44.45
+1,553,8.89
+1,553,40.64
+1,553,50.8
+1,553,7.62
+1,553,7.62
+1,553,19.05
+1,553,10.16
+1,553,10.16
+1,553,40.64
+1,553,35.56
+1,553,50.8
+1,553,63.5
+1,553,40.64
+1,553,35.56
+1,553,8.89
+1,553,30.48
+1,553,30.48
+1,553,7.62
+1,553,22.86
+1,553,50.8
+1,553,46.355
+1,553,45.72
+1,553,35.56
+1,553,33.02
+1,553,33.02
+1,553,55.88
+1,553,33.02
+1,553,99.06
+1,554,7.62
+1,554,27.94
+1,554,8.89
+1,554,99.06
+1,554,30.48
+1,554,33.02
+1,554,53.975
+1,554,22.86
+1,554,8.89
+1,554,33.02
+1,554,55.88
+1,554,7.62
+1,554,81.28
+1,554,40.64
+1,554,46.355
+1,554,35.56
+1,554,7.62
+1,554,10.16
+1,554,15.24
+1,554,33.02
+1,554,19.05
+1,554,10.16
+1,554,10.16
+1,554,7.62
+1,554,40.64
+1,554,33.02
+1,554,19.05
+1,554,19.05
+1,554,24.13
+1,554,30.48
+1,555,63.5
+1,555,35.56
+1,555,81.28
+1,555,63.5
+1,555,53.975
+1,555,7.62
+1,555,30.48
+1,555,10.16
+1,555,33.02
+1,555,33.02
+1,555,19.05
+1,555,7.62
+1,555,35.56
+1,555,50.8
+1,555,27.94
+1,555,27.94
+1,555,33.02
+1,555,22.86
+1,555,63.5
+1,555,30.48
+1,555,35.56
+1,555,33.02
+1,555,30.48
+1,555,53.975
+1,555,22.86
+1,555,30.48
+1,555,10.16
+1,555,33.02
+1,555,33.02
+1,555,44.45
+1,556,33.02
+1,556,40.64
+1,556,99.06
+1,556,27.94
+1,556,30.48
+1,556,10.16
+1,556,33.02
+1,556,55.88
+1,556,40.64
+1,556,15.24
+1,556,46.355
+1,556,30.48
+1,556,44.45
+1,556,99.06
+1,556,55.88
+1,556,24.13
+1,556,33.02
+1,556,7.62
+1,556,33.02
+1,556,40.64
+1,556,30.48
+1,556,19.05
+1,556,46.355
+1,556,55.88
+1,556,63.5
+1,556,7.62
+1,556,40.64
+1,556,45.72
+1,556,40.64
+1,556,24.13
+1,557,10.16
+1,557,7.62
+1,557,55.88
+1,557,19.05
+1,557,30.48
+1,557,19.05
+1,557,53.975
+1,557,7.62
+1,557,10.16
+1,557,8.89
+1,557,15.24
+1,557,55.88
+1,557,35.56
+1,557,7.62
+1,557,27.94
+1,557,99.06
+1,557,27.94
+1,557,44.45
+1,557,8.89
+1,557,30.48
+1,557,7.62
+1,557,50.8
+1,557,35.56
+1,557,45.72
+1,557,33.02
+1,557,53.975
+1,557,19.05
+1,557,44.45
+1,557,7.62
+1,557,30.48
+1,558,30.48
+1,558,40.64
+1,558,22.86
+1,558,50.8
+1,558,99.06
+1,558,99.06
+1,558,7.62
+1,558,45.72
+1,558,7.62
+1,558,46.355
+1,558,81.28
+1,558,44.45
+1,558,35.56
+1,558,44.45
+1,558,46.355
+1,558,33.02
+1,558,35.56
+1,558,99.06
+1,558,46.355
+1,558,99.06
+1,558,22.86
+1,558,7.62
+1,558,33.02
+1,558,33.02
+1,558,46.355
+1,558,7.62
+1,558,81.28
+1,558,24.13
+1,558,99.06
+1,558,7.62
+1,559,33.02
+1,559,99.06
+1,559,7.62
+1,559,40.64
+1,559,40.64
+1,559,55.88
+1,559,35.56
+1,559,45.72
+1,559,33.02
+1,559,46.355
+1,559,33.02
+1,559,22.86
+1,559,7.62
+1,559,7.62
+1,559,19.05
+1,559,63.5
+1,559,22.86
+1,559,46.355
+1,559,50.8
+1,559,81.28
+1,559,7.62
+1,559,10.16
+1,559,50.8
+1,559,44.45
+1,559,10.16
+1,559,10.16
+1,559,63.5
+1,559,99.06
+1,559,40.64
+1,559,7.62
+1,560,63.5
+1,560,50.8
+1,560,33.02
+1,560,40.64
+1,560,10.16
+1,560,35.56
+1,560,55.88
+1,560,19.05
+1,560,99.06
+1,560,27.94
+1,560,7.62
+1,560,8.89
+1,560,7.62
+1,560,7.62
+1,560,8.89
+1,560,15.24
+1,560,22.86
+1,560,15.24
+1,560,40.64
+1,560,45.72
+1,560,8.89
+1,560,50.8
+1,560,19.05
+1,560,24.13
+1,560,24.13
+1,560,35.56
+1,560,7.62
+1,560,35.56
+1,560,40.64
+1,560,19.05
+1,561,27.94
+1,561,33.02
+1,561,7.62
+1,561,7.62
+1,561,33.02
+1,561,81.28
+1,561,46.355
+1,561,35.56
+1,561,44.45
+1,561,30.48
+1,561,40.64
+1,561,30.48
+1,561,7.62
+1,561,40.64
+1,561,7.62
+1,561,10.16
+1,561,99.06
+1,561,15.24
+1,561,7.62
+1,561,7.62
+1,561,50.8
+1,561,7.62
+1,561,50.8
+1,561,55.88
+1,561,99.06
+1,561,7.62
+1,561,7.62
+1,561,50.8
+1,561,35.56
+1,561,7.62
+1,562,7.62
+1,562,45.72
+1,562,33.02
+1,562,7.62
+1,562,10.16
+1,562,7.62
+1,562,24.13
+1,562,40.64
+1,562,53.975
+1,562,81.28
+1,562,40.64
+1,562,33.02
+1,562,15.24
+1,562,7.62
+1,562,63.5
+1,562,50.8
+1,562,55.88
+1,562,7.62
+1,562,27.94
+1,562,33.02
+1,562,7.62
+1,562,81.28
+1,562,10.16
+1,562,35.56
+1,562,33.02
+1,562,22.86
+1,562,30.48
+1,562,22.86
+1,562,46.355
+1,562,53.975
+1,563,35.56
+1,563,35.56
+1,563,7.62
+1,563,7.62
+1,563,33.02
+1,563,30.48
+1,563,45.72
+1,563,15.24
+1,563,53.975
+1,563,40.64
+1,563,7.62
+1,563,35.56
+1,563,50.8
+1,563,8.89
+1,563,7.62
+1,563,30.48
+1,563,22.86
+1,563,50.8
+1,563,7.62
+1,563,50.8
+1,563,7.62
+1,563,63.5
+1,563,35.56
+1,563,33.02
+1,563,45.72
+1,563,19.05
+1,563,19.05
+1,563,40.64
+1,563,22.86
+1,563,7.62
+1,564,44.45
+1,564,8.89
+1,564,33.02
+1,564,50.8
+1,564,33.02
+1,564,35.56
+1,564,35.56
+1,564,8.89
+1,564,81.28
+1,564,30.48
+1,564,45.72
+1,564,7.62
+1,564,45.72
+1,564,45.72
+1,564,8.89
+1,564,7.62
+1,564,7.62
+1,564,7.62
+1,564,33.02
+1,564,40.64
+1,564,7.62
+1,564,7.62
+1,564,53.975
+1,564,7.62
+1,564,10.16
+1,564,55.88
+1,564,44.45
+1,564,46.355
+1,564,53.975
+1,564,22.86
+1,565,40.64
+1,565,19.05
+1,565,33.02
+1,565,27.94
+1,565,35.56
+1,565,27.94
+1,565,45.72
+1,565,55.88
+1,565,44.45
+1,565,24.13
+1,565,53.975
+1,565,7.62
+1,565,10.16
+1,565,44.45
+1,565,33.02
+1,565,7.62
+1,565,33.02
+1,565,24.13
+1,565,7.62
+1,565,27.94
+1,565,81.28
+1,565,33.02
+1,565,22.86
+1,565,8.89
+1,565,7.62
+1,565,35.56
+1,565,40.64
+1,565,40.64
+1,565,50.8
+1,565,99.06
+1,566,33.02
+1,566,63.5
+1,566,35.56
+1,566,99.06
+1,566,63.5
+1,566,15.24
+1,566,33.02
+1,566,22.86
+1,566,33.02
+1,566,30.48
+1,566,35.56
+1,566,19.05
+1,566,7.62
+1,566,7.62
+1,566,55.88
+1,566,22.86
+1,566,8.89
+1,566,10.16
+1,566,63.5
+1,566,53.975
+1,566,7.62
+1,566,33.02
+1,566,33.02
+1,566,30.48
+1,566,99.06
+1,566,8.89
+1,566,15.24
+1,566,7.62
+1,566,46.355
+1,566,53.975
+1,567,99.06
+1,567,7.62
+1,567,45.72
+1,567,24.13
+1,567,7.62
+1,567,63.5
+1,567,33.02
+1,567,7.62
+1,567,33.02
+1,567,45.72
+1,567,33.02
+1,567,40.64
+1,567,81.28
+1,567,46.355
+1,567,81.28
+1,567,81.28
+1,567,7.62
+1,567,19.05
+1,567,27.94
+1,567,33.02
+1,567,33.02
+1,567,7.62
+1,567,55.88
+1,567,7.62
+1,567,45.72
+1,567,40.64
+1,567,53.975
+1,567,99.06
+1,567,7.62
+1,567,7.62
+1,568,45.72
+1,568,7.62
+1,568,7.62
+1,568,10.16
+1,568,7.62
+1,568,50.8
+1,568,10.16
+1,568,45.72
+1,568,44.45
+1,568,53.975
+1,568,81.28
+1,568,53.975
+1,568,81.28
+1,568,33.02
+1,568,22.86
+1,568,33.02
+1,568,40.64
+1,568,40.64
+1,568,33.02
+1,568,35.56
+1,568,19.05
+1,568,63.5
+1,568,35.56
+1,568,40.64
+1,568,19.05
+1,568,40.64
+1,568,7.62
+1,568,7.62
+1,568,35.56
+1,568,33.02
+1,569,40.64
+1,569,7.62
+1,569,7.62
+1,569,46.355
+1,569,24.13
+1,569,46.355
+1,569,22.86
+1,569,10.16
+1,569,40.64
+1,569,99.06
+1,569,46.355
+1,569,40.64
+1,569,63.5
+1,569,24.13
+1,569,7.62
+1,569,33.02
+1,569,50.8
+1,569,8.89
+1,569,24.13
+1,569,63.5
+1,569,40.64
+1,569,24.13
+1,569,7.62
+1,569,10.16
+1,569,22.86
+1,569,10.16
+1,569,8.89
+1,569,55.88
+1,569,7.62
+1,569,22.86
+1,570,81.28
+1,570,55.88
+1,570,22.86
+1,570,24.13
+1,570,35.56
+1,570,7.62
+1,570,7.62
+1,570,7.62
+1,570,35.56
+1,570,40.64
+1,570,53.975
+1,570,7.62
+1,570,8.89
+1,570,10.16
+1,570,99.06
+1,570,55.88
+1,570,55.88
+1,570,40.64
+1,570,8.89
+1,570,35.56
+1,570,27.94
+1,570,63.5
+1,570,35.56
+1,570,24.13
+1,570,40.64
+1,570,40.64
+1,570,81.28
+1,570,27.94
+1,570,35.56
+1,570,35.56
+1,571,27.94
+1,571,40.64
+1,571,7.62
+1,571,10.16
+1,571,15.24
+1,571,8.89
+1,571,99.06
+1,571,53.975
+1,571,24.13
+1,571,7.62
+1,571,7.62
+1,571,30.48
+1,571,63.5
+1,571,33.02
+1,571,7.62
+1,571,24.13
+1,571,45.72
+1,571,7.62
+1,571,7.62
+1,571,7.62
+1,571,19.05
+1,571,19.05
+1,571,7.62
+1,571,46.355
+1,571,7.62
+1,571,46.355
+1,571,7.62
+1,571,33.02
+1,571,22.86
+1,571,7.62
+1,572,33.02
+1,572,7.62
+1,572,19.05
+1,572,19.05
+1,572,7.62
+1,572,55.88
+1,572,55.88
+1,572,19.05
+1,572,10.16
+1,572,15.24
+1,572,7.62
+1,572,19.05
+1,572,33.02
+1,572,33.02
+1,572,35.56
+1,572,7.62
+1,572,19.05
+1,572,35.56
+1,572,27.94
+1,572,33.02
+1,572,24.13
+1,572,33.02
+1,572,7.62
+1,572,53.975
+1,572,81.28
+1,572,7.62
+1,572,46.355
+1,572,40.64
+1,572,53.975
+1,572,19.05
+1,573,15.24
+1,573,24.13
+1,573,33.02
+1,573,10.16
+1,573,19.05
+1,573,30.48
+1,573,44.45
+1,573,8.89
+1,573,7.62
+1,573,15.24
+1,573,7.62
+1,573,53.975
+1,573,40.64
+1,573,53.975
+1,573,81.28
+1,573,50.8
+1,573,7.62
+1,573,33.02
+1,573,7.62
+1,573,33.02
+1,573,46.355
+1,573,33.02
+1,573,8.89
+1,573,19.05
+1,573,99.06
+1,573,40.64
+1,573,7.62
+1,573,40.64
+1,573,99.06
+1,573,10.16
+1,574,24.13
+1,574,33.02
+1,574,7.62
+1,574,44.45
+1,574,7.62
+1,574,8.89
+1,574,24.13
+1,574,7.62
+1,574,30.48
+1,574,10.16
+1,574,40.64
+1,574,63.5
+1,574,55.88
+1,574,10.16
+1,574,63.5
+1,574,40.64
+1,574,35.56
+1,574,27.94
+1,574,50.8
+1,574,8.89
+1,574,46.355
+1,574,63.5
+1,574,35.56
+1,574,81.28
+1,574,35.56
+1,574,40.64
+1,574,35.56
+1,574,7.62
+1,574,27.94
+1,574,45.72
+1,575,50.8
+1,575,55.88
+1,575,33.02
+1,575,81.28
+1,575,10.16
+1,575,7.62
+1,575,33.02
+1,575,7.62
+1,575,7.62
+1,575,19.05
+1,575,35.56
+1,575,10.16
+1,575,27.94
+1,575,7.62
+1,575,33.02
+1,575,33.02
+1,575,40.64
+1,575,63.5
+1,575,15.24
+1,575,33.02
+1,575,45.72
+1,575,40.64
+1,575,7.62
+1,575,40.64
+1,575,63.5
+1,575,19.05
+1,575,24.13
+1,575,40.64
+1,575,81.28
+1,575,40.64
+1,576,7.62
+1,576,15.24
+1,576,44.45
+1,576,7.62
+1,576,45.72
+1,576,10.16
+1,576,19.05
+1,576,40.64
+1,576,10.16
+1,576,45.72
+1,576,7.62
+1,576,45.72
+1,576,81.28
+1,576,7.62
+1,576,7.62
+1,576,45.72
+1,576,35.56
+1,576,40.64
+1,576,7.62
+1,576,10.16
+1,576,27.94
+1,576,7.62
+1,576,55.88
+1,576,10.16
+1,576,8.89
+1,576,7.62
+1,576,46.355
+1,576,7.62
+1,576,40.64
+1,576,50.8
+1,577,35.56
+1,577,35.56
+1,577,35.56
+1,577,7.62
+1,577,53.975
+1,577,63.5
+1,577,15.24
+1,577,24.13
+1,577,44.45
+1,577,46.355
+1,577,33.02
+1,577,30.48
+1,577,35.56
+1,577,99.06
+1,577,99.06
+1,577,15.24
+1,577,99.06
+1,577,33.02
+1,577,33.02
+1,577,46.355
+1,577,15.24
+1,577,46.355
+1,577,55.88
+1,577,33.02
+1,577,19.05
+1,577,63.5
+1,577,10.16
+1,577,46.355
+1,577,55.88
+1,577,33.02
+1,578,24.13
+1,578,50.8
+1,578,15.24
+1,578,44.45
+1,578,55.88
+1,578,10.16
+1,578,35.56
+1,578,44.45
+1,578,24.13
+1,578,35.56
+1,578,24.13
+1,578,33.02
+1,578,27.94
+1,578,44.45
+1,578,24.13
+1,578,55.88
+1,578,33.02
+1,578,24.13
+1,578,99.06
+1,578,50.8
+1,578,33.02
+1,578,33.02
+1,578,7.62
+1,578,45.72
+1,578,7.62
+1,578,35.56
+1,578,19.05
+1,578,8.89
+1,578,81.28
+1,578,53.975
+1,579,53.975
+1,579,7.62
+1,579,10.16
+1,579,55.88
+1,579,7.62
+1,579,24.13
+1,579,10.16
+1,579,35.56
+1,579,44.45
+1,579,22.86
+1,579,40.64
+1,579,53.975
+1,579,19.05
+1,579,33.02
+1,579,7.62
+1,579,55.88
+1,579,30.48
+1,579,35.56
+1,579,30.48
+1,579,7.62
+1,579,44.45
+1,579,35.56
+1,579,40.64
+1,579,7.62
+1,579,24.13
+1,579,63.5
+1,579,33.02
+1,579,10.16
+1,579,7.62
+1,579,33.02
+1,580,33.02
+1,580,19.05
+1,580,7.62
+1,580,7.62
+1,580,7.62
+1,580,30.48
+1,580,40.64
+1,580,30.48
+1,580,24.13
+1,580,19.05
+1,580,33.02
+1,580,33.02
+1,580,7.62
+1,580,10.16
+1,580,44.45
+1,580,7.62
+1,580,99.06
+1,580,33.02
+1,580,8.89
+1,580,53.975
+1,580,10.16
+1,580,10.16
+1,580,33.02
+1,580,7.62
+1,580,81.28
+1,580,33.02
+1,580,33.02
+1,580,33.02
+1,580,46.355
+1,580,27.94
+1,581,19.05
+1,581,19.05
+1,581,40.64
+1,581,33.02
+1,581,44.45
+1,581,81.28
+1,581,7.62
+1,581,35.56
+1,581,33.02
+1,581,81.28
+1,581,63.5
+1,581,81.28
+1,581,24.13
+1,581,7.62
+1,581,7.62
+1,581,7.62
+1,581,50.8
+1,581,33.02
+1,581,15.24
+1,581,53.975
+1,581,55.88
+1,581,10.16
+1,581,53.975
+1,581,7.62
+1,581,7.62
+1,581,7.62
+1,581,44.45
+1,581,81.28
+1,581,55.88
+1,581,7.62
+1,582,55.88
+1,582,99.06
+1,582,44.45
+1,582,24.13
+1,582,24.13
+1,582,19.05
+1,582,33.02
+1,582,40.64
+1,582,33.02
+1,582,40.64
+1,582,35.56
+1,582,33.02
+1,582,10.16
+1,582,7.62
+1,582,15.24
+1,582,33.02
+1,582,7.62
+1,582,55.88
+1,582,15.24
+1,582,33.02
+1,582,63.5
+1,582,19.05
+1,582,63.5
+1,582,8.89
+1,582,10.16
+1,582,7.62
+1,582,7.62
+1,582,19.05
+1,582,55.88
+1,582,19.05
+1,583,24.13
+1,583,40.64
+1,583,40.64
+1,583,19.05
+1,583,53.975
+1,583,35.56
+1,583,7.62
+1,583,35.56
+1,583,99.06
+1,583,40.64
+1,583,10.16
+1,583,45.72
+1,583,7.62
+1,583,10.16
+1,583,30.48
+1,583,40.64
+1,583,40.64
+1,583,7.62
+1,583,46.355
+1,583,46.355
+1,583,7.62
+1,583,22.86
+1,583,40.64
+1,583,27.94
+1,583,40.64
+1,583,7.62
+1,583,7.62
+1,583,33.02
+1,583,22.86
+1,583,15.24
+1,584,10.16
+1,584,44.45
+1,584,50.8
+1,584,45.72
+1,584,15.24
+1,584,40.64
+1,584,33.02
+1,584,35.56
+1,584,15.24
+1,584,63.5
+1,584,7.62
+1,584,99.06
+1,584,19.05
+1,584,55.88
+1,584,7.62
+1,584,63.5
+1,584,40.64
+1,584,35.56
+1,584,7.62
+1,584,7.62
+1,584,27.94
+1,584,53.975
+1,584,7.62
+1,584,35.56
+1,584,7.62
+1,584,50.8
+1,584,35.56
+1,584,19.05
+1,584,99.06
+1,584,35.56
+1,585,55.88
+1,585,8.89
+1,585,15.24
+1,585,50.8
+1,585,7.62
+1,585,22.86
+1,585,46.355
+1,585,30.48
+1,585,15.24
+1,585,44.45
+1,585,27.94
+1,585,44.45
+1,585,7.62
+1,585,40.64
+1,585,99.06
+1,585,44.45
+1,585,45.72
+1,585,33.02
+1,585,99.06
+1,585,40.64
+1,585,40.64
+1,585,24.13
+1,585,8.89
+1,585,7.62
+1,585,35.56
+1,585,63.5
+1,585,35.56
+1,585,30.48
+1,585,33.02
+1,585,10.16
+1,586,33.02
+1,586,46.355
+1,586,27.94
+1,586,7.62
+1,586,99.06
+1,586,40.64
+1,586,7.62
+1,586,7.62
+1,586,7.62
+1,586,35.56
+1,586,45.72
+1,586,35.56
+1,586,10.16
+1,586,7.62
+1,586,45.72
+1,586,44.45
+1,586,7.62
+1,586,33.02
+1,586,10.16
+1,586,15.24
+1,586,63.5
+1,586,7.62
+1,586,24.13
+1,586,44.45
+1,586,10.16
+1,586,40.64
+1,586,33.02
+1,586,40.64
+1,586,55.88
+1,586,7.62
+1,587,63.5
+1,587,44.45
+1,587,30.48
+1,587,33.02
+1,587,50.8
+1,587,33.02
+1,587,35.56
+1,587,33.02
+1,587,7.62
+1,587,10.16
+1,587,30.48
+1,587,10.16
+1,587,50.8
+1,587,40.64
+1,587,7.62
+1,587,35.56
+1,587,10.16
+1,587,7.62
+1,587,45.72
+1,587,7.62
+1,587,55.88
+1,587,40.64
+1,587,7.62
+1,587,22.86
+1,587,33.02
+1,587,27.94
+1,587,46.355
+1,587,7.62
+1,587,27.94
+1,587,81.28
+1,588,81.28
+1,588,53.975
+1,588,7.62
+1,588,30.48
+1,588,35.56
+1,588,33.02
+1,588,81.28
+1,588,33.02
+1,588,40.64
+1,588,81.28
+1,588,50.8
+1,588,63.5
+1,588,15.24
+1,588,55.88
+1,588,33.02
+1,588,33.02
+1,588,7.62
+1,588,55.88
+1,588,45.72
+1,588,7.62
+1,588,8.89
+1,588,22.86
+1,588,33.02
+1,588,53.975
+1,588,55.88
+1,588,50.8
+1,588,35.56
+1,588,35.56
+1,588,7.62
+1,588,10.16
+1,589,27.94
+1,589,33.02
+1,589,7.62
+1,589,35.56
+1,589,10.16
+1,589,99.06
+1,589,10.16
+1,589,10.16
+1,589,35.56
+1,589,7.62
+1,589,35.56
+1,589,44.45
+1,589,7.62
+1,589,7.62
+1,589,50.8
+1,589,7.62
+1,589,7.62
+1,589,19.05
+1,589,63.5
+1,589,33.02
+1,589,33.02
+1,589,7.62
+1,589,63.5
+1,589,7.62
+1,589,40.64
+1,589,35.56
+1,589,24.13
+1,589,10.16
+1,589,99.06
+1,589,50.8
+1,590,99.06
+1,590,24.13
+1,590,22.86
+1,590,27.94
+1,590,7.62
+1,590,15.24
+1,590,7.62
+1,590,55.88
+1,590,35.56
+1,590,44.45
+1,590,55.88
+1,590,33.02
+1,590,10.16
+1,590,15.24
+1,590,8.89
+1,590,33.02
+1,590,7.62
+1,590,35.56
+1,590,45.72
+1,590,50.8
+1,590,24.13
+1,590,33.02
+1,590,40.64
+1,590,55.88
+1,590,10.16
+1,590,40.64
+1,590,7.62
+1,590,27.94
+1,590,7.62
+1,590,22.86
+1,591,44.45
+1,591,46.355
+1,591,63.5
+1,591,35.56
+1,591,10.16
+1,591,55.88
+1,591,19.05
+1,591,63.5
+1,591,22.86
+1,591,40.64
+1,591,46.355
+1,591,50.8
+1,591,30.48
+1,591,8.89
+1,591,40.64
+1,591,7.62
+1,591,33.02
+1,591,15.24
+1,591,10.16
+1,591,7.62
+1,591,45.72
+1,591,10.16
+1,591,10.16
+1,591,35.56
+1,591,35.56
+1,591,7.62
+1,591,35.56
+1,591,35.56
+1,591,10.16
+1,591,33.02
+1,592,53.975
+1,592,27.94
+1,592,7.62
+1,592,22.86
+1,592,27.94
+1,592,35.56
+1,592,27.94
+1,592,53.975
+1,592,55.88
+1,592,99.06
+1,592,35.56
+1,592,81.28
+1,592,7.62
+1,592,10.16
+1,592,19.05
+1,592,35.56
+1,592,35.56
+1,592,44.45
+1,592,10.16
+1,592,24.13
+1,592,45.72
+1,592,7.62
+1,592,10.16
+1,592,7.62
+1,592,44.45
+1,592,33.02
+1,592,7.62
+1,592,33.02
+1,592,35.56
+1,592,99.06
+1,593,33.02
+1,593,50.8
+1,593,30.48
+1,593,50.8
+1,593,46.355
+1,593,7.62
+1,593,63.5
+1,593,19.05
+1,593,33.02
+1,593,40.64
+1,593,40.64
+1,593,53.975
+1,593,40.64
+1,593,22.86
+1,593,10.16
+1,593,99.06
+1,593,22.86
+1,593,99.06
+1,593,10.16
+1,593,15.24
+1,593,33.02
+1,593,99.06
+1,593,10.16
+1,593,33.02
+1,593,30.48
+1,593,10.16
+1,593,10.16
+1,593,33.02
+1,593,55.88
+1,593,46.355
+1,594,33.02
+1,594,50.8
+1,594,33.02
+1,594,24.13
+1,594,33.02
+1,594,44.45
+1,594,8.89
+1,594,63.5
+1,594,40.64
+1,594,7.62
+1,594,10.16
+1,594,10.16
+1,594,33.02
+1,594,53.975
+1,594,10.16
+1,594,30.48
+1,594,33.02
+1,594,7.62
+1,594,33.02
+1,594,10.16
+1,594,10.16
+1,594,33.02
+1,594,45.72
+1,594,15.24
+1,594,55.88
+1,594,7.62
+1,594,7.62
+1,594,15.24
+1,594,27.94
+1,594,10.16
+1,595,81.28
+1,595,63.5
+1,595,7.62
+1,595,15.24
+1,595,50.8
+1,595,7.62
+1,595,8.89
+1,595,7.62
+1,595,24.13
+1,595,27.94
+1,595,8.89
+1,595,10.16
+1,595,7.62
+1,595,7.62
+1,595,7.62
+1,595,24.13
+1,595,27.94
+1,595,19.05
+1,595,8.89
+1,595,7.62
+1,595,33.02
+1,595,35.56
+1,595,30.48
+1,595,45.72
+1,595,46.355
+1,595,40.64
+1,595,33.02
+1,595,45.72
+1,595,46.355
+1,595,10.16
+1,596,30.48
+1,596,45.72
+1,596,33.02
+1,596,40.64
+1,596,7.62
+1,596,44.45
+1,596,35.56
+1,596,27.94
+1,596,10.16
+1,596,33.02
+1,596,24.13
+1,596,53.975
+1,596,27.94
+1,596,40.64
+1,596,8.89
+1,596,24.13
+1,596,46.355
+1,596,19.05
+1,596,53.975
+1,596,53.975
+1,596,15.24
+1,596,99.06
+1,596,44.45
+1,596,99.06
+1,596,45.72
+1,596,40.64
+1,596,63.5
+1,596,30.48
+1,596,44.45
+1,596,81.28
+1,597,53.975
+1,597,33.02
+1,597,33.02
+1,597,40.64
+1,597,44.45
+1,597,35.56
+1,597,33.02
+1,597,40.64
+1,597,19.05
+1,597,35.56
+1,597,7.62
+1,597,50.8
+1,597,7.62
+1,597,10.16
+1,597,7.62
+1,597,19.05
+1,597,53.975
+1,597,7.62
+1,597,15.24
+1,597,19.05
+1,597,35.56
+1,597,27.94
+1,597,44.45
+1,597,50.8
+1,597,7.62
+1,597,7.62
+1,597,30.48
+1,597,30.48
+1,597,40.64
+1,597,19.05
+1,598,10.16
+1,598,35.56
+1,598,33.02
+1,598,15.24
+1,598,10.16
+1,598,55.88
+1,598,10.16
+1,598,33.02
+1,598,46.355
+1,598,10.16
+1,598,33.02
+1,598,15.24
+1,598,99.06
+1,598,27.94
+1,598,40.64
+1,598,7.62
+1,598,15.24
+1,598,7.62
+1,598,15.24
+1,598,33.02
+1,598,33.02
+1,598,44.45
+1,598,7.62
+1,598,33.02
+1,598,35.56
+1,598,45.72
+1,598,10.16
+1,598,10.16
+1,598,44.45
+1,598,10.16
+1,599,35.56
+1,599,55.88
+1,599,22.86
+1,599,10.16
+1,599,33.02
+1,599,7.62
+1,599,35.56
+1,599,7.62
+1,599,15.24
+1,599,33.02
+1,599,7.62
+1,599,81.28
+1,599,24.13
+1,599,10.16
+1,599,33.02
+1,599,33.02
+1,599,7.62
+1,599,7.62
+1,599,40.64
+1,599,10.16
+1,599,8.89
+1,599,81.28
+1,599,10.16
+1,599,40.64
+1,599,10.16
+1,599,40.64
+1,599,35.56
+1,599,99.06
+1,599,10.16
+1,599,50.8
+1,600,7.62
+1,600,40.64
+1,600,27.94
+1,600,46.355
+1,600,7.62
+1,600,55.88
+1,600,53.975
+1,600,27.94
+1,600,50.8
+1,600,30.48
+1,600,40.64
+1,600,8.89
+1,600,40.64
+1,600,50.8
+1,600,35.56
+1,600,7.62
+1,600,33.02
+1,600,33.02
+1,600,81.28
+1,600,10.16
+1,600,35.56
+1,600,40.64
+1,600,7.62
+1,600,10.16
+1,600,7.62
+1,600,33.02
+1,600,7.62
+1,600,33.02
+1,600,10.16
+1,600,46.355
+1,601,35.56
+1,601,19.05
+1,601,50.8
+1,601,40.64
+1,601,46.355
+1,601,10.16
+1,601,10.16
+1,601,35.56
+1,601,8.89
+1,601,22.86
+1,601,50.8
+1,601,33.02
+1,601,10.16
+1,601,19.05
+1,601,40.64
+1,601,24.13
+1,601,33.02
+1,601,7.62
+1,601,10.16
+1,601,46.355
+1,601,35.56
+1,601,45.72
+1,601,8.89
+1,601,33.02
+1,601,10.16
+1,601,53.975
+1,601,33.02
+1,601,35.56
+1,601,63.5
+1,601,24.13
+1,602,55.88
+1,602,8.89
+1,602,24.13
+1,602,15.24
+1,602,50.8
+1,602,7.62
+1,602,33.02
+1,602,15.24
+1,602,7.62
+1,602,44.45
+1,602,24.13
+1,602,45.72
+1,602,7.62
+1,602,44.45
+1,602,7.62
+1,602,63.5
+1,602,8.89
+1,602,15.24
+1,602,19.05
+1,602,7.62
+1,602,40.64
+1,602,53.975
+1,602,30.48
+1,602,35.56
+1,602,15.24
+1,602,7.62
+1,602,35.56
+1,602,7.62
+1,602,24.13
+1,602,19.05
+1,603,10.16
+1,603,7.62
+1,603,33.02
+1,603,27.94
+1,603,33.02
+1,603,81.28
+1,603,44.45
+1,603,81.28
+1,603,46.355
+1,603,50.8
+1,603,44.45
+1,603,35.56
+1,603,33.02
+1,603,35.56
+1,603,10.16
+1,603,7.62
+1,603,50.8
+1,603,8.89
+1,603,33.02
+1,603,33.02
+1,603,24.13
+1,603,63.5
+1,603,53.975
+1,603,44.45
+1,603,19.05
+1,603,53.975
+1,603,7.62
+1,603,33.02
+1,603,10.16
+1,603,55.88
+1,604,15.24
+1,604,7.62
+1,604,7.62
+1,604,40.64
+1,604,7.62
+1,604,7.62
+1,604,63.5
+1,604,19.05
+1,604,19.05
+1,604,22.86
+1,604,27.94
+1,604,99.06
+1,604,46.355
+1,604,55.88
+1,604,7.62
+1,604,27.94
+1,604,30.48
+1,604,40.64
+1,604,10.16
+1,604,50.8
+1,604,35.56
+1,604,33.02
+1,604,46.355
+1,604,33.02
+1,604,22.86
+1,604,33.02
+1,604,7.62
+1,604,53.975
+1,604,99.06
+1,604,53.975
+1,605,27.94
+1,605,22.86
+1,605,35.56
+1,605,40.64
+1,605,22.86
+1,605,99.06
+1,605,15.24
+1,605,40.64
+1,605,15.24
+1,605,7.62
+1,605,15.24
+1,605,10.16
+1,605,19.05
+1,605,81.28
+1,605,33.02
+1,605,81.28
+1,605,7.62
+1,605,50.8
+1,605,99.06
+1,605,40.64
+1,605,15.24
+1,605,50.8
+1,605,10.16
+1,605,53.975
+1,605,30.48
+1,605,7.62
+1,605,35.56
+1,605,53.975
+1,605,27.94
+1,605,8.89
+1,606,7.62
+1,606,81.28
+1,606,35.56
+1,606,55.88
+1,606,35.56
+1,606,35.56
+1,606,7.62
+1,606,7.62
+1,606,8.89
+1,606,55.88
+1,606,35.56
+1,606,35.56
+1,606,10.16
+1,606,10.16
+1,606,44.45
+1,606,7.62
+1,606,24.13
+1,606,19.05
+1,606,10.16
+1,606,53.975
+1,606,55.88
+1,606,30.48
+1,606,10.16
+1,606,46.355
+1,606,15.24
+1,606,55.88
+1,606,27.94
+1,606,50.8
+1,606,35.56
+1,606,45.72
+1,607,7.62
+1,607,44.45
+1,607,81.28
+1,607,19.05
+1,607,46.355
+1,607,33.02
+1,607,30.48
+1,607,27.94
+1,607,24.13
+1,607,33.02
+1,607,10.16
+1,607,46.355
+1,607,7.62
+1,607,33.02
+1,607,35.56
+1,607,46.355
+1,607,7.62
+1,607,10.16
+1,607,40.64
+1,607,45.72
+1,607,7.62
+1,607,10.16
+1,607,81.28
+1,607,7.62
+1,607,63.5
+1,607,50.8
+1,607,55.88
+1,607,45.72
+1,607,19.05
+1,607,8.89
+1,608,7.62
+1,608,7.62
+1,608,27.94
+1,608,10.16
+1,608,10.16
+1,608,44.45
+1,608,19.05
+1,608,22.86
+1,608,33.02
+1,608,33.02
+1,608,63.5
+1,608,19.05
+1,608,10.16
+1,608,7.62
+1,608,30.48
+1,608,7.62
+1,608,55.88
+1,608,35.56
+1,608,40.64
+1,608,8.89
+1,608,44.45
+1,608,35.56
+1,608,7.62
+1,608,63.5
+1,608,81.28
+1,608,63.5
+1,608,7.62
+1,608,30.48
+1,608,99.06
+1,608,8.89
+1,609,7.62
+1,609,15.24
+1,609,33.02
+1,609,99.06
+1,609,7.62
+1,609,24.13
+1,609,15.24
+1,609,22.86
+1,609,15.24
+1,609,8.89
+1,609,30.48
+1,609,33.02
+1,609,10.16
+1,609,33.02
+1,609,10.16
+1,609,40.64
+1,609,24.13
+1,609,15.24
+1,609,22.86
+1,609,44.45
+1,609,10.16
+1,609,7.62
+1,609,10.16
+1,609,46.355
+1,609,7.62
+1,609,8.89
+1,609,7.62
+1,609,30.48
+1,609,35.56
+1,609,10.16
+1,610,40.64
+1,610,44.45
+1,610,81.28
+1,610,33.02
+1,610,33.02
+1,610,46.355
+1,610,44.45
+1,610,7.62
+1,610,33.02
+1,610,40.64
+1,610,33.02
+1,610,22.86
+1,610,10.16
+1,610,35.56
+1,610,45.72
+1,610,45.72
+1,610,63.5
+1,610,35.56
+1,610,46.355
+1,610,45.72
+1,610,55.88
+1,610,33.02
+1,610,35.56
+1,610,7.62
+1,610,35.56
+1,610,24.13
+1,610,10.16
+1,610,33.02
+1,610,22.86
+1,610,35.56
+1,611,33.02
+1,611,33.02
+1,611,55.88
+1,611,44.45
+1,611,30.48
+1,611,99.06
+1,611,7.62
+1,611,33.02
+1,611,55.88
+1,611,46.355
+1,611,63.5
+1,611,53.975
+1,611,50.8
+1,611,81.28
+1,611,46.355
+1,611,30.48
+1,611,8.89
+1,611,53.975
+1,611,33.02
+1,611,55.88
+1,611,24.13
+1,611,15.24
+1,611,15.24
+1,611,45.72
+1,611,46.355
+1,611,8.89
+1,611,50.8
+1,611,10.16
+1,611,50.8
+1,611,33.02
+1,612,35.56
+1,612,44.45
+1,612,40.64
+1,612,63.5
+1,612,40.64
+1,612,10.16
+1,612,33.02
+1,612,7.62
+1,612,33.02
+1,612,22.86
+1,612,10.16
+1,612,55.88
+1,612,50.8
+1,612,53.975
+1,612,15.24
+1,612,15.24
+1,612,7.62
+1,612,40.64
+1,612,7.62
+1,612,40.64
+1,612,45.72
+1,612,33.02
+1,612,10.16
+1,612,40.64
+1,612,7.62
+1,612,24.13
+1,612,15.24
+1,612,10.16
+1,612,81.28
+1,612,35.56
+1,613,81.28
+1,613,7.62
+1,613,15.24
+1,613,55.88
+1,613,44.45
+1,613,24.13
+1,613,33.02
+1,613,40.64
+1,613,55.88
+1,613,7.62
+1,613,8.89
+1,613,7.62
+1,613,44.45
+1,613,7.62
+1,613,40.64
+1,613,10.16
+1,613,15.24
+1,613,35.56
+1,613,53.975
+1,613,35.56
+1,613,7.62
+1,613,10.16
+1,613,24.13
+1,613,50.8
+1,613,15.24
+1,613,33.02
+1,613,99.06
+1,613,35.56
+1,613,33.02
+1,613,22.86
+1,614,55.88
+1,614,40.64
+1,614,35.56
+1,614,33.02
+1,614,7.62
+1,614,22.86
+1,614,53.975
+1,614,40.64
+1,614,33.02
+1,614,10.16
+1,614,7.62
+1,614,8.89
+1,614,7.62
+1,614,81.28
+1,614,53.975
+1,614,27.94
+1,614,63.5
+1,614,19.05
+1,614,15.24
+1,614,35.56
+1,614,33.02
+1,614,50.8
+1,614,7.62
+1,614,7.62
+1,614,33.02
+1,614,33.02
+1,614,19.05
+1,614,55.88
+1,614,45.72
+1,614,46.355
+1,615,33.02
+1,615,30.48
+1,615,40.64
+1,615,35.56
+1,615,55.88
+1,615,50.8
+1,615,22.86
+1,615,10.16
+1,615,99.06
+1,615,46.355
+1,615,27.94
+1,615,10.16
+1,615,45.72
+1,615,7.62
+1,615,10.16
+1,615,10.16
+1,615,30.48
+1,615,33.02
+1,615,45.72
+1,615,45.72
+1,615,81.28
+1,615,55.88
+1,615,35.56
+1,615,22.86
+1,615,22.86
+1,615,10.16
+1,615,19.05
+1,615,7.62
+1,615,7.62
+1,615,22.86
+1,616,53.975
+1,616,10.16
+1,616,35.56
+1,616,35.56
+1,616,63.5
+1,616,10.16
+1,616,33.02
+1,616,8.89
+1,616,40.64
+1,616,44.45
+1,616,7.62
+1,616,33.02
+1,616,15.24
+1,616,33.02
+1,616,99.06
+1,616,10.16
+1,616,45.72
+1,616,19.05
+1,616,35.56
+1,616,19.05
+1,616,44.45
+1,616,44.45
+1,616,99.06
+1,616,63.5
+1,616,63.5
+1,616,15.24
+1,616,33.02
+1,616,53.975
+1,616,27.94
+1,616,19.05
+1,617,19.05
+1,617,53.975
+1,617,40.64
+1,617,44.45
+1,617,35.56
+1,617,24.13
+1,617,40.64
+1,617,27.94
+1,617,44.45
+1,617,50.8
+1,617,40.64
+1,617,33.02
+1,617,10.16
+1,617,40.64
+1,617,7.62
+1,617,33.02
+1,617,50.8
+1,617,33.02
+1,617,81.28
+1,617,7.62
+1,617,35.56
+1,617,10.16
+1,617,27.94
+1,617,10.16
+1,617,10.16
+1,617,35.56
+1,617,19.05
+1,617,24.13
+1,617,10.16
+1,617,53.975
+1,618,33.02
+1,618,45.72
+1,618,44.45
+1,618,15.24
+1,618,46.355
+1,618,10.16
+1,618,8.89
+1,618,45.72
+1,618,7.62
+1,618,7.62
+1,618,50.8
+1,618,33.02
+1,618,40.64
+1,618,24.13
+1,618,33.02
+1,618,45.72
+1,618,10.16
+1,618,10.16
+1,618,7.62
+1,618,40.64
+1,618,10.16
+1,618,35.56
+1,618,10.16
+1,618,27.94
+1,618,50.8
+1,618,7.62
+1,618,7.62
+1,618,35.56
+1,618,40.64
+1,618,35.56
+1,619,7.62
+1,619,50.8
+1,619,33.02
+1,619,7.62
+1,619,99.06
+1,619,40.64
+1,619,50.8
+1,619,40.64
+1,619,33.02
+1,619,33.02
+1,619,19.05
+1,619,15.24
+1,619,7.62
+1,619,40.64
+1,619,30.48
+1,619,35.56
+1,619,45.72
+1,619,27.94
+1,619,81.28
+1,619,81.28
+1,619,7.62
+1,619,50.8
+1,619,8.89
+1,619,45.72
+1,619,7.62
+1,619,24.13
+1,619,35.56
+1,619,7.62
+1,619,50.8
+1,619,35.56
+1,620,10.16
+1,620,10.16
+1,620,46.355
+1,620,33.02
+1,620,46.355
+1,620,46.355
+1,620,30.48
+1,620,81.28
+1,620,55.88
+1,620,46.355
+1,620,33.02
+1,620,53.975
+1,620,44.45
+1,620,30.48
+1,620,63.5
+1,620,46.355
+1,620,24.13
+1,620,7.62
+1,620,35.56
+1,620,7.62
+1,620,33.02
+1,620,7.62
+1,620,22.86
+1,620,44.45
+1,620,35.56
+1,620,40.64
+1,620,45.72
+1,620,33.02
+1,620,7.62
+1,620,7.62
+1,621,8.89
+1,621,33.02
+1,621,19.05
+1,621,7.62
+1,621,44.45
+1,621,63.5
+1,621,99.06
+1,621,27.94
+1,621,7.62
+1,621,8.89
+1,621,45.72
+1,621,63.5
+1,621,40.64
+1,621,7.62
+1,621,7.62
+1,621,10.16
+1,621,35.56
+1,621,7.62
+1,621,7.62
+1,621,35.56
+1,621,81.28
+1,621,99.06
+1,621,24.13
+1,621,7.62
+1,621,99.06
+1,621,53.975
+1,621,99.06
+1,621,22.86
+1,621,33.02
+1,621,33.02
+1,622,63.5
+1,622,22.86
+1,622,40.64
+1,622,15.24
+1,622,8.89
+1,622,7.62
+1,622,33.02
+1,622,33.02
+1,622,22.86
+1,622,15.24
+1,622,33.02
+1,622,10.16
+1,622,53.975
+1,622,33.02
+1,622,44.45
+1,622,46.355
+1,622,33.02
+1,622,7.62
+1,622,55.88
+1,622,53.975
+1,622,10.16
+1,622,19.05
+1,622,35.56
+1,622,27.94
+1,622,7.62
+1,622,10.16
+1,622,44.45
+1,622,7.62
+1,622,63.5
+1,622,7.62
+1,623,7.62
+1,623,22.86
+1,623,10.16
+1,623,63.5
+1,623,55.88
+1,623,7.62
+1,623,10.16
+1,623,35.56
+1,623,22.86
+1,623,33.02
+1,623,27.94
+1,623,27.94
+1,623,8.89
+1,623,44.45
+1,623,99.06
+1,623,35.56
+1,623,15.24
+1,623,40.64
+1,623,22.86
+1,623,50.8
+1,623,10.16
+1,623,33.02
+1,623,30.48
+1,623,44.45
+1,623,10.16
+1,623,10.16
+1,623,45.72
+1,623,33.02
+1,623,19.05
+1,623,24.13
+1,624,22.86
+1,624,33.02
+1,624,33.02
+1,624,7.62
+1,624,15.24
+1,624,40.64
+1,624,33.02
+1,624,55.88
+1,624,24.13
+1,624,33.02
+1,624,35.56
+1,624,35.56
+1,624,33.02
+1,624,40.64
+1,624,33.02
+1,624,33.02
+1,624,30.48
+1,624,50.8
+1,624,7.62
+1,624,53.975
+1,624,7.62
+1,624,8.89
+1,624,15.24
+1,624,24.13
+1,624,40.64
+1,624,45.72
+1,624,8.89
+1,624,7.62
+1,624,7.62
+1,624,35.56
+1,625,99.06
+1,625,33.02
+1,625,10.16
+1,625,55.88
+1,625,22.86
+1,625,22.86
+1,625,40.64
+1,625,7.62
+1,625,81.28
+1,625,40.64
+1,625,7.62
+1,625,35.56
+1,625,55.88
+1,625,44.45
+1,625,35.56
+1,625,50.8
+1,625,30.48
+1,625,7.62
+1,625,55.88
+1,625,40.64
+1,625,8.89
+1,625,46.355
+1,625,22.86
+1,625,30.48
+1,625,8.89
+1,625,40.64
+1,625,7.62
+1,625,46.355
+1,625,55.88
+1,625,40.64
+1,626,35.56
+1,626,33.02
+1,626,30.48
+1,626,7.62
+1,626,7.62
+1,626,7.62
+1,626,63.5
+1,626,99.06
+1,626,10.16
+1,626,27.94
+1,626,46.355
+1,626,33.02
+1,626,33.02
+1,626,63.5
+1,626,7.62
+1,626,30.48
+1,626,7.62
+1,626,7.62
+1,626,33.02
+1,626,10.16
+1,626,8.89
+1,626,40.64
+1,626,7.62
+1,626,50.8
+1,626,44.45
+1,626,33.02
+1,626,81.28
+1,626,99.06
+1,626,33.02
+1,626,46.355
+1,627,30.48
+1,627,7.62
+1,627,15.24
+1,627,35.56
+1,627,33.02
+1,627,44.45
+1,627,81.28
+1,627,33.02
+1,627,40.64
+1,627,81.28
+1,627,27.94
+1,627,33.02
+1,627,55.88
+1,627,63.5
+1,627,40.64
+1,627,19.05
+1,627,7.62
+1,627,8.89
+1,627,22.86
+1,627,30.48
+1,627,10.16
+1,627,7.62
+1,627,55.88
+1,627,30.48
+1,627,22.86
+1,627,30.48
+1,627,10.16
+1,627,27.94
+1,627,40.64
+1,627,35.56
+1,628,7.62
+1,628,81.28
+1,628,33.02
+1,628,19.05
+1,628,10.16
+1,628,8.89
+1,628,35.56
+1,628,10.16
+1,628,45.72
+1,628,7.62
+1,628,63.5
+1,628,27.94
+1,628,7.62
+1,628,7.62
+1,628,55.88
+1,628,7.62
+1,628,40.64
+1,628,30.48
+1,628,22.86
+1,628,33.02
+1,628,7.62
+1,628,27.94
+1,628,7.62
+1,628,19.05
+1,628,99.06
+1,628,15.24
+1,628,10.16
+1,628,45.72
+1,628,7.62
+1,628,35.56
+1,629,7.62
+1,629,7.62
+1,629,63.5
+1,629,7.62
+1,629,30.48
+1,629,81.28
+1,629,7.62
+1,629,22.86
+1,629,8.89
+1,629,50.8
+1,629,15.24
+1,629,7.62
+1,629,40.64
+1,629,15.24
+1,629,35.56
+1,629,15.24
+1,629,19.05
+1,629,10.16
+1,629,8.89
+1,629,63.5
+1,629,35.56
+1,629,30.48
+1,629,46.355
+1,629,30.48
+1,629,81.28
+1,629,7.62
+1,629,63.5
+1,629,99.06
+1,629,99.06
+1,629,46.355
+1,630,55.88
+1,630,33.02
+1,630,24.13
+1,630,81.28
+1,630,10.16
+1,630,40.64
+1,630,10.16
+1,630,45.72
+1,630,35.56
+1,630,53.975
+1,630,30.48
+1,630,63.5
+1,630,8.89
+1,630,33.02
+1,630,15.24
+1,630,7.62
+1,630,8.89
+1,630,27.94
+1,630,7.62
+1,630,10.16
+1,630,35.56
+1,630,7.62
+1,630,10.16
+1,630,35.56
+1,630,35.56
+1,630,19.05
+1,630,44.45
+1,630,33.02
+1,630,7.62
+1,630,15.24
+1,631,33.02
+1,631,7.62
+1,631,33.02
+1,631,45.72
+1,631,30.48
+1,631,35.56
+1,631,27.94
+1,631,63.5
+1,631,10.16
+1,631,8.89
+1,631,99.06
+1,631,33.02
+1,631,27.94
+1,631,22.86
+1,631,30.48
+1,631,55.88
+1,631,99.06
+1,631,19.05
+1,631,22.86
+1,631,63.5
+1,631,15.24
+1,631,19.05
+1,631,10.16
+1,631,63.5
+1,631,50.8
+1,631,44.45
+1,631,45.72
+1,631,35.56
+1,631,50.8
+1,631,10.16
+1,632,8.89
+1,632,53.975
+1,632,7.62
+1,632,10.16
+1,632,99.06
+1,632,45.72
+1,632,99.06
+1,632,50.8
+1,632,8.89
+1,632,33.02
+1,632,7.62
+1,632,10.16
+1,632,81.28
+1,632,45.72
+1,632,27.94
+1,632,8.89
+1,632,33.02
+1,632,30.48
+1,632,22.86
+1,632,30.48
+1,632,7.62
+1,632,33.02
+1,632,33.02
+1,632,7.62
+1,632,8.89
+1,632,99.06
+1,632,33.02
+1,632,40.64
+1,632,19.05
+1,632,55.88
+1,633,55.88
+1,633,55.88
+1,633,24.13
+1,633,53.975
+1,633,27.94
+1,633,40.64
+1,633,53.975
+1,633,8.89
+1,633,44.45
+1,633,44.45
+1,633,53.975
+1,633,7.62
+1,633,35.56
+1,633,40.64
+1,633,7.62
+1,633,35.56
+1,633,7.62
+1,633,99.06
+1,633,7.62
+1,633,50.8
+1,633,7.62
+1,633,44.45
+1,633,27.94
+1,633,7.62
+1,633,81.28
+1,633,8.89
+1,633,30.48
+1,633,35.56
+1,633,45.72
+1,633,44.45
+1,634,7.62
+1,634,7.62
+1,634,8.89
+1,634,15.24
+1,634,22.86
+1,634,7.62
+1,634,81.28
+1,634,45.72
+1,634,7.62
+1,634,19.05
+1,634,81.28
+1,634,33.02
+1,634,7.62
+1,634,55.88
+1,634,22.86
+1,634,50.8
+1,634,35.56
+1,634,50.8
+1,634,15.24
+1,634,35.56
+1,634,30.48
+1,634,7.62
+1,634,99.06
+1,634,40.64
+1,634,35.56
+1,634,81.28
+1,634,30.48
+1,634,10.16
+1,634,7.62
+1,634,55.88
+1,635,30.48
+1,635,33.02
+1,635,7.62
+1,635,33.02
+1,635,63.5
+1,635,7.62
+1,635,10.16
+1,635,45.72
+1,635,33.02
+1,635,27.94
+1,635,33.02
+1,635,46.355
+1,635,33.02
+1,635,55.88
+1,635,8.89
+1,635,40.64
+1,635,19.05
+1,635,7.62
+1,635,81.28
+1,635,30.48
+1,635,10.16
+1,635,45.72
+1,635,99.06
+1,635,99.06
+1,635,45.72
+1,635,33.02
+1,635,33.02
+1,635,27.94
+1,635,46.355
+1,635,22.86
+1,636,46.355
+1,636,40.64
+1,636,8.89
+1,636,33.02
+1,636,81.28
+1,636,33.02
+1,636,10.16
+1,636,55.88
+1,636,44.45
+1,636,15.24
+1,636,22.86
+1,636,10.16
+1,636,53.975
+1,636,7.62
+1,636,7.62
+1,636,63.5
+1,636,8.89
+1,636,22.86
+1,636,7.62
+1,636,33.02
+1,636,7.62
+1,636,50.8
+1,636,19.05
+1,636,24.13
+1,636,30.48
+1,636,35.56
+1,636,19.05
+1,636,19.05
+1,636,53.975
+1,636,45.72
+1,637,7.62
+1,637,30.48
+1,637,46.355
+1,637,40.64
+1,637,24.13
+1,637,40.64
+1,637,7.62
+1,637,10.16
+1,637,15.24
+1,637,81.28
+1,637,81.28
+1,637,10.16
+1,637,46.355
+1,637,8.89
+1,637,33.02
+1,637,35.56
+1,637,33.02
+1,637,24.13
+1,637,99.06
+1,637,81.28
+1,637,33.02
+1,637,45.72
+1,637,10.16
+1,637,7.62
+1,637,45.72
+1,637,22.86
+1,637,40.64
+1,637,7.62
+1,637,7.62
+1,637,7.62
+1,638,27.94
+1,638,7.62
+1,638,19.05
+1,638,44.45
+1,638,40.64
+1,638,99.06
+1,638,10.16
+1,638,33.02
+1,638,30.48
+1,638,7.62
+1,638,7.62
+1,638,8.89
+1,638,7.62
+1,638,53.975
+1,638,53.975
+1,638,53.975
+1,638,8.89
+1,638,63.5
+1,638,40.64
+1,638,7.62
+1,638,7.62
+1,638,7.62
+1,638,10.16
+1,638,7.62
+1,638,27.94
+1,638,40.64
+1,638,45.72
+1,638,22.86
+1,638,81.28
+1,638,7.62
+1,639,15.24
+1,639,10.16
+1,639,99.06
+1,639,15.24
+1,639,81.28
+1,639,99.06
+1,639,22.86
+1,639,33.02
+1,639,19.05
+1,639,10.16
+1,639,24.13
+1,639,7.62
+1,639,10.16
+1,639,7.62
+1,639,50.8
+1,639,7.62
+1,639,33.02
+1,639,55.88
+1,639,63.5
+1,639,44.45
+1,639,45.72
+1,639,30.48
+1,639,7.62
+1,639,30.48
+1,639,19.05
+1,639,40.64
+1,639,46.355
+1,639,10.16
+1,639,33.02
+1,639,40.64
+1,640,15.24
+1,640,24.13
+1,640,53.975
+1,640,7.62
+1,640,10.16
+1,640,27.94
+1,640,40.64
+1,640,7.62
+1,640,55.88
+1,640,40.64
+1,640,7.62
+1,640,33.02
+1,640,63.5
+1,640,15.24
+1,640,15.24
+1,640,63.5
+1,640,7.62
+1,640,55.88
+1,640,7.62
+1,640,63.5
+1,640,40.64
+1,640,33.02
+1,640,30.48
+1,640,10.16
+1,640,27.94
+1,640,10.16
+1,640,24.13
+1,640,33.02
+1,640,10.16
+1,640,33.02
+1,641,81.28
+1,641,27.94
+1,641,35.56
+1,641,30.48
+1,641,7.62
+1,641,45.72
+1,641,50.8
+1,641,7.62
+1,641,15.24
+1,641,8.89
+1,641,7.62
+1,641,40.64
+1,641,55.88
+1,641,8.89
+1,641,27.94
+1,641,99.06
+1,641,35.56
+1,641,63.5
+1,641,30.48
+1,641,99.06
+1,641,7.62
+1,641,7.62
+1,641,35.56
+1,641,55.88
+1,641,7.62
+1,641,50.8
+1,641,53.975
+1,641,45.72
+1,641,33.02
+1,641,22.86
+1,642,53.975
+1,642,40.64
+1,642,19.05
+1,642,7.62
+1,642,7.62
+1,642,46.355
+1,642,8.89
+1,642,27.94
+1,642,33.02
+1,642,19.05
+1,642,27.94
+1,642,40.64
+1,642,27.94
+1,642,24.13
+1,642,33.02
+1,642,40.64
+1,642,24.13
+1,642,30.48
+1,642,8.89
+1,642,24.13
+1,642,8.89
+1,642,55.88
+1,642,7.62
+1,642,33.02
+1,642,46.355
+1,642,27.94
+1,642,81.28
+1,642,7.62
+1,642,27.94
+1,642,7.62
+1,643,81.28
+1,643,35.56
+1,643,7.62
+1,643,81.28
+1,643,45.72
+1,643,63.5
+1,643,7.62
+1,643,30.48
+1,643,46.355
+1,643,45.72
+1,643,99.06
+1,643,7.62
+1,643,27.94
+1,643,8.89
+1,643,24.13
+1,643,63.5
+1,643,10.16
+1,643,15.24
+1,643,99.06
+1,643,7.62
+1,643,22.86
+1,643,99.06
+1,643,27.94
+1,643,33.02
+1,643,10.16
+1,643,50.8
+1,643,10.16
+1,643,81.28
+1,643,33.02
+1,643,40.64
+1,644,22.86
+1,644,99.06
+1,644,33.02
+1,644,81.28
+1,644,33.02
+1,644,40.64
+1,644,7.62
+1,644,33.02
+1,644,7.62
+1,644,35.56
+1,644,8.89
+1,644,50.8
+1,644,44.45
+1,644,33.02
+1,644,7.62
+1,644,10.16
+1,644,81.28
+1,644,50.8
+1,644,44.45
+1,644,30.48
+1,644,35.56
+1,644,10.16
+1,644,33.02
+1,644,45.72
+1,644,33.02
+1,644,27.94
+1,644,8.89
+1,644,27.94
+1,644,40.64
+1,644,10.16
+1,645,7.62
+1,645,40.64
+1,645,10.16
+1,645,99.06
+1,645,46.355
+1,645,33.02
+1,645,55.88
+1,645,19.05
+1,645,63.5
+1,645,7.62
+1,645,33.02
+1,645,50.8
+1,645,55.88
+1,645,8.89
+1,645,27.94
+1,645,7.62
+1,645,7.62
+1,645,33.02
+1,645,7.62
+1,645,19.05
+1,645,22.86
+1,645,45.72
+1,645,19.05
+1,645,10.16
+1,645,63.5
+1,645,24.13
+1,645,7.62
+1,645,10.16
+1,645,35.56
+1,645,33.02
+1,646,35.56
+1,646,99.06
+1,646,63.5
+1,646,7.62
+1,646,7.62
+1,646,7.62
+1,646,15.24
+1,646,15.24
+1,646,24.13
+1,646,24.13
+1,646,7.62
+1,646,10.16
+1,646,40.64
+1,646,55.88
+1,646,19.05
+1,646,19.05
+1,646,33.02
+1,646,46.355
+1,646,8.89
+1,646,7.62
+1,646,99.06
+1,646,10.16
+1,646,99.06
+1,646,7.62
+1,646,7.62
+1,646,33.02
+1,646,53.975
+1,646,8.89
+1,646,7.62
+1,646,7.62
+1,647,53.975
+1,647,7.62
+1,647,63.5
+1,647,7.62
+1,647,10.16
+1,647,7.62
+1,647,53.975
+1,647,99.06
+1,647,40.64
+1,647,63.5
+1,647,7.62
+1,647,24.13
+1,647,7.62
+1,647,35.56
+1,647,33.02
+1,647,7.62
+1,647,19.05
+1,647,7.62
+1,647,35.56
+1,647,50.8
+1,647,27.94
+1,647,81.28
+1,647,35.56
+1,647,63.5
+1,647,35.56
+1,647,10.16
+1,647,10.16
+1,647,50.8
+1,647,10.16
+1,647,40.64
+1,648,33.02
+1,648,63.5
+1,648,99.06
+1,648,7.62
+1,648,33.02
+1,648,7.62
+1,648,7.62
+1,648,40.64
+1,648,24.13
+1,648,46.355
+1,648,40.64
+1,648,7.62
+1,648,27.94
+1,648,45.72
+1,648,33.02
+1,648,7.62
+1,648,81.28
+1,648,35.56
+1,648,7.62
+1,648,7.62
+1,648,53.975
+1,648,35.56
+1,648,7.62
+1,648,46.355
+1,648,99.06
+1,648,63.5
+1,648,7.62
+1,648,40.64
+1,648,81.28
+1,648,35.56
+1,649,46.355
+1,649,63.5
+1,649,55.88
+1,649,33.02
+1,649,33.02
+1,649,33.02
+1,649,10.16
+1,649,30.48
+1,649,99.06
+1,649,24.13
+1,649,19.05
+1,649,35.56
+1,649,99.06
+1,649,44.45
+1,649,33.02
+1,649,10.16
+1,649,7.62
+1,649,35.56
+1,649,7.62
+1,649,45.72
+1,649,63.5
+1,649,33.02
+1,649,33.02
+1,649,10.16
+1,649,50.8
+1,649,33.02
+1,649,30.48
+1,649,33.02
+1,649,7.62
+1,649,15.24
+1,650,27.94
+1,650,19.05
+1,650,50.8
+1,650,35.56
+1,650,10.16
+1,650,8.89
+1,650,15.24
+1,650,40.64
+1,650,44.45
+1,650,53.975
+1,650,50.8
+1,650,7.62
+1,650,8.89
+1,650,24.13
+1,650,44.45
+1,650,40.64
+1,650,45.72
+1,650,45.72
+1,650,99.06
+1,650,7.62
+1,650,33.02
+1,650,33.02
+1,650,7.62
+1,650,45.72
+1,650,33.02
+1,650,7.62
+1,650,33.02
+1,650,10.16
+1,650,7.62
+1,650,46.355
+1,651,50.8
+1,651,7.62
+1,651,27.94
+1,651,99.06
+1,651,15.24
+1,651,7.62
+1,651,45.72
+1,651,8.89
+1,651,63.5
+1,651,33.02
+1,651,35.56
+1,651,7.62
+1,651,10.16
+1,651,35.56
+1,651,45.72
+1,651,7.62
+1,651,46.355
+1,651,40.64
+1,651,8.89
+1,651,40.64
+1,651,7.62
+1,651,40.64
+1,651,30.48
+1,651,45.72
+1,651,24.13
+1,651,99.06
+1,651,99.06
+1,651,7.62
+1,651,99.06
+1,651,27.94
+1,652,55.88
+1,652,55.88
+1,652,40.64
+1,652,99.06
+1,652,7.62
+1,652,45.72
+1,652,7.62
+1,652,7.62
+1,652,33.02
+1,652,33.02
+1,652,7.62
+1,652,15.24
+1,652,8.89
+1,652,7.62
+1,652,50.8
+1,652,33.02
+1,652,7.62
+1,652,7.62
+1,652,8.89
+1,652,7.62
+1,652,45.72
+1,652,63.5
+1,652,33.02
+1,652,44.45
+1,652,22.86
+1,652,35.56
+1,652,30.48
+1,652,35.56
+1,652,7.62
+1,652,7.62
+1,653,10.16
+1,653,7.62
+1,653,40.64
+1,653,7.62
+1,653,22.86
+1,653,7.62
+1,653,8.89
+1,653,99.06
+1,653,99.06
+1,653,7.62
+1,653,46.355
+1,653,53.975
+1,653,35.56
+1,653,8.89
+1,653,44.45
+1,653,33.02
+1,653,22.86
+1,653,27.94
+1,653,27.94
+1,653,22.86
+1,653,35.56
+1,653,44.45
+1,653,63.5
+1,653,33.02
+1,653,8.89
+1,653,35.56
+1,653,40.64
+1,653,7.62
+1,653,45.72
+1,653,33.02
+1,654,10.16
+1,654,81.28
+1,654,7.62
+1,654,7.62
+1,654,10.16
+1,654,7.62
+1,654,35.56
+1,654,81.28
+1,654,30.48
+1,654,81.28
+1,654,33.02
+1,654,7.62
+1,654,8.89
+1,654,50.8
+1,654,15.24
+1,654,55.88
+1,654,46.355
+1,654,7.62
+1,654,63.5
+1,654,7.62
+1,654,33.02
+1,654,24.13
+1,654,10.16
+1,654,10.16
+1,654,7.62
+1,654,99.06
+1,654,22.86
+1,654,10.16
+1,654,33.02
+1,654,53.975
+1,655,99.06
+1,655,33.02
+1,655,53.975
+1,655,33.02
+1,655,99.06
+1,655,35.56
+1,655,46.355
+1,655,35.56
+1,655,45.72
+1,655,40.64
+1,655,99.06
+1,655,50.8
+1,655,15.24
+1,655,99.06
+1,655,81.28
+1,655,22.86
+1,655,46.355
+1,655,40.64
+1,655,24.13
+1,655,50.8
+1,655,7.62
+1,655,8.89
+1,655,10.16
+1,655,22.86
+1,655,45.72
+1,655,81.28
+1,655,99.06
+1,655,99.06
+1,655,81.28
+1,655,30.48
+1,656,55.88
+1,656,8.89
+1,656,7.62
+1,656,15.24
+1,656,45.72
+1,656,46.355
+1,656,55.88
+1,656,50.8
+1,656,22.86
+1,656,35.56
+1,656,53.975
+1,656,40.64
+1,656,33.02
+1,656,81.28
+1,656,10.16
+1,656,53.975
+1,656,15.24
+1,656,15.24
+1,656,7.62
+1,656,8.89
+1,656,35.56
+1,656,81.28
+1,656,50.8
+1,656,24.13
+1,656,15.24
+1,656,15.24
+1,656,7.62
+1,656,50.8
+1,656,7.62
+1,656,22.86
+1,657,50.8
+1,657,33.02
+1,657,53.975
+1,657,33.02
+1,657,10.16
+1,657,44.45
+1,657,55.88
+1,657,81.28
+1,657,7.62
+1,657,50.8
+1,657,46.355
+1,657,50.8
+1,657,10.16
+1,657,19.05
+1,657,7.62
+1,657,46.355
+1,657,27.94
+1,657,35.56
+1,657,33.02
+1,657,24.13
+1,657,33.02
+1,657,7.62
+1,657,19.05
+1,657,33.02
+1,657,35.56
+1,657,63.5
+1,657,99.06
+1,657,35.56
+1,657,35.56
+1,657,24.13
+1,658,35.56
+1,658,8.89
+1,658,15.24
+1,658,35.56
+1,658,7.62
+1,658,33.02
+1,658,27.94
+1,658,7.62
+1,658,33.02
+1,658,15.24
+1,658,63.5
+1,658,24.13
+1,658,7.62
+1,658,7.62
+1,658,27.94
+1,658,33.02
+1,658,8.89
+1,658,63.5
+1,658,81.28
+1,658,10.16
+1,658,50.8
+1,658,15.24
+1,658,7.62
+1,658,40.64
+1,658,81.28
+1,658,33.02
+1,658,33.02
+1,658,19.05
+1,658,8.89
+1,658,50.8
+1,659,45.72
+1,659,10.16
+1,659,19.05
+1,659,99.06
+1,659,19.05
+1,659,10.16
+1,659,33.02
+1,659,40.64
+1,659,8.89
+1,659,33.02
+1,659,10.16
+1,659,8.89
+1,659,44.45
+1,659,45.72
+1,659,33.02
+1,659,44.45
+1,659,7.62
+1,659,50.8
+1,659,46.355
+1,659,30.48
+1,659,99.06
+1,659,33.02
+1,659,35.56
+1,659,30.48
+1,659,53.975
+1,659,7.62
+1,659,7.62
+1,659,50.8
+1,659,81.28
+1,659,33.02
+1,660,7.62
+1,660,81.28
+1,660,7.62
+1,660,81.28
+1,660,50.8
+1,660,22.86
+1,660,33.02
+1,660,30.48
+1,660,15.24
+1,660,15.24
+1,660,35.56
+1,660,7.62
+1,660,7.62
+1,660,63.5
+1,660,33.02
+1,660,40.64
+1,660,35.56
+1,660,35.56
+1,660,55.88
+1,660,7.62
+1,660,35.56
+1,660,24.13
+1,660,63.5
+1,660,46.355
+1,660,33.02
+1,660,24.13
+1,660,22.86
+1,660,33.02
+1,660,24.13
+1,660,53.975
+1,661,33.02
+1,661,81.28
+1,661,44.45
+1,661,10.16
+1,661,50.8
+1,661,35.56
+1,661,33.02
+1,661,63.5
+1,661,50.8
+1,661,33.02
+1,661,7.62
+1,661,35.56
+1,661,10.16
+1,661,10.16
+1,661,53.975
+1,661,7.62
+1,661,8.89
+1,661,24.13
+1,661,50.8
+1,661,55.88
+1,661,22.86
+1,661,33.02
+1,661,50.8
+1,661,81.28
+1,661,24.13
+1,661,50.8
+1,661,33.02
+1,661,30.48
+1,661,8.89
+1,661,7.62
+1,662,7.62
+1,662,19.05
+1,662,33.02
+1,662,24.13
+1,662,63.5
+1,662,55.88
+1,662,10.16
+1,662,40.64
+1,662,40.64
+1,662,55.88
+1,662,81.28
+1,662,15.24
+1,662,33.02
+1,662,44.45
+1,662,45.72
+1,662,30.48
+1,662,24.13
+1,662,7.62
+1,662,24.13
+1,662,24.13
+1,662,99.06
+1,662,33.02
+1,662,7.62
+1,662,10.16
+1,662,55.88
+1,662,7.62
+1,662,81.28
+1,662,40.64
+1,662,53.975
+1,662,40.64
+1,663,30.48
+1,663,24.13
+1,663,27.94
+1,663,7.62
+1,663,40.64
+1,663,40.64
+1,663,33.02
+1,663,10.16
+1,663,81.28
+1,663,35.56
+1,663,24.13
+1,663,63.5
+1,663,8.89
+1,663,63.5
+1,663,33.02
+1,663,10.16
+1,663,7.62
+1,663,33.02
+1,663,7.62
+1,663,46.355
+1,663,33.02
+1,663,8.89
+1,663,10.16
+1,663,53.975
+1,663,10.16
+1,663,53.975
+1,663,22.86
+1,663,22.86
+1,663,30.48
+1,663,45.72
+1,664,7.62
+1,664,15.24
+1,664,10.16
+1,664,35.56
+1,664,7.62
+1,664,15.24
+1,664,53.975
+1,664,46.355
+1,664,7.62
+1,664,7.62
+1,664,7.62
+1,664,46.355
+1,664,46.355
+1,664,7.62
+1,664,63.5
+1,664,10.16
+1,664,15.24
+1,664,99.06
+1,664,24.13
+1,664,45.72
+1,664,46.355
+1,664,50.8
+1,664,53.975
+1,664,7.62
+1,664,81.28
+1,664,81.28
+1,664,45.72
+1,664,8.89
+1,664,99.06
+1,664,35.56
+1,665,55.88
+1,665,44.45
+1,665,22.86
+1,665,27.94
+1,665,99.06
+1,665,40.64
+1,665,99.06
+1,665,7.62
+1,665,40.64
+1,665,53.975
+1,665,15.24
+1,665,30.48
+1,665,7.62
+1,665,24.13
+1,665,10.16
+1,665,50.8
+1,665,40.64
+1,665,27.94
+1,665,15.24
+1,665,33.02
+1,665,63.5
+1,665,10.16
+1,665,22.86
+1,665,10.16
+1,665,63.5
+1,665,7.62
+1,665,10.16
+1,665,33.02
+1,665,33.02
+1,665,30.48
+1,666,7.62
+1,666,81.28
+1,666,40.64
+1,666,30.48
+1,666,7.62
+1,666,45.72
+1,666,50.8
+1,666,10.16
+1,666,27.94
+1,666,7.62
+1,666,7.62
+1,666,7.62
+1,666,53.975
+1,666,15.24
+1,666,33.02
+1,666,44.45
+1,666,81.28
+1,666,40.64
+1,666,33.02
+1,666,53.975
+1,666,7.62
+1,666,63.5
+1,666,53.975
+1,666,50.8
+1,666,55.88
+1,666,53.975
+1,666,19.05
+1,666,35.56
+1,666,22.86
+1,666,81.28
+1,667,35.56
+1,667,8.89
+1,667,27.94
+1,667,55.88
+1,667,45.72
+1,667,7.62
+1,667,99.06
+1,667,81.28
+1,667,7.62
+1,667,53.975
+1,667,35.56
+1,667,15.24
+1,667,10.16
+1,667,63.5
+1,667,63.5
+1,667,8.89
+1,667,7.62
+1,667,33.02
+1,667,15.24
+1,667,7.62
+1,667,33.02
+1,667,46.355
+1,667,55.88
+1,667,7.62
+1,667,50.8
+1,667,50.8
+1,667,8.89
+1,667,8.89
+1,667,35.56
+1,667,19.05
+1,668,10.16
+1,668,7.62
+1,668,10.16
+1,668,46.355
+1,668,40.64
+1,668,15.24
+1,668,50.8
+1,668,7.62
+1,668,33.02
+1,668,45.72
+1,668,44.45
+1,668,22.86
+1,668,40.64
+1,668,10.16
+1,668,35.56
+1,668,53.975
+1,668,19.05
+1,668,7.62
+1,668,27.94
+1,668,33.02
+1,668,81.28
+1,668,33.02
+1,668,15.24
+1,668,44.45
+1,668,30.48
+1,668,50.8
+1,668,99.06
+1,668,7.62
+1,668,45.72
+1,668,10.16
+1,669,7.62
+1,669,7.62
+1,669,10.16
+1,669,7.62
+1,669,40.64
+1,669,55.88
+1,669,24.13
+1,669,27.94
+1,669,35.56
+1,669,24.13
+1,669,81.28
+1,669,24.13
+1,669,45.72
+1,669,50.8
+1,669,53.975
+1,669,10.16
+1,669,7.62
+1,669,7.62
+1,669,24.13
+1,669,15.24
+1,669,53.975
+1,669,50.8
+1,669,44.45
+1,669,55.88
+1,669,50.8
+1,669,27.94
+1,669,7.62
+1,669,40.64
+1,669,35.56
+1,669,27.94
+1,670,44.45
+1,670,15.24
+1,670,15.24
+1,670,40.64
+1,670,10.16
+1,670,40.64
+1,670,35.56
+1,670,10.16
+1,670,55.88
+1,670,15.24
+1,670,35.56
+1,670,35.56
+1,670,40.64
+1,670,27.94
+1,670,7.62
+1,670,10.16
+1,670,63.5
+1,670,33.02
+1,670,8.89
+1,670,22.86
+1,670,33.02
+1,670,45.72
+1,670,30.48
+1,670,30.48
+1,670,27.94
+1,670,99.06
+1,670,81.28
+1,670,35.56
+1,670,44.45
+1,670,7.62
+1,671,7.62
+1,671,19.05
+1,671,40.64
+1,671,22.86
+1,671,81.28
+1,671,10.16
+1,671,45.72
+1,671,33.02
+1,671,8.89
+1,671,50.8
+1,671,45.72
+1,671,33.02
+1,671,99.06
+1,671,40.64
+1,671,7.62
+1,671,33.02
+1,671,46.355
+1,671,8.89
+1,671,99.06
+1,671,33.02
+1,671,7.62
+1,671,50.8
+1,671,55.88
+1,671,10.16
+1,671,63.5
+1,671,19.05
+1,671,7.62
+1,671,63.5
+1,671,44.45
+1,671,40.64
+1,672,46.355
+1,672,35.56
+1,672,10.16
+1,672,19.05
+1,672,81.28
+1,672,7.62
+1,672,44.45
+1,672,10.16
+1,672,30.48
+1,672,46.355
+1,672,50.8
+1,672,10.16
+1,672,15.24
+1,672,33.02
+1,672,35.56
+1,672,81.28
+1,672,40.64
+1,672,8.89
+1,672,55.88
+1,672,10.16
+1,672,63.5
+1,672,19.05
+1,672,10.16
+1,672,7.62
+1,672,50.8
+1,672,53.975
+1,672,27.94
+1,672,35.56
+1,672,53.975
+1,672,55.88
+1,673,30.48
+1,673,35.56
+1,673,22.86
+1,673,46.355
+1,673,33.02
+1,673,45.72
+1,673,15.24
+1,673,33.02
+1,673,24.13
+1,673,22.86
+1,673,27.94
+1,673,44.45
+1,673,7.62
+1,673,44.45
+1,673,46.355
+1,673,10.16
+1,673,33.02
+1,673,7.62
+1,673,99.06
+1,673,7.62
+1,673,7.62
+1,673,63.5
+1,673,33.02
+1,673,35.56
+1,673,7.62
+1,673,55.88
+1,673,27.94
+1,673,8.89
+1,673,63.5
+1,673,45.72
+1,674,24.13
+1,674,8.89
+1,674,27.94
+1,674,81.28
+1,674,45.72
+1,674,15.24
+1,674,8.89
+1,674,7.62
+1,674,7.62
+1,674,63.5
+1,674,19.05
+1,674,15.24
+1,674,99.06
+1,674,24.13
+1,674,40.64
+1,674,81.28
+1,674,7.62
+1,674,7.62
+1,674,99.06
+1,674,33.02
+1,674,63.5
+1,674,99.06
+1,674,30.48
+1,674,30.48
+1,674,33.02
+1,674,8.89
+1,674,33.02
+1,674,22.86
+1,674,63.5
+1,674,55.88
+1,675,44.45
+1,675,7.62
+1,675,33.02
+1,675,30.48
+1,675,55.88
+1,675,7.62
+1,675,45.72
+1,675,7.62
+1,675,35.56
+1,675,10.16
+1,675,40.64
+1,675,15.24
+1,675,7.62
+1,675,55.88
+1,675,44.45
+1,675,45.72
+1,675,46.355
+1,675,99.06
+1,675,22.86
+1,675,30.48
+1,675,15.24
+1,675,24.13
+1,675,15.24
+1,675,7.62
+1,675,7.62
+1,675,7.62
+1,675,7.62
+1,675,35.56
+1,675,63.5
+1,675,19.05
+1,676,30.48
+1,676,27.94
+1,676,53.975
+1,676,7.62
+1,676,40.64
+1,676,10.16
+1,676,8.89
+1,676,7.62
+1,676,7.62
+1,676,33.02
+1,676,22.86
+1,676,44.45
+1,676,55.88
+1,676,99.06
+1,676,33.02
+1,676,99.06
+1,676,10.16
+1,676,7.62
+1,676,45.72
+1,676,99.06
+1,676,27.94
+1,676,24.13
+1,676,46.355
+1,676,99.06
+1,676,10.16
+1,676,7.62
+1,676,22.86
+1,676,35.56
+1,676,24.13
+1,676,7.62
+1,677,46.355
+1,677,33.02
+1,677,7.62
+1,677,30.48
+1,677,44.45
+1,677,27.94
+1,677,81.28
+1,677,15.24
+1,677,99.06
+1,677,8.89
+1,677,99.06
+1,677,7.62
+1,677,45.72
+1,677,8.89
+1,677,19.05
+1,677,33.02
+1,677,10.16
+1,677,10.16
+1,677,27.94
+1,677,27.94
+1,677,99.06
+1,677,22.86
+1,677,35.56
+1,677,7.62
+1,677,30.48
+1,677,30.48
+1,677,24.13
+1,677,7.62
+1,677,44.45
+1,677,33.02
+1,678,46.355
+1,678,10.16
+1,678,50.8
+1,678,27.94
+1,678,35.56
+1,678,55.88
+1,678,30.48
+1,678,30.48
+1,678,40.64
+1,678,99.06
+1,678,53.975
+1,678,7.62
+1,678,53.975
+1,678,19.05
+1,678,22.86
+1,678,24.13
+1,678,30.48
+1,678,19.05
+1,678,45.72
+1,678,33.02
+1,678,63.5
+1,678,24.13
+1,678,15.24
+1,678,45.72
+1,678,8.89
+1,678,50.8
+1,678,10.16
+1,678,40.64
+1,678,19.05
+1,678,24.13
+1,679,19.05
+1,679,24.13
+1,679,99.06
+1,679,33.02
+1,679,50.8
+1,679,7.62
+1,679,33.02
+1,679,10.16
+1,679,7.62
+1,679,33.02
+1,679,33.02
+1,679,8.89
+1,679,7.62
+1,679,33.02
+1,679,35.56
+1,679,7.62
+1,679,40.64
+1,679,40.64
+1,679,24.13
+1,679,22.86
+1,679,24.13
+1,679,45.72
+1,679,27.94
+1,679,19.05
+1,679,35.56
+1,679,33.02
+1,679,24.13
+1,679,27.94
+1,679,44.45
+1,679,10.16
+1,680,30.48
+1,680,10.16
+1,680,45.72
+1,680,10.16
+1,680,40.64
+1,680,33.02
+1,680,53.975
+1,680,10.16
+1,680,81.28
+1,680,63.5
+1,680,33.02
+1,680,99.06
+1,680,81.28
+1,680,35.56
+1,680,44.45
+1,680,27.94
+1,680,19.05
+1,680,15.24
+1,680,7.62
+1,680,40.64
+1,680,10.16
+1,680,7.62
+1,680,45.72
+1,680,10.16
+1,680,40.64
+1,680,22.86
+1,680,33.02
+1,680,10.16
+1,680,22.86
+1,680,33.02
+1,681,99.06
+1,681,22.86
+1,681,27.94
+1,681,40.64
+1,681,27.94
+1,681,7.62
+1,681,33.02
+1,681,40.64
+1,681,35.56
+1,681,15.24
+1,681,40.64
+1,681,55.88
+1,681,7.62
+1,681,7.62
+1,681,33.02
+1,681,45.72
+1,681,45.72
+1,681,44.45
+1,681,44.45
+1,681,99.06
+1,681,46.355
+1,681,15.24
+1,681,7.62
+1,681,33.02
+1,681,35.56
+1,681,81.28
+1,681,50.8
+1,681,7.62
+1,681,46.355
+1,681,63.5
+1,682,27.94
+1,682,33.02
+1,682,63.5
+1,682,33.02
+1,682,81.28
+1,682,19.05
+1,682,15.24
+1,682,27.94
+1,682,63.5
+1,682,19.05
+1,682,63.5
+1,682,45.72
+1,682,7.62
+1,682,7.62
+1,682,7.62
+1,682,7.62
+1,682,33.02
+1,682,10.16
+1,682,7.62
+1,682,7.62
+1,682,7.62
+1,682,63.5
+1,682,24.13
+1,682,35.56
+1,682,40.64
+1,682,40.64
+1,682,99.06
+1,682,7.62
+1,682,50.8
+1,682,35.56
+1,683,30.48
+1,683,30.48
+1,683,15.24
+1,683,33.02
+1,683,7.62
+1,683,19.05
+1,683,99.06
+1,683,30.48
+1,683,81.28
+1,683,46.355
+1,683,46.355
+1,683,22.86
+1,683,10.16
+1,683,10.16
+1,683,44.45
+1,683,81.28
+1,683,27.94
+1,683,10.16
+1,683,8.89
+1,683,30.48
+1,683,27.94
+1,683,35.56
+1,683,19.05
+1,683,40.64
+1,683,27.94
+1,683,53.975
+1,683,40.64
+1,683,7.62
+1,683,24.13
+1,683,30.48
+1,684,35.56
+1,684,15.24
+1,684,81.28
+1,684,7.62
+1,684,63.5
+1,684,33.02
+1,684,81.28
+1,684,10.16
+1,684,81.28
+1,684,7.62
+1,684,53.975
+1,684,63.5
+1,684,19.05
+1,684,45.72
+1,684,7.62
+1,684,45.72
+1,684,45.72
+1,684,8.89
+1,684,8.89
+1,684,15.24
+1,684,30.48
+1,684,99.06
+1,684,7.62
+1,684,15.24
+1,684,33.02
+1,684,7.62
+1,684,7.62
+1,684,53.975
+1,684,7.62
+1,684,7.62
+1,685,81.28
+1,685,19.05
+1,685,35.56
+1,685,99.06
+1,685,19.05
+1,685,10.16
+1,685,35.56
+1,685,8.89
+1,685,46.355
+1,685,63.5
+1,685,81.28
+1,685,99.06
+1,685,7.62
+1,685,7.62
+1,685,22.86
+1,685,15.24
+1,685,53.975
+1,685,7.62
+1,685,7.62
+1,685,99.06
+1,685,33.02
+1,685,35.56
+1,685,40.64
+1,685,33.02
+1,685,30.48
+1,685,55.88
+1,685,10.16
+1,685,7.62
+1,685,10.16
+1,685,63.5
+1,686,81.28
+1,686,45.72
+1,686,50.8
+1,686,15.24
+1,686,7.62
+1,686,7.62
+1,686,7.62
+1,686,40.64
+1,686,15.24
+1,686,99.06
+1,686,45.72
+1,686,50.8
+1,686,27.94
+1,686,55.88
+1,686,46.355
+1,686,10.16
+1,686,44.45
+1,686,24.13
+1,686,33.02
+1,686,33.02
+1,686,35.56
+1,686,81.28
+1,686,46.355
+1,686,99.06
+1,686,35.56
+1,686,33.02
+1,686,53.975
+1,686,40.64
+1,686,8.89
+1,686,33.02
+1,687,15.24
+1,687,53.975
+1,687,40.64
+1,687,35.56
+1,687,99.06
+1,687,27.94
+1,687,35.56
+1,687,63.5
+1,687,7.62
+1,687,7.62
+1,687,10.16
+1,687,35.56
+1,687,22.86
+1,687,24.13
+1,687,81.28
+1,687,10.16
+1,687,55.88
+1,687,10.16
+1,687,27.94
+1,687,15.24
+1,687,33.02
+1,687,45.72
+1,687,53.975
+1,687,7.62
+1,687,33.02
+1,687,10.16
+1,687,81.28
+1,687,8.89
+1,687,10.16
+1,687,10.16
+1,688,7.62
+1,688,81.28
+1,688,40.64
+1,688,7.62
+1,688,44.45
+1,688,7.62
+1,688,55.88
+1,688,24.13
+1,688,50.8
+1,688,7.62
+1,688,22.86
+1,688,27.94
+1,688,19.05
+1,688,35.56
+1,688,35.56
+1,688,81.28
+1,688,35.56
+1,688,10.16
+1,688,10.16
+1,688,33.02
+1,688,33.02
+1,688,8.89
+1,688,19.05
+1,688,46.355
+1,688,63.5
+1,688,99.06
+1,688,33.02
+1,688,19.05
+1,688,40.64
+1,688,7.62
+1,689,46.355
+1,689,55.88
+1,689,10.16
+1,689,46.355
+1,689,33.02
+1,689,10.16
+1,689,44.45
+1,689,7.62
+1,689,35.56
+1,689,46.355
+1,689,10.16
+1,689,33.02
+1,689,45.72
+1,689,55.88
+1,689,35.56
+1,689,15.24
+1,689,10.16
+1,689,19.05
+1,689,50.8
+1,689,53.975
+1,689,55.88
+1,689,33.02
+1,689,7.62
+1,689,8.89
+1,689,10.16
+1,689,7.62
+1,689,35.56
+1,689,53.975
+1,689,44.45
+1,689,7.62
+1,690,81.28
+1,690,22.86
+1,690,10.16
+1,690,22.86
+1,690,50.8
+1,690,24.13
+1,690,46.355
+1,690,7.62
+1,690,24.13
+1,690,35.56
+1,690,33.02
+1,690,55.88
+1,690,33.02
+1,690,8.89
+1,690,8.89
+1,690,24.13
+1,690,8.89
+1,690,46.355
+1,690,7.62
+1,690,7.62
+1,690,30.48
+1,690,44.45
+1,690,81.28
+1,690,35.56
+1,690,45.72
+1,690,40.64
+1,690,27.94
+1,690,30.48
+1,690,10.16
+1,690,33.02
+1,691,40.64
+1,691,40.64
+1,691,22.86
+1,691,63.5
+1,691,35.56
+1,691,7.62
+1,691,53.975
+1,691,7.62
+1,691,27.94
+1,691,30.48
+1,691,46.355
+1,691,30.48
+1,691,40.64
+1,691,81.28
+1,691,35.56
+1,691,7.62
+1,691,7.62
+1,691,44.45
+1,691,45.72
+1,691,99.06
+1,691,63.5
+1,691,10.16
+1,691,7.62
+1,691,81.28
+1,691,30.48
+1,691,40.64
+1,691,7.62
+1,691,55.88
+1,691,44.45
+1,691,45.72
+1,692,15.24
+1,692,35.56
+1,692,35.56
+1,692,99.06
+1,692,10.16
+1,692,15.24
+1,692,35.56
+1,692,55.88
+1,692,40.64
+1,692,55.88
+1,692,7.62
+1,692,22.86
+1,692,30.48
+1,692,33.02
+1,692,55.88
+1,692,10.16
+1,692,7.62
+1,692,7.62
+1,692,7.62
+1,692,33.02
+1,692,8.89
+1,692,24.13
+1,692,8.89
+1,692,46.355
+1,692,50.8
+1,692,33.02
+1,692,7.62
+1,692,33.02
+1,692,33.02
+1,692,7.62
+1,693,15.24
+1,693,33.02
+1,693,46.355
+1,693,33.02
+1,693,40.64
+1,693,63.5
+1,693,8.89
+1,693,46.355
+1,693,50.8
+1,693,63.5
+1,693,63.5
+1,693,7.62
+1,693,7.62
+1,693,7.62
+1,693,7.62
+1,693,33.02
+1,693,15.24
+1,693,7.62
+1,693,55.88
+1,693,8.89
+1,693,35.56
+1,693,44.45
+1,693,35.56
+1,693,22.86
+1,693,33.02
+1,693,22.86
+1,693,10.16
+1,693,50.8
+1,693,44.45
+1,693,30.48
+1,694,10.16
+1,694,46.355
+1,694,40.64
+1,694,45.72
+1,694,40.64
+1,694,27.94
+1,694,33.02
+1,694,53.975
+1,694,15.24
+1,694,22.86
+1,694,19.05
+1,694,46.355
+1,694,33.02
+1,694,50.8
+1,694,99.06
+1,694,55.88
+1,694,33.02
+1,694,44.45
+1,694,63.5
+1,694,99.06
+1,694,24.13
+1,694,33.02
+1,694,45.72
+1,694,99.06
+1,694,44.45
+1,694,40.64
+1,694,33.02
+1,694,50.8
+1,694,7.62
+1,694,33.02
+1,695,7.62
+1,695,7.62
+1,695,7.62
+1,695,24.13
+1,695,8.89
+1,695,30.48
+1,695,30.48
+1,695,55.88
+1,695,50.8
+1,695,63.5
+1,695,8.89
+1,695,7.62
+1,695,50.8
+1,695,63.5
+1,695,99.06
+1,695,33.02
+1,695,22.86
+1,695,33.02
+1,695,7.62
+1,695,46.355
+1,695,44.45
+1,695,27.94
+1,695,15.24
+1,695,10.16
+1,695,44.45
+1,695,7.62
+1,695,33.02
+1,695,7.62
+1,695,27.94
+1,695,40.64
+1,696,50.8
+1,696,63.5
+1,696,81.28
+1,696,7.62
+1,696,10.16
+1,696,24.13
+1,696,19.05
+1,696,45.72
+1,696,45.72
+1,696,63.5
+1,696,35.56
+1,696,7.62
+1,696,50.8
+1,696,50.8
+1,696,33.02
+1,696,44.45
+1,696,27.94
+1,696,55.88
+1,696,27.94
+1,696,35.56
+1,696,40.64
+1,696,8.89
+1,696,81.28
+1,696,7.62
+1,696,45.72
+1,696,44.45
+1,696,30.48
+1,696,22.86
+1,696,22.86
+1,696,7.62
+1,697,22.86
+1,697,15.24
+1,697,10.16
+1,697,27.94
+1,697,35.56
+1,697,99.06
+1,697,45.72
+1,697,46.355
+1,697,7.62
+1,697,35.56
+1,697,46.355
+1,697,15.24
+1,697,63.5
+1,697,7.62
+1,697,19.05
+1,697,7.62
+1,697,45.72
+1,697,33.02
+1,697,7.62
+1,697,24.13
+1,697,63.5
+1,697,7.62
+1,697,63.5
+1,697,45.72
+1,697,10.16
+1,697,7.62
+1,697,55.88
+1,697,27.94
+1,697,19.05
+1,697,15.24
+1,698,50.8
+1,698,46.355
+1,698,45.72
+1,698,50.8
+1,698,7.62
+1,698,15.24
+1,698,44.45
+1,698,46.355
+1,698,8.89
+1,698,7.62
+1,698,63.5
+1,698,7.62
+1,698,45.72
+1,698,63.5
+1,698,45.72
+1,698,7.62
+1,698,7.62
+1,698,10.16
+1,698,33.02
+1,698,7.62
+1,698,44.45
+1,698,10.16
+1,698,99.06
+1,698,7.62
+1,698,7.62
+1,698,40.64
+1,698,44.45
+1,698,99.06
+1,698,22.86
+1,698,50.8
+1,699,81.28
+1,699,81.28
+1,699,53.975
+1,699,7.62
+1,699,35.56
+1,699,55.88
+1,699,50.8
+1,699,22.86
+1,699,81.28
+1,699,27.94
+1,699,53.975
+1,699,15.24
+1,699,63.5
+1,699,33.02
+1,699,24.13
+1,699,19.05
+1,699,35.56
+1,699,24.13
+1,699,27.94
+1,699,45.72
+1,699,7.62
+1,699,7.62
+1,699,7.62
+1,699,50.8
+1,699,44.45
+1,699,15.24
+1,699,44.45
+1,699,15.24
+1,699,99.06
+1,699,10.16
+1,700,10.16
+1,700,44.45
+1,700,22.86
+1,700,33.02
+1,700,81.28
+1,700,40.64
+1,700,53.975
+1,700,7.62
+1,700,81.28
+1,700,8.89
+1,700,30.48
+1,700,99.06
+1,700,22.86
+1,700,45.72
+1,700,15.24
+1,700,33.02
+1,700,22.86
+1,700,10.16
+1,700,35.56
+1,700,53.975
+1,700,33.02
+1,700,33.02
+1,700,8.89
+1,700,27.94
+1,700,35.56
+1,700,30.48
+1,700,40.64
+1,700,7.62
+1,700,40.64
+1,700,99.06
+1,701,10.16
+1,701,53.975
+1,701,24.13
+1,701,7.62
+1,701,50.8
+1,701,46.355
+1,701,45.72
+1,701,7.62
+1,701,7.62
+1,701,40.64
+1,701,46.355
+1,701,8.89
+1,701,50.8
+1,701,53.975
+1,701,44.45
+1,701,55.88
+1,701,53.975
+1,701,7.62
+1,701,10.16
+1,701,35.56
+1,701,35.56
+1,701,8.89
+1,701,7.62
+1,701,63.5
+1,701,30.48
+1,701,33.02
+1,701,63.5
+1,701,10.16
+1,701,10.16
+1,701,50.8
+1,702,35.56
+1,702,50.8
+1,702,55.88
+1,702,7.62
+1,702,33.02
+1,702,10.16
+1,702,33.02
+1,702,7.62
+1,702,7.62
+1,702,46.355
+1,702,53.975
+1,702,40.64
+1,702,33.02
+1,702,15.24
+1,702,40.64
+1,702,44.45
+1,702,27.94
+1,702,44.45
+1,702,40.64
+1,702,22.86
+1,702,99.06
+1,702,63.5
+1,702,35.56
+1,702,53.975
+1,702,53.975
+1,702,81.28
+1,702,19.05
+1,702,19.05
+1,702,30.48
+1,702,7.62
+1,703,7.62
+1,703,44.45
+1,703,22.86
+1,703,7.62
+1,703,44.45
+1,703,8.89
+1,703,33.02
+1,703,35.56
+1,703,44.45
+1,703,53.975
+1,703,40.64
+1,703,7.62
+1,703,99.06
+1,703,8.89
+1,703,30.48
+1,703,55.88
+1,703,99.06
+1,703,35.56
+1,703,22.86
+1,703,35.56
+1,703,44.45
+1,703,55.88
+1,703,35.56
+1,703,24.13
+1,703,63.5
+1,703,44.45
+1,703,30.48
+1,703,45.72
+1,703,30.48
+1,703,40.64
+1,704,24.13
+1,704,63.5
+1,704,10.16
+1,704,15.24
+1,704,33.02
+1,704,35.56
+1,704,53.975
+1,704,8.89
+1,704,7.62
+1,704,8.89
+1,704,7.62
+1,704,46.355
+1,704,81.28
+1,704,50.8
+1,704,30.48
+1,704,7.62
+1,704,35.56
+1,704,40.64
+1,704,7.62
+1,704,53.975
+1,704,27.94
+1,704,55.88
+1,704,63.5
+1,704,81.28
+1,704,30.48
+1,704,55.88
+1,704,19.05
+1,704,50.8
+1,704,7.62
+1,704,10.16
+1,705,33.02
+1,705,99.06
+1,705,7.62
+1,705,50.8
+1,705,50.8
+1,705,35.56
+1,705,27.94
+1,705,35.56
+1,705,99.06
+1,705,55.88
+1,705,10.16
+1,705,40.64
+1,705,33.02
+1,705,7.62
+1,705,33.02
+1,705,10.16
+1,705,33.02
+1,705,40.64
+1,705,7.62
+1,705,44.45
+1,705,81.28
+1,705,33.02
+1,705,40.64
+1,705,7.62
+1,705,50.8
+1,705,22.86
+1,705,33.02
+1,705,50.8
+1,705,22.86
+1,705,30.48
+1,706,81.28
+1,706,40.64
+1,706,63.5
+1,706,99.06
+1,706,35.56
+1,706,81.28
+1,706,33.02
+1,706,10.16
+1,706,44.45
+1,706,7.62
+1,706,8.89
+1,706,19.05
+1,706,33.02
+1,706,33.02
+1,706,33.02
+1,706,22.86
+1,706,7.62
+1,706,33.02
+1,706,7.62
+1,706,7.62
+1,706,30.48
+1,706,15.24
+1,706,30.48
+1,706,46.355
+1,706,33.02
+1,706,7.62
+1,706,7.62
+1,706,81.28
+1,706,35.56
+1,706,63.5
+1,707,50.8
+1,707,15.24
+1,707,7.62
+1,707,7.62
+1,707,53.975
+1,707,33.02
+1,707,24.13
+1,707,45.72
+1,707,50.8
+1,707,63.5
+1,707,30.48
+1,707,19.05
+1,707,50.8
+1,707,63.5
+1,707,99.06
+1,707,33.02
+1,707,15.24
+1,707,40.64
+1,707,45.72
+1,707,33.02
+1,707,7.62
+1,707,15.24
+1,707,46.355
+1,707,50.8
+1,707,46.355
+1,707,55.88
+1,707,40.64
+1,707,33.02
+1,707,7.62
+1,707,8.89
+1,708,33.02
+1,708,7.62
+1,708,44.45
+1,708,55.88
+1,708,7.62
+1,708,35.56
+1,708,30.48
+1,708,40.64
+1,708,10.16
+1,708,7.62
+1,708,8.89
+1,708,7.62
+1,708,15.24
+1,708,33.02
+1,708,55.88
+1,708,10.16
+1,708,63.5
+1,708,33.02
+1,708,10.16
+1,708,24.13
+1,708,27.94
+1,708,19.05
+1,708,40.64
+1,708,35.56
+1,708,24.13
+1,708,10.16
+1,708,7.62
+1,708,22.86
+1,708,7.62
+1,708,99.06
+1,709,30.48
+1,709,45.72
+1,709,40.64
+1,709,33.02
+1,709,33.02
+1,709,33.02
+1,709,99.06
+1,709,10.16
+1,709,33.02
+1,709,7.62
+1,709,10.16
+1,709,35.56
+1,709,45.72
+1,709,63.5
+1,709,8.89
+1,709,99.06
+1,709,81.28
+1,709,22.86
+1,709,46.355
+1,709,33.02
+1,709,10.16
+1,709,33.02
+1,709,35.56
+1,709,40.64
+1,709,19.05
+1,709,27.94
+1,709,10.16
+1,709,7.62
+1,709,40.64
+1,709,63.5
+1,710,15.24
+1,710,24.13
+1,710,10.16
+1,710,35.56
+1,710,7.62
+1,710,46.355
+1,710,15.24
+1,710,53.975
+1,710,44.45
+1,710,10.16
+1,710,22.86
+1,710,99.06
+1,710,7.62
+1,710,53.975
+1,710,30.48
+1,710,33.02
+1,710,10.16
+1,710,30.48
+1,710,40.64
+1,710,33.02
+1,710,19.05
+1,710,10.16
+1,710,7.62
+1,710,33.02
+1,710,7.62
+1,710,7.62
+1,710,7.62
+1,710,35.56
+1,710,19.05
+1,710,45.72
+1,711,10.16
+1,711,22.86
+1,711,81.28
+1,711,30.48
+1,711,55.88
+1,711,53.975
+1,711,24.13
+1,711,40.64
+1,711,7.62
+1,711,10.16
+1,711,19.05
+1,711,7.62
+1,711,10.16
+1,711,53.975
+1,711,40.64
+1,711,55.88
+1,711,40.64
+1,711,24.13
+1,711,30.48
+1,711,46.355
+1,711,35.56
+1,711,33.02
+1,711,33.02
+1,711,7.62
+1,711,35.56
+1,711,7.62
+1,711,55.88
+1,711,44.45
+1,711,10.16
+1,711,8.89
+1,712,7.62
+1,712,46.355
+1,712,8.89
+1,712,99.06
+1,712,33.02
+1,712,8.89
+1,712,63.5
+1,712,81.28
+1,712,30.48
+1,712,7.62
+1,712,35.56
+1,712,63.5
+1,712,7.62
+1,712,30.48
+1,712,33.02
+1,712,10.16
+1,712,30.48
+1,712,55.88
+1,712,33.02
+1,712,35.56
+1,712,24.13
+1,712,7.62
+1,712,24.13
+1,712,81.28
+1,712,46.355
+1,712,35.56
+1,712,33.02
+1,712,40.64
+1,712,24.13
+1,712,10.16
+1,713,44.45
+1,713,53.975
+1,713,33.02
+1,713,55.88
+1,713,7.62
+1,713,7.62
+1,713,35.56
+1,713,40.64
+1,713,81.28
+1,713,35.56
+1,713,45.72
+1,713,63.5
+1,713,27.94
+1,713,40.64
+1,713,7.62
+1,713,55.88
+1,713,35.56
+1,713,8.89
+1,713,7.62
+1,713,55.88
+1,713,15.24
+1,713,27.94
+1,713,35.56
+1,713,50.8
+1,713,8.89
+1,713,35.56
+1,713,24.13
+1,713,7.62
+1,713,33.02
+1,713,8.89
+1,714,53.975
+1,714,8.89
+1,714,10.16
+1,714,35.56
+1,714,63.5
+1,714,33.02
+1,714,35.56
+1,714,10.16
+1,714,7.62
+1,714,19.05
+1,714,33.02
+1,714,24.13
+1,714,8.89
+1,714,33.02
+1,714,7.62
+1,714,7.62
+1,714,22.86
+1,714,99.06
+1,714,33.02
+1,714,99.06
+1,714,27.94
+1,714,7.62
+1,714,7.62
+1,714,10.16
+1,714,40.64
+1,714,7.62
+1,714,7.62
+1,714,46.355
+1,714,33.02
+1,714,40.64
+1,715,7.62
+1,715,63.5
+1,715,35.56
+1,715,53.975
+1,715,8.89
+1,715,15.24
+1,715,7.62
+1,715,46.355
+1,715,99.06
+1,715,50.8
+1,715,7.62
+1,715,40.64
+1,715,7.62
+1,715,10.16
+1,715,45.72
+1,715,40.64
+1,715,30.48
+1,715,40.64
+1,715,22.86
+1,715,7.62
+1,715,45.72
+1,715,7.62
+1,715,19.05
+1,715,10.16
+1,715,10.16
+1,715,40.64
+1,715,27.94
+1,715,33.02
+1,715,35.56
+1,715,7.62
+1,716,35.56
+1,716,10.16
+1,716,44.45
+1,716,19.05
+1,716,10.16
+1,716,35.56
+1,716,53.975
+1,716,44.45
+1,716,10.16
+1,716,35.56
+1,716,24.13
+1,716,33.02
+1,716,8.89
+1,716,33.02
+1,716,19.05
+1,716,10.16
+1,716,44.45
+1,716,7.62
+1,716,99.06
+1,716,33.02
+1,716,30.48
+1,716,45.72
+1,716,63.5
+1,716,55.88
+1,716,7.62
+1,716,10.16
+1,716,35.56
+1,716,50.8
+1,716,99.06
+1,716,40.64
+1,717,33.02
+1,717,33.02
+1,717,40.64
+1,717,7.62
+1,717,33.02
+1,717,46.355
+1,717,40.64
+1,717,33.02
+1,717,40.64
+1,717,15.24
+1,717,27.94
+1,717,63.5
+1,717,40.64
+1,717,10.16
+1,717,7.62
+1,717,10.16
+1,717,46.355
+1,717,53.975
+1,717,33.02
+1,717,99.06
+1,717,99.06
+1,717,27.94
+1,717,63.5
+1,717,40.64
+1,717,50.8
+1,717,33.02
+1,717,7.62
+1,717,40.64
+1,717,35.56
+1,717,8.89
+1,718,33.02
+1,718,24.13
+1,718,19.05
+1,718,15.24
+1,718,63.5
+1,718,45.72
+1,718,22.86
+1,718,44.45
+1,718,7.62
+1,718,99.06
+1,718,33.02
+1,718,33.02
+1,718,33.02
+1,718,81.28
+1,718,24.13
+1,718,7.62
+1,718,63.5
+1,718,81.28
+1,718,10.16
+1,718,53.975
+1,718,10.16
+1,718,30.48
+1,718,7.62
+1,718,50.8
+1,718,81.28
+1,718,33.02
+1,718,40.64
+1,718,33.02
+1,718,30.48
+1,718,46.355
+1,719,27.94
+1,719,35.56
+1,719,30.48
+1,719,35.56
+1,719,55.88
+1,719,33.02
+1,719,27.94
+1,719,19.05
+1,719,33.02
+1,719,44.45
+1,719,7.62
+1,719,24.13
+1,719,30.48
+1,719,45.72
+1,719,46.355
+1,719,27.94
+1,719,19.05
+1,719,10.16
+1,719,7.62
+1,719,19.05
+1,719,35.56
+1,719,35.56
+1,719,46.355
+1,719,50.8
+1,719,40.64
+1,719,30.48
+1,719,40.64
+1,719,7.62
+1,719,35.56
+1,719,10.16
+1,720,27.94
+1,720,7.62
+1,720,40.64
+1,720,45.72
+1,720,35.56
+1,720,33.02
+1,720,10.16
+1,720,35.56
+1,720,55.88
+1,720,24.13
+1,720,7.62
+1,720,40.64
+1,720,7.62
+1,720,27.94
+1,720,53.975
+1,720,24.13
+1,720,10.16
+1,720,63.5
+1,720,30.48
+1,720,40.64
+1,720,45.72
+1,720,45.72
+1,720,7.62
+1,720,33.02
+1,720,44.45
+1,720,53.975
+1,720,53.975
+1,720,50.8
+1,720,7.62
+1,720,63.5
+1,721,19.05
+1,721,10.16
+1,721,27.94
+1,721,10.16
+1,721,7.62
+1,721,7.62
+1,721,24.13
+1,721,35.56
+1,721,7.62
+1,721,81.28
+1,721,63.5
+1,721,40.64
+1,721,30.48
+1,721,63.5
+1,721,81.28
+1,721,99.06
+1,721,7.62
+1,721,33.02
+1,721,33.02
+1,721,33.02
+1,721,15.24
+1,721,50.8
+1,721,53.975
+1,721,35.56
+1,721,46.355
+1,721,10.16
+1,721,22.86
+1,721,40.64
+1,721,15.24
+1,721,33.02
+1,722,27.94
+1,722,35.56
+1,722,24.13
+1,722,30.48
+1,722,33.02
+1,722,10.16
+1,722,27.94
+1,722,15.24
+1,722,27.94
+1,722,7.62
+1,722,7.62
+1,722,7.62
+1,722,7.62
+1,722,35.56
+1,722,7.62
+1,722,10.16
+1,722,55.88
+1,722,33.02
+1,722,33.02
+1,722,30.48
+1,722,35.56
+1,722,40.64
+1,722,10.16
+1,722,81.28
+1,722,7.62
+1,722,81.28
+1,722,99.06
+1,722,33.02
+1,722,40.64
+1,722,19.05
+1,723,22.86
+1,723,22.86
+1,723,55.88
+1,723,40.64
+1,723,10.16
+1,723,50.8
+1,723,35.56
+1,723,8.89
+1,723,46.355
+1,723,45.72
+1,723,7.62
+1,723,24.13
+1,723,44.45
+1,723,24.13
+1,723,44.45
+1,723,44.45
+1,723,15.24
+1,723,10.16
+1,723,33.02
+1,723,30.48
+1,723,30.48
+1,723,35.56
+1,723,45.72
+1,723,46.355
+1,723,40.64
+1,723,8.89
+1,723,24.13
+1,723,45.72
+1,723,7.62
+1,723,35.56
+1,724,40.64
+1,724,7.62
+1,724,7.62
+1,724,63.5
+1,724,33.02
+1,724,7.62
+1,724,33.02
+1,724,7.62
+1,724,55.88
+1,724,33.02
+1,724,7.62
+1,724,35.56
+1,724,7.62
+1,724,33.02
+1,724,8.89
+1,724,40.64
+1,724,24.13
+1,724,10.16
+1,724,40.64
+1,724,33.02
+1,724,19.05
+1,724,24.13
+1,724,10.16
+1,724,7.62
+1,724,19.05
+1,724,7.62
+1,724,33.02
+1,724,81.28
+1,724,27.94
+1,724,40.64
+1,725,35.56
+1,725,50.8
+1,725,7.62
+1,725,33.02
+1,725,10.16
+1,725,7.62
+1,725,7.62
+1,725,63.5
+1,725,46.355
+1,725,8.89
+1,725,55.88
+1,725,22.86
+1,725,81.28
+1,725,22.86
+1,725,15.24
+1,725,15.24
+1,725,7.62
+1,725,99.06
+1,725,27.94
+1,725,10.16
+1,725,99.06
+1,725,40.64
+1,725,81.28
+1,725,7.62
+1,725,10.16
+1,725,45.72
+1,725,99.06
+1,725,45.72
+1,725,7.62
+1,725,35.56
+1,726,81.28
+1,726,7.62
+1,726,63.5
+1,726,40.64
+1,726,40.64
+1,726,35.56
+1,726,7.62
+1,726,99.06
+1,726,7.62
+1,726,35.56
+1,726,7.62
+1,726,7.62
+1,726,10.16
+1,726,22.86
+1,726,15.24
+1,726,50.8
+1,726,40.64
+1,726,10.16
+1,726,81.28
+1,726,22.86
+1,726,63.5
+1,726,81.28
+1,726,45.72
+1,726,7.62
+1,726,10.16
+1,726,99.06
+1,726,33.02
+1,726,40.64
+1,726,40.64
+1,726,15.24
+1,727,7.62
+1,727,81.28
+1,727,50.8
+1,727,33.02
+1,727,19.05
+1,727,7.62
+1,727,24.13
+1,727,46.355
+1,727,22.86
+1,727,50.8
+1,727,30.48
+1,727,7.62
+1,727,7.62
+1,727,33.02
+1,727,81.28
+1,727,35.56
+1,727,44.45
+1,727,30.48
+1,727,10.16
+1,727,63.5
+1,727,27.94
+1,727,10.16
+1,727,33.02
+1,727,46.355
+1,727,99.06
+1,727,81.28
+1,727,10.16
+1,727,99.06
+1,727,15.24
+1,727,35.56
+1,728,33.02
+1,728,63.5
+1,728,7.62
+1,728,45.72
+1,728,46.355
+1,728,10.16
+1,728,15.24
+1,728,46.355
+1,728,40.64
+1,728,10.16
+1,728,99.06
+1,728,55.88
+1,728,46.355
+1,728,81.28
+1,728,7.62
+1,728,7.62
+1,728,8.89
+1,728,7.62
+1,728,40.64
+1,728,53.975
+1,728,35.56
+1,728,22.86
+1,728,22.86
+1,728,7.62
+1,728,40.64
+1,728,22.86
+1,728,10.16
+1,728,53.975
+1,728,33.02
+1,728,7.62
+1,729,7.62
+1,729,44.45
+1,729,99.06
+1,729,22.86
+1,729,99.06
+1,729,10.16
+1,729,33.02
+1,729,33.02
+1,729,63.5
+1,729,8.89
+1,729,15.24
+1,729,19.05
+1,729,35.56
+1,729,99.06
+1,729,63.5
+1,729,44.45
+1,729,46.355
+1,729,40.64
+1,729,30.48
+1,729,45.72
+1,729,7.62
+1,729,40.64
+1,729,7.62
+1,729,7.62
+1,729,15.24
+1,729,10.16
+1,729,63.5
+1,729,35.56
+1,729,44.45
+1,729,35.56
+1,730,7.62
+1,730,22.86
+1,730,7.62
+1,730,40.64
+1,730,27.94
+1,730,35.56
+1,730,45.72
+1,730,33.02
+1,730,35.56
+1,730,33.02
+1,730,33.02
+1,730,46.355
+1,730,15.24
+1,730,35.56
+1,730,7.62
+1,730,24.13
+1,730,33.02
+1,730,35.56
+1,730,53.975
+1,730,40.64
+1,730,15.24
+1,730,10.16
+1,730,7.62
+1,730,33.02
+1,730,55.88
+1,730,81.28
+1,730,35.56
+1,730,50.8
+1,730,10.16
+1,730,30.48
+1,731,7.62
+1,731,55.88
+1,731,35.56
+1,731,27.94
+1,731,7.62
+1,731,45.72
+1,731,53.975
+1,731,99.06
+1,731,19.05
+1,731,7.62
+1,731,24.13
+1,731,35.56
+1,731,10.16
+1,731,33.02
+1,731,50.8
+1,731,33.02
+1,731,53.975
+1,731,44.45
+1,731,33.02
+1,731,40.64
+1,731,50.8
+1,731,22.86
+1,731,7.62
+1,731,24.13
+1,731,44.45
+1,731,33.02
+1,731,81.28
+1,731,45.72
+1,731,40.64
+1,731,24.13
+1,732,7.62
+1,732,7.62
+1,732,81.28
+1,732,55.88
+1,732,53.975
+1,732,7.62
+1,732,63.5
+1,732,7.62
+1,732,35.56
+1,732,33.02
+1,732,44.45
+1,732,81.28
+1,732,19.05
+1,732,63.5
+1,732,10.16
+1,732,15.24
+1,732,40.64
+1,732,55.88
+1,732,53.975
+1,732,99.06
+1,732,8.89
+1,732,35.56
+1,732,7.62
+1,732,7.62
+1,732,46.355
+1,732,40.64
+1,732,40.64
+1,732,55.88
+1,732,44.45
+1,732,40.64
+1,733,35.56
+1,733,45.72
+1,733,10.16
+1,733,40.64
+1,733,99.06
+1,733,44.45
+1,733,50.8
+1,733,35.56
+1,733,33.02
+1,733,22.86
+1,733,99.06
+1,733,33.02
+1,733,44.45
+1,733,81.28
+1,733,99.06
+1,733,63.5
+1,733,53.975
+1,733,24.13
+1,733,63.5
+1,733,22.86
+1,733,53.975
+1,733,15.24
+1,733,15.24
+1,733,30.48
+1,733,45.72
+1,733,8.89
+1,733,53.975
+1,733,33.02
+1,733,53.975
+1,733,55.88
+1,734,7.62
+1,734,22.86
+1,734,10.16
+1,734,40.64
+1,734,19.05
+1,734,22.86
+1,734,35.56
+1,734,35.56
+1,734,7.62
+1,734,19.05
+1,734,46.355
+1,734,10.16
+1,734,50.8
+1,734,33.02
+1,734,15.24
+1,734,33.02
+1,734,50.8
+1,734,10.16
+1,734,50.8
+1,734,33.02
+1,734,50.8
+1,734,7.62
+1,734,46.355
+1,734,35.56
+1,734,24.13
+1,734,40.64
+1,734,27.94
+1,734,55.88
+1,734,8.89
+1,734,33.02
+1,735,33.02
+1,735,27.94
+1,735,10.16
+1,735,7.62
+1,735,33.02
+1,735,33.02
+1,735,55.88
+1,735,55.88
+1,735,33.02
+1,735,7.62
+1,735,15.24
+1,735,55.88
+1,735,35.56
+1,735,81.28
+1,735,45.72
+1,735,55.88
+1,735,15.24
+1,735,55.88
+1,735,33.02
+1,735,81.28
+1,735,24.13
+1,735,33.02
+1,735,40.64
+1,735,7.62
+1,735,35.56
+1,735,10.16
+1,735,7.62
+1,735,99.06
+1,735,99.06
+1,735,7.62
+1,736,7.62
+1,736,99.06
+1,736,33.02
+1,736,63.5
+1,736,63.5
+1,736,7.62
+1,736,15.24
+1,736,10.16
+1,736,30.48
+1,736,24.13
+1,736,30.48
+1,736,46.355
+1,736,15.24
+1,736,40.64
+1,736,33.02
+1,736,24.13
+1,736,7.62
+1,736,22.86
+1,736,46.355
+1,736,33.02
+1,736,27.94
+1,736,99.06
+1,736,24.13
+1,736,44.45
+1,736,7.62
+1,736,7.62
+1,736,33.02
+1,736,22.86
+1,736,7.62
+1,736,50.8
+1,737,33.02
+1,737,44.45
+1,737,46.355
+1,737,35.56
+1,737,35.56
+1,737,40.64
+1,737,55.88
+1,737,19.05
+1,737,22.86
+1,737,35.56
+1,737,7.62
+1,737,7.62
+1,737,7.62
+1,737,10.16
+1,737,19.05
+1,737,8.89
+1,737,40.64
+1,737,19.05
+1,737,63.5
+1,737,8.89
+1,737,33.02
+1,737,22.86
+1,737,7.62
+1,737,46.355
+1,737,33.02
+1,737,30.48
+1,737,45.72
+1,737,46.355
+1,737,10.16
+1,737,40.64
+1,738,63.5
+1,738,33.02
+1,738,35.56
+1,738,15.24
+1,738,24.13
+1,738,40.64
+1,738,35.56
+1,738,40.64
+1,738,10.16
+1,738,35.56
+1,738,99.06
+1,738,30.48
+1,738,40.64
+1,738,27.94
+1,738,53.975
+1,738,46.355
+1,738,50.8
+1,738,15.24
+1,738,46.355
+1,738,19.05
+1,738,8.89
+1,738,33.02
+1,738,40.64
+1,738,55.88
+1,738,40.64
+1,738,7.62
+1,738,45.72
+1,738,35.56
+1,738,33.02
+1,738,15.24
+1,739,81.28
+1,739,40.64
+1,739,24.13
+1,739,7.62
+1,739,10.16
+1,739,7.62
+1,739,50.8
+1,739,27.94
+1,739,10.16
+1,739,10.16
+1,739,44.45
+1,739,7.62
+1,739,53.975
+1,739,7.62
+1,739,7.62
+1,739,40.64
+1,739,40.64
+1,739,40.64
+1,739,63.5
+1,739,7.62
+1,739,33.02
+1,739,22.86
+1,739,53.975
+1,739,7.62
+1,739,10.16
+1,739,10.16
+1,739,24.13
+1,739,10.16
+1,739,24.13
+1,739,40.64
+1,740,10.16
+1,740,30.48
+1,740,53.975
+1,740,7.62
+1,740,7.62
+1,740,35.56
+1,740,10.16
+1,740,81.28
+1,740,10.16
+1,740,27.94
+1,740,30.48
+1,740,22.86
+1,740,40.64
+1,740,10.16
+1,740,19.05
+1,740,24.13
+1,740,45.72
+1,740,33.02
+1,740,15.24
+1,740,99.06
+1,740,15.24
+1,740,27.94
+1,740,24.13
+1,740,7.62
+1,740,35.56
+1,740,7.62
+1,740,7.62
+1,740,35.56
+1,740,99.06
+1,740,7.62
+1,741,10.16
+1,741,10.16
+1,741,24.13
+1,741,35.56
+1,741,63.5
+1,741,63.5
+1,741,10.16
+1,741,99.06
+1,741,22.86
+1,741,30.48
+1,741,24.13
+1,741,8.89
+1,741,33.02
+1,741,33.02
+1,741,53.975
+1,741,46.355
+1,741,81.28
+1,741,7.62
+1,741,46.355
+1,741,7.62
+1,741,33.02
+1,741,55.88
+1,741,35.56
+1,741,30.48
+1,741,8.89
+1,741,15.24
+1,741,33.02
+1,741,22.86
+1,741,15.24
+1,741,46.355
+1,742,44.45
+1,742,10.16
+1,742,35.56
+1,742,19.05
+1,742,8.89
+1,742,35.56
+1,742,7.62
+1,742,40.64
+1,742,7.62
+1,742,10.16
+1,742,7.62
+1,742,50.8
+1,742,63.5
+1,742,46.355
+1,742,27.94
+1,742,40.64
+1,742,10.16
+1,742,63.5
+1,742,55.88
+1,742,53.975
+1,742,35.56
+1,742,45.72
+1,742,35.56
+1,742,45.72
+1,742,27.94
+1,742,7.62
+1,742,40.64
+1,742,19.05
+1,742,10.16
+1,742,53.975
+1,743,55.88
+1,743,63.5
+1,743,99.06
+1,743,35.56
+1,743,33.02
+1,743,44.45
+1,743,40.64
+1,743,33.02
+1,743,35.56
+1,743,7.62
+1,743,40.64
+1,743,33.02
+1,743,40.64
+1,743,53.975
+1,743,10.16
+1,743,40.64
+1,743,40.64
+1,743,63.5
+1,743,8.89
+1,743,7.62
+1,743,10.16
+1,743,46.355
+1,743,22.86
+1,743,40.64
+1,743,15.24
+1,743,99.06
+1,743,7.62
+1,743,7.62
+1,743,35.56
+1,743,33.02
+1,744,27.94
+1,744,53.975
+1,744,7.62
+1,744,22.86
+1,744,30.48
+1,744,45.72
+1,744,40.64
+1,744,40.64
+1,744,30.48
+1,744,63.5
+1,744,15.24
+1,744,27.94
+1,744,10.16
+1,744,7.62
+1,744,46.355
+1,744,7.62
+1,744,7.62
+1,744,53.975
+1,744,81.28
+1,744,35.56
+1,744,40.64
+1,744,45.72
+1,744,33.02
+1,744,33.02
+1,744,40.64
+1,744,27.94
+1,744,35.56
+1,744,7.62
+1,744,19.05
+1,744,33.02
+1,745,7.62
+1,745,7.62
+1,745,33.02
+1,745,24.13
+1,745,19.05
+1,745,53.975
+1,745,7.62
+1,745,24.13
+1,745,27.94
+1,745,53.975
+1,745,22.86
+1,745,10.16
+1,745,8.89
+1,745,40.64
+1,745,7.62
+1,745,24.13
+1,745,53.975
+1,745,40.64
+1,745,33.02
+1,745,40.64
+1,745,53.975
+1,745,40.64
+1,745,40.64
+1,745,7.62
+1,745,40.64
+1,745,63.5
+1,745,55.88
+1,745,15.24
+1,745,30.48
+1,745,63.5
+1,746,63.5
+1,746,10.16
+1,746,8.89
+1,746,46.355
+1,746,50.8
+1,746,33.02
+1,746,7.62
+1,746,33.02
+1,746,35.56
+1,746,33.02
+1,746,19.05
+1,746,30.48
+1,746,10.16
+1,746,45.72
+1,746,35.56
+1,746,99.06
+1,746,7.62
+1,746,46.355
+1,746,33.02
+1,746,33.02
+1,746,50.8
+1,746,35.56
+1,746,53.975
+1,746,35.56
+1,746,7.62
+1,746,40.64
+1,746,7.62
+1,746,33.02
+1,746,7.62
+1,746,63.5
+1,747,7.62
+1,747,7.62
+1,747,33.02
+1,747,7.62
+1,747,8.89
+1,747,55.88
+1,747,19.05
+1,747,63.5
+1,747,27.94
+1,747,8.89
+1,747,46.355
+1,747,44.45
+1,747,7.62
+1,747,50.8
+1,747,40.64
+1,747,10.16
+1,747,50.8
+1,747,7.62
+1,747,40.64
+1,747,55.88
+1,747,40.64
+1,747,7.62
+1,747,63.5
+1,747,55.88
+1,747,35.56
+1,747,8.89
+1,747,40.64
+1,747,45.72
+1,747,53.975
+1,747,33.02
+1,748,22.86
+1,748,50.8
+1,748,99.06
+1,748,35.56
+1,748,46.355
+1,748,40.64
+1,748,45.72
+1,748,63.5
+1,748,53.975
+1,748,33.02
+1,748,50.8
+1,748,99.06
+1,748,10.16
+1,748,33.02
+1,748,55.88
+1,748,33.02
+1,748,24.13
+1,748,53.975
+1,748,24.13
+1,748,7.62
+1,748,63.5
+1,748,30.48
+1,748,7.62
+1,748,7.62
+1,748,33.02
+1,748,35.56
+1,748,15.24
+1,748,40.64
+1,748,8.89
+1,748,22.86
+1,749,7.62
+1,749,10.16
+1,749,55.88
+1,749,7.62
+1,749,33.02
+1,749,55.88
+1,749,24.13
+1,749,7.62
+1,749,33.02
+1,749,35.56
+1,749,40.64
+1,749,22.86
+1,749,44.45
+1,749,30.48
+1,749,7.62
+1,749,33.02
+1,749,10.16
+1,749,7.62
+1,749,7.62
+1,749,99.06
+1,749,45.72
+1,749,19.05
+1,749,45.72
+1,749,15.24
+1,749,63.5
+1,749,7.62
+1,749,15.24
+1,749,55.88
+1,749,10.16
+1,749,55.88
+1,750,50.8
+1,750,7.62
+1,750,7.62
+1,750,7.62
+1,750,45.72
+1,750,7.62
+1,750,22.86
+1,750,55.88
+1,750,33.02
+1,750,55.88
+1,750,99.06
+1,750,10.16
+1,750,33.02
+1,750,7.62
+1,750,7.62
+1,750,22.86
+1,750,53.975
+1,750,50.8
+1,750,35.56
+1,750,30.48
+1,750,99.06
+1,750,7.62
+1,750,7.62
+1,750,55.88
+1,750,53.975
+1,750,35.56
+1,750,33.02
+1,750,45.72
+1,750,40.64
+1,750,50.8
+1,751,81.28
+1,751,81.28
+1,751,33.02
+1,751,15.24
+1,751,45.72
+1,751,40.64
+1,751,10.16
+1,751,55.88
+1,751,24.13
+1,751,55.88
+1,751,7.62
+1,751,30.48
+1,751,81.28
+1,751,22.86
+1,751,7.62
+1,751,7.62
+1,751,81.28
+1,751,33.02
+1,751,19.05
+1,751,19.05
+1,751,45.72
+1,751,63.5
+1,751,63.5
+1,751,15.24
+1,751,40.64
+1,751,7.62
+1,751,10.16
+1,751,24.13
+1,751,53.975
+1,751,44.45
+1,752,7.62
+1,752,81.28
+1,752,7.62
+1,752,33.02
+1,752,24.13
+1,752,7.62
+1,752,35.56
+1,752,35.56
+1,752,50.8
+1,752,27.94
+1,752,99.06
+1,752,63.5
+1,752,50.8
+1,752,7.62
+1,752,33.02
+1,752,46.355
+1,752,46.355
+1,752,10.16
+1,752,7.62
+1,752,15.24
+1,752,55.88
+1,752,81.28
+1,752,10.16
+1,752,55.88
+1,752,19.05
+1,752,33.02
+1,752,55.88
+1,752,35.56
+1,752,27.94
+1,752,8.89
+1,753,27.94
+1,753,19.05
+1,753,7.62
+1,753,81.28
+1,753,7.62
+1,753,46.355
+1,753,33.02
+1,753,55.88
+1,753,44.45
+1,753,7.62
+1,753,46.355
+1,753,40.64
+1,753,7.62
+1,753,8.89
+1,753,10.16
+1,753,30.48
+1,753,7.62
+1,753,33.02
+1,753,7.62
+1,753,35.56
+1,753,46.355
+1,753,44.45
+1,753,7.62
+1,753,19.05
+1,753,7.62
+1,753,8.89
+1,753,63.5
+1,753,99.06
+1,753,53.975
+1,753,7.62
+1,754,7.62
+1,754,50.8
+1,754,99.06
+1,754,27.94
+1,754,99.06
+1,754,10.16
+1,754,40.64
+1,754,7.62
+1,754,7.62
+1,754,22.86
+1,754,35.56
+1,754,46.355
+1,754,35.56
+1,754,99.06
+1,754,63.5
+1,754,27.94
+1,754,35.56
+1,754,33.02
+1,754,10.16
+1,754,22.86
+1,754,33.02
+1,754,63.5
+1,754,99.06
+1,754,45.72
+1,754,7.62
+1,754,55.88
+1,754,55.88
+1,754,8.89
+1,754,24.13
+1,754,7.62
+1,755,30.48
+1,755,10.16
+1,755,46.355
+1,755,7.62
+1,755,22.86
+1,755,24.13
+1,755,33.02
+1,755,40.64
+1,755,8.89
+1,755,7.62
+1,755,10.16
+1,755,40.64
+1,755,7.62
+1,755,46.355
+1,755,53.975
+1,755,45.72
+1,755,7.62
+1,755,33.02
+1,755,24.13
+1,755,55.88
+1,755,50.8
+1,755,27.94
+1,755,10.16
+1,755,99.06
+1,755,63.5
+1,755,30.48
+1,755,30.48
+1,755,8.89
+1,755,35.56
+1,755,81.28
+1,756,24.13
+1,756,7.62
+1,756,44.45
+1,756,7.62
+1,756,7.62
+1,756,15.24
+1,756,22.86
+1,756,81.28
+1,756,55.88
+1,756,19.05
+1,756,22.86
+1,756,10.16
+1,756,33.02
+1,756,63.5
+1,756,7.62
+1,756,99.06
+1,756,7.62
+1,756,27.94
+1,756,63.5
+1,756,15.24
+1,756,40.64
+1,756,7.62
+1,756,7.62
+1,756,10.16
+1,756,46.355
+1,756,40.64
+1,756,27.94
+1,756,10.16
+1,756,44.45
+1,756,27.94
+1,757,24.13
+1,757,33.02
+1,757,55.88
+1,757,40.64
+1,757,40.64
+1,757,53.975
+1,757,27.94
+1,757,19.05
+1,757,50.8
+1,757,40.64
+1,757,33.02
+1,757,19.05
+1,757,7.62
+1,757,55.88
+1,757,7.62
+1,757,63.5
+1,757,33.02
+1,757,35.56
+1,757,35.56
+1,757,22.86
+1,757,40.64
+1,757,44.45
+1,757,40.64
+1,757,33.02
+1,757,7.62
+1,757,7.62
+1,757,33.02
+1,757,44.45
+1,757,27.94
+1,757,7.62
+1,758,45.72
+1,758,63.5
+1,758,99.06
+1,758,40.64
+1,758,53.975
+1,758,7.62
+1,758,15.24
+1,758,7.62
+1,758,33.02
+1,758,10.16
+1,758,35.56
+1,758,63.5
+1,758,24.13
+1,758,19.05
+1,758,50.8
+1,758,50.8
+1,758,10.16
+1,758,50.8
+1,758,44.45
+1,758,45.72
+1,758,35.56
+1,758,7.62
+1,758,35.56
+1,758,46.355
+1,758,10.16
+1,758,24.13
+1,758,33.02
+1,758,40.64
+1,758,22.86
+1,758,35.56
+1,759,33.02
+1,759,7.62
+1,759,35.56
+1,759,27.94
+1,759,22.86
+1,759,33.02
+1,759,55.88
+1,759,33.02
+1,759,46.355
+1,759,10.16
+1,759,63.5
+1,759,19.05
+1,759,33.02
+1,759,15.24
+1,759,7.62
+1,759,44.45
+1,759,53.975
+1,759,35.56
+1,759,27.94
+1,759,27.94
+1,759,45.72
+1,759,10.16
+1,759,24.13
+1,759,44.45
+1,759,15.24
+1,759,44.45
+1,759,46.355
+1,759,45.72
+1,759,53.975
+1,759,24.13
+1,760,35.56
+1,760,35.56
+1,760,24.13
+1,760,33.02
+1,760,33.02
+1,760,8.89
+1,760,7.62
+1,760,99.06
+1,760,19.05
+1,760,55.88
+1,760,22.86
+1,760,63.5
+1,760,46.355
+1,760,10.16
+1,760,44.45
+1,760,40.64
+1,760,46.355
+1,760,40.64
+1,760,50.8
+1,760,10.16
+1,760,40.64
+1,760,15.24
+1,760,63.5
+1,760,7.62
+1,760,44.45
+1,760,53.975
+1,760,7.62
+1,760,40.64
+1,760,7.62
+1,760,55.88
+1,761,81.28
+1,761,15.24
+1,761,55.88
+1,761,7.62
+1,761,63.5
+1,761,33.02
+1,761,45.72
+1,761,10.16
+1,761,27.94
+1,761,40.64
+1,761,15.24
+1,761,50.8
+1,761,46.355
+1,761,81.28
+1,761,7.62
+1,761,10.16
+1,761,7.62
+1,761,10.16
+1,761,15.24
+1,761,24.13
+1,761,35.56
+1,761,63.5
+1,761,10.16
+1,761,19.05
+1,761,7.62
+1,761,55.88
+1,761,33.02
+1,761,33.02
+1,761,35.56
+1,761,33.02
+1,762,7.62
+1,762,50.8
+1,762,63.5
+1,762,44.45
+1,762,7.62
+1,762,45.72
+1,762,7.62
+1,762,7.62
+1,762,33.02
+1,762,24.13
+1,762,50.8
+1,762,33.02
+1,762,15.24
+1,762,44.45
+1,762,55.88
+1,762,8.89
+1,762,55.88
+1,762,30.48
+1,762,30.48
+1,762,30.48
+1,762,63.5
+1,762,99.06
+1,762,45.72
+1,762,7.62
+1,762,10.16
+1,762,44.45
+1,762,45.72
+1,762,30.48
+1,762,33.02
+1,762,24.13
+1,763,15.24
+1,763,24.13
+1,763,24.13
+1,763,7.62
+1,763,7.62
+1,763,10.16
+1,763,63.5
+1,763,33.02
+1,763,19.05
+1,763,7.62
+1,763,55.88
+1,763,40.64
+1,763,22.86
+1,763,55.88
+1,763,33.02
+1,763,81.28
+1,763,8.89
+1,763,33.02
+1,763,35.56
+1,763,7.62
+1,763,35.56
+1,763,22.86
+1,763,46.355
+1,763,35.56
+1,763,53.975
+1,763,27.94
+1,763,7.62
+1,763,7.62
+1,763,40.64
+1,763,44.45
+1,764,8.89
+1,764,30.48
+1,764,35.56
+1,764,50.8
+1,764,7.62
+1,764,40.64
+1,764,40.64
+1,764,33.02
+1,764,7.62
+1,764,44.45
+1,764,7.62
+1,764,7.62
+1,764,55.88
+1,764,33.02
+1,764,33.02
+1,764,55.88
+1,764,55.88
+1,764,22.86
+1,764,46.355
+1,764,81.28
+1,764,33.02
+1,764,30.48
+1,764,24.13
+1,764,33.02
+1,764,7.62
+1,764,33.02
+1,764,45.72
+1,764,33.02
+1,764,30.48
+1,764,33.02
+1,765,15.24
+1,765,63.5
+1,765,7.62
+1,765,40.64
+1,765,45.72
+1,765,19.05
+1,765,7.62
+1,765,7.62
+1,765,10.16
+1,765,46.355
+1,765,33.02
+1,765,10.16
+1,765,33.02
+1,765,99.06
+1,765,35.56
+1,765,81.28
+1,765,7.62
+1,765,7.62
+1,765,7.62
+1,765,99.06
+1,765,24.13
+1,765,53.975
+1,765,7.62
+1,765,44.45
+1,765,7.62
+1,765,35.56
+1,765,63.5
+1,765,7.62
+1,765,44.45
+1,765,45.72
+1,766,10.16
+1,766,63.5
+1,766,35.56
+1,766,30.48
+1,766,7.62
+1,766,35.56
+1,766,99.06
+1,766,10.16
+1,766,99.06
+1,766,7.62
+1,766,81.28
+1,766,35.56
+1,766,7.62
+1,766,7.62
+1,766,27.94
+1,766,27.94
+1,766,7.62
+1,766,55.88
+1,766,7.62
+1,766,22.86
+1,766,99.06
+1,766,33.02
+1,766,7.62
+1,766,53.975
+1,766,22.86
+1,766,10.16
+1,766,99.06
+1,766,7.62
+1,766,33.02
+1,766,27.94
+1,767,40.64
+1,767,7.62
+1,767,53.975
+1,767,33.02
+1,767,7.62
+1,767,7.62
+1,767,33.02
+1,767,63.5
+1,767,10.16
+1,767,99.06
+1,767,46.355
+1,767,50.8
+1,767,7.62
+1,767,15.24
+1,767,46.355
+1,767,46.355
+1,767,33.02
+1,767,44.45
+1,767,27.94
+1,767,8.89
+1,767,10.16
+1,767,35.56
+1,767,19.05
+1,767,33.02
+1,767,7.62
+1,767,46.355
+1,767,44.45
+1,767,7.62
+1,767,50.8
+1,767,81.28
+1,768,24.13
+1,768,10.16
+1,768,46.355
+1,768,63.5
+1,768,63.5
+1,768,35.56
+1,768,15.24
+1,768,33.02
+1,768,35.56
+1,768,10.16
+1,768,40.64
+1,768,24.13
+1,768,99.06
+1,768,15.24
+1,768,53.975
+1,768,7.62
+1,768,40.64
+1,768,55.88
+1,768,81.28
+1,768,7.62
+1,768,7.62
+1,768,33.02
+1,768,15.24
+1,768,30.48
+1,768,7.62
+1,768,19.05
+1,768,27.94
+1,768,30.48
+1,768,7.62
+1,768,30.48
+1,769,7.62
+1,769,44.45
+1,769,19.05
+1,769,30.48
+1,769,24.13
+1,769,33.02
+1,769,22.86
+1,769,50.8
+1,769,7.62
+1,769,35.56
+1,769,33.02
+1,769,50.8
+1,769,40.64
+1,769,46.355
+1,769,35.56
+1,769,55.88
+1,769,35.56
+1,769,22.86
+1,769,7.62
+1,769,8.89
+1,769,46.355
+1,769,40.64
+1,769,99.06
+1,769,33.02
+1,769,27.94
+1,769,27.94
+1,769,7.62
+1,769,30.48
+1,769,46.355
+1,769,55.88
+1,770,99.06
+1,770,99.06
+1,770,35.56
+1,770,7.62
+1,770,55.88
+1,770,63.5
+1,770,81.28
+1,770,7.62
+1,770,46.355
+1,770,7.62
+1,770,7.62
+1,770,44.45
+1,770,35.56
+1,770,46.355
+1,770,27.94
+1,770,22.86
+1,770,35.56
+1,770,7.62
+1,770,8.89
+1,770,33.02
+1,770,10.16
+1,770,40.64
+1,770,50.8
+1,770,33.02
+1,770,44.45
+1,770,10.16
+1,770,81.28
+1,770,46.355
+1,770,46.355
+1,770,35.56
+1,771,63.5
+1,771,50.8
+1,771,8.89
+1,771,24.13
+1,771,35.56
+1,771,7.62
+1,771,81.28
+1,771,15.24
+1,771,35.56
+1,771,8.89
+1,771,35.56
+1,771,24.13
+1,771,8.89
+1,771,7.62
+1,771,24.13
+1,771,10.16
+1,771,7.62
+1,771,81.28
+1,771,99.06
+1,771,46.355
+1,771,22.86
+1,771,45.72
+1,771,46.355
+1,771,7.62
+1,771,30.48
+1,771,53.975
+1,771,7.62
+1,771,30.48
+1,771,81.28
+1,771,46.355
+1,772,22.86
+1,772,40.64
+1,772,99.06
+1,772,40.64
+1,772,33.02
+1,772,46.355
+1,772,99.06
+1,772,33.02
+1,772,10.16
+1,772,33.02
+1,772,8.89
+1,772,55.88
+1,772,7.62
+1,772,46.355
+1,772,15.24
+1,772,15.24
+1,772,10.16
+1,772,10.16
+1,772,33.02
+1,772,35.56
+1,772,46.355
+1,772,99.06
+1,772,40.64
+1,772,10.16
+1,772,40.64
+1,772,55.88
+1,772,35.56
+1,772,35.56
+1,772,24.13
+1,772,33.02
+1,773,50.8
+1,773,33.02
+1,773,33.02
+1,773,8.89
+1,773,15.24
+1,773,40.64
+1,773,24.13
+1,773,8.89
+1,773,45.72
+1,773,19.05
+1,773,7.62
+1,773,45.72
+1,773,33.02
+1,773,99.06
+1,773,40.64
+1,773,27.94
+1,773,35.56
+1,773,24.13
+1,773,15.24
+1,773,7.62
+1,773,22.86
+1,773,50.8
+1,773,50.8
+1,773,7.62
+1,773,63.5
+1,773,27.94
+1,773,35.56
+1,773,55.88
+1,773,33.02
+1,773,30.48
+1,774,81.28
+1,774,35.56
+1,774,55.88
+1,774,44.45
+1,774,53.975
+1,774,46.355
+1,774,7.62
+1,774,33.02
+1,774,55.88
+1,774,35.56
+1,774,7.62
+1,774,15.24
+1,774,15.24
+1,774,7.62
+1,774,19.05
+1,774,7.62
+1,774,22.86
+1,774,81.28
+1,774,35.56
+1,774,10.16
+1,774,81.28
+1,774,33.02
+1,774,7.62
+1,774,63.5
+1,774,63.5
+1,774,10.16
+1,774,10.16
+1,774,46.355
+1,774,27.94
+1,774,24.13
+1,775,44.45
+1,775,99.06
+1,775,30.48
+1,775,7.62
+1,775,10.16
+1,775,33.02
+1,775,24.13
+1,775,7.62
+1,775,7.62
+1,775,81.28
+1,775,30.48
+1,775,8.89
+1,775,8.89
+1,775,55.88
+1,775,81.28
+1,775,33.02
+1,775,33.02
+1,775,35.56
+1,775,99.06
+1,775,44.45
+1,775,35.56
+1,775,10.16
+1,775,8.89
+1,775,40.64
+1,775,45.72
+1,775,35.56
+1,775,15.24
+1,775,15.24
+1,775,24.13
+1,775,45.72
+1,776,8.89
+1,776,33.02
+1,776,55.88
+1,776,99.06
+1,776,46.355
+1,776,55.88
+1,776,35.56
+1,776,46.355
+1,776,33.02
+1,776,27.94
+1,776,15.24
+1,776,44.45
+1,776,7.62
+1,776,15.24
+1,776,7.62
+1,776,40.64
+1,776,33.02
+1,776,44.45
+1,776,15.24
+1,776,30.48
+1,776,7.62
+1,776,7.62
+1,776,81.28
+1,776,15.24
+1,776,53.975
+1,776,22.86
+1,776,33.02
+1,776,7.62
+1,776,40.64
+1,776,63.5
+1,777,99.06
+1,777,53.975
+1,777,33.02
+1,777,33.02
+1,777,22.86
+1,777,81.28
+1,777,24.13
+1,777,30.48
+1,777,7.62
+1,777,50.8
+1,777,33.02
+1,777,33.02
+1,777,7.62
+1,777,55.88
+1,777,46.355
+1,777,35.56
+1,777,22.86
+1,777,7.62
+1,777,10.16
+1,777,8.89
+1,777,50.8
+1,777,19.05
+1,777,7.62
+1,777,99.06
+1,777,33.02
+1,777,46.355
+1,777,24.13
+1,777,10.16
+1,777,44.45
+1,777,99.06
+1,778,24.13
+1,778,35.56
+1,778,7.62
+1,778,19.05
+1,778,7.62
+1,778,33.02
+1,778,7.62
+1,778,24.13
+1,778,35.56
+1,778,35.56
+1,778,15.24
+1,778,40.64
+1,778,35.56
+1,778,33.02
+1,778,30.48
+1,778,7.62
+1,778,35.56
+1,778,45.72
+1,778,40.64
+1,778,33.02
+1,778,81.28
+1,778,10.16
+1,778,35.56
+1,778,40.64
+1,778,55.88
+1,778,30.48
+1,778,81.28
+1,778,40.64
+1,778,7.62
+1,778,40.64
+1,779,10.16
+1,779,35.56
+1,779,44.45
+1,779,35.56
+1,779,7.62
+1,779,19.05
+1,779,7.62
+1,779,40.64
+1,779,19.05
+1,779,30.48
+1,779,44.45
+1,779,40.64
+1,779,63.5
+1,779,53.975
+1,779,7.62
+1,779,27.94
+1,779,53.975
+1,779,99.06
+1,779,30.48
+1,779,27.94
+1,779,55.88
+1,779,40.64
+1,779,44.45
+1,779,19.05
+1,779,24.13
+1,779,44.45
+1,779,15.24
+1,779,7.62
+1,779,40.64
+1,779,19.05
+1,780,40.64
+1,780,35.56
+1,780,44.45
+1,780,33.02
+1,780,45.72
+1,780,99.06
+1,780,33.02
+1,780,19.05
+1,780,40.64
+1,780,53.975
+1,780,35.56
+1,780,33.02
+1,780,55.88
+1,780,24.13
+1,780,7.62
+1,780,33.02
+1,780,22.86
+1,780,22.86
+1,780,46.355
+1,780,63.5
+1,780,33.02
+1,780,35.56
+1,780,19.05
+1,780,81.28
+1,780,33.02
+1,780,46.355
+1,780,53.975
+1,780,99.06
+1,780,33.02
+1,780,45.72
+1,781,7.62
+1,781,7.62
+1,781,19.05
+1,781,7.62
+1,781,99.06
+1,781,24.13
+1,781,33.02
+1,781,7.62
+1,781,40.64
+1,781,24.13
+1,781,35.56
+1,781,63.5
+1,781,10.16
+1,781,19.05
+1,781,35.56
+1,781,53.975
+1,781,46.355
+1,781,7.62
+1,781,27.94
+1,781,44.45
+1,781,33.02
+1,781,8.89
+1,781,22.86
+1,781,35.56
+1,781,27.94
+1,781,35.56
+1,781,40.64
+1,781,33.02
+1,781,7.62
+1,781,35.56
+1,782,24.13
+1,782,35.56
+1,782,40.64
+1,782,7.62
+1,782,53.975
+1,782,35.56
+1,782,50.8
+1,782,45.72
+1,782,27.94
+1,782,50.8
+1,782,33.02
+1,782,24.13
+1,782,7.62
+1,782,19.05
+1,782,10.16
+1,782,33.02
+1,782,40.64
+1,782,10.16
+1,782,30.48
+1,782,7.62
+1,782,15.24
+1,782,46.355
+1,782,44.45
+1,782,45.72
+1,782,7.62
+1,782,46.355
+1,782,40.64
+1,782,7.62
+1,782,7.62
+1,782,46.355
+1,783,27.94
+1,783,35.56
+1,783,27.94
+1,783,7.62
+1,783,33.02
+1,783,53.975
+1,783,22.86
+1,783,40.64
+1,783,22.86
+1,783,19.05
+1,783,7.62
+1,783,10.16
+1,783,10.16
+1,783,24.13
+1,783,7.62
+1,783,7.62
+1,783,7.62
+1,783,50.8
+1,783,33.02
+1,783,19.05
+1,783,46.355
+1,783,7.62
+1,783,33.02
+1,783,40.64
+1,783,45.72
+1,783,7.62
+1,783,7.62
+1,783,7.62
+1,783,63.5
+1,783,55.88
+1,784,33.02
+1,784,33.02
+1,784,35.56
+1,784,35.56
+1,784,10.16
+1,784,7.62
+1,784,10.16
+1,784,40.64
+1,784,45.72
+1,784,55.88
+1,784,19.05
+1,784,7.62
+1,784,35.56
+1,784,33.02
+1,784,45.72
+1,784,99.06
+1,784,24.13
+1,784,7.62
+1,784,63.5
+1,784,22.86
+1,784,50.8
+1,784,33.02
+1,784,24.13
+1,784,45.72
+1,784,8.89
+1,784,81.28
+1,784,99.06
+1,784,7.62
+1,784,8.89
+1,784,33.02
+1,785,35.56
+1,785,50.8
+1,785,7.62
+1,785,7.62
+1,785,27.94
+1,785,7.62
+1,785,7.62
+1,785,35.56
+1,785,7.62
+1,785,24.13
+1,785,8.89
+1,785,19.05
+1,785,30.48
+1,785,27.94
+1,785,8.89
+1,785,19.05
+1,785,10.16
+1,785,7.62
+1,785,15.24
+1,785,8.89
+1,785,33.02
+1,785,15.24
+1,785,99.06
+1,785,7.62
+1,785,63.5
+1,785,33.02
+1,785,7.62
+1,785,33.02
+1,785,7.62
+1,785,40.64
+1,786,33.02
+1,786,63.5
+1,786,46.355
+1,786,45.72
+1,786,40.64
+1,786,33.02
+1,786,30.48
+1,786,7.62
+1,786,27.94
+1,786,7.62
+1,786,10.16
+1,786,50.8
+1,786,53.975
+1,786,33.02
+1,786,44.45
+1,786,7.62
+1,786,53.975
+1,786,7.62
+1,786,50.8
+1,786,55.88
+1,786,30.48
+1,786,10.16
+1,786,40.64
+1,786,45.72
+1,786,15.24
+1,786,7.62
+1,786,22.86
+1,786,22.86
+1,786,40.64
+1,786,7.62
+1,787,7.62
+1,787,7.62
+1,787,7.62
+1,787,7.62
+1,787,24.13
+1,787,46.355
+1,787,15.24
+1,787,7.62
+1,787,27.94
+1,787,40.64
+1,787,7.62
+1,787,99.06
+1,787,8.89
+1,787,45.72
+1,787,99.06
+1,787,15.24
+1,787,40.64
+1,787,19.05
+1,787,44.45
+1,787,46.355
+1,787,46.355
+1,787,40.64
+1,787,7.62
+1,787,46.355
+1,787,33.02
+1,787,46.355
+1,787,7.62
+1,787,10.16
+1,787,35.56
+1,787,15.24
+1,788,22.86
+1,788,7.62
+1,788,55.88
+1,788,35.56
+1,788,10.16
+1,788,7.62
+1,788,81.28
+1,788,8.89
+1,788,35.56
+1,788,7.62
+1,788,99.06
+1,788,33.02
+1,788,7.62
+1,788,7.62
+1,788,35.56
+1,788,81.28
+1,788,35.56
+1,788,15.24
+1,788,35.56
+1,788,35.56
+1,788,10.16
+1,788,7.62
+1,788,50.8
+1,788,81.28
+1,788,7.62
+1,788,81.28
+1,788,35.56
+1,788,19.05
+1,788,53.975
+1,788,24.13
+1,789,10.16
+1,789,40.64
+1,789,24.13
+1,789,33.02
+1,789,35.56
+1,789,22.86
+1,789,46.355
+1,789,33.02
+1,789,10.16
+1,789,7.62
+1,789,40.64
+1,789,53.975
+1,789,55.88
+1,789,7.62
+1,789,15.24
+1,789,35.56
+1,789,10.16
+1,789,81.28
+1,789,53.975
+1,789,40.64
+1,789,50.8
+1,789,7.62
+1,789,35.56
+1,789,40.64
+1,789,53.975
+1,789,46.355
+1,789,19.05
+1,789,33.02
+1,789,10.16
+1,789,7.62
+1,790,53.975
+1,790,45.72
+1,790,46.355
+1,790,35.56
+1,790,10.16
+1,790,7.62
+1,790,35.56
+1,790,33.02
+1,790,50.8
+1,790,33.02
+1,790,53.975
+1,790,46.355
+1,790,35.56
+1,790,53.975
+1,790,33.02
+1,790,63.5
+1,790,45.72
+1,790,22.86
+1,790,7.62
+1,790,22.86
+1,790,7.62
+1,790,27.94
+1,790,30.48
+1,790,27.94
+1,790,7.62
+1,790,53.975
+1,790,35.56
+1,790,45.72
+1,790,46.355
+1,790,24.13
+1,791,33.02
+1,791,7.62
+1,791,63.5
+1,791,30.48
+1,791,63.5
+1,791,40.64
+1,791,46.355
+1,791,7.62
+1,791,19.05
+1,791,33.02
+1,791,45.72
+1,791,40.64
+1,791,81.28
+1,791,24.13
+1,791,35.56
+1,791,55.88
+1,791,8.89
+1,791,99.06
+1,791,27.94
+1,791,53.975
+1,791,7.62
+1,791,35.56
+1,791,10.16
+1,791,8.89
+1,791,8.89
+1,791,35.56
+1,791,24.13
+1,791,10.16
+1,791,8.89
+1,791,35.56
+1,792,10.16
+1,792,45.72
+1,792,40.64
+1,792,44.45
+1,792,35.56
+1,792,40.64
+1,792,33.02
+1,792,7.62
+1,792,46.355
+1,792,30.48
+1,792,40.64
+1,792,44.45
+1,792,99.06
+1,792,10.16
+1,792,8.89
+1,792,10.16
+1,792,24.13
+1,792,46.355
+1,792,40.64
+1,792,33.02
+1,792,7.62
+1,792,55.88
+1,792,99.06
+1,792,63.5
+1,792,35.56
+1,792,10.16
+1,792,33.02
+1,792,27.94
+1,792,7.62
+1,792,44.45
+1,793,44.45
+1,793,50.8
+1,793,27.94
+1,793,40.64
+1,793,55.88
+1,793,46.355
+1,793,46.355
+1,793,7.62
+1,793,10.16
+1,793,99.06
+1,793,45.72
+1,793,8.89
+1,793,19.05
+1,793,53.975
+1,793,7.62
+1,793,10.16
+1,793,46.355
+1,793,7.62
+1,793,22.86
+1,793,44.45
+1,793,35.56
+1,793,35.56
+1,793,35.56
+1,793,40.64
+1,793,10.16
+1,793,8.89
+1,793,27.94
+1,793,35.56
+1,793,10.16
+1,793,35.56
+1,794,33.02
+1,794,15.24
+1,794,27.94
+1,794,44.45
+1,794,8.89
+1,794,50.8
+1,794,15.24
+1,794,27.94
+1,794,15.24
+1,794,8.89
+1,794,53.975
+1,794,99.06
+1,794,99.06
+1,794,55.88
+1,794,10.16
+1,794,27.94
+1,794,22.86
+1,794,63.5
+1,794,63.5
+1,794,8.89
+1,794,45.72
+1,794,35.56
+1,794,33.02
+1,794,15.24
+1,794,7.62
+1,794,50.8
+1,794,22.86
+1,794,24.13
+1,794,33.02
+1,794,7.62
+1,795,30.48
+1,795,35.56
+1,795,33.02
+1,795,40.64
+1,795,7.62
+1,795,45.72
+1,795,81.28
+1,795,22.86
+1,795,99.06
+1,795,30.48
+1,795,10.16
+1,795,27.94
+1,795,81.28
+1,795,22.86
+1,795,63.5
+1,795,33.02
+1,795,53.975
+1,795,7.62
+1,795,45.72
+1,795,44.45
+1,795,27.94
+1,795,8.89
+1,795,33.02
+1,795,35.56
+1,795,15.24
+1,795,99.06
+1,795,50.8
+1,795,15.24
+1,795,99.06
+1,795,35.56
+1,796,44.45
+1,796,8.89
+1,796,35.56
+1,796,50.8
+1,796,7.62
+1,796,44.45
+1,796,7.62
+1,796,33.02
+1,796,35.56
+1,796,8.89
+1,796,40.64
+1,796,10.16
+1,796,33.02
+1,796,7.62
+1,796,81.28
+1,796,7.62
+1,796,7.62
+1,796,7.62
+1,796,27.94
+1,796,35.56
+1,796,99.06
+1,796,7.62
+1,796,33.02
+1,796,30.48
+1,796,40.64
+1,796,81.28
+1,796,33.02
+1,796,30.48
+1,796,35.56
+1,796,24.13
+1,797,99.06
+1,797,7.62
+1,797,99.06
+1,797,33.02
+1,797,33.02
+1,797,45.72
+1,797,27.94
+1,797,33.02
+1,797,19.05
+1,797,35.56
+1,797,35.56
+1,797,81.28
+1,797,55.88
+1,797,15.24
+1,797,81.28
+1,797,10.16
+1,797,19.05
+1,797,99.06
+1,797,44.45
+1,797,50.8
+1,797,33.02
+1,797,22.86
+1,797,40.64
+1,797,35.56
+1,797,33.02
+1,797,45.72
+1,797,22.86
+1,797,63.5
+1,797,8.89
+1,797,10.16
+1,798,7.62
+1,798,53.975
+1,798,7.62
+1,798,40.64
+1,798,15.24
+1,798,55.88
+1,798,46.355
+1,798,35.56
+1,798,40.64
+1,798,45.72
+1,798,35.56
+1,798,7.62
+1,798,19.05
+1,798,50.8
+1,798,99.06
+1,798,63.5
+1,798,24.13
+1,798,7.62
+1,798,46.355
+1,798,50.8
+1,798,99.06
+1,798,7.62
+1,798,33.02
+1,798,35.56
+1,798,45.72
+1,798,10.16
+1,798,30.48
+1,798,27.94
+1,798,63.5
+1,798,27.94
+1,799,81.28
+1,799,35.56
+1,799,7.62
+1,799,81.28
+1,799,10.16
+1,799,50.8
+1,799,81.28
+1,799,63.5
+1,799,40.64
+1,799,30.48
+1,799,53.975
+1,799,33.02
+1,799,7.62
+1,799,7.62
+1,799,30.48
+1,799,7.62
+1,799,8.89
+1,799,55.88
+1,799,53.975
+1,799,40.64
+1,799,27.94
+1,799,99.06
+1,799,30.48
+1,799,40.64
+1,799,10.16
+1,799,99.06
+1,799,50.8
+1,799,35.56
+1,799,33.02
+1,799,35.56
+1,800,50.8
+1,800,33.02
+1,800,30.48
+1,800,99.06
+1,800,35.56
+1,800,33.02
+1,800,81.28
+1,800,45.72
+1,800,19.05
+1,800,27.94
+1,800,27.94
+1,800,27.94
+1,800,46.355
+1,800,7.62
+1,800,33.02
+1,800,7.62
+1,800,10.16
+1,800,63.5
+1,800,33.02
+1,800,30.48
+1,800,33.02
+1,800,55.88
+1,800,8.89
+1,800,19.05
+1,800,22.86
+1,800,55.88
+1,800,45.72
+1,800,35.56
+1,800,33.02
+1,800,7.62
+1,801,22.86
+1,801,22.86
+1,801,50.8
+1,801,7.62
+1,801,33.02
+1,801,33.02
+1,801,53.975
+1,801,63.5
+1,801,22.86
+1,801,35.56
+1,801,81.28
+1,801,44.45
+1,801,19.05
+1,801,35.56
+1,801,40.64
+1,801,53.975
+1,801,53.975
+1,801,22.86
+1,801,53.975
+1,801,24.13
+1,801,99.06
+1,801,46.355
+1,801,7.62
+1,801,53.975
+1,801,33.02
+1,801,40.64
+1,801,50.8
+1,801,44.45
+1,801,33.02
+1,801,99.06
+1,802,7.62
+1,802,33.02
+1,802,33.02
+1,802,81.28
+1,802,40.64
+1,802,7.62
+1,802,40.64
+1,802,22.86
+1,802,10.16
+1,802,63.5
+1,802,33.02
+1,802,30.48
+1,802,30.48
+1,802,24.13
+1,802,8.89
+1,802,35.56
+1,802,15.24
+1,802,99.06
+1,802,33.02
+1,802,81.28
+1,802,7.62
+1,802,46.355
+1,802,22.86
+1,802,35.56
+1,802,27.94
+1,802,53.975
+1,802,33.02
+1,802,35.56
+1,802,15.24
+1,802,7.62
+1,803,99.06
+1,803,45.72
+1,803,55.88
+1,803,81.28
+1,803,27.94
+1,803,8.89
+1,803,50.8
+1,803,22.86
+1,803,46.355
+1,803,81.28
+1,803,7.62
+1,803,33.02
+1,803,7.62
+1,803,55.88
+1,803,10.16
+1,803,30.48
+1,803,81.28
+1,803,33.02
+1,803,7.62
+1,803,15.24
+1,803,81.28
+1,803,35.56
+1,803,24.13
+1,803,7.62
+1,803,33.02
+1,803,40.64
+1,803,99.06
+1,803,22.86
+1,803,40.64
+1,803,53.975
+1,804,46.355
+1,804,7.62
+1,804,24.13
+1,804,33.02
+1,804,55.88
+1,804,22.86
+1,804,33.02
+1,804,33.02
+1,804,10.16
+1,804,7.62
+1,804,33.02
+1,804,81.28
+1,804,7.62
+1,804,40.64
+1,804,10.16
+1,804,15.24
+1,804,81.28
+1,804,33.02
+1,804,33.02
+1,804,7.62
+1,804,7.62
+1,804,46.355
+1,804,50.8
+1,804,50.8
+1,804,27.94
+1,804,46.355
+1,804,22.86
+1,804,30.48
+1,804,10.16
+1,804,15.24
+1,805,30.48
+1,805,40.64
+1,805,10.16
+1,805,15.24
+1,805,35.56
+1,805,7.62
+1,805,45.72
+1,805,35.56
+1,805,44.45
+1,805,33.02
+1,805,10.16
+1,805,45.72
+1,805,53.975
+1,805,53.975
+1,805,24.13
+1,805,50.8
+1,805,33.02
+1,805,55.88
+1,805,30.48
+1,805,7.62
+1,805,53.975
+1,805,81.28
+1,805,33.02
+1,805,53.975
+1,805,63.5
+1,805,15.24
+1,805,19.05
+1,805,44.45
+1,805,8.89
+1,805,22.86
+1,806,53.975
+1,806,7.62
+1,806,7.62
+1,806,7.62
+1,806,7.62
+1,806,53.975
+1,806,7.62
+1,806,53.975
+1,806,7.62
+1,806,15.24
+1,806,10.16
+1,806,7.62
+1,806,33.02
+1,806,50.8
+1,806,40.64
+1,806,10.16
+1,806,27.94
+1,806,33.02
+1,806,44.45
+1,806,35.56
+1,806,7.62
+1,806,35.56
+1,806,44.45
+1,806,53.975
+1,806,7.62
+1,806,53.975
+1,806,7.62
+1,806,10.16
+1,806,7.62
+1,806,44.45
+1,807,7.62
+1,807,35.56
+1,807,35.56
+1,807,7.62
+1,807,63.5
+1,807,7.62
+1,807,15.24
+1,807,27.94
+1,807,7.62
+1,807,40.64
+1,807,7.62
+1,807,99.06
+1,807,33.02
+1,807,63.5
+1,807,33.02
+1,807,15.24
+1,807,46.355
+1,807,40.64
+1,807,15.24
+1,807,7.62
+1,807,10.16
+1,807,50.8
+1,807,7.62
+1,807,7.62
+1,807,55.88
+1,807,27.94
+1,807,8.89
+1,807,33.02
+1,807,35.56
+1,807,7.62
+1,808,7.62
+1,808,45.72
+1,808,35.56
+1,808,81.28
+1,808,7.62
+1,808,33.02
+1,808,7.62
+1,808,33.02
+1,808,63.5
+1,808,40.64
+1,808,40.64
+1,808,55.88
+1,808,99.06
+1,808,63.5
+1,808,81.28
+1,808,8.89
+1,808,63.5
+1,808,22.86
+1,808,30.48
+1,808,40.64
+1,808,40.64
+1,808,10.16
+1,808,40.64
+1,808,35.56
+1,808,10.16
+1,808,22.86
+1,808,19.05
+1,808,81.28
+1,808,33.02
+1,808,24.13
+1,809,45.72
+1,809,40.64
+1,809,22.86
+1,809,10.16
+1,809,99.06
+1,809,50.8
+1,809,27.94
+1,809,8.89
+1,809,33.02
+1,809,22.86
+1,809,7.62
+1,809,53.975
+1,809,7.62
+1,809,33.02
+1,809,30.48
+1,809,63.5
+1,809,35.56
+1,809,44.45
+1,809,40.64
+1,809,7.62
+1,809,33.02
+1,809,81.28
+1,809,7.62
+1,809,99.06
+1,809,35.56
+1,809,7.62
+1,809,7.62
+1,809,40.64
+1,809,33.02
+1,809,55.88
+1,810,10.16
+1,810,55.88
+1,810,10.16
+1,810,7.62
+1,810,35.56
+1,810,33.02
+1,810,46.355
+1,810,10.16
+1,810,55.88
+1,810,7.62
+1,810,53.975
+1,810,46.355
+1,810,53.975
+1,810,50.8
+1,810,45.72
+1,810,55.88
+1,810,55.88
+1,810,63.5
+1,810,7.62
+1,810,15.24
+1,810,55.88
+1,810,63.5
+1,810,53.975
+1,810,33.02
+1,810,10.16
+1,810,7.62
+1,810,10.16
+1,810,35.56
+1,810,81.28
+1,810,35.56
+1,811,35.56
+1,811,53.975
+1,811,7.62
+1,811,33.02
+1,811,7.62
+1,811,10.16
+1,811,63.5
+1,811,7.62
+1,811,7.62
+1,811,15.24
+1,811,33.02
+1,811,53.975
+1,811,19.05
+1,811,22.86
+1,811,40.64
+1,811,40.64
+1,811,50.8
+1,811,7.62
+1,811,53.975
+1,811,7.62
+1,811,53.975
+1,811,7.62
+1,811,15.24
+1,811,33.02
+1,811,55.88
+1,811,35.56
+1,811,99.06
+1,811,7.62
+1,811,24.13
+1,811,30.48
+1,812,10.16
+1,812,7.62
+1,812,7.62
+1,812,81.28
+1,812,46.355
+1,812,10.16
+1,812,15.24
+1,812,81.28
+1,812,10.16
+1,812,30.48
+1,812,24.13
+1,812,40.64
+1,812,7.62
+1,812,7.62
+1,812,63.5
+1,812,7.62
+1,812,30.48
+1,812,24.13
+1,812,44.45
+1,812,63.5
+1,812,35.56
+1,812,35.56
+1,812,7.62
+1,812,7.62
+1,812,30.48
+1,812,44.45
+1,812,7.62
+1,812,8.89
+1,812,35.56
+1,812,40.64
+1,813,63.5
+1,813,7.62
+1,813,33.02
+1,813,7.62
+1,813,24.13
+1,813,8.89
+1,813,53.975
+1,813,19.05
+1,813,24.13
+1,813,10.16
+1,813,50.8
+1,813,63.5
+1,813,8.89
+1,813,22.86
+1,813,50.8
+1,813,7.62
+1,813,55.88
+1,813,30.48
+1,813,46.355
+1,813,55.88
+1,813,24.13
+1,813,81.28
+1,813,63.5
+1,813,46.355
+1,813,40.64
+1,813,46.355
+1,813,8.89
+1,813,19.05
+1,813,7.62
+1,813,40.64
+1,814,33.02
+1,814,50.8
+1,814,63.5
+1,814,10.16
+1,814,7.62
+1,814,7.62
+1,814,35.56
+1,814,63.5
+1,814,19.05
+1,814,10.16
+1,814,53.975
+1,814,55.88
+1,814,45.72
+1,814,7.62
+1,814,15.24
+1,814,46.355
+1,814,33.02
+1,814,7.62
+1,814,30.48
+1,814,7.62
+1,814,33.02
+1,814,24.13
+1,814,24.13
+1,814,35.56
+1,814,35.56
+1,814,15.24
+1,814,10.16
+1,814,33.02
+1,814,27.94
+1,814,35.56
+1,815,40.64
+1,815,55.88
+1,815,33.02
+1,815,33.02
+1,815,33.02
+1,815,33.02
+1,815,35.56
+1,815,40.64
+1,815,99.06
+1,815,40.64
+1,815,7.62
+1,815,35.56
+1,815,81.28
+1,815,44.45
+1,815,63.5
+1,815,81.28
+1,815,15.24
+1,815,10.16
+1,815,40.64
+1,815,33.02
+1,815,33.02
+1,815,15.24
+1,815,33.02
+1,815,8.89
+1,815,8.89
+1,815,44.45
+1,815,10.16
+1,815,40.64
+1,815,33.02
+1,815,33.02
+1,816,7.62
+1,816,19.05
+1,816,10.16
+1,816,50.8
+1,816,40.64
+1,816,7.62
+1,816,35.56
+1,816,53.975
+1,816,8.89
+1,816,33.02
+1,816,33.02
+1,816,45.72
+1,816,40.64
+1,816,27.94
+1,816,10.16
+1,816,19.05
+1,816,50.8
+1,816,7.62
+1,816,7.62
+1,816,35.56
+1,816,35.56
+1,816,10.16
+1,816,7.62
+1,816,45.72
+1,816,40.64
+1,816,7.62
+1,816,22.86
+1,816,7.62
+1,816,35.56
+1,816,27.94
+1,817,22.86
+1,817,35.56
+1,817,81.28
+1,817,27.94
+1,817,45.72
+1,817,7.62
+1,817,40.64
+1,817,15.24
+1,817,15.24
+1,817,63.5
+1,817,46.355
+1,817,53.975
+1,817,63.5
+1,817,24.13
+1,817,44.45
+1,817,35.56
+1,817,7.62
+1,817,35.56
+1,817,53.975
+1,817,35.56
+1,817,22.86
+1,817,40.64
+1,817,45.72
+1,817,8.89
+1,817,24.13
+1,817,44.45
+1,817,8.89
+1,817,7.62
+1,817,7.62
+1,817,7.62
+1,818,35.56
+1,818,33.02
+1,818,63.5
+1,818,50.8
+1,818,40.64
+1,818,19.05
+1,818,10.16
+1,818,10.16
+1,818,33.02
+1,818,55.88
+1,818,7.62
+1,818,53.975
+1,818,10.16
+1,818,15.24
+1,818,15.24
+1,818,40.64
+1,818,44.45
+1,818,33.02
+1,818,27.94
+1,818,55.88
+1,818,15.24
+1,818,8.89
+1,818,33.02
+1,818,7.62
+1,818,8.89
+1,818,33.02
+1,818,35.56
+1,818,33.02
+1,818,35.56
+1,818,33.02
+1,819,33.02
+1,819,50.8
+1,819,44.45
+1,819,22.86
+1,819,22.86
+1,819,10.16
+1,819,81.28
+1,819,7.62
+1,819,30.48
+1,819,7.62
+1,819,55.88
+1,819,10.16
+1,819,53.975
+1,819,40.64
+1,819,7.62
+1,819,35.56
+1,819,7.62
+1,819,33.02
+1,819,63.5
+1,819,33.02
+1,819,7.62
+1,819,10.16
+1,819,45.72
+1,819,53.975
+1,819,15.24
+1,819,8.89
+1,819,99.06
+1,819,33.02
+1,819,40.64
+1,819,50.8
+1,820,30.48
+1,820,7.62
+1,820,40.64
+1,820,33.02
+1,820,33.02
+1,820,10.16
+1,820,10.16
+1,820,35.56
+1,820,55.88
+1,820,8.89
+1,820,45.72
+1,820,81.28
+1,820,10.16
+1,820,63.5
+1,820,30.48
+1,820,7.62
+1,820,7.62
+1,820,7.62
+1,820,35.56
+1,820,7.62
+1,820,8.89
+1,820,19.05
+1,820,35.56
+1,820,7.62
+1,820,81.28
+1,820,22.86
+1,820,7.62
+1,820,30.48
+1,820,99.06
+1,820,55.88
+1,821,7.62
+1,821,7.62
+1,821,10.16
+1,821,15.24
+1,821,33.02
+1,821,19.05
+1,821,45.72
+1,821,15.24
+1,821,99.06
+1,821,30.48
+1,821,27.94
+1,821,46.355
+1,821,7.62
+1,821,8.89
+1,821,44.45
+1,821,22.86
+1,821,27.94
+1,821,33.02
+1,821,15.24
+1,821,19.05
+1,821,19.05
+1,821,7.62
+1,821,10.16
+1,821,24.13
+1,821,15.24
+1,821,10.16
+1,821,33.02
+1,821,7.62
+1,821,7.62
+1,821,10.16
+1,822,10.16
+1,822,10.16
+1,822,33.02
+1,822,22.86
+1,822,40.64
+1,822,10.16
+1,822,40.64
+1,822,33.02
+1,822,55.88
+1,822,7.62
+1,822,27.94
+1,822,44.45
+1,822,10.16
+1,822,99.06
+1,822,50.8
+1,822,44.45
+1,822,53.975
+1,822,7.62
+1,822,24.13
+1,822,30.48
+1,822,35.56
+1,822,33.02
+1,822,40.64
+1,822,19.05
+1,822,81.28
+1,822,15.24
+1,822,35.56
+1,822,44.45
+1,822,30.48
+1,822,30.48
+1,823,7.62
+1,823,63.5
+1,823,55.88
+1,823,7.62
+1,823,8.89
+1,823,50.8
+1,823,15.24
+1,823,27.94
+1,823,22.86
+1,823,24.13
+1,823,50.8
+1,823,35.56
+1,823,33.02
+1,823,40.64
+1,823,45.72
+1,823,19.05
+1,823,40.64
+1,823,81.28
+1,823,30.48
+1,823,81.28
+1,823,30.48
+1,823,44.45
+1,823,19.05
+1,823,63.5
+1,823,33.02
+1,823,7.62
+1,823,22.86
+1,823,33.02
+1,823,35.56
+1,823,35.56
+1,824,27.94
+1,824,19.05
+1,824,24.13
+1,824,53.975
+1,824,15.24
+1,824,24.13
+1,824,45.72
+1,824,50.8
+1,824,40.64
+1,824,7.62
+1,824,33.02
+1,824,55.88
+1,824,53.975
+1,824,30.48
+1,824,63.5
+1,824,55.88
+1,824,40.64
+1,824,10.16
+1,824,24.13
+1,824,33.02
+1,824,33.02
+1,824,7.62
+1,824,45.72
+1,824,15.24
+1,824,55.88
+1,824,35.56
+1,824,30.48
+1,824,7.62
+1,824,7.62
+1,824,44.45
+1,825,7.62
+1,825,35.56
+1,825,45.72
+1,825,33.02
+1,825,40.64
+1,825,40.64
+1,825,35.56
+1,825,99.06
+1,825,7.62
+1,825,30.48
+1,825,63.5
+1,825,30.48
+1,825,45.72
+1,825,33.02
+1,825,7.62
+1,825,27.94
+1,825,22.86
+1,825,46.355
+1,825,44.45
+1,825,44.45
+1,825,81.28
+1,825,7.62
+1,825,22.86
+1,825,8.89
+1,825,45.72
+1,825,10.16
+1,825,99.06
+1,825,10.16
+1,825,44.45
+1,825,63.5
+1,826,15.24
+1,826,7.62
+1,826,24.13
+1,826,7.62
+1,826,45.72
+1,826,99.06
+1,826,40.64
+1,826,33.02
+1,826,10.16
+1,826,44.45
+1,826,10.16
+1,826,40.64
+1,826,33.02
+1,826,22.86
+1,826,46.355
+1,826,33.02
+1,826,63.5
+1,826,15.24
+1,826,35.56
+1,826,22.86
+1,826,7.62
+1,826,33.02
+1,826,33.02
+1,826,35.56
+1,826,50.8
+1,826,15.24
+1,826,33.02
+1,826,99.06
+1,826,35.56
+1,826,81.28
+1,827,7.62
+1,827,40.64
+1,827,7.62
+1,827,50.8
+1,827,7.62
+1,827,7.62
+1,827,7.62
+1,827,44.45
+1,827,35.56
+1,827,22.86
+1,827,24.13
+1,827,7.62
+1,827,63.5
+1,827,15.24
+1,827,30.48
+1,827,7.62
+1,827,19.05
+1,827,7.62
+1,827,7.62
+1,827,81.28
+1,827,35.56
+1,827,24.13
+1,827,19.05
+1,827,33.02
+1,827,7.62
+1,827,53.975
+1,827,7.62
+1,827,10.16
+1,827,7.62
+1,827,55.88
+1,828,7.62
+1,828,33.02
+1,828,46.355
+1,828,19.05
+1,828,15.24
+1,828,55.88
+1,828,10.16
+1,828,55.88
+1,828,55.88
+1,828,24.13
+1,828,99.06
+1,828,33.02
+1,828,10.16
+1,828,10.16
+1,828,45.72
+1,828,30.48
+1,828,35.56
+1,828,10.16
+1,828,50.8
+1,828,8.89
+1,828,10.16
+1,828,33.02
+1,828,15.24
+1,828,7.62
+1,828,45.72
+1,828,8.89
+1,828,7.62
+1,828,22.86
+1,828,7.62
+1,828,35.56
+1,829,30.48
+1,829,10.16
+1,829,30.48
+1,829,50.8
+1,829,46.355
+1,829,15.24
+1,829,15.24
+1,829,45.72
+1,829,55.88
+1,829,50.8
+1,829,44.45
+1,829,81.28
+1,829,30.48
+1,829,7.62
+1,829,7.62
+1,829,50.8
+1,829,55.88
+1,829,27.94
+1,829,7.62
+1,829,7.62
+1,829,45.72
+1,829,7.62
+1,829,7.62
+1,829,40.64
+1,829,46.355
+1,829,53.975
+1,829,7.62
+1,829,40.64
+1,829,30.48
+1,829,24.13
+1,830,7.62
+1,830,35.56
+1,830,27.94
+1,830,81.28
+1,830,10.16
+1,830,7.62
+1,830,46.355
+1,830,40.64
+1,830,50.8
+1,830,7.62
+1,830,53.975
+1,830,35.56
+1,830,44.45
+1,830,63.5
+1,830,45.72
+1,830,19.05
+1,830,46.355
+1,830,81.28
+1,830,33.02
+1,830,7.62
+1,830,35.56
+1,830,7.62
+1,830,30.48
+1,830,7.62
+1,830,15.24
+1,830,53.975
+1,830,33.02
+1,830,33.02
+1,830,15.24
+1,830,40.64
+1,831,40.64
+1,831,46.355
+1,831,53.975
+1,831,7.62
+1,831,53.975
+1,831,53.975
+1,831,7.62
+1,831,45.72
+1,831,7.62
+1,831,35.56
+1,831,7.62
+1,831,46.355
+1,831,15.24
+1,831,7.62
+1,831,27.94
+1,831,35.56
+1,831,7.62
+1,831,63.5
+1,831,35.56
+1,831,45.72
+1,831,7.62
+1,831,55.88
+1,831,44.45
+1,831,55.88
+1,831,35.56
+1,831,35.56
+1,831,35.56
+1,831,7.62
+1,831,63.5
+1,831,33.02
+1,832,15.24
+1,832,45.72
+1,832,33.02
+1,832,63.5
+1,832,40.64
+1,832,35.56
+1,832,10.16
+1,832,50.8
+1,832,99.06
+1,832,55.88
+1,832,7.62
+1,832,7.62
+1,832,81.28
+1,832,33.02
+1,832,45.72
+1,832,35.56
+1,832,81.28
+1,832,33.02
+1,832,10.16
+1,832,35.56
+1,832,45.72
+1,832,10.16
+1,832,99.06
+1,832,24.13
+1,832,53.975
+1,832,35.56
+1,832,7.62
+1,832,40.64
+1,832,46.355
+1,832,7.62
+1,833,40.64
+1,833,40.64
+1,833,33.02
+1,833,46.355
+1,833,40.64
+1,833,30.48
+1,833,81.28
+1,833,15.24
+1,833,33.02
+1,833,10.16
+1,833,45.72
+1,833,35.56
+1,833,53.975
+1,833,7.62
+1,833,7.62
+1,833,33.02
+1,833,99.06
+1,833,7.62
+1,833,45.72
+1,833,7.62
+1,833,40.64
+1,833,27.94
+1,833,10.16
+1,833,27.94
+1,833,22.86
+1,833,35.56
+1,833,7.62
+1,833,22.86
+1,833,27.94
+1,833,27.94
+1,834,35.56
+1,834,15.24
+1,834,7.62
+1,834,46.355
+1,834,40.64
+1,834,40.64
+1,834,81.28
+1,834,10.16
+1,834,22.86
+1,834,24.13
+1,834,15.24
+1,834,27.94
+1,834,30.48
+1,834,33.02
+1,834,7.62
+1,834,35.56
+1,834,7.62
+1,834,8.89
+1,834,35.56
+1,834,40.64
+1,834,35.56
+1,834,45.72
+1,834,7.62
+1,834,63.5
+1,834,8.89
+1,834,27.94
+1,834,53.975
+1,834,35.56
+1,834,7.62
+1,834,63.5
+1,835,24.13
+1,835,40.64
+1,835,15.24
+1,835,7.62
+1,835,7.62
+1,835,63.5
+1,835,10.16
+1,835,7.62
+1,835,7.62
+1,835,30.48
+1,835,7.62
+1,835,99.06
+1,835,7.62
+1,835,53.975
+1,835,30.48
+1,835,33.02
+1,835,7.62
+1,835,33.02
+1,835,33.02
+1,835,7.62
+1,835,45.72
+1,835,40.64
+1,835,33.02
+1,835,40.64
+1,835,40.64
+1,835,44.45
+1,835,40.64
+1,835,7.62
+1,835,7.62
+1,835,8.89
+1,836,33.02
+1,836,30.48
+1,836,22.86
+1,836,22.86
+1,836,40.64
+1,836,40.64
+1,836,33.02
+1,836,24.13
+1,836,53.975
+1,836,10.16
+1,836,53.975
+1,836,7.62
+1,836,40.64
+1,836,44.45
+1,836,7.62
+1,836,30.48
+1,836,22.86
+1,836,40.64
+1,836,50.8
+1,836,53.975
+1,836,46.355
+1,836,40.64
+1,836,24.13
+1,836,10.16
+1,836,99.06
+1,836,33.02
+1,836,7.62
+1,836,15.24
+1,836,35.56
+1,836,55.88
+1,837,99.06
+1,837,53.975
+1,837,27.94
+1,837,81.28
+1,837,7.62
+1,837,53.975
+1,837,15.24
+1,837,8.89
+1,837,55.88
+1,837,40.64
+1,837,33.02
+1,837,33.02
+1,837,7.62
+1,837,10.16
+1,837,33.02
+1,837,33.02
+1,837,63.5
+1,837,40.64
+1,837,50.8
+1,837,45.72
+1,837,10.16
+1,837,33.02
+1,837,7.62
+1,837,10.16
+1,837,44.45
+1,837,10.16
+1,837,63.5
+1,837,46.355
+1,837,46.355
+1,837,63.5
+1,838,33.02
+1,838,40.64
+1,838,7.62
+1,838,46.355
+1,838,24.13
+1,838,33.02
+1,838,33.02
+1,838,22.86
+1,838,10.16
+1,838,53.975
+1,838,7.62
+1,838,55.88
+1,838,35.56
+1,838,10.16
+1,838,55.88
+1,838,63.5
+1,838,27.94
+1,838,40.64
+1,838,44.45
+1,838,24.13
+1,838,10.16
+1,838,33.02
+1,838,35.56
+1,838,7.62
+1,838,33.02
+1,838,35.56
+1,838,10.16
+1,838,7.62
+1,838,7.62
+1,838,33.02
+1,839,45.72
+1,839,40.64
+1,839,19.05
+1,839,81.28
+1,839,22.86
+1,839,63.5
+1,839,19.05
+1,839,33.02
+1,839,46.355
+1,839,50.8
+1,839,7.62
+1,839,63.5
+1,839,33.02
+1,839,55.88
+1,839,24.13
+1,839,22.86
+1,839,8.89
+1,839,35.56
+1,839,46.355
+1,839,30.48
+1,839,55.88
+1,839,55.88
+1,839,33.02
+1,839,15.24
+1,839,33.02
+1,839,22.86
+1,839,35.56
+1,839,7.62
+1,839,8.89
+1,839,7.62
+1,840,30.48
+1,840,19.05
+1,840,7.62
+1,840,10.16
+1,840,7.62
+1,840,10.16
+1,840,33.02
+1,840,22.86
+1,840,50.8
+1,840,33.02
+1,840,99.06
+1,840,10.16
+1,840,44.45
+1,840,33.02
+1,840,46.355
+1,840,55.88
+1,840,7.62
+1,840,40.64
+1,840,15.24
+1,840,7.62
+1,840,35.56
+1,840,7.62
+1,840,46.355
+1,840,22.86
+1,840,7.62
+1,840,8.89
+1,840,99.06
+1,840,10.16
+1,840,27.94
+1,840,24.13
+1,841,55.88
+1,841,46.355
+1,841,50.8
+1,841,81.28
+1,841,63.5
+1,841,8.89
+1,841,7.62
+1,841,35.56
+1,841,40.64
+1,841,7.62
+1,841,44.45
+1,841,81.28
+1,841,8.89
+1,841,55.88
+1,841,10.16
+1,841,19.05
+1,841,7.62
+1,841,44.45
+1,841,33.02
+1,841,24.13
+1,841,10.16
+1,841,8.89
+1,841,35.56
+1,841,27.94
+1,841,7.62
+1,841,27.94
+1,841,81.28
+1,841,35.56
+1,841,7.62
+1,841,10.16
+1,842,63.5
+1,842,7.62
+1,842,30.48
+1,842,30.48
+1,842,40.64
+1,842,35.56
+1,842,33.02
+1,842,10.16
+1,842,33.02
+1,842,45.72
+1,842,22.86
+1,842,35.56
+1,842,99.06
+1,842,33.02
+1,842,24.13
+1,842,8.89
+1,842,7.62
+1,842,63.5
+1,842,7.62
+1,842,35.56
+1,842,8.89
+1,842,7.62
+1,842,30.48
+1,842,30.48
+1,842,8.89
+1,842,8.89
+1,842,22.86
+1,842,44.45
+1,842,35.56
+1,842,35.56
+1,843,33.02
+1,843,44.45
+1,843,7.62
+1,843,55.88
+1,843,53.975
+1,843,8.89
+1,843,33.02
+1,843,7.62
+1,843,24.13
+1,843,33.02
+1,843,40.64
+1,843,7.62
+1,843,7.62
+1,843,33.02
+1,843,15.24
+1,843,7.62
+1,843,35.56
+1,843,53.975
+1,843,40.64
+1,843,8.89
+1,843,33.02
+1,843,24.13
+1,843,46.355
+1,843,7.62
+1,843,8.89
+1,843,7.62
+1,843,19.05
+1,843,53.975
+1,843,7.62
+1,843,46.355
+1,844,33.02
+1,844,81.28
+1,844,7.62
+1,844,53.975
+1,844,33.02
+1,844,22.86
+1,844,40.64
+1,844,24.13
+1,844,35.56
+1,844,44.45
+1,844,40.64
+1,844,7.62
+1,844,40.64
+1,844,50.8
+1,844,7.62
+1,844,46.355
+1,844,35.56
+1,844,7.62
+1,844,7.62
+1,844,55.88
+1,844,27.94
+1,844,8.89
+1,844,7.62
+1,844,50.8
+1,844,7.62
+1,844,50.8
+1,844,55.88
+1,844,30.48
+1,844,99.06
+1,844,44.45
+1,845,7.62
+1,845,33.02
+1,845,7.62
+1,845,50.8
+1,845,15.24
+1,845,53.975
+1,845,35.56
+1,845,15.24
+1,845,24.13
+1,845,33.02
+1,845,46.355
+1,845,24.13
+1,845,40.64
+1,845,50.8
+1,845,35.56
+1,845,8.89
+1,845,22.86
+1,845,45.72
+1,845,40.64
+1,845,40.64
+1,845,63.5
+1,845,53.975
+1,845,50.8
+1,845,44.45
+1,845,19.05
+1,845,19.05
+1,845,46.355
+1,845,27.94
+1,845,33.02
+1,845,99.06
+1,846,27.94
+1,846,7.62
+1,846,19.05
+1,846,99.06
+1,846,63.5
+1,846,50.8
+1,846,45.72
+1,846,7.62
+1,846,44.45
+1,846,50.8
+1,846,7.62
+1,846,7.62
+1,846,50.8
+1,846,7.62
+1,846,10.16
+1,846,7.62
+1,846,33.02
+1,846,7.62
+1,846,30.48
+1,846,33.02
+1,846,35.56
+1,846,63.5
+1,846,7.62
+1,846,7.62
+1,846,99.06
+1,846,7.62
+1,846,35.56
+1,846,10.16
+1,846,40.64
+1,846,53.975
+1,847,53.975
+1,847,7.62
+1,847,63.5
+1,847,45.72
+1,847,19.05
+1,847,27.94
+1,847,22.86
+1,847,7.62
+1,847,7.62
+1,847,46.355
+1,847,19.05
+1,847,50.8
+1,847,81.28
+1,847,40.64
+1,847,30.48
+1,847,7.62
+1,847,40.64
+1,847,24.13
+1,847,33.02
+1,847,22.86
+1,847,10.16
+1,847,46.355
+1,847,10.16
+1,847,35.56
+1,847,53.975
+1,847,46.355
+1,847,55.88
+1,847,44.45
+1,847,33.02
+1,847,24.13
+1,848,7.62
+1,848,33.02
+1,848,7.62
+1,848,45.72
+1,848,7.62
+1,848,19.05
+1,848,33.02
+1,848,35.56
+1,848,35.56
+1,848,7.62
+1,848,19.05
+1,848,35.56
+1,848,40.64
+1,848,35.56
+1,848,7.62
+1,848,55.88
+1,848,7.62
+1,848,10.16
+1,848,45.72
+1,848,10.16
+1,848,99.06
+1,848,45.72
+1,848,7.62
+1,848,40.64
+1,848,7.62
+1,848,50.8
+1,848,24.13
+1,848,45.72
+1,848,55.88
+1,848,55.88
+1,849,99.06
+1,849,40.64
+1,849,22.86
+1,849,7.62
+1,849,7.62
+1,849,7.62
+1,849,30.48
+1,849,46.355
+1,849,7.62
+1,849,44.45
+1,849,10.16
+1,849,81.28
+1,849,40.64
+1,849,45.72
+1,849,15.24
+1,849,44.45
+1,849,55.88
+1,849,50.8
+1,849,81.28
+1,849,33.02
+1,849,22.86
+1,849,7.62
+1,849,81.28
+1,849,7.62
+1,849,35.56
+1,849,53.975
+1,849,40.64
+1,849,30.48
+1,849,7.62
+1,849,44.45
+1,850,33.02
+1,850,30.48
+1,850,7.62
+1,850,53.975
+1,850,81.28
+1,850,99.06
+1,850,81.28
+1,850,10.16
+1,850,10.16
+1,850,46.355
+1,850,10.16
+1,850,44.45
+1,850,15.24
+1,850,33.02
+1,850,24.13
+1,850,63.5
+1,850,45.72
+1,850,53.975
+1,850,40.64
+1,850,19.05
+1,850,24.13
+1,850,33.02
+1,850,24.13
+1,850,33.02
+1,850,55.88
+1,850,44.45
+1,850,55.88
+1,850,99.06
+1,850,63.5
+1,850,10.16
+1,851,46.355
+1,851,35.56
+1,851,33.02
+1,851,44.45
+1,851,35.56
+1,851,45.72
+1,851,53.975
+1,851,7.62
+1,851,53.975
+1,851,15.24
+1,851,81.28
+1,851,33.02
+1,851,8.89
+1,851,50.8
+1,851,27.94
+1,851,55.88
+1,851,50.8
+1,851,22.86
+1,851,24.13
+1,851,46.355
+1,851,22.86
+1,851,30.48
+1,851,50.8
+1,851,15.24
+1,851,50.8
+1,851,7.62
+1,851,7.62
+1,851,40.64
+1,851,24.13
+1,851,35.56
+1,852,8.89
+1,852,33.02
+1,852,35.56
+1,852,33.02
+1,852,53.975
+1,852,7.62
+1,852,30.48
+1,852,81.28
+1,852,33.02
+1,852,7.62
+1,852,35.56
+1,852,19.05
+1,852,50.8
+1,852,53.975
+1,852,81.28
+1,852,10.16
+1,852,22.86
+1,852,10.16
+1,852,7.62
+1,852,7.62
+1,852,53.975
+1,852,35.56
+1,852,10.16
+1,852,50.8
+1,852,7.62
+1,852,53.975
+1,852,46.355
+1,852,30.48
+1,852,7.62
+1,852,27.94
+1,853,10.16
+1,853,81.28
+1,853,7.62
+1,853,81.28
+1,853,81.28
+1,853,81.28
+1,853,99.06
+1,853,35.56
+1,853,8.89
+1,853,10.16
+1,853,44.45
+1,853,10.16
+1,853,33.02
+1,853,8.89
+1,853,40.64
+1,853,63.5
+1,853,40.64
+1,853,30.48
+1,853,7.62
+1,853,15.24
+1,853,7.62
+1,853,22.86
+1,853,63.5
+1,853,35.56
+1,853,33.02
+1,853,53.975
+1,853,19.05
+1,853,24.13
+1,853,55.88
+1,853,46.355
+1,854,24.13
+1,854,53.975
+1,854,99.06
+1,854,7.62
+1,854,15.24
+1,854,53.975
+1,854,10.16
+1,854,40.64
+1,854,15.24
+1,854,45.72
+1,854,33.02
+1,854,53.975
+1,854,45.72
+1,854,55.88
+1,854,53.975
+1,854,50.8
+1,854,46.355
+1,854,22.86
+1,854,44.45
+1,854,50.8
+1,854,55.88
+1,854,44.45
+1,854,55.88
+1,854,7.62
+1,854,27.94
+1,854,55.88
+1,854,35.56
+1,854,7.62
+1,854,99.06
+1,854,33.02
+1,855,99.06
+1,855,15.24
+1,855,35.56
+1,855,10.16
+1,855,46.355
+1,855,45.72
+1,855,27.94
+1,855,55.88
+1,855,33.02
+1,855,40.64
+1,855,53.975
+1,855,27.94
+1,855,30.48
+1,855,55.88
+1,855,10.16
+1,855,27.94
+1,855,35.56
+1,855,7.62
+1,855,19.05
+1,855,19.05
+1,855,22.86
+1,855,27.94
+1,855,33.02
+1,855,46.355
+1,855,53.975
+1,855,7.62
+1,855,33.02
+1,855,35.56
+1,855,46.355
+1,855,99.06
+1,856,10.16
+1,856,10.16
+1,856,81.28
+1,856,35.56
+1,856,44.45
+1,856,10.16
+1,856,55.88
+1,856,35.56
+1,856,33.02
+1,856,44.45
+1,856,45.72
+1,856,55.88
+1,856,35.56
+1,856,99.06
+1,856,22.86
+1,856,40.64
+1,856,53.975
+1,856,45.72
+1,856,50.8
+1,856,7.62
+1,856,19.05
+1,856,10.16
+1,856,53.975
+1,856,30.48
+1,856,27.94
+1,856,8.89
+1,856,7.62
+1,856,99.06
+1,856,19.05
+1,856,7.62
+1,857,55.88
+1,857,40.64
+1,857,24.13
+1,857,7.62
+1,857,8.89
+1,857,7.62
+1,857,24.13
+1,857,33.02
+1,857,7.62
+1,857,33.02
+1,857,19.05
+1,857,81.28
+1,857,33.02
+1,857,24.13
+1,857,10.16
+1,857,40.64
+1,857,53.975
+1,857,10.16
+1,857,99.06
+1,857,35.56
+1,857,35.56
+1,857,55.88
+1,857,33.02
+1,857,63.5
+1,857,35.56
+1,857,53.975
+1,857,53.975
+1,857,45.72
+1,857,27.94
+1,857,8.89
+1,858,7.62
+1,858,35.56
+1,858,24.13
+1,858,15.24
+1,858,15.24
+1,858,10.16
+1,858,8.89
+1,858,46.355
+1,858,15.24
+1,858,22.86
+1,858,35.56
+1,858,22.86
+1,858,63.5
+1,858,35.56
+1,858,33.02
+1,858,40.64
+1,858,33.02
+1,858,35.56
+1,858,99.06
+1,858,55.88
+1,858,33.02
+1,858,55.88
+1,858,22.86
+1,858,40.64
+1,858,53.975
+1,858,55.88
+1,858,7.62
+1,858,46.355
+1,858,45.72
+1,858,40.64
+1,859,81.28
+1,859,10.16
+1,859,50.8
+1,859,10.16
+1,859,35.56
+1,859,7.62
+1,859,7.62
+1,859,33.02
+1,859,63.5
+1,859,33.02
+1,859,53.975
+1,859,46.355
+1,859,44.45
+1,859,45.72
+1,859,33.02
+1,859,45.72
+1,859,33.02
+1,859,7.62
+1,859,35.56
+1,859,7.62
+1,859,7.62
+1,859,81.28
+1,859,10.16
+1,859,63.5
+1,859,27.94
+1,859,8.89
+1,859,8.89
+1,859,19.05
+1,859,33.02
+1,859,10.16
+1,860,15.24
+1,860,33.02
+1,860,63.5
+1,860,19.05
+1,860,7.62
+1,860,50.8
+1,860,55.88
+1,860,22.86
+1,860,40.64
+1,860,7.62
+1,860,81.28
+1,860,81.28
+1,860,55.88
+1,860,50.8
+1,860,63.5
+1,860,63.5
+1,860,35.56
+1,860,35.56
+1,860,35.56
+1,860,40.64
+1,860,53.975
+1,860,22.86
+1,860,22.86
+1,860,22.86
+1,860,8.89
+1,860,81.28
+1,860,40.64
+1,860,7.62
+1,860,81.28
+1,860,7.62
+1,861,35.56
+1,861,7.62
+1,861,7.62
+1,861,8.89
+1,861,10.16
+1,861,35.56
+1,861,50.8
+1,861,33.02
+1,861,19.05
+1,861,50.8
+1,861,99.06
+1,861,10.16
+1,861,46.355
+1,861,8.89
+1,861,45.72
+1,861,45.72
+1,861,40.64
+1,861,8.89
+1,861,7.62
+1,861,99.06
+1,861,35.56
+1,861,30.48
+1,861,46.355
+1,861,33.02
+1,861,24.13
+1,861,35.56
+1,861,55.88
+1,861,8.89
+1,861,7.62
+1,861,7.62
+1,862,7.62
+1,862,53.975
+1,862,7.62
+1,862,40.64
+1,862,7.62
+1,862,30.48
+1,862,7.62
+1,862,35.56
+1,862,55.88
+1,862,35.56
+1,862,35.56
+1,862,22.86
+1,862,33.02
+1,862,35.56
+1,862,30.48
+1,862,7.62
+1,862,53.975
+1,862,22.86
+1,862,50.8
+1,862,99.06
+1,862,35.56
+1,862,50.8
+1,862,7.62
+1,862,22.86
+1,862,50.8
+1,862,24.13
+1,862,40.64
+1,862,7.62
+1,862,99.06
+1,862,81.28
+1,863,44.45
+1,863,53.975
+1,863,7.62
+1,863,7.62
+1,863,15.24
+1,863,33.02
+1,863,7.62
+1,863,7.62
+1,863,30.48
+1,863,55.88
+1,863,24.13
+1,863,33.02
+1,863,33.02
+1,863,22.86
+1,863,33.02
+1,863,40.64
+1,863,33.02
+1,863,7.62
+1,863,27.94
+1,863,35.56
+1,863,44.45
+1,863,99.06
+1,863,35.56
+1,863,35.56
+1,863,24.13
+1,863,24.13
+1,863,35.56
+1,863,53.975
+1,863,40.64
+1,863,7.62
+1,864,7.62
+1,864,40.64
+1,864,7.62
+1,864,22.86
+1,864,63.5
+1,864,10.16
+1,864,99.06
+1,864,55.88
+1,864,7.62
+1,864,30.48
+1,864,33.02
+1,864,22.86
+1,864,63.5
+1,864,15.24
+1,864,7.62
+1,864,44.45
+1,864,7.62
+1,864,22.86
+1,864,10.16
+1,864,40.64
+1,864,27.94
+1,864,44.45
+1,864,33.02
+1,864,10.16
+1,864,10.16
+1,864,50.8
+1,864,50.8
+1,864,99.06
+1,864,45.72
+1,864,55.88
+1,865,46.355
+1,865,10.16
+1,865,44.45
+1,865,19.05
+1,865,55.88
+1,865,40.64
+1,865,35.56
+1,865,46.355
+1,865,35.56
+1,865,7.62
+1,865,7.62
+1,865,81.28
+1,865,27.94
+1,865,7.62
+1,865,44.45
+1,865,10.16
+1,865,15.24
+1,865,99.06
+1,865,33.02
+1,865,10.16
+1,865,10.16
+1,865,63.5
+1,865,7.62
+1,865,7.62
+1,865,7.62
+1,865,8.89
+1,865,81.28
+1,865,10.16
+1,865,27.94
+1,865,19.05
+1,866,8.89
+1,866,53.975
+1,866,50.8
+1,866,46.355
+1,866,15.24
+1,866,7.62
+1,866,7.62
+1,866,10.16
+1,866,27.94
+1,866,44.45
+1,866,40.64
+1,866,19.05
+1,866,10.16
+1,866,7.62
+1,866,30.48
+1,866,7.62
+1,866,7.62
+1,866,33.02
+1,866,44.45
+1,866,8.89
+1,866,81.28
+1,866,35.56
+1,866,53.975
+1,866,27.94
+1,866,35.56
+1,866,46.355
+1,866,27.94
+1,866,7.62
+1,866,33.02
+1,866,99.06
+1,867,7.62
+1,867,7.62
+1,867,81.28
+1,867,40.64
+1,867,40.64
+1,867,10.16
+1,867,15.24
+1,867,40.64
+1,867,7.62
+1,867,30.48
+1,867,15.24
+1,867,33.02
+1,867,7.62
+1,867,15.24
+1,867,53.975
+1,867,99.06
+1,867,63.5
+1,867,63.5
+1,867,35.56
+1,867,44.45
+1,867,35.56
+1,867,63.5
+1,867,19.05
+1,867,7.62
+1,867,10.16
+1,867,33.02
+1,867,7.62
+1,867,15.24
+1,867,27.94
+1,867,53.975
+1,868,7.62
+1,868,44.45
+1,868,33.02
+1,868,15.24
+1,868,7.62
+1,868,7.62
+1,868,63.5
+1,868,15.24
+1,868,81.28
+1,868,7.62
+1,868,10.16
+1,868,22.86
+1,868,81.28
+1,868,35.56
+1,868,7.62
+1,868,99.06
+1,868,99.06
+1,868,24.13
+1,868,7.62
+1,868,10.16
+1,868,40.64
+1,868,45.72
+1,868,53.975
+1,868,22.86
+1,868,46.355
+1,868,7.62
+1,868,99.06
+1,868,7.62
+1,868,44.45
+1,868,30.48
+1,869,24.13
+1,869,40.64
+1,869,46.355
+1,869,46.355
+1,869,30.48
+1,869,33.02
+1,869,7.62
+1,869,33.02
+1,869,7.62
+1,869,15.24
+1,869,40.64
+1,869,7.62
+1,869,40.64
+1,869,27.94
+1,869,33.02
+1,869,8.89
+1,869,35.56
+1,869,46.355
+1,869,35.56
+1,869,40.64
+1,869,8.89
+1,869,46.355
+1,869,22.86
+1,869,40.64
+1,869,35.56
+1,869,15.24
+1,869,7.62
+1,869,19.05
+1,869,22.86
+1,869,7.62
+1,870,27.94
+1,870,35.56
+1,870,81.28
+1,870,7.62
+1,870,35.56
+1,870,15.24
+1,870,7.62
+1,870,8.89
+1,870,50.8
+1,870,27.94
+1,870,7.62
+1,870,50.8
+1,870,81.28
+1,870,10.16
+1,870,50.8
+1,870,35.56
+1,870,7.62
+1,870,7.62
+1,870,44.45
+1,870,27.94
+1,870,35.56
+1,870,19.05
+1,870,81.28
+1,870,19.05
+1,870,44.45
+1,870,30.48
+1,870,30.48
+1,870,45.72
+1,870,7.62
+1,870,33.02
+1,871,7.62
+1,871,55.88
+1,871,45.72
+1,871,19.05
+1,871,8.89
+1,871,15.24
+1,871,45.72
+1,871,40.64
+1,871,7.62
+1,871,10.16
+1,871,7.62
+1,871,33.02
+1,871,33.02
+1,871,10.16
+1,871,33.02
+1,871,40.64
+1,871,33.02
+1,871,53.975
+1,871,7.62
+1,871,30.48
+1,871,8.89
+1,871,99.06
+1,871,50.8
+1,871,50.8
+1,871,33.02
+1,871,7.62
+1,871,10.16
+1,871,10.16
+1,871,33.02
+1,871,7.62
+1,872,22.86
+1,872,44.45
+1,872,33.02
+1,872,45.72
+1,872,40.64
+1,872,50.8
+1,872,10.16
+1,872,19.05
+1,872,33.02
+1,872,7.62
+1,872,22.86
+1,872,50.8
+1,872,27.94
+1,872,10.16
+1,872,63.5
+1,872,7.62
+1,872,46.355
+1,872,35.56
+1,872,27.94
+1,872,99.06
+1,872,7.62
+1,872,55.88
+1,872,45.72
+1,872,15.24
+1,872,30.48
+1,872,19.05
+1,872,10.16
+1,872,24.13
+1,872,10.16
+1,872,30.48
+1,873,24.13
+1,873,40.64
+1,873,7.62
+1,873,30.48
+1,873,33.02
+1,873,33.02
+1,873,46.355
+1,873,53.975
+1,873,53.975
+1,873,44.45
+1,873,7.62
+1,873,50.8
+1,873,40.64
+1,873,63.5
+1,873,53.975
+1,873,53.975
+1,873,99.06
+1,873,7.62
+1,873,53.975
+1,873,44.45
+1,873,35.56
+1,873,7.62
+1,873,33.02
+1,873,33.02
+1,873,40.64
+1,873,7.62
+1,873,46.355
+1,873,63.5
+1,873,63.5
+1,873,45.72
+1,874,10.16
+1,874,7.62
+1,874,35.56
+1,874,99.06
+1,874,7.62
+1,874,33.02
+1,874,33.02
+1,874,22.86
+1,874,33.02
+1,874,10.16
+1,874,24.13
+1,874,44.45
+1,874,19.05
+1,874,7.62
+1,874,19.05
+1,874,8.89
+1,874,40.64
+1,874,35.56
+1,874,7.62
+1,874,55.88
+1,874,24.13
+1,874,50.8
+1,874,19.05
+1,874,63.5
+1,874,45.72
+1,874,7.62
+1,874,7.62
+1,874,7.62
+1,874,22.86
+1,874,7.62
+1,875,44.45
+1,875,50.8
+1,875,27.94
+1,875,44.45
+1,875,30.48
+1,875,33.02
+1,875,22.86
+1,875,53.975
+1,875,22.86
+1,875,33.02
+1,875,46.355
+1,875,7.62
+1,875,7.62
+1,875,22.86
+1,875,7.62
+1,875,81.28
+1,875,44.45
+1,875,19.05
+1,875,7.62
+1,875,24.13
+1,875,7.62
+1,875,35.56
+1,875,53.975
+1,875,35.56
+1,875,50.8
+1,875,35.56
+1,875,27.94
+1,875,40.64
+1,875,7.62
+1,875,27.94
+1,876,27.94
+1,876,24.13
+1,876,7.62
+1,876,19.05
+1,876,81.28
+1,876,46.355
+1,876,55.88
+1,876,27.94
+1,876,27.94
+1,876,63.5
+1,876,46.355
+1,876,35.56
+1,876,81.28
+1,876,27.94
+1,876,30.48
+1,876,44.45
+1,876,27.94
+1,876,15.24
+1,876,33.02
+1,876,99.06
+1,876,27.94
+1,876,63.5
+1,876,19.05
+1,876,35.56
+1,876,55.88
+1,876,19.05
+1,876,35.56
+1,876,7.62
+1,876,55.88
+1,876,35.56
+1,877,24.13
+1,877,40.64
+1,877,30.48
+1,877,33.02
+1,877,40.64
+1,877,27.94
+1,877,33.02
+1,877,33.02
+1,877,8.89
+1,877,35.56
+1,877,7.62
+1,877,7.62
+1,877,10.16
+1,877,33.02
+1,877,45.72
+1,877,15.24
+1,877,35.56
+1,877,19.05
+1,877,53.975
+1,877,8.89
+1,877,40.64
+1,877,45.72
+1,877,30.48
+1,877,10.16
+1,877,40.64
+1,877,33.02
+1,877,33.02
+1,877,46.355
+1,877,40.64
+1,877,33.02
+1,878,44.45
+1,878,15.24
+1,878,27.94
+1,878,81.28
+1,878,44.45
+1,878,45.72
+1,878,55.88
+1,878,35.56
+1,878,53.975
+1,878,44.45
+1,878,45.72
+1,878,7.62
+1,878,46.355
+1,878,15.24
+1,878,10.16
+1,878,50.8
+1,878,81.28
+1,878,81.28
+1,878,46.355
+1,878,55.88
+1,878,99.06
+1,878,19.05
+1,878,8.89
+1,878,10.16
+1,878,30.48
+1,878,7.62
+1,878,19.05
+1,878,44.45
+1,878,7.62
+1,878,33.02
+1,879,24.13
+1,879,10.16
+1,879,46.355
+1,879,27.94
+1,879,7.62
+1,879,44.45
+1,879,45.72
+1,879,45.72
+1,879,15.24
+1,879,30.48
+1,879,35.56
+1,879,81.28
+1,879,35.56
+1,879,44.45
+1,879,22.86
+1,879,7.62
+1,879,40.64
+1,879,40.64
+1,879,7.62
+1,879,81.28
+1,879,55.88
+1,879,15.24
+1,879,33.02
+1,879,50.8
+1,879,33.02
+1,879,45.72
+1,879,10.16
+1,879,81.28
+1,879,46.355
+1,879,63.5
+1,880,40.64
+1,880,53.975
+1,880,8.89
+1,880,7.62
+1,880,40.64
+1,880,7.62
+1,880,27.94
+1,880,8.89
+1,880,33.02
+1,880,40.64
+1,880,35.56
+1,880,44.45
+1,880,19.05
+1,880,44.45
+1,880,15.24
+1,880,8.89
+1,880,50.8
+1,880,33.02
+1,880,33.02
+1,880,33.02
+1,880,81.28
+1,880,99.06
+1,880,33.02
+1,880,7.62
+1,880,40.64
+1,880,10.16
+1,880,7.62
+1,880,33.02
+1,880,10.16
+1,880,33.02
+1,881,22.86
+1,881,8.89
+1,881,10.16
+1,881,50.8
+1,881,35.56
+1,881,81.28
+1,881,33.02
+1,881,10.16
+1,881,55.88
+1,881,19.05
+1,881,10.16
+1,881,33.02
+1,881,35.56
+1,881,33.02
+1,881,10.16
+1,881,45.72
+1,881,10.16
+1,881,15.24
+1,881,8.89
+1,881,8.89
+1,881,10.16
+1,881,33.02
+1,881,46.355
+1,881,33.02
+1,881,15.24
+1,881,46.355
+1,881,40.64
+1,881,33.02
+1,881,35.56
+1,881,7.62
+1,882,46.355
+1,882,44.45
+1,882,27.94
+1,882,15.24
+1,882,40.64
+1,882,22.86
+1,882,46.355
+1,882,22.86
+1,882,45.72
+1,882,7.62
+1,882,7.62
+1,882,81.28
+1,882,27.94
+1,882,50.8
+1,882,33.02
+1,882,40.64
+1,882,40.64
+1,882,27.94
+1,882,22.86
+1,882,40.64
+1,882,44.45
+1,882,7.62
+1,882,7.62
+1,882,8.89
+1,882,40.64
+1,882,53.975
+1,882,33.02
+1,882,33.02
+1,882,33.02
+1,882,33.02
+1,883,63.5
+1,883,40.64
+1,883,40.64
+1,883,24.13
+1,883,7.62
+1,883,81.28
+1,883,33.02
+1,883,19.05
+1,883,7.62
+1,883,7.62
+1,883,35.56
+1,883,24.13
+1,883,45.72
+1,883,33.02
+1,883,45.72
+1,883,24.13
+1,883,22.86
+1,883,33.02
+1,883,63.5
+1,883,53.975
+1,883,53.975
+1,883,8.89
+1,883,33.02
+1,883,55.88
+1,883,8.89
+1,883,7.62
+1,883,7.62
+1,883,33.02
+1,883,15.24
+1,883,63.5
+1,884,53.975
+1,884,7.62
+1,884,33.02
+1,884,10.16
+1,884,24.13
+1,884,33.02
+1,884,33.02
+1,884,81.28
+1,884,15.24
+1,884,53.975
+1,884,7.62
+1,884,40.64
+1,884,33.02
+1,884,44.45
+1,884,7.62
+1,884,53.975
+1,884,8.89
+1,884,10.16
+1,884,22.86
+1,884,40.64
+1,884,8.89
+1,884,55.88
+1,884,40.64
+1,884,7.62
+1,884,33.02
+1,884,81.28
+1,884,8.89
+1,884,10.16
+1,884,63.5
+1,884,8.89
+1,885,35.56
+1,885,8.89
+1,885,7.62
+1,885,10.16
+1,885,35.56
+1,885,40.64
+1,885,35.56
+1,885,10.16
+1,885,45.72
+1,885,40.64
+1,885,33.02
+1,885,35.56
+1,885,50.8
+1,885,46.355
+1,885,33.02
+1,885,7.62
+1,885,24.13
+1,885,22.86
+1,885,46.355
+1,885,53.975
+1,885,81.28
+1,885,15.24
+1,885,46.355
+1,885,63.5
+1,885,10.16
+1,885,7.62
+1,885,50.8
+1,885,24.13
+1,885,15.24
+1,885,45.72
+1,886,99.06
+1,886,44.45
+1,886,40.64
+1,886,40.64
+1,886,30.48
+1,886,10.16
+1,886,40.64
+1,886,7.62
+1,886,27.94
+1,886,81.28
+1,886,35.56
+1,886,53.975
+1,886,50.8
+1,886,46.355
+1,886,10.16
+1,886,33.02
+1,886,35.56
+1,886,27.94
+1,886,7.62
+1,886,7.62
+1,886,33.02
+1,886,27.94
+1,886,22.86
+1,886,8.89
+1,886,19.05
+1,886,33.02
+1,886,7.62
+1,886,7.62
+1,886,7.62
+1,886,35.56
+1,887,45.72
+1,887,7.62
+1,887,45.72
+1,887,55.88
+1,887,22.86
+1,887,10.16
+1,887,7.62
+1,887,10.16
+1,887,55.88
+1,887,45.72
+1,887,40.64
+1,887,7.62
+1,887,24.13
+1,887,55.88
+1,887,40.64
+1,887,7.62
+1,887,33.02
+1,887,7.62
+1,887,40.64
+1,887,19.05
+1,887,40.64
+1,887,63.5
+1,887,81.28
+1,887,33.02
+1,887,30.48
+1,887,30.48
+1,887,10.16
+1,887,35.56
+1,887,7.62
+1,887,8.89
+1,888,35.56
+1,888,10.16
+1,888,35.56
+1,888,40.64
+1,888,7.62
+1,888,45.72
+1,888,99.06
+1,888,35.56
+1,888,44.45
+1,888,7.62
+1,888,81.28
+1,888,7.62
+1,888,45.72
+1,888,30.48
+1,888,22.86
+1,888,50.8
+1,888,10.16
+1,888,99.06
+1,888,7.62
+1,888,33.02
+1,888,19.05
+1,888,81.28
+1,888,33.02
+1,888,24.13
+1,888,44.45
+1,888,50.8
+1,888,15.24
+1,888,35.56
+1,888,46.355
+1,888,8.89
+1,889,8.89
+1,889,19.05
+1,889,35.56
+1,889,7.62
+1,889,27.94
+1,889,27.94
+1,889,40.64
+1,889,46.355
+1,889,33.02
+1,889,22.86
+1,889,24.13
+1,889,33.02
+1,889,7.62
+1,889,10.16
+1,889,63.5
+1,889,63.5
+1,889,30.48
+1,889,27.94
+1,889,35.56
+1,889,10.16
+1,889,35.56
+1,889,35.56
+1,889,50.8
+1,889,35.56
+1,889,19.05
+1,889,44.45
+1,889,19.05
+1,889,53.975
+1,889,27.94
+1,889,35.56
+1,890,19.05
+1,890,33.02
+1,890,22.86
+1,890,10.16
+1,890,7.62
+1,890,7.62
+1,890,81.28
+1,890,24.13
+1,890,22.86
+1,890,44.45
+1,890,40.64
+1,890,7.62
+1,890,46.355
+1,890,27.94
+1,890,7.62
+1,890,46.355
+1,890,15.24
+1,890,46.355
+1,890,7.62
+1,890,33.02
+1,890,81.28
+1,890,63.5
+1,890,46.355
+1,890,50.8
+1,890,7.62
+1,890,99.06
+1,890,99.06
+1,890,19.05
+1,890,7.62
+1,890,40.64
+1,891,46.355
+1,891,81.28
+1,891,44.45
+1,891,10.16
+1,891,35.56
+1,891,7.62
+1,891,40.64
+1,891,7.62
+1,891,33.02
+1,891,7.62
+1,891,63.5
+1,891,7.62
+1,891,46.355
+1,891,63.5
+1,891,50.8
+1,891,7.62
+1,891,7.62
+1,891,33.02
+1,891,7.62
+1,891,7.62
+1,891,7.62
+1,891,7.62
+1,891,15.24
+1,891,7.62
+1,891,63.5
+1,891,99.06
+1,891,33.02
+1,891,22.86
+1,891,50.8
+1,891,53.975
+1,892,22.86
+1,892,35.56
+1,892,10.16
+1,892,7.62
+1,892,33.02
+1,892,33.02
+1,892,10.16
+1,892,7.62
+1,892,19.05
+1,892,53.975
+1,892,8.89
+1,892,7.62
+1,892,40.64
+1,892,45.72
+1,892,81.28
+1,892,22.86
+1,892,33.02
+1,892,19.05
+1,892,33.02
+1,892,7.62
+1,892,8.89
+1,892,44.45
+1,892,30.48
+1,892,99.06
+1,892,35.56
+1,892,19.05
+1,892,99.06
+1,892,99.06
+1,892,35.56
+1,892,33.02
+1,893,7.62
+1,893,15.24
+1,893,30.48
+1,893,45.72
+1,893,45.72
+1,893,10.16
+1,893,8.89
+1,893,8.89
+1,893,33.02
+1,893,45.72
+1,893,55.88
+1,893,19.05
+1,893,15.24
+1,893,35.56
+1,893,7.62
+1,893,33.02
+1,893,40.64
+1,893,7.62
+1,893,53.975
+1,893,81.28
+1,893,40.64
+1,893,63.5
+1,893,35.56
+1,893,7.62
+1,893,81.28
+1,893,7.62
+1,893,8.89
+1,893,99.06
+1,893,7.62
+1,893,46.355
+1,894,35.56
+1,894,81.28
+1,894,27.94
+1,894,7.62
+1,894,7.62
+1,894,63.5
+1,894,55.88
+1,894,30.48
+1,894,10.16
+1,894,7.62
+1,894,40.64
+1,894,30.48
+1,894,22.86
+1,894,24.13
+1,894,33.02
+1,894,24.13
+1,894,53.975
+1,894,50.8
+1,894,40.64
+1,894,55.88
+1,894,10.16
+1,894,99.06
+1,894,10.16
+1,894,40.64
+1,894,44.45
+1,894,55.88
+1,894,33.02
+1,894,40.64
+1,894,24.13
+1,894,55.88
+1,895,22.86
+1,895,7.62
+1,895,7.62
+1,895,19.05
+1,895,19.05
+1,895,40.64
+1,895,55.88
+1,895,10.16
+1,895,30.48
+1,895,45.72
+1,895,45.72
+1,895,40.64
+1,895,15.24
+1,895,63.5
+1,895,10.16
+1,895,27.94
+1,895,33.02
+1,895,7.62
+1,895,24.13
+1,895,40.64
+1,895,27.94
+1,895,63.5
+1,895,81.28
+1,895,15.24
+1,895,27.94
+1,895,19.05
+1,895,30.48
+1,895,7.62
+1,895,10.16
+1,895,22.86
+1,896,30.48
+1,896,15.24
+1,896,10.16
+1,896,27.94
+1,896,40.64
+1,896,7.62
+1,896,19.05
+1,896,53.975
+1,896,15.24
+1,896,55.88
+1,896,44.45
+1,896,50.8
+1,896,81.28
+1,896,30.48
+1,896,40.64
+1,896,50.8
+1,896,81.28
+1,896,46.355
+1,896,8.89
+1,896,45.72
+1,896,30.48
+1,896,15.24
+1,896,53.975
+1,896,46.355
+1,896,33.02
+1,896,15.24
+1,896,8.89
+1,896,7.62
+1,896,7.62
+1,896,44.45
+1,897,35.56
+1,897,30.48
+1,897,99.06
+1,897,55.88
+1,897,40.64
+1,897,63.5
+1,897,7.62
+1,897,33.02
+1,897,27.94
+1,897,7.62
+1,897,7.62
+1,897,7.62
+1,897,33.02
+1,897,63.5
+1,897,46.355
+1,897,8.89
+1,897,7.62
+1,897,33.02
+1,897,35.56
+1,897,7.62
+1,897,40.64
+1,897,46.355
+1,897,15.24
+1,897,40.64
+1,897,7.62
+1,897,19.05
+1,897,50.8
+1,897,8.89
+1,897,55.88
+1,897,8.89
+1,898,7.62
+1,898,35.56
+1,898,81.28
+1,898,33.02
+1,898,10.16
+1,898,27.94
+1,898,7.62
+1,898,45.72
+1,898,33.02
+1,898,40.64
+1,898,7.62
+1,898,7.62
+1,898,44.45
+1,898,81.28
+1,898,81.28
+1,898,35.56
+1,898,33.02
+1,898,10.16
+1,898,46.355
+1,898,50.8
+1,898,53.975
+1,898,7.62
+1,898,7.62
+1,898,35.56
+1,898,63.5
+1,898,7.62
+1,898,7.62
+1,898,35.56
+1,898,50.8
+1,898,44.45
+1,899,10.16
+1,899,27.94
+1,899,63.5
+1,899,33.02
+1,899,46.355
+1,899,81.28
+1,899,99.06
+1,899,40.64
+1,899,81.28
+1,899,53.975
+1,899,7.62
+1,899,8.89
+1,899,22.86
+1,899,99.06
+1,899,30.48
+1,899,99.06
+1,899,7.62
+1,899,55.88
+1,899,15.24
+1,899,22.86
+1,899,35.56
+1,899,10.16
+1,899,7.62
+1,899,55.88
+1,899,10.16
+1,899,99.06
+1,899,8.89
+1,899,15.24
+1,899,81.28
+1,899,35.56
+1,900,46.355
+1,900,8.89
+1,900,10.16
+1,900,45.72
+1,900,22.86
+1,900,30.48
+1,900,7.62
+1,900,33.02
+1,900,63.5
+1,900,63.5
+1,900,46.355
+1,900,27.94
+1,900,55.88
+1,900,55.88
+1,900,46.355
+1,900,44.45
+1,900,27.94
+1,900,50.8
+1,900,7.62
+1,900,55.88
+1,900,81.28
+1,900,33.02
+1,900,46.355
+1,900,7.62
+1,900,45.72
+1,900,55.88
+1,900,19.05
+1,900,19.05
+1,900,22.86
+1,900,27.94
+1,901,53.975
+1,901,55.88
+1,901,46.355
+1,901,53.975
+1,901,35.56
+1,901,40.64
+1,901,7.62
+1,901,30.48
+1,901,46.355
+1,901,7.62
+1,901,33.02
+1,901,7.62
+1,901,33.02
+1,901,7.62
+1,901,35.56
+1,901,19.05
+1,901,10.16
+1,901,40.64
+1,901,81.28
+1,901,63.5
+1,901,33.02
+1,901,35.56
+1,901,44.45
+1,901,10.16
+1,901,33.02
+1,901,35.56
+1,901,10.16
+1,901,7.62
+1,901,7.62
+1,901,7.62
+1,902,24.13
+1,902,35.56
+1,902,53.975
+1,902,7.62
+1,902,33.02
+1,902,99.06
+1,902,53.975
+1,902,7.62
+1,902,44.45
+1,902,81.28
+1,902,99.06
+1,902,55.88
+1,902,81.28
+1,902,33.02
+1,902,19.05
+1,902,53.975
+1,902,40.64
+1,902,40.64
+1,902,40.64
+1,902,7.62
+1,902,15.24
+1,902,33.02
+1,902,63.5
+1,902,33.02
+1,902,22.86
+1,902,24.13
+1,902,22.86
+1,902,81.28
+1,902,99.06
+1,902,44.45
+1,903,53.975
+1,903,40.64
+1,903,33.02
+1,903,33.02
+1,903,33.02
+1,903,15.24
+1,903,46.355
+1,903,10.16
+1,903,22.86
+1,903,40.64
+1,903,50.8
+1,903,45.72
+1,903,40.64
+1,903,10.16
+1,903,40.64
+1,903,63.5
+1,903,35.56
+1,903,7.62
+1,903,22.86
+1,903,15.24
+1,903,7.62
+1,903,7.62
+1,903,15.24
+1,903,10.16
+1,903,35.56
+1,903,33.02
+1,903,45.72
+1,903,33.02
+1,903,22.86
+1,903,33.02
+1,904,27.94
+1,904,40.64
+1,904,99.06
+1,904,7.62
+1,904,22.86
+1,904,40.64
+1,904,33.02
+1,904,10.16
+1,904,35.56
+1,904,8.89
+1,904,33.02
+1,904,22.86
+1,904,30.48
+1,904,45.72
+1,904,7.62
+1,904,33.02
+1,904,45.72
+1,904,10.16
+1,904,63.5
+1,904,44.45
+1,904,63.5
+1,904,33.02
+1,904,35.56
+1,904,46.355
+1,904,24.13
+1,904,63.5
+1,904,10.16
+1,904,35.56
+1,904,22.86
+1,904,7.62
+1,905,7.62
+1,905,19.05
+1,905,22.86
+1,905,10.16
+1,905,63.5
+1,905,30.48
+1,905,15.24
+1,905,19.05
+1,905,55.88
+1,905,7.62
+1,905,35.56
+1,905,33.02
+1,905,7.62
+1,905,99.06
+1,905,19.05
+1,905,7.62
+1,905,46.355
+1,905,55.88
+1,905,99.06
+1,905,99.06
+1,905,99.06
+1,905,15.24
+1,905,53.975
+1,905,53.975
+1,905,10.16
+1,905,7.62
+1,905,27.94
+1,905,22.86
+1,905,63.5
+1,905,22.86
+1,906,7.62
+1,906,99.06
+1,906,27.94
+1,906,55.88
+1,906,22.86
+1,906,24.13
+1,906,7.62
+1,906,24.13
+1,906,30.48
+1,906,7.62
+1,906,22.86
+1,906,55.88
+1,906,55.88
+1,906,8.89
+1,906,40.64
+1,906,55.88
+1,906,30.48
+1,906,33.02
+1,906,33.02
+1,906,81.28
+1,906,30.48
+1,906,53.975
+1,906,10.16
+1,906,40.64
+1,906,7.62
+1,906,22.86
+1,906,50.8
+1,906,19.05
+1,906,53.975
+1,906,27.94
+1,907,35.56
+1,907,27.94
+1,907,33.02
+1,907,33.02
+1,907,40.64
+1,907,7.62
+1,907,7.62
+1,907,55.88
+1,907,7.62
+1,907,19.05
+1,907,22.86
+1,907,99.06
+1,907,7.62
+1,907,63.5
+1,907,8.89
+1,907,40.64
+1,907,10.16
+1,907,27.94
+1,907,7.62
+1,907,27.94
+1,907,8.89
+1,907,15.24
+1,907,7.62
+1,907,27.94
+1,907,10.16
+1,907,45.72
+1,907,30.48
+1,907,8.89
+1,907,8.89
+1,907,99.06
+1,908,7.62
+1,908,99.06
+1,908,35.56
+1,908,19.05
+1,908,7.62
+1,908,7.62
+1,908,99.06
+1,908,63.5
+1,908,10.16
+1,908,7.62
+1,908,7.62
+1,908,99.06
+1,908,27.94
+1,908,81.28
+1,908,22.86
+1,908,53.975
+1,908,24.13
+1,908,8.89
+1,908,24.13
+1,908,81.28
+1,908,7.62
+1,908,40.64
+1,908,53.975
+1,908,55.88
+1,908,33.02
+1,908,45.72
+1,908,99.06
+1,908,10.16
+1,908,81.28
+1,908,33.02
+1,909,44.45
+1,909,45.72
+1,909,27.94
+1,909,33.02
+1,909,40.64
+1,909,45.72
+1,909,81.28
+1,909,35.56
+1,909,53.975
+1,909,33.02
+1,909,40.64
+1,909,7.62
+1,909,8.89
+1,909,10.16
+1,909,63.5
+1,909,7.62
+1,909,55.88
+1,909,81.28
+1,909,99.06
+1,909,7.62
+1,909,15.24
+1,909,53.975
+1,909,33.02
+1,909,7.62
+1,909,10.16
+1,909,10.16
+1,909,33.02
+1,909,30.48
+1,909,63.5
+1,909,46.355
+1,910,35.56
+1,910,33.02
+1,910,8.89
+1,910,81.28
+1,910,7.62
+1,910,44.45
+1,910,53.975
+1,910,45.72
+1,910,99.06
+1,910,27.94
+1,910,22.86
+1,910,33.02
+1,910,7.62
+1,910,35.56
+1,910,50.8
+1,910,46.355
+1,910,81.28
+1,910,50.8
+1,910,7.62
+1,910,8.89
+1,910,50.8
+1,910,7.62
+1,910,33.02
+1,910,7.62
+1,910,19.05
+1,910,7.62
+1,910,10.16
+1,910,46.355
+1,910,7.62
+1,910,24.13
+1,911,45.72
+1,911,24.13
+1,911,40.64
+1,911,33.02
+1,911,40.64
+1,911,7.62
+1,911,46.355
+1,911,99.06
+1,911,35.56
+1,911,81.28
+1,911,81.28
+1,911,40.64
+1,911,45.72
+1,911,33.02
+1,911,40.64
+1,911,27.94
+1,911,7.62
+1,911,50.8
+1,911,7.62
+1,911,53.975
+1,911,81.28
+1,911,15.24
+1,911,55.88
+1,911,50.8
+1,911,15.24
+1,911,7.62
+1,911,44.45
+1,911,30.48
+1,911,35.56
+1,911,19.05
+1,912,44.45
+1,912,22.86
+1,912,46.355
+1,912,63.5
+1,912,27.94
+1,912,10.16
+1,912,24.13
+1,912,15.24
+1,912,7.62
+1,912,7.62
+1,912,40.64
+1,912,7.62
+1,912,81.28
+1,912,99.06
+1,912,7.62
+1,912,19.05
+1,912,33.02
+1,912,45.72
+1,912,27.94
+1,912,19.05
+1,912,81.28
+1,912,55.88
+1,912,7.62
+1,912,44.45
+1,912,81.28
+1,912,33.02
+1,912,10.16
+1,912,27.94
+1,912,7.62
+1,912,10.16
+1,913,33.02
+1,913,7.62
+1,913,40.64
+1,913,33.02
+1,913,24.13
+1,913,24.13
+1,913,33.02
+1,913,24.13
+1,913,40.64
+1,913,7.62
+1,913,24.13
+1,913,35.56
+1,913,24.13
+1,913,33.02
+1,913,40.64
+1,913,24.13
+1,913,22.86
+1,913,27.94
+1,913,40.64
+1,913,50.8
+1,913,10.16
+1,913,7.62
+1,913,8.89
+1,913,10.16
+1,913,33.02
+1,913,33.02
+1,913,53.975
+1,913,22.86
+1,913,27.94
+1,913,40.64
+1,914,8.89
+1,914,7.62
+1,914,55.88
+1,914,7.62
+1,914,99.06
+1,914,19.05
+1,914,35.56
+1,914,35.56
+1,914,7.62
+1,914,33.02
+1,914,10.16
+1,914,7.62
+1,914,35.56
+1,914,27.94
+1,914,55.88
+1,914,63.5
+1,914,27.94
+1,914,55.88
+1,914,50.8
+1,914,7.62
+1,914,33.02
+1,914,30.48
+1,914,10.16
+1,914,44.45
+1,914,45.72
+1,914,27.94
+1,914,8.89
+1,914,7.62
+1,914,46.355
+1,914,63.5
+1,915,40.64
+1,915,81.28
+1,915,35.56
+1,915,15.24
+1,915,10.16
+1,915,7.62
+1,915,10.16
+1,915,50.8
+1,915,53.975
+1,915,10.16
+1,915,40.64
+1,915,10.16
+1,915,40.64
+1,915,35.56
+1,915,7.62
+1,915,7.62
+1,915,40.64
+1,915,40.64
+1,915,35.56
+1,915,63.5
+1,915,10.16
+1,915,33.02
+1,915,33.02
+1,915,33.02
+1,915,81.28
+1,915,99.06
+1,915,10.16
+1,915,19.05
+1,915,45.72
+1,915,33.02
+1,916,35.56
+1,916,33.02
+1,916,33.02
+1,916,63.5
+1,916,22.86
+1,916,24.13
+1,916,10.16
+1,916,40.64
+1,916,8.89
+1,916,27.94
+1,916,35.56
+1,916,40.64
+1,916,15.24
+1,916,19.05
+1,916,7.62
+1,916,63.5
+1,916,15.24
+1,916,33.02
+1,916,33.02
+1,916,7.62
+1,916,8.89
+1,916,10.16
+1,916,81.28
+1,916,53.975
+1,916,53.975
+1,916,22.86
+1,916,55.88
+1,916,19.05
+1,916,40.64
+1,916,22.86
+1,917,53.975
+1,917,55.88
+1,917,10.16
+1,917,35.56
+1,917,35.56
+1,917,7.62
+1,917,7.62
+1,917,33.02
+1,917,8.89
+1,917,10.16
+1,917,8.89
+1,917,7.62
+1,917,27.94
+1,917,44.45
+1,917,15.24
+1,917,35.56
+1,917,35.56
+1,917,33.02
+1,917,7.62
+1,917,10.16
+1,917,30.48
+1,917,7.62
+1,917,53.975
+1,917,45.72
+1,917,81.28
+1,917,45.72
+1,917,7.62
+1,917,30.48
+1,917,50.8
+1,917,45.72
+1,918,10.16
+1,918,22.86
+1,918,24.13
+1,918,53.975
+1,918,15.24
+1,918,7.62
+1,918,55.88
+1,918,35.56
+1,918,35.56
+1,918,45.72
+1,918,7.62
+1,918,24.13
+1,918,7.62
+1,918,33.02
+1,918,35.56
+1,918,44.45
+1,918,7.62
+1,918,33.02
+1,918,33.02
+1,918,8.89
+1,918,99.06
+1,918,45.72
+1,918,7.62
+1,918,22.86
+1,918,55.88
+1,918,81.28
+1,918,7.62
+1,918,50.8
+1,918,35.56
+1,918,33.02
+1,919,33.02
+1,919,63.5
+1,919,63.5
+1,919,7.62
+1,919,50.8
+1,919,7.62
+1,919,50.8
+1,919,53.975
+1,919,27.94
+1,919,19.05
+1,919,46.355
+1,919,10.16
+1,919,53.975
+1,919,7.62
+1,919,10.16
+1,919,63.5
+1,919,7.62
+1,919,30.48
+1,919,35.56
+1,919,63.5
+1,919,44.45
+1,919,50.8
+1,919,19.05
+1,919,40.64
+1,919,45.72
+1,919,44.45
+1,919,30.48
+1,919,44.45
+1,919,35.56
+1,919,45.72
+1,920,55.88
+1,920,33.02
+1,920,45.72
+1,920,81.28
+1,920,22.86
+1,920,15.24
+1,920,7.62
+1,920,45.72
+1,920,10.16
+1,920,19.05
+1,920,30.48
+1,920,10.16
+1,920,44.45
+1,920,33.02
+1,920,40.64
+1,920,35.56
+1,920,33.02
+1,920,35.56
+1,920,22.86
+1,920,7.62
+1,920,53.975
+1,920,55.88
+1,920,45.72
+1,920,40.64
+1,920,8.89
+1,920,40.64
+1,920,46.355
+1,920,24.13
+1,920,99.06
+1,920,10.16
+1,921,50.8
+1,921,33.02
+1,921,7.62
+1,921,7.62
+1,921,53.975
+1,921,44.45
+1,921,30.48
+1,921,24.13
+1,921,40.64
+1,921,46.355
+1,921,99.06
+1,921,50.8
+1,921,27.94
+1,921,27.94
+1,921,81.28
+1,921,35.56
+1,921,24.13
+1,921,33.02
+1,921,33.02
+1,921,24.13
+1,921,7.62
+1,921,7.62
+1,921,81.28
+1,921,81.28
+1,921,8.89
+1,921,7.62
+1,921,27.94
+1,921,22.86
+1,921,55.88
+1,921,22.86
+1,922,44.45
+1,922,8.89
+1,922,40.64
+1,922,7.62
+1,922,50.8
+1,922,40.64
+1,922,8.89
+1,922,7.62
+1,922,7.62
+1,922,35.56
+1,922,45.72
+1,922,63.5
+1,922,50.8
+1,922,55.88
+1,922,7.62
+1,922,30.48
+1,922,7.62
+1,922,50.8
+1,922,8.89
+1,922,33.02
+1,922,99.06
+1,922,30.48
+1,922,10.16
+1,922,53.975
+1,922,45.72
+1,922,22.86
+1,922,7.62
+1,922,27.94
+1,922,35.56
+1,922,40.64
+1,923,7.62
+1,923,27.94
+1,923,27.94
+1,923,8.89
+1,923,46.355
+1,923,10.16
+1,923,81.28
+1,923,99.06
+1,923,8.89
+1,923,8.89
+1,923,7.62
+1,923,22.86
+1,923,7.62
+1,923,7.62
+1,923,27.94
+1,923,24.13
+1,923,44.45
+1,923,7.62
+1,923,33.02
+1,923,46.355
+1,923,7.62
+1,923,7.62
+1,923,35.56
+1,923,7.62
+1,923,10.16
+1,923,7.62
+1,923,19.05
+1,923,33.02
+1,923,33.02
+1,923,7.62
+1,924,81.28
+1,924,8.89
+1,924,10.16
+1,924,99.06
+1,924,46.355
+1,924,15.24
+1,924,33.02
+1,924,53.975
+1,924,44.45
+1,924,35.56
+1,924,35.56
+1,924,44.45
+1,924,8.89
+1,924,35.56
+1,924,35.56
+1,924,81.28
+1,924,81.28
+1,924,81.28
+1,924,7.62
+1,924,7.62
+1,924,81.28
+1,924,63.5
+1,924,44.45
+1,924,35.56
+1,924,45.72
+1,924,15.24
+1,924,55.88
+1,924,7.62
+1,924,15.24
+1,924,7.62
+1,925,46.355
+1,925,19.05
+1,925,7.62
+1,925,35.56
+1,925,7.62
+1,925,33.02
+1,925,22.86
+1,925,33.02
+1,925,8.89
+1,925,10.16
+1,925,7.62
+1,925,7.62
+1,925,15.24
+1,925,33.02
+1,925,7.62
+1,925,35.56
+1,925,7.62
+1,925,30.48
+1,925,27.94
+1,925,33.02
+1,925,44.45
+1,925,7.62
+1,925,7.62
+1,925,22.86
+1,925,19.05
+1,925,10.16
+1,925,22.86
+1,925,81.28
+1,925,8.89
+1,925,27.94
+1,926,7.62
+1,926,22.86
+1,926,81.28
+1,926,33.02
+1,926,40.64
+1,926,99.06
+1,926,35.56
+1,926,10.16
+1,926,44.45
+1,926,55.88
+1,926,30.48
+1,926,27.94
+1,926,40.64
+1,926,8.89
+1,926,7.62
+1,926,10.16
+1,926,27.94
+1,926,7.62
+1,926,63.5
+1,926,40.64
+1,926,19.05
+1,926,8.89
+1,926,7.62
+1,926,55.88
+1,926,63.5
+1,926,63.5
+1,926,15.24
+1,926,27.94
+1,926,44.45
+1,926,35.56
+1,927,55.88
+1,927,63.5
+1,927,33.02
+1,927,44.45
+1,927,40.64
+1,927,33.02
+1,927,10.16
+1,927,24.13
+1,927,10.16
+1,927,63.5
+1,927,55.88
+1,927,53.975
+1,927,63.5
+1,927,81.28
+1,927,50.8
+1,927,81.28
+1,927,15.24
+1,927,7.62
+1,927,30.48
+1,927,33.02
+1,927,35.56
+1,927,53.975
+1,927,30.48
+1,927,19.05
+1,927,7.62
+1,927,35.56
+1,927,33.02
+1,927,22.86
+1,927,35.56
+1,927,40.64
+1,928,7.62
+1,928,10.16
+1,928,33.02
+1,928,45.72
+1,928,7.62
+1,928,50.8
+1,928,7.62
+1,928,7.62
+1,928,44.45
+1,928,44.45
+1,928,7.62
+1,928,33.02
+1,928,22.86
+1,928,27.94
+1,928,50.8
+1,928,15.24
+1,928,10.16
+1,928,53.975
+1,928,33.02
+1,928,35.56
+1,928,46.355
+1,928,53.975
+1,928,40.64
+1,928,35.56
+1,928,99.06
+1,928,45.72
+1,928,33.02
+1,928,7.62
+1,928,10.16
+1,928,99.06
+1,929,24.13
+1,929,7.62
+1,929,33.02
+1,929,44.45
+1,929,10.16
+1,929,63.5
+1,929,33.02
+1,929,55.88
+1,929,44.45
+1,929,7.62
+1,929,50.8
+1,929,50.8
+1,929,50.8
+1,929,7.62
+1,929,7.62
+1,929,53.975
+1,929,27.94
+1,929,40.64
+1,929,24.13
+1,929,7.62
+1,929,7.62
+1,929,33.02
+1,929,15.24
+1,929,7.62
+1,929,35.56
+1,929,99.06
+1,929,15.24
+1,929,7.62
+1,929,22.86
+1,929,8.89
+1,930,7.62
+1,930,40.64
+1,930,24.13
+1,930,50.8
+1,930,10.16
+1,930,63.5
+1,930,81.28
+1,930,35.56
+1,930,40.64
+1,930,63.5
+1,930,40.64
+1,930,35.56
+1,930,35.56
+1,930,19.05
+1,930,19.05
+1,930,45.72
+1,930,8.89
+1,930,10.16
+1,930,24.13
+1,930,24.13
+1,930,45.72
+1,930,33.02
+1,930,7.62
+1,930,24.13
+1,930,40.64
+1,930,40.64
+1,930,7.62
+1,930,46.355
+1,930,8.89
+1,930,15.24
+1,931,35.56
+1,931,22.86
+1,931,7.62
+1,931,81.28
+1,931,7.62
+1,931,15.24
+1,931,40.64
+1,931,46.355
+1,931,81.28
+1,931,24.13
+1,931,81.28
+1,931,19.05
+1,931,35.56
+1,931,19.05
+1,931,22.86
+1,931,46.355
+1,931,24.13
+1,931,10.16
+1,931,30.48
+1,931,8.89
+1,931,7.62
+1,931,35.56
+1,931,55.88
+1,931,30.48
+1,931,55.88
+1,931,63.5
+1,931,10.16
+1,931,46.355
+1,931,81.28
+1,931,55.88
+1,932,27.94
+1,932,40.64
+1,932,27.94
+1,932,7.62
+1,932,63.5
+1,932,40.64
+1,932,63.5
+1,932,63.5
+1,932,27.94
+1,932,53.975
+1,932,55.88
+1,932,40.64
+1,932,8.89
+1,932,7.62
+1,932,50.8
+1,932,81.28
+1,932,50.8
+1,932,7.62
+1,932,40.64
+1,932,24.13
+1,932,27.94
+1,932,7.62
+1,932,7.62
+1,932,7.62
+1,932,7.62
+1,932,33.02
+1,932,40.64
+1,932,44.45
+1,932,15.24
+1,932,15.24
+1,933,35.56
+1,933,7.62
+1,933,35.56
+1,933,40.64
+1,933,44.45
+1,933,45.72
+1,933,33.02
+1,933,7.62
+1,933,40.64
+1,933,7.62
+1,933,33.02
+1,933,24.13
+1,933,35.56
+1,933,24.13
+1,933,63.5
+1,933,10.16
+1,933,50.8
+1,933,46.355
+1,933,99.06
+1,933,44.45
+1,933,55.88
+1,933,40.64
+1,933,7.62
+1,933,44.45
+1,933,22.86
+1,933,35.56
+1,933,8.89
+1,933,7.62
+1,933,22.86
+1,933,33.02
+1,934,7.62
+1,934,99.06
+1,934,35.56
+1,934,7.62
+1,934,45.72
+1,934,99.06
+1,934,55.88
+1,934,35.56
+1,934,63.5
+1,934,7.62
+1,934,40.64
+1,934,46.355
+1,934,33.02
+1,934,22.86
+1,934,33.02
+1,934,7.62
+1,934,40.64
+1,934,35.56
+1,934,15.24
+1,934,30.48
+1,934,30.48
+1,934,46.355
+1,934,46.355
+1,934,10.16
+1,934,10.16
+1,934,24.13
+1,934,10.16
+1,934,44.45
+1,934,53.975
+1,934,99.06
+1,935,44.45
+1,935,7.62
+1,935,81.28
+1,935,7.62
+1,935,10.16
+1,935,7.62
+1,935,22.86
+1,935,33.02
+1,935,19.05
+1,935,45.72
+1,935,44.45
+1,935,53.975
+1,935,40.64
+1,935,7.62
+1,935,7.62
+1,935,81.28
+1,935,22.86
+1,935,33.02
+1,935,8.89
+1,935,33.02
+1,935,19.05
+1,935,22.86
+1,935,8.89
+1,935,10.16
+1,935,50.8
+1,935,15.24
+1,935,30.48
+1,935,99.06
+1,935,99.06
+1,935,99.06
+1,936,55.88
+1,936,33.02
+1,936,30.48
+1,936,33.02
+1,936,81.28
+1,936,10.16
+1,936,46.355
+1,936,53.975
+1,936,10.16
+1,936,63.5
+1,936,33.02
+1,936,35.56
+1,936,35.56
+1,936,53.975
+1,936,99.06
+1,936,33.02
+1,936,15.24
+1,936,99.06
+1,936,35.56
+1,936,7.62
+1,936,53.975
+1,936,30.48
+1,936,8.89
+1,936,35.56
+1,936,10.16
+1,936,55.88
+1,936,63.5
+1,936,45.72
+1,936,33.02
+1,936,30.48
+1,937,50.8
+1,937,15.24
+1,937,33.02
+1,937,50.8
+1,937,46.355
+1,937,10.16
+1,937,22.86
+1,937,33.02
+1,937,22.86
+1,937,7.62
+1,937,7.62
+1,937,46.355
+1,937,53.975
+1,937,27.94
+1,937,53.975
+1,937,8.89
+1,937,7.62
+1,937,19.05
+1,937,19.05
+1,937,27.94
+1,937,33.02
+1,937,50.8
+1,937,24.13
+1,937,55.88
+1,937,33.02
+1,937,10.16
+1,937,22.86
+1,937,22.86
+1,937,99.06
+1,937,33.02
+1,938,8.89
+1,938,7.62
+1,938,8.89
+1,938,7.62
+1,938,15.24
+1,938,30.48
+1,938,24.13
+1,938,99.06
+1,938,33.02
+1,938,35.56
+1,938,33.02
+1,938,7.62
+1,938,53.975
+1,938,35.56
+1,938,55.88
+1,938,7.62
+1,938,27.94
+1,938,46.355
+1,938,45.72
+1,938,40.64
+1,938,40.64
+1,938,27.94
+1,938,10.16
+1,938,10.16
+1,938,40.64
+1,938,63.5
+1,938,27.94
+1,938,55.88
+1,938,46.355
+1,938,55.88
+1,939,44.45
+1,939,33.02
+1,939,55.88
+1,939,24.13
+1,939,7.62
+1,939,35.56
+1,939,35.56
+1,939,24.13
+1,939,99.06
+1,939,27.94
+1,939,35.56
+1,939,27.94
+1,939,50.8
+1,939,24.13
+1,939,40.64
+1,939,7.62
+1,939,19.05
+1,939,99.06
+1,939,7.62
+1,939,45.72
+1,939,8.89
+1,939,33.02
+1,939,10.16
+1,939,99.06
+1,939,27.94
+1,939,7.62
+1,939,33.02
+1,939,7.62
+1,939,63.5
+1,939,22.86
+1,940,7.62
+1,940,33.02
+1,940,19.05
+1,940,7.62
+1,940,7.62
+1,940,33.02
+1,940,27.94
+1,940,7.62
+1,940,46.355
+1,940,45.72
+1,940,8.89
+1,940,46.355
+1,940,7.62
+1,940,30.48
+1,940,7.62
+1,940,40.64
+1,940,46.355
+1,940,53.975
+1,940,19.05
+1,940,7.62
+1,940,45.72
+1,940,99.06
+1,940,30.48
+1,940,15.24
+1,940,7.62
+1,940,10.16
+1,940,81.28
+1,940,7.62
+1,940,7.62
+1,940,53.975
+1,941,7.62
+1,941,7.62
+1,941,35.56
+1,941,7.62
+1,941,7.62
+1,941,33.02
+1,941,7.62
+1,941,81.28
+1,941,63.5
+1,941,40.64
+1,941,55.88
+1,941,40.64
+1,941,99.06
+1,941,7.62
+1,941,19.05
+1,941,15.24
+1,941,81.28
+1,941,30.48
+1,941,81.28
+1,941,19.05
+1,941,45.72
+1,941,22.86
+1,941,22.86
+1,941,35.56
+1,941,44.45
+1,941,8.89
+1,941,7.62
+1,941,8.89
+1,941,7.62
+1,941,53.975
+1,942,63.5
+1,942,10.16
+1,942,10.16
+1,942,33.02
+1,942,8.89
+1,942,10.16
+1,942,63.5
+1,942,7.62
+1,942,50.8
+1,942,27.94
+1,942,7.62
+1,942,33.02
+1,942,81.28
+1,942,7.62
+1,942,46.355
+1,942,55.88
+1,942,7.62
+1,942,33.02
+1,942,30.48
+1,942,33.02
+1,942,33.02
+1,942,55.88
+1,942,15.24
+1,942,22.86
+1,942,22.86
+1,942,45.72
+1,942,10.16
+1,942,46.355
+1,942,30.48
+1,942,15.24
+1,943,44.45
+1,943,46.355
+1,943,7.62
+1,943,40.64
+1,943,40.64
+1,943,45.72
+1,943,40.64
+1,943,33.02
+1,943,33.02
+1,943,81.28
+1,943,63.5
+1,943,40.64
+1,943,33.02
+1,943,33.02
+1,943,30.48
+1,943,7.62
+1,943,33.02
+1,943,35.56
+1,943,24.13
+1,943,50.8
+1,943,33.02
+1,943,10.16
+1,943,15.24
+1,943,22.86
+1,943,50.8
+1,943,53.975
+1,943,10.16
+1,943,10.16
+1,943,7.62
+1,943,19.05
+1,944,33.02
+1,944,50.8
+1,944,99.06
+1,944,22.86
+1,944,27.94
+1,944,15.24
+1,944,27.94
+1,944,44.45
+1,944,22.86
+1,944,33.02
+1,944,46.355
+1,944,7.62
+1,944,15.24
+1,944,35.56
+1,944,22.86
+1,944,8.89
+1,944,7.62
+1,944,44.45
+1,944,7.62
+1,944,10.16
+1,944,7.62
+1,944,44.45
+1,944,40.64
+1,944,10.16
+1,944,40.64
+1,944,33.02
+1,944,22.86
+1,944,45.72
+1,944,55.88
+1,944,45.72
+1,945,44.45
+1,945,7.62
+1,945,7.62
+1,945,19.05
+1,945,7.62
+1,945,46.355
+1,945,55.88
+1,945,53.975
+1,945,7.62
+1,945,44.45
+1,945,35.56
+1,945,15.24
+1,945,35.56
+1,945,24.13
+1,945,81.28
+1,945,53.975
+1,945,40.64
+1,945,7.62
+1,945,63.5
+1,945,30.48
+1,945,33.02
+1,945,10.16
+1,945,53.975
+1,945,33.02
+1,945,35.56
+1,945,35.56
+1,945,35.56
+1,945,7.62
+1,945,7.62
+1,945,33.02
+1,946,44.45
+1,946,46.355
+1,946,15.24
+1,946,81.28
+1,946,55.88
+1,946,7.62
+1,946,7.62
+1,946,45.72
+1,946,35.56
+1,946,22.86
+1,946,46.355
+1,946,33.02
+1,946,8.89
+1,946,33.02
+1,946,15.24
+1,946,55.88
+1,946,15.24
+1,946,33.02
+1,946,19.05
+1,946,7.62
+1,946,15.24
+1,946,40.64
+1,946,33.02
+1,946,8.89
+1,946,33.02
+1,946,7.62
+1,946,63.5
+1,946,46.355
+1,946,19.05
+1,946,8.89
+1,947,46.355
+1,947,81.28
+1,947,53.975
+1,947,99.06
+1,947,30.48
+1,947,46.355
+1,947,33.02
+1,947,99.06
+1,947,15.24
+1,947,24.13
+1,947,7.62
+1,947,7.62
+1,947,55.88
+1,947,35.56
+1,947,10.16
+1,947,7.62
+1,947,45.72
+1,947,19.05
+1,947,7.62
+1,947,33.02
+1,947,35.56
+1,947,27.94
+1,947,10.16
+1,947,27.94
+1,947,22.86
+1,947,44.45
+1,947,10.16
+1,947,7.62
+1,947,40.64
+1,947,8.89
+1,948,27.94
+1,948,8.89
+1,948,44.45
+1,948,15.24
+1,948,46.355
+1,948,19.05
+1,948,19.05
+1,948,7.62
+1,948,24.13
+1,948,33.02
+1,948,53.975
+1,948,7.62
+1,948,40.64
+1,948,10.16
+1,948,46.355
+1,948,81.28
+1,948,40.64
+1,948,45.72
+1,948,8.89
+1,948,35.56
+1,948,40.64
+1,948,24.13
+1,948,10.16
+1,948,30.48
+1,948,53.975
+1,948,33.02
+1,948,24.13
+1,948,10.16
+1,948,10.16
+1,948,99.06
+1,949,7.62
+1,949,46.355
+1,949,40.64
+1,949,33.02
+1,949,40.64
+1,949,46.355
+1,949,10.16
+1,949,7.62
+1,949,7.62
+1,949,7.62
+1,949,8.89
+1,949,7.62
+1,949,46.355
+1,949,35.56
+1,949,19.05
+1,949,7.62
+1,949,10.16
+1,949,33.02
+1,949,10.16
+1,949,33.02
+1,949,8.89
+1,949,10.16
+1,949,19.05
+1,949,40.64
+1,949,22.86
+1,949,33.02
+1,949,19.05
+1,949,10.16
+1,949,33.02
+1,949,40.64
+1,950,19.05
+1,950,10.16
+1,950,40.64
+1,950,27.94
+1,950,33.02
+1,950,81.28
+1,950,7.62
+1,950,35.56
+1,950,10.16
+1,950,35.56
+1,950,35.56
+1,950,33.02
+1,950,55.88
+1,950,8.89
+1,950,7.62
+1,950,55.88
+1,950,19.05
+1,950,7.62
+1,950,22.86
+1,950,35.56
+1,950,40.64
+1,950,8.89
+1,950,63.5
+1,950,45.72
+1,950,45.72
+1,950,33.02
+1,950,33.02
+1,950,19.05
+1,950,99.06
+1,950,30.48
+1,951,40.64
+1,951,7.62
+1,951,24.13
+1,951,44.45
+1,951,50.8
+1,951,81.28
+1,951,30.48
+1,951,40.64
+1,951,10.16
+1,951,81.28
+1,951,15.24
+1,951,15.24
+1,951,24.13
+1,951,35.56
+1,951,50.8
+1,951,30.48
+1,951,7.62
+1,951,7.62
+1,951,10.16
+1,951,7.62
+1,951,63.5
+1,951,7.62
+1,951,44.45
+1,951,15.24
+1,951,35.56
+1,951,7.62
+1,951,81.28
+1,951,10.16
+1,951,27.94
+1,951,63.5
+1,952,33.02
+1,952,50.8
+1,952,7.62
+1,952,7.62
+1,952,8.89
+1,952,99.06
+1,952,7.62
+1,952,7.62
+1,952,24.13
+1,952,35.56
+1,952,35.56
+1,952,7.62
+1,952,35.56
+1,952,44.45
+1,952,81.28
+1,952,30.48
+1,952,33.02
+1,952,40.64
+1,952,10.16
+1,952,44.45
+1,952,7.62
+1,952,7.62
+1,952,46.355
+1,952,44.45
+1,952,33.02
+1,952,19.05
+1,952,19.05
+1,952,7.62
+1,952,7.62
+1,952,40.64
+1,953,33.02
+1,953,46.355
+1,953,55.88
+1,953,19.05
+1,953,22.86
+1,953,19.05
+1,953,40.64
+1,953,46.355
+1,953,46.355
+1,953,19.05
+1,953,45.72
+1,953,50.8
+1,953,33.02
+1,953,45.72
+1,953,33.02
+1,953,99.06
+1,953,27.94
+1,953,46.355
+1,953,24.13
+1,953,45.72
+1,953,10.16
+1,953,7.62
+1,953,35.56
+1,953,99.06
+1,953,44.45
+1,953,22.86
+1,953,40.64
+1,953,35.56
+1,953,7.62
+1,953,15.24
+1,954,10.16
+1,954,99.06
+1,954,35.56
+1,954,10.16
+1,954,27.94
+1,954,50.8
+1,954,55.88
+1,954,8.89
+1,954,7.62
+1,954,10.16
+1,954,27.94
+1,954,10.16
+1,954,24.13
+1,954,33.02
+1,954,33.02
+1,954,50.8
+1,954,10.16
+1,954,81.28
+1,954,40.64
+1,954,33.02
+1,954,8.89
+1,954,24.13
+1,954,35.56
+1,954,50.8
+1,954,10.16
+1,954,33.02
+1,954,7.62
+1,954,50.8
+1,954,81.28
+1,954,27.94
+1,955,53.975
+1,955,8.89
+1,955,24.13
+1,955,24.13
+1,955,81.28
+1,955,44.45
+1,955,35.56
+1,955,81.28
+1,955,33.02
+1,955,40.64
+1,955,35.56
+1,955,7.62
+1,955,7.62
+1,955,7.62
+1,955,99.06
+1,955,46.355
+1,955,35.56
+1,955,30.48
+1,955,7.62
+1,955,63.5
+1,955,50.8
+1,955,30.48
+1,955,10.16
+1,955,99.06
+1,955,40.64
+1,955,30.48
+1,955,7.62
+1,955,46.355
+1,955,45.72
+1,955,7.62
+1,956,35.56
+1,956,99.06
+1,956,30.48
+1,956,45.72
+1,956,7.62
+1,956,19.05
+1,956,33.02
+1,956,33.02
+1,956,35.56
+1,956,15.24
+1,956,46.355
+1,956,7.62
+1,956,22.86
+1,956,46.355
+1,956,33.02
+1,956,10.16
+1,956,40.64
+1,956,44.45
+1,956,7.62
+1,956,33.02
+1,956,7.62
+1,956,44.45
+1,956,33.02
+1,956,44.45
+1,956,7.62
+1,956,33.02
+1,956,44.45
+1,956,53.975
+1,956,27.94
+1,956,27.94
+1,957,44.45
+1,957,99.06
+1,957,7.62
+1,957,46.355
+1,957,35.56
+1,957,45.72
+1,957,44.45
+1,957,33.02
+1,957,7.62
+1,957,27.94
+1,957,19.05
+1,957,19.05
+1,957,63.5
+1,957,22.86
+1,957,22.86
+1,957,22.86
+1,957,7.62
+1,957,10.16
+1,957,19.05
+1,957,46.355
+1,957,81.28
+1,957,7.62
+1,957,40.64
+1,957,30.48
+1,957,15.24
+1,957,7.62
+1,957,15.24
+1,957,63.5
+1,957,27.94
+1,957,10.16
+1,958,40.64
+1,958,44.45
+1,958,40.64
+1,958,40.64
+1,958,55.88
+1,958,45.72
+1,958,35.56
+1,958,55.88
+1,958,27.94
+1,958,7.62
+1,958,33.02
+1,958,45.72
+1,958,27.94
+1,958,45.72
+1,958,10.16
+1,958,22.86
+1,958,7.62
+1,958,35.56
+1,958,33.02
+1,958,19.05
+1,958,55.88
+1,958,40.64
+1,958,33.02
+1,958,35.56
+1,958,10.16
+1,958,24.13
+1,958,99.06
+1,958,33.02
+1,958,45.72
+1,958,30.48
+1,959,53.975
+1,959,27.94
+1,959,7.62
+1,959,46.355
+1,959,53.975
+1,959,55.88
+1,959,19.05
+1,959,45.72
+1,959,7.62
+1,959,22.86
+1,959,53.975
+1,959,33.02
+1,959,15.24
+1,959,33.02
+1,959,35.56
+1,959,7.62
+1,959,33.02
+1,959,45.72
+1,959,30.48
+1,959,45.72
+1,959,15.24
+1,959,99.06
+1,959,53.975
+1,959,50.8
+1,959,15.24
+1,959,44.45
+1,959,46.355
+1,959,40.64
+1,959,19.05
+1,959,33.02
+1,960,35.56
+1,960,7.62
+1,960,33.02
+1,960,7.62
+1,960,81.28
+1,960,22.86
+1,960,10.16
+1,960,99.06
+1,960,7.62
+1,960,7.62
+1,960,24.13
+1,960,33.02
+1,960,35.56
+1,960,50.8
+1,960,63.5
+1,960,15.24
+1,960,24.13
+1,960,35.56
+1,960,35.56
+1,960,19.05
+1,960,27.94
+1,960,53.975
+1,960,19.05
+1,960,27.94
+1,960,24.13
+1,960,27.94
+1,960,27.94
+1,960,10.16
+1,960,30.48
+1,960,40.64
+1,961,22.86
+1,961,19.05
+1,961,99.06
+1,961,99.06
+1,961,50.8
+1,961,63.5
+1,961,35.56
+1,961,35.56
+1,961,33.02
+1,961,63.5
+1,961,7.62
+1,961,22.86
+1,961,46.355
+1,961,7.62
+1,961,10.16
+1,961,46.355
+1,961,10.16
+1,961,19.05
+1,961,33.02
+1,961,40.64
+1,961,63.5
+1,961,53.975
+1,961,10.16
+1,961,7.62
+1,961,19.05
+1,961,33.02
+1,961,22.86
+1,961,10.16
+1,961,99.06
+1,961,33.02
+1,962,33.02
+1,962,40.64
+1,962,7.62
+1,962,10.16
+1,962,22.86
+1,962,24.13
+1,962,35.56
+1,962,10.16
+1,962,81.28
+1,962,30.48
+1,962,10.16
+1,962,35.56
+1,962,8.89
+1,962,7.62
+1,962,7.62
+1,962,8.89
+1,962,33.02
+1,962,22.86
+1,962,10.16
+1,962,8.89
+1,962,33.02
+1,962,15.24
+1,962,46.355
+1,962,50.8
+1,962,99.06
+1,962,7.62
+1,962,50.8
+1,962,7.62
+1,962,10.16
+1,962,40.64
+1,963,40.64
+1,963,10.16
+1,963,7.62
+1,963,50.8
+1,963,33.02
+1,963,46.355
+1,963,35.56
+1,963,10.16
+1,963,7.62
+1,963,22.86
+1,963,81.28
+1,963,50.8
+1,963,81.28
+1,963,35.56
+1,963,35.56
+1,963,33.02
+1,963,63.5
+1,963,33.02
+1,963,81.28
+1,963,99.06
+1,963,10.16
+1,963,10.16
+1,963,35.56
+1,963,30.48
+1,963,46.355
+1,963,81.28
+1,963,45.72
+1,963,33.02
+1,963,46.355
+1,963,55.88
+1,964,7.62
+1,964,33.02
+1,964,40.64
+1,964,35.56
+1,964,7.62
+1,964,40.64
+1,964,45.72
+1,964,99.06
+1,964,10.16
+1,964,7.62
+1,964,24.13
+1,964,15.24
+1,964,7.62
+1,964,27.94
+1,964,24.13
+1,964,7.62
+1,964,30.48
+1,964,10.16
+1,964,53.975
+1,964,8.89
+1,964,27.94
+1,964,45.72
+1,964,40.64
+1,964,8.89
+1,964,46.355
+1,964,99.06
+1,964,40.64
+1,964,46.355
+1,964,24.13
+1,964,45.72
+1,965,10.16
+1,965,7.62
+1,965,7.62
+1,965,10.16
+1,965,7.62
+1,965,50.8
+1,965,99.06
+1,965,7.62
+1,965,27.94
+1,965,45.72
+1,965,7.62
+1,965,40.64
+1,965,22.86
+1,965,63.5
+1,965,55.88
+1,965,53.975
+1,965,7.62
+1,965,63.5
+1,965,19.05
+1,965,53.975
+1,965,22.86
+1,965,53.975
+1,965,44.45
+1,965,53.975
+1,965,15.24
+1,965,33.02
+1,965,63.5
+1,965,40.64
+1,965,55.88
+1,965,33.02
+1,966,10.16
+1,966,99.06
+1,966,33.02
+1,966,10.16
+1,966,35.56
+1,966,81.28
+1,966,24.13
+1,966,30.48
+1,966,7.62
+1,966,53.975
+1,966,7.62
+1,966,99.06
+1,966,63.5
+1,966,45.72
+1,966,15.24
+1,966,63.5
+1,966,7.62
+1,966,30.48
+1,966,63.5
+1,966,7.62
+1,966,10.16
+1,966,33.02
+1,966,35.56
+1,966,7.62
+1,966,19.05
+1,966,27.94
+1,966,10.16
+1,966,33.02
+1,966,55.88
+1,966,50.8
+1,967,46.355
+1,967,46.355
+1,967,99.06
+1,967,7.62
+1,967,7.62
+1,967,81.28
+1,967,40.64
+1,967,44.45
+1,967,33.02
+1,967,19.05
+1,967,15.24
+1,967,22.86
+1,967,40.64
+1,967,35.56
+1,967,7.62
+1,967,35.56
+1,967,81.28
+1,967,40.64
+1,967,24.13
+1,967,10.16
+1,967,19.05
+1,967,81.28
+1,967,40.64
+1,967,19.05
+1,967,44.45
+1,967,40.64
+1,967,30.48
+1,967,46.355
+1,967,24.13
+1,967,10.16
+1,968,53.975
+1,968,35.56
+1,968,55.88
+1,968,7.62
+1,968,30.48
+1,968,30.48
+1,968,33.02
+1,968,45.72
+1,968,33.02
+1,968,30.48
+1,968,10.16
+1,968,53.975
+1,968,33.02
+1,968,24.13
+1,968,10.16
+1,968,99.06
+1,968,81.28
+1,968,40.64
+1,968,7.62
+1,968,15.24
+1,968,44.45
+1,968,35.56
+1,968,81.28
+1,968,33.02
+1,968,33.02
+1,968,7.62
+1,968,33.02
+1,968,10.16
+1,968,33.02
+1,968,33.02
+1,969,24.13
+1,969,10.16
+1,969,33.02
+1,969,40.64
+1,969,30.48
+1,969,33.02
+1,969,81.28
+1,969,27.94
+1,969,46.355
+1,969,63.5
+1,969,7.62
+1,969,7.62
+1,969,7.62
+1,969,27.94
+1,969,33.02
+1,969,7.62
+1,969,7.62
+1,969,63.5
+1,969,19.05
+1,969,35.56
+1,969,55.88
+1,969,24.13
+1,969,81.28
+1,969,33.02
+1,969,63.5
+1,969,35.56
+1,969,22.86
+1,969,99.06
+1,969,40.64
+1,969,19.05
+1,970,35.56
+1,970,40.64
+1,970,7.62
+1,970,7.62
+1,970,24.13
+1,970,40.64
+1,970,10.16
+1,970,15.24
+1,970,40.64
+1,970,30.48
+1,970,19.05
+1,970,30.48
+1,970,50.8
+1,970,46.355
+1,970,7.62
+1,970,81.28
+1,970,55.88
+1,970,33.02
+1,970,7.62
+1,970,30.48
+1,970,40.64
+1,970,45.72
+1,970,40.64
+1,970,24.13
+1,970,63.5
+1,970,46.355
+1,970,24.13
+1,970,55.88
+1,970,15.24
+1,970,30.48
+1,971,8.89
+1,971,15.24
+1,971,33.02
+1,971,7.62
+1,971,45.72
+1,971,7.62
+1,971,44.45
+1,971,35.56
+1,971,24.13
+1,971,46.355
+1,971,10.16
+1,971,63.5
+1,971,7.62
+1,971,33.02
+1,971,45.72
+1,971,40.64
+1,971,33.02
+1,971,27.94
+1,971,63.5
+1,971,53.975
+1,971,33.02
+1,971,24.13
+1,971,46.355
+1,971,50.8
+1,971,7.62
+1,971,45.72
+1,971,7.62
+1,971,33.02
+1,971,55.88
+1,971,7.62
+1,972,24.13
+1,972,33.02
+1,972,30.48
+1,972,35.56
+1,972,44.45
+1,972,30.48
+1,972,50.8
+1,972,35.56
+1,972,53.975
+1,972,10.16
+1,972,27.94
+1,972,7.62
+1,972,40.64
+1,972,99.06
+1,972,22.86
+1,972,24.13
+1,972,10.16
+1,972,7.62
+1,972,33.02
+1,972,35.56
+1,972,15.24
+1,972,35.56
+1,972,10.16
+1,972,81.28
+1,972,35.56
+1,972,19.05
+1,972,10.16
+1,972,7.62
+1,972,35.56
+1,972,81.28
+1,973,99.06
+1,973,7.62
+1,973,7.62
+1,973,81.28
+1,973,35.56
+1,973,24.13
+1,973,35.56
+1,973,33.02
+1,973,19.05
+1,973,15.24
+1,973,53.975
+1,973,99.06
+1,973,99.06
+1,973,8.89
+1,973,7.62
+1,973,50.8
+1,973,40.64
+1,973,24.13
+1,973,45.72
+1,973,99.06
+1,973,27.94
+1,973,7.62
+1,973,35.56
+1,973,33.02
+1,973,81.28
+1,973,50.8
+1,973,7.62
+1,973,7.62
+1,973,99.06
+1,973,40.64
+1,974,24.13
+1,974,45.72
+1,974,24.13
+1,974,15.24
+1,974,63.5
+1,974,30.48
+1,974,99.06
+1,974,30.48
+1,974,24.13
+1,974,35.56
+1,974,63.5
+1,974,99.06
+1,974,24.13
+1,974,33.02
+1,974,40.64
+1,974,46.355
+1,974,30.48
+1,974,7.62
+1,974,40.64
+1,974,27.94
+1,974,33.02
+1,974,53.975
+1,974,50.8
+1,974,7.62
+1,974,81.28
+1,974,8.89
+1,974,35.56
+1,974,44.45
+1,974,35.56
+1,974,7.62
+1,975,63.5
+1,975,15.24
+1,975,63.5
+1,975,7.62
+1,975,7.62
+1,975,19.05
+1,975,10.16
+1,975,27.94
+1,975,7.62
+1,975,10.16
+1,975,7.62
+1,975,53.975
+1,975,63.5
+1,975,33.02
+1,975,50.8
+1,975,40.64
+1,975,63.5
+1,975,46.355
+1,975,7.62
+1,975,44.45
+1,975,24.13
+1,975,35.56
+1,975,40.64
+1,975,53.975
+1,975,7.62
+1,975,10.16
+1,975,10.16
+1,975,19.05
+1,975,19.05
+1,975,50.8
+1,976,55.88
+1,976,7.62
+1,976,7.62
+1,976,22.86
+1,976,63.5
+1,976,44.45
+1,976,33.02
+1,976,33.02
+1,976,7.62
+1,976,22.86
+1,976,22.86
+1,976,99.06
+1,976,33.02
+1,976,7.62
+1,976,7.62
+1,976,33.02
+1,976,7.62
+1,976,24.13
+1,976,30.48
+1,976,53.975
+1,976,55.88
+1,976,15.24
+1,976,30.48
+1,976,40.64
+1,976,35.56
+1,976,7.62
+1,976,24.13
+1,976,19.05
+1,976,7.62
+1,976,40.64
+1,977,40.64
+1,977,53.975
+1,977,8.89
+1,977,46.355
+1,977,30.48
+1,977,33.02
+1,977,33.02
+1,977,40.64
+1,977,19.05
+1,977,33.02
+1,977,99.06
+1,977,22.86
+1,977,99.06
+1,977,7.62
+1,977,7.62
+1,977,40.64
+1,977,33.02
+1,977,35.56
+1,977,15.24
+1,977,7.62
+1,977,40.64
+1,977,7.62
+1,977,33.02
+1,977,19.05
+1,977,55.88
+1,977,46.355
+1,977,7.62
+1,977,7.62
+1,977,30.48
+1,977,53.975
+1,978,8.89
+1,978,33.02
+1,978,7.62
+1,978,53.975
+1,978,44.45
+1,978,33.02
+1,978,7.62
+1,978,19.05
+1,978,33.02
+1,978,35.56
+1,978,22.86
+1,978,35.56
+1,978,46.355
+1,978,19.05
+1,978,55.88
+1,978,40.64
+1,978,40.64
+1,978,15.24
+1,978,7.62
+1,978,7.62
+1,978,10.16
+1,978,30.48
+1,978,40.64
+1,978,35.56
+1,978,7.62
+1,978,35.56
+1,978,10.16
+1,978,33.02
+1,978,30.48
+1,978,27.94
+1,979,27.94
+1,979,55.88
+1,979,35.56
+1,979,15.24
+1,979,30.48
+1,979,10.16
+1,979,33.02
+1,979,35.56
+1,979,19.05
+1,979,35.56
+1,979,7.62
+1,979,35.56
+1,979,44.45
+1,979,7.62
+1,979,24.13
+1,979,40.64
+1,979,24.13
+1,979,35.56
+1,979,24.13
+1,979,50.8
+1,979,55.88
+1,979,24.13
+1,979,10.16
+1,979,30.48
+1,979,35.56
+1,979,7.62
+1,979,27.94
+1,979,22.86
+1,979,50.8
+1,979,40.64
+1,980,50.8
+1,980,7.62
+1,980,46.355
+1,980,10.16
+1,980,55.88
+1,980,7.62
+1,980,50.8
+1,980,10.16
+1,980,19.05
+1,980,33.02
+1,980,46.355
+1,980,10.16
+1,980,35.56
+1,980,46.355
+1,980,7.62
+1,980,19.05
+1,980,7.62
+1,980,27.94
+1,980,19.05
+1,980,7.62
+1,980,33.02
+1,980,63.5
+1,980,30.48
+1,980,7.62
+1,980,53.975
+1,980,27.94
+1,980,33.02
+1,980,53.975
+1,980,35.56
+1,980,27.94
+1,981,8.89
+1,981,46.355
+1,981,40.64
+1,981,55.88
+1,981,50.8
+1,981,30.48
+1,981,53.975
+1,981,46.355
+1,981,45.72
+1,981,35.56
+1,981,19.05
+1,981,33.02
+1,981,27.94
+1,981,33.02
+1,981,50.8
+1,981,7.62
+1,981,33.02
+1,981,27.94
+1,981,27.94
+1,981,27.94
+1,981,27.94
+1,981,10.16
+1,981,99.06
+1,981,7.62
+1,981,7.62
+1,981,15.24
+1,981,24.13
+1,981,53.975
+1,981,40.64
+1,981,8.89
+1,982,10.16
+1,982,81.28
+1,982,33.02
+1,982,10.16
+1,982,24.13
+1,982,33.02
+1,982,53.975
+1,982,35.56
+1,982,35.56
+1,982,24.13
+1,982,81.28
+1,982,33.02
+1,982,33.02
+1,982,55.88
+1,982,7.62
+1,982,7.62
+1,982,50.8
+1,982,45.72
+1,982,15.24
+1,982,19.05
+1,982,22.86
+1,982,33.02
+1,982,53.975
+1,982,55.88
+1,982,15.24
+1,982,55.88
+1,982,10.16
+1,982,35.56
+1,982,53.975
+1,982,7.62
+1,983,10.16
+1,983,33.02
+1,983,53.975
+1,983,99.06
+1,983,15.24
+1,983,44.45
+1,983,40.64
+1,983,35.56
+1,983,27.94
+1,983,10.16
+1,983,22.86
+1,983,19.05
+1,983,35.56
+1,983,46.355
+1,983,10.16
+1,983,30.48
+1,983,35.56
+1,983,24.13
+1,983,15.24
+1,983,8.89
+1,983,81.28
+1,983,24.13
+1,983,24.13
+1,983,33.02
+1,983,55.88
+1,983,8.89
+1,983,44.45
+1,983,7.62
+1,983,35.56
+1,983,53.975
+1,984,22.86
+1,984,63.5
+1,984,8.89
+1,984,7.62
+1,984,33.02
+1,984,7.62
+1,984,99.06
+1,984,33.02
+1,984,19.05
+1,984,33.02
+1,984,10.16
+1,984,7.62
+1,984,40.64
+1,984,50.8
+1,984,10.16
+1,984,55.88
+1,984,27.94
+1,984,10.16
+1,984,15.24
+1,984,33.02
+1,984,30.48
+1,984,7.62
+1,984,44.45
+1,984,44.45
+1,984,35.56
+1,984,24.13
+1,984,33.02
+1,984,35.56
+1,984,15.24
+1,984,22.86
+1,985,44.45
+1,985,15.24
+1,985,33.02
+1,985,99.06
+1,985,30.48
+1,985,27.94
+1,985,33.02
+1,985,44.45
+1,985,7.62
+1,985,15.24
+1,985,27.94
+1,985,35.56
+1,985,7.62
+1,985,35.56
+1,985,27.94
+1,985,81.28
+1,985,50.8
+1,985,27.94
+1,985,7.62
+1,985,10.16
+1,985,7.62
+1,985,10.16
+1,985,53.975
+1,985,33.02
+1,985,33.02
+1,985,45.72
+1,985,50.8
+1,985,19.05
+1,985,7.62
+1,985,35.56
+1,986,7.62
+1,986,10.16
+1,986,27.94
+1,986,33.02
+1,986,30.48
+1,986,27.94
+1,986,40.64
+1,986,24.13
+1,986,8.89
+1,986,63.5
+1,986,55.88
+1,986,10.16
+1,986,45.72
+1,986,50.8
+1,986,63.5
+1,986,33.02
+1,986,8.89
+1,986,33.02
+1,986,7.62
+1,986,44.45
+1,986,24.13
+1,986,24.13
+1,986,27.94
+1,986,35.56
+1,986,33.02
+1,986,7.62
+1,986,63.5
+1,986,33.02
+1,986,10.16
+1,986,99.06
+1,987,10.16
+1,987,35.56
+1,987,63.5
+1,987,44.45
+1,987,33.02
+1,987,15.24
+1,987,40.64
+1,987,7.62
+1,987,63.5
+1,987,10.16
+1,987,7.62
+1,987,33.02
+1,987,7.62
+1,987,7.62
+1,987,10.16
+1,987,27.94
+1,987,33.02
+1,987,7.62
+1,987,40.64
+1,987,45.72
+1,987,63.5
+1,987,63.5
+1,987,81.28
+1,987,7.62
+1,987,99.06
+1,987,10.16
+1,987,55.88
+1,987,99.06
+1,987,10.16
+1,987,7.62
+1,988,53.975
+1,988,7.62
+1,988,46.355
+1,988,24.13
+1,988,45.72
+1,988,10.16
+1,988,33.02
+1,988,33.02
+1,988,7.62
+1,988,7.62
+1,988,46.355
+1,988,8.89
+1,988,7.62
+1,988,7.62
+1,988,50.8
+1,988,53.975
+1,988,33.02
+1,988,53.975
+1,988,55.88
+1,988,50.8
+1,988,33.02
+1,988,27.94
+1,988,35.56
+1,988,22.86
+1,988,46.355
+1,988,63.5
+1,988,7.62
+1,988,35.56
+1,988,45.72
+1,988,46.355
+1,989,10.16
+1,989,10.16
+1,989,50.8
+1,989,33.02
+1,989,30.48
+1,989,7.62
+1,989,50.8
+1,989,8.89
+1,989,45.72
+1,989,33.02
+1,989,35.56
+1,989,22.86
+1,989,7.62
+1,989,55.88
+1,989,7.62
+1,989,10.16
+1,989,40.64
+1,989,33.02
+1,989,19.05
+1,989,27.94
+1,989,55.88
+1,989,30.48
+1,989,33.02
+1,989,10.16
+1,989,55.88
+1,989,7.62
+1,989,7.62
+1,989,50.8
+1,989,46.355
+1,989,33.02
+1,990,7.62
+1,990,53.975
+1,990,30.48
+1,990,15.24
+1,990,7.62
+1,990,81.28
+1,990,24.13
+1,990,33.02
+1,990,10.16
+1,990,44.45
+1,990,27.94
+1,990,44.45
+1,990,24.13
+1,990,63.5
+1,990,40.64
+1,990,15.24
+1,990,7.62
+1,990,46.355
+1,990,7.62
+1,990,55.88
+1,990,7.62
+1,990,7.62
+1,990,8.89
+1,990,24.13
+1,990,10.16
+1,990,10.16
+1,990,7.62
+1,990,50.8
+1,990,45.72
+1,990,19.05
+1,991,63.5
+1,991,10.16
+1,991,7.62
+1,991,15.24
+1,991,63.5
+1,991,55.88
+1,991,63.5
+1,991,55.88
+1,991,46.355
+1,991,7.62
+1,991,19.05
+1,991,35.56
+1,991,35.56
+1,991,7.62
+1,991,19.05
+1,991,46.355
+1,991,15.24
+1,991,81.28
+1,991,44.45
+1,991,45.72
+1,991,7.62
+1,991,15.24
+1,991,33.02
+1,991,7.62
+1,991,63.5
+1,991,35.56
+1,991,33.02
+1,991,45.72
+1,991,46.355
+1,991,10.16
+1,992,33.02
+1,992,7.62
+1,992,53.975
+1,992,99.06
+1,992,15.24
+1,992,99.06
+1,992,7.62
+1,992,7.62
+1,992,24.13
+1,992,7.62
+1,992,63.5
+1,992,33.02
+1,992,27.94
+1,992,46.355
+1,992,19.05
+1,992,33.02
+1,992,46.355
+1,992,45.72
+1,992,53.975
+1,992,55.88
+1,992,35.56
+1,992,10.16
+1,992,7.62
+1,992,7.62
+1,992,27.94
+1,992,22.86
+1,992,35.56
+1,992,7.62
+1,992,33.02
+1,992,7.62
+1,993,10.16
+1,993,35.56
+1,993,33.02
+1,993,30.48
+1,993,55.88
+1,993,7.62
+1,993,24.13
+1,993,7.62
+1,993,8.89
+1,993,35.56
+1,993,7.62
+1,993,35.56
+1,993,55.88
+1,993,7.62
+1,993,10.16
+1,993,40.64
+1,993,33.02
+1,993,81.28
+1,993,33.02
+1,993,99.06
+1,993,24.13
+1,993,30.48
+1,993,53.975
+1,993,7.62
+1,993,19.05
+1,993,81.28
+1,993,55.88
+1,993,40.64
+1,993,63.5
+1,993,27.94
+1,994,46.355
+1,994,33.02
+1,994,33.02
+1,994,22.86
+1,994,7.62
+1,994,40.64
+1,994,45.72
+1,994,15.24
+1,994,7.62
+1,994,10.16
+1,994,46.355
+1,994,44.45
+1,994,27.94
+1,994,30.48
+1,994,27.94
+1,994,7.62
+1,994,10.16
+1,994,8.89
+1,994,35.56
+1,994,10.16
+1,994,30.48
+1,994,19.05
+1,994,7.62
+1,994,99.06
+1,994,27.94
+1,994,33.02
+1,994,63.5
+1,994,81.28
+1,994,53.975
+1,994,15.24
+1,995,22.86
+1,995,19.05
+1,995,44.45
+1,995,40.64
+1,995,22.86
+1,995,63.5
+1,995,33.02
+1,995,7.62
+1,995,55.88
+1,995,40.64
+1,995,81.28
+1,995,15.24
+1,995,44.45
+1,995,45.72
+1,995,33.02
+1,995,30.48
+1,995,30.48
+1,995,7.62
+1,995,33.02
+1,995,30.48
+1,995,7.62
+1,995,7.62
+1,995,35.56
+1,995,7.62
+1,995,27.94
+1,995,99.06
+1,995,7.62
+1,995,40.64
+1,995,99.06
+1,995,7.62
+1,996,19.05
+1,996,15.24
+1,996,50.8
+1,996,81.28
+1,996,8.89
+1,996,33.02
+1,996,99.06
+1,996,15.24
+1,996,81.28
+1,996,33.02
+1,996,40.64
+1,996,44.45
+1,996,10.16
+1,996,19.05
+1,996,10.16
+1,996,81.28
+1,996,55.88
+1,996,50.8
+1,996,33.02
+1,996,40.64
+1,996,33.02
+1,996,7.62
+1,996,30.48
+1,996,81.28
+1,996,45.72
+1,996,15.24
+1,996,7.62
+1,996,8.89
+1,996,27.94
+1,996,33.02
+1,997,10.16
+1,997,50.8
+1,997,40.64
+1,997,10.16
+1,997,44.45
+1,997,7.62
+1,997,7.62
+1,997,7.62
+1,997,44.45
+1,997,15.24
+1,997,33.02
+1,997,8.89
+1,997,55.88
+1,997,30.48
+1,997,33.02
+1,997,81.28
+1,997,35.56
+1,997,7.62
+1,997,33.02
+1,997,46.355
+1,997,99.06
+1,997,30.48
+1,997,8.89
+1,997,24.13
+1,997,22.86
+1,997,44.45
+1,997,7.62
+1,997,33.02
+1,997,45.72
+1,997,7.62
+1,998,7.62
+1,998,50.8
+1,998,8.89
+1,998,19.05
+1,998,45.72
+1,998,99.06
+1,998,99.06
+1,998,33.02
+1,998,45.72
+1,998,7.62
+1,998,46.355
+1,998,7.62
+1,998,10.16
+1,998,27.94
+1,998,53.975
+1,998,10.16
+1,998,45.72
+1,998,24.13
+1,998,30.48
+1,998,10.16
+1,998,50.8
+1,998,33.02
+1,998,53.975
+1,998,7.62
+1,998,8.89
+1,998,30.48
+1,998,8.89
+1,998,63.5
+1,998,53.975
+1,998,7.62
+1,999,53.975
+1,999,81.28
+1,999,7.62
+1,999,24.13
+1,999,46.355
+1,999,7.62
+1,999,30.48
+1,999,33.02
+1,999,10.16
+1,999,46.355
+1,999,19.05
+1,999,40.64
+1,999,55.88
+1,999,24.13
+1,999,30.48
+1,999,33.02
+1,999,99.06
+1,999,33.02
+1,999,53.975
+1,999,44.45
+1,999,33.02
+1,999,40.64
+1,999,27.94
+1,999,33.02
+1,999,7.62
+1,999,24.13
+1,999,8.89
+1,999,10.16
+1,999,7.62
+1,999,22.86
+1,1000,10.16
+1,1000,15.24
+1,1000,46.355
+1,1000,10.16
+1,1000,8.89
+1,1000,53.975
+1,1000,55.88
+1,1000,24.13
+1,1000,40.64
+1,1000,30.48
+1,1000,10.16
+1,1000,7.62
+1,1000,7.62
+1,1000,10.16
+1,1000,40.64
+1,1000,99.06
+1,1000,55.88
+1,1000,40.64
+1,1000,50.8
+1,1000,7.62
+1,1000,50.8
+1,1000,81.28
+1,1000,10.16
+1,1000,35.56
+1,1000,63.5
+1,1000,24.13
+1,1000,27.94
+1,1000,55.88
+1,1000,44.45
+1,1000,27.94
diff --git a/materials/worksheet_04/generate_estimates_worksheet_04.R b/materials/worksheet_04/generate_estimates_worksheet_04.R
new file mode 100644
index 0000000..75ad2a6
--- /dev/null
+++ b/materials/worksheet_04/generate_estimates_worksheet_04.R
@@ -0,0 +1,45 @@
+library(datateachr)
+library(infer)
+library(repr)
+library(tidyverse)
+
+set.seed(0756)
+
+# This script is used to generate the data frames used in section 3.
+
+sunset_pop <- vancouver_trees %>%
+ filter(neighbourhood_name == "SUNSET") %>%
+ select(diameter) %>%
+ mutate(diameter = diameter * 2.54)
+
+generate_bootstrap_samples <- function(sample) {
+ sample %>%
+ rep_sample_n(reps = 1000, size = nrow(sample), replace = TRUE) %>%
+ ungroup()
+}
+
+compute_bootstrap_means <- function(bootstrap_sample) {
+ bootstrap_sample %>%
+ group_by(replicate) %>%
+ summarize(bootstrap_mean = mean(diameter), .groups = "drop")
+}
+
+sunset_bootstrap_means <- sunset_pop %>%
+ rep_sample_n(size = 30, reps = 100, replace = FALSE) %>%
+ nest() %>%
+ ungroup() %>%
+ rename(sample = data) %>%
+ rename(sample_id = replicate) %>%
+ mutate(bootstrap_samples = map(sample, generate_bootstrap_samples)) %>%
+ mutate(bootstrap_means = map(bootstrap_samples, compute_bootstrap_means))
+
+bootstrap_samples <- sunset_bootstrap_means %>%
+ select(sample_id, bootstrap_samples) %>%
+ unnest(bootstrap_samples) %>%
+ filter(sample_id == 1)
+write.csv(bootstrap_samples, "bootstrap_samples.csv", row.names = FALSE)
+
+sampling_dist_estimates <- sunset_bootstrap_means %>%
+ select(sample_id, bootstrap_means) %>%
+ unnest(bootstrap_means)
+write.csv(sampling_dist_estimates, "sampling_dist_estimates.csv", row.names = FALSE)
\ No newline at end of file
diff --git a/materials/worksheet_04/sampling_dist_estimates.csv b/materials/worksheet_04/sampling_dist_estimates.csv
new file mode 100644
index 0000000..df3f055
--- /dev/null
+++ b/materials/worksheet_04/sampling_dist_estimates.csv
@@ -0,0 +1,100001 @@
+"sample_id","replicate","bootstrap_mean"
+1,1,37.6131666666667
+1,2,36.83
+1,3,30.607
+1,4,33.401
+1,5,26.2466666666667
+1,6,31.0515
+1,7,28.6596666666667
+1,8,28.321
+1,9,31.1996666666667
+1,10,32.5331666666667
+1,11,41.1691666666667
+1,12,38.9043333333333
+1,13,38.1211666666667
+1,14,38.8831666666667
+1,15,21.5476666666667
+1,16,36.4701666666667
+1,17,33.5703333333333
+1,18,37.9095
+1,19,35.433
+1,20,29.464
+1,21,37.3591666666667
+1,22,28.0881666666667
+1,23,28.1728333333333
+1,24,32.004
+1,25,32.639
+1,26,42.2063333333333
+1,27,35.6023333333333
+1,28,36.5548333333333
+1,29,32.258
+1,30,34.2053333333333
+1,31,36.8935
+1,32,26.5006666666667
+1,33,38.1
+1,34,36.4701666666667
+1,35,37.7613333333333
+1,36,27.3473333333333
+1,37,33.02
+1,38,35.2001666666667
+1,39,26.5006666666667
+1,40,38.6291666666667
+1,41,32.893
+1,42,38.3751666666667
+1,43,29.845
+1,44,40.1108333333333
+1,45,33.3375
+1,46,33.274
+1,47,40.64
+1,48,28.5961666666667
+1,49,37.5708333333333
+1,50,33.9936666666667
+1,51,26.9028333333333
+1,52,36.2585
+1,53,31.7923333333333
+1,54,20.6163333333333
+1,55,28.067
+1,56,31.5595
+1,57,25.8445
+1,58,34.9673333333333
+1,59,32.3003333333333
+1,60,29.718
+1,61,26.7546666666667
+1,62,38.3751666666667
+1,63,34.0783333333333
+1,64,38.8408333333333
+1,65,32.3003333333333
+1,66,35.1155
+1,67,35.3483333333333
+1,68,30.0778333333333
+1,69,30.9456666666667
+1,70,36.195
+1,71,29.5275
+1,72,30.353
+1,73,33.274
+1,74,30.8186666666667
+1,75,28.1305
+1,76,32.8718333333333
+1,77,35.8775
+1,78,39.0525
+1,79,26.0561666666667
+1,80,33.1681666666667
+1,81,30.5646666666667
+1,82,35.7505
+1,83,28.8925
+1,84,33.274
+1,85,33.6973333333333
+1,86,34.6921666666667
+1,87,32.0251666666667
+1,88,32.6601666666667
+1,89,31.4536666666667
+1,90,31.4113333333333
+1,91,34.0148333333333
+1,92,39.116
+1,93,35.6446666666667
+1,94,27.432
+1,95,32.385
+1,96,29.9931666666667
+1,97,37.3168333333333
+1,98,28.2575
+1,99,33.782
+1,100,33.4645
+1,101,27.0933333333333
+1,102,33.147
+1,103,28.6596666666667
+1,104,32.9141666666667
+1,105,32.4696666666667
+1,106,35.179
+1,107,30.3318333333333
+1,108,31.6441666666667
+1,109,31.0938333333333
+1,110,41.3173333333333
+1,111,36.576
+1,112,38.7561666666667
+1,113,31.0726666666667
+1,114,27.5166666666667
+1,115,37.8671666666667
+1,116,29.9931666666667
+1,117,31.2843333333333
+1,118,36.2796666666667
+1,119,32.8083333333333
+1,120,37.6131666666667
+1,121,39.4335
+1,122,32.4696666666667
+1,123,27.4108333333333
+1,124,32.9988333333333
+1,125,37.2321666666667
+1,126,35.1578333333333
+1,127,29.9085
+1,128,34.3958333333333
+1,129,37.846
+1,130,34.671
+1,131,33.3163333333333
+1,132,29.718
+1,133,41.0421666666667
+1,134,36.1315
+1,135,32.9141666666667
+1,136,37.8883333333333
+1,137,38.6291666666667
+1,138,38.7561666666667
+1,139,29.8873333333333
+1,140,32.4061666666667
+1,141,34.798
+1,142,34.036
+1,143,26.2466666666667
+1,144,29.9931666666667
+1,145,38.3963333333333
+1,146,36.2161666666667
+1,147,33.8243333333333
+1,148,29.7603333333333
+1,149,32.9565
+1,150,35.9198333333333
+1,151,34.5016666666667
+1,152,36.0468333333333
+1,153,31.5595
+1,154,31.4325
+1,155,26.2043333333333
+1,156,35.8986666666667
+1,157,33.1893333333333
+1,158,32.9353333333333
+1,159,26.6488333333333
+1,160,28.3421666666667
+1,161,32.5331666666667
+1,162,25.3576666666667
+1,163,35.5811666666667
+1,164,32.2156666666667
+1,165,39.3911666666667
+1,166,32.6813333333333
+1,167,32.385
+1,168,40.3013333333333
+1,169,29.9296666666667
+1,170,35.3906666666667
+1,171,36.576
+1,172,32.6601666666667
+1,173,32.6178333333333
+1,174,36.2796666666667
+1,175,34.9673333333333
+1,176,38.4175
+1,177,37.1051666666667
+1,178,35.7505
+1,179,31.2631666666667
+1,180,30.4376666666667
+1,181,31.0938333333333
+1,182,35.56
+1,183,30.0355
+1,184,36.3008333333333
+1,185,33.2951666666667
+1,186,28.6385
+1,187,34.0571666666667
+1,188,30.9456666666667
+1,189,27.0721666666667
+1,190,27.5166666666667
+1,191,30.0778333333333
+1,192,34.6075
+1,193,38.2058333333333
+1,194,40.9363333333333
+1,195,31.2208333333333
+1,196,33.4856666666667
+1,197,33.02
+1,198,37.1898333333333
+1,199,32.4908333333333
+1,200,28.8925
+1,201,40.1955
+1,202,37.7825
+1,203,28.5326666666667
+1,204,34.925
+1,205,37.338
+1,206,35.8775
+1,207,28.3845
+1,208,21.5688333333333
+1,209,32.893
+1,210,29.972
+1,211,29.4428333333333
+1,212,37.1051666666667
+1,213,35.0308333333333
+1,214,28.448
+1,215,35.6446666666667
+1,216,33.3375
+1,217,31.9193333333333
+1,218,29.8026666666667
+1,219,33.0411666666667
+1,220,32.0886666666667
+1,221,32.131
+1,222,28.067
+1,223,36.0045
+1,224,27.1991666666667
+1,225,25.8021666666667
+1,226,32.1521666666667
+1,227,33.5491666666667
+1,228,27.8765
+1,229,34.036
+1,230,27.432
+1,231,26.9028333333333
+1,232,34.7556666666667
+1,233,32.4485
+1,234,34.8615
+1,235,36.7453333333333
+1,236,32.6601666666667
+1,237,32.4908333333333
+1,238,31.0303333333333
+1,239,44.0266666666667
+1,240,33.401
+1,241,30.3953333333333
+1,242,42.7143333333333
+1,243,30.6705
+1,244,34.3323333333333
+1,245,30.8398333333333
+1,246,36.2373333333333
+1,247,33.9513333333333
+1,248,33.6126666666667
+1,249,33.6761666666667
+1,250,32.1098333333333
+1,251,26.9451666666667
+1,252,36.7665
+1,253,34.29
+1,254,35.9198333333333
+1,255,34.8191666666667
+1,256,30.3106666666667
+1,257,30.734
+1,258,39.5181666666667
+1,259,29.2311666666667
+1,260,29.1888333333333
+1,261,32.131
+1,262,35.0096666666667
+1,263,30.7128333333333
+1,264,28.0035
+1,265,34.3111666666667
+1,266,36.5971666666667
+1,267,35.4541666666667
+1,268,37.211
+1,269,23.4103333333333
+1,270,31.496
+1,271,29.4851666666667
+1,272,43.0953333333333
+1,273,32.6813333333333
+1,274,31.7076666666667
+1,275,39.751
+1,276,34.8826666666667
+1,277,34.6075
+1,278,24.6803333333333
+1,279,32.6601666666667
+1,280,39.7933333333333
+1,281,28.6596666666667
+1,282,31.5383333333333
+1,283,36.2585
+1,284,33.7396666666667
+1,285,36.1103333333333
+1,286,33.0835
+1,287,39.3488333333333
+1,288,35.4118333333333
+1,289,38.9678333333333
+1,290,33.0411666666667
+1,291,34.4805
+1,292,36.0256666666667
+1,293,33.4221666666667
+1,294,40.5341666666667
+1,295,37.211
+1,296,30.1625
+1,297,34.5651666666667
+1,298,30.0778333333333
+1,299,33.3163333333333
+1,300,37.4226666666667
+1,301,39.116
+1,302,29.1253333333333
+1,303,37.211
+1,304,35.3906666666667
+1,305,30.7128333333333
+1,306,28.5115
+1,307,34.8191666666667
+1,308,39.1795
+1,309,38.3751666666667
+1,310,32.8083333333333
+1,311,41.3808333333333
+1,312,34.6286666666667
+1,313,33.3586666666667
+1,314,30.6281666666667
+1,315,36.7241666666667
+1,316,32.5331666666667
+1,317,30.5011666666667
+1,318,39.3065
+1,319,31.9828333333333
+1,320,41.5925
+1,321,33.6126666666667
+1,322,31.8981666666667
+1,323,29.21
+1,324,31.369
+1,325,32.2156666666667
+1,326,40.3225
+1,327,33.782
+1,328,30.5435
+1,329,32.0886666666667
+1,330,34.036
+1,331,27.3896666666667
+1,332,37.6343333333333
+1,333,31.877
+1,334,37.8883333333333
+1,335,32.1098333333333
+1,336,30.0143333333333
+1,337,32.2368333333333
+1,338,29.972
+1,339,36.3008333333333
+1,340,26.924
+1,341,30.0143333333333
+1,342,36.8935
+1,343,28.0035
+1,344,28.8713333333333
+1,345,33.0835
+1,346,36.6606666666667
+1,347,30.1201666666667
+1,348,24.765
+1,349,28.6173333333333
+1,350,35.7716666666667
+1,351,36.2796666666667
+1,352,39.0101666666667
+1,353,35.3695
+1,354,39.0736666666667
+1,355,33.7396666666667
+1,356,34.9461666666667
+1,357,43.18
+1,358,24.765
+1,359,37.5496666666667
+1,360,34.7345
+1,361,32.8083333333333
+1,362,34.4381666666667
+1,363,32.0675
+1,364,39.3488333333333
+1,365,31.369
+1,366,34.4381666666667
+1,367,37.9306666666667
+1,368,34.4381666666667
+1,369,31.5806666666667
+1,370,38.0365
+1,371,37.8671666666667
+1,372,32.9776666666667
+1,373,28.0458333333333
+1,374,34.2476666666667
+1,375,30.0566666666667
+1,376,25.3153333333333
+1,377,31.9405
+1,378,27.1356666666667
+1,379,29.7603333333333
+1,380,40.1743333333333
+1,381,30.8186666666667
+1,382,28.9136666666667
+1,383,38.2481666666667
+1,384,30.9245
+1,385,29.4216666666667
+1,386,30.9033333333333
+1,387,26.3948333333333
+1,388,28.9983333333333
+1,389,27.1991666666667
+1,390,27.4955
+1,391,41.021
+1,392,37.1263333333333
+1,393,33.5068333333333
+1,394,41.2961666666667
+1,395,37.6343333333333
+1,396,35.9833333333333
+1,397,37.973
+1,398,33.6338333333333
+1,399,32.766
+1,400,30.4376666666667
+1,401,28.448
+1,402,33.8031666666667
+1,403,34.8615
+1,404,38.5021666666667
+1,405,33.0411666666667
+1,406,31.7711666666667
+1,407,23.9183333333333
+1,408,26.2678333333333
+1,409,26.6488333333333
+1,410,25.8445
+1,411,32.7448333333333
+1,412,35.9621666666667
+1,413,39.751
+1,414,30.353
+1,415,40.3225
+1,416,30.2895
+1,417,40.6188333333333
+1,418,34.6498333333333
+1,419,32.512
+1,420,28.9983333333333
+1,421,38.2905
+1,422,38.6715
+1,423,33.1046666666667
+1,424,36.449
+1,425,32.5331666666667
+1,426,28.2786666666667
+1,427,29.083
+1,428,32.9353333333333
+1,429,32.1098333333333
+1,430,36.5971666666667
+1,431,30.7975
+1,432,43.7938333333333
+1,433,35.6658333333333
+1,434,33.5915
+1,435,34.0783333333333
+1,436,31.0303333333333
+1,437,36.703
+1,438,36.3008333333333
+1,439,31.242
+1,440,29.845
+1,441,31.5595
+1,442,29.2311666666667
+1,443,24.7226666666667
+1,444,30.0355
+1,445,40.1955
+1,446,39.9626666666667
+1,447,38.4598333333333
+1,448,31.4748333333333
+1,449,38.1
+1,450,34.5651666666667
+1,451,36.576
+1,452,22.1826666666667
+1,453,29.1253333333333
+1,454,34.5016666666667
+1,455,36.5971666666667
+1,456,31.6653333333333
+1,457,35.3695
+1,458,31.2631666666667
+1,459,39.9415
+1,460,39.497
+1,461,35.0308333333333
+1,462,34.6921666666667
+1,463,33.2951666666667
+1,464,35.306
+1,465,42.926
+1,466,37.4861666666667
+1,467,37.2533333333333
+1,468,35.3695
+1,469,32.385
+1,470,28.7866666666667
+1,471,41.5713333333333
+1,472,31.9405
+1,473,35.3483333333333
+1,474,25.6116666666667
+1,475,28.8713333333333
+1,476,35.8775
+1,477,32.5331666666667
+1,478,35.7293333333333
+1,479,26.5853333333333
+1,480,36.576
+1,481,35.5388333333333
+1,482,27.3261666666667
+1,483,28.7443333333333
+1,484,30.6916666666667
+1,485,36.3855
+1,486,29.2311666666667
+1,487,26.2043333333333
+1,488,33.5068333333333
+1,489,35.6023333333333
+1,490,31.5595
+1,491,34.6286666666667
+1,492,32.0251666666667
+1,493,30.861
+1,494,32.6813333333333
+1,495,33.8455
+1,496,28.321
+1,497,35.8986666666667
+1,498,27.94
+1,499,31.6653333333333
+1,500,32.1098333333333
+1,501,33.8878333333333
+1,502,36.5336666666667
+1,503,28.6808333333333
+1,504,34.3323333333333
+1,505,35.8563333333333
+1,506,33.6973333333333
+1,507,25.2518333333333
+1,508,36.322
+1,509,26.543
+1,510,33.0411666666667
+1,511,35.2213333333333
+1,512,32.9141666666667
+1,513,30.9668333333333
+1,514,31.7923333333333
+1,515,31.4748333333333
+1,516,34.7556666666667
+1,517,31.3266666666667
+1,518,39.8145
+1,519,32.258
+1,520,32.8295
+1,521,26.7335
+1,522,28.2575
+1,523,31.4113333333333
+1,524,30.6493333333333
+1,525,27.6013333333333
+1,526,32.0251666666667
+1,527,29.6756666666667
+1,528,33.8031666666667
+1,529,34.036
+1,530,34.8191666666667
+1,531,33.1893333333333
+1,532,28.1516666666667
+1,533,28.6596666666667
+1,534,40.3436666666667
+1,535,39.624
+1,536,33.3375
+1,537,29.845
+1,538,29.6545
+1,539,30.0143333333333
+1,540,32.9776666666667
+1,541,38.4386666666667
+1,542,34.1418333333333
+1,543,41.7406666666667
+1,544,28.4268333333333
+1,545,32.766
+1,546,38.2481666666667
+1,547,29.9508333333333
+1,548,32.6601666666667
+1,549,32.0675
+1,550,35.0308333333333
+1,551,37.4226666666667
+1,552,28.5115
+1,553,33.5491666666667
+1,554,29.083
+1,555,35.2636666666667
+1,556,39.1583333333333
+1,557,30.1413333333333
+1,558,45.9316666666667
+1,559,37.8883333333333
+1,560,29.3793333333333
+1,561,32.9141666666667
+1,562,33.0411666666667
+1,563,29.1041666666667
+1,564,30.7551666666667
+1,565,34.1418333333333
+1,566,34.9885
+1,567,39.243
+1,568,34.7133333333333
+1,569,30.6281666666667
+1,570,36.9358333333333
+1,571,24.9131666666667
+1,572,28.7231666666667
+1,573,32.7448333333333
+1,574,33.8455
+1,575,33.655
+1,576,26.6488333333333
+1,577,42.1428333333333
+1,578,36.0891666666667
+1,579,29.5486666666667
+1,580,28.8713333333333
+1,581,35.7293333333333
+1,582,31.1573333333333
+1,583,30.2895
+1,584,35.7081666666667
+1,585,35.6658333333333
+1,586,29.8661666666667
+1,587,31.3055
+1,588,38.6926666666667
+1,589,30.861
+1,590,30.226
+1,591,30.3953333333333
+1,592,34.671
+1,593,38.3751666666667
+1,594,26.6488333333333
+1,595,26.3736666666667
+1,596,40.8516666666667
+1,597,28.7443333333333
+1,598,27.6225
+1,599,29.972
+1,600,30.7551666666667
+1,601,29.9508333333333
+1,602,25.8868333333333
+1,603,35.7928333333333
+1,604,34.2053333333333
+1,605,35.3483333333333
+1,606,31.877
+1,607,32.7025
+1,608,31.242
+1,609,22.9235
+1,610,36.068
+1,611,40.5765
+1,612,31.0938333333333
+1,613,31.8981666666667
+1,614,32.8718333333333
+1,615,32.5755
+1,616,37.2533333333333
+1,617,31.877
+1,618,27.4108333333333
+1,619,35.179
+1,620,34.3746666666667
+1,621,37.8248333333333
+1,622,28.9348333333333
+1,623,30.099
+1,624,28.4691666666667
+1,625,36.2373333333333
+1,626,34.671
+1,627,32.8083333333333
+1,628,27.7283333333333
+1,629,35.306
+1,630,28.2575
+1,631,37.1686666666667
+1,632,35.1155
+1,633,36.3431666666667
+1,634,33.6973333333333
+1,635,37.0416666666667
+1,636,30.4165
+1,637,32.8506666666667
+1,638,29.5275
+1,639,33.8031666666667
+1,640,28.9771666666667
+1,641,36.6818333333333
+1,642,28.3421666666667
+1,643,40.5765
+1,644,34.29
+1,645,30.2048333333333
+1,646,29.4216666666667
+1,647,33.401
+1,648,37.6131666666667
+1,649,35.8775
+1,650,31.2843333333333
+1,651,37.3168333333333
+1,652,28.9136666666667
+1,653,32.766
+1,654,31.7923333333333
+1,655,51.2868333333333
+1,656,32.5331666666667
+1,657,36.9358333333333
+1,658,29.591
+1,659,35.7716666666667
+1,660,34.29
+1,661,34.7768333333333
+1,662,37.0205
+1,663,30.7128333333333
+1,664,36.1103333333333
+1,665,34.3958333333333
+1,666,37.5073333333333
+1,667,33.3586666666667
+1,668,32.6813333333333
+1,669,31.9193333333333
+1,670,33.4856666666667
+1,671,37.6555
+1,672,35.052
+1,673,32.893
+1,674,38.608
+1,675,29.6545
+1,676,35.0096666666667
+1,677,33.9725
+1,678,34.6498333333333
+1,679,28.7866666666667
+1,680,33.9725
+1,681,38.735
+1,682,32.893
+1,683,33.1258333333333
+1,684,33.3586666666667
+1,685,38.0153333333333
+1,686,40.3225
+1,687,32.4696666666667
+1,688,33.6338333333333
+1,689,31.0091666666667
+1,690,31.3266666666667
+1,691,38.5656666666667
+1,692,28.9348333333333
+1,693,31.5383333333333
+1,694,43.0741666666667
+1,695,30.6281666666667
+1,696,36.449
+1,697,31.0726666666667
+1,698,34.7556666666667
+1,699,38.1
+1,700,36.9993333333333
+1,701,32.5331666666667
+1,702,37.1686666666667
+1,703,38.4598333333333
+1,704,34.1841666666667
+1,705,37.6343333333333
+1,706,35.1155
+1,707,36.5125
+1,708,27.6436666666667
+1,709,36.6818333333333
+1,710,27.2415
+1,711,31.2631666666667
+1,712,34.9673333333333
+1,713,33.0835
+1,714,29.1676666666667
+1,715,29.337
+1,716,35.0308333333333
+1,717,37.4438333333333
+1,718,38.6503333333333
+1,719,30.48
+1,720,34.3111666666667
+1,721,34.671
+1,722,30.5646666666667
+1,723,31.2843333333333
+1,724,26.7123333333333
+1,725,36.7241666666667
+1,726,37.5073333333333
+1,727,38.1846666666667
+1,728,32.8295
+1,729,37.6555
+1,730,31.496
+1,731,36.449
+1,732,38.8408333333333
+1,733,45.6353333333333
+1,734,29.5063333333333
+1,735,37.8883333333333
+1,736,32.639
+1,737,29.2735
+1,738,36.0045
+1,739,27.3896666666667
+1,740,29.4428333333333
+1,741,33.6126666666667
+1,742,32.0675
+1,743,36.8723333333333
+1,744,32.4485
+1,745,31.7923333333333
+1,746,33.9301666666667
+1,747,32.6813333333333
+1,748,38.2905
+1,749,30.2683333333333
+1,750,35.8563333333333
+1,751,37.4015
+1,752,35.814
+1,753,30.5646666666667
+1,754,39.4758333333333
+1,755,33.1681666666667
+1,756,29.9931666666667
+1,757,32.9141666666667
+1,758,35.433
+1,759,32.9353333333333
+1,760,35.4965
+1,761,32.5331666666667
+1,762,35.052
+1,763,30.3106666666667
+1,764,33.4221666666667
+1,765,33.7396666666667
+1,766,35.8351666666667
+1,767,33.9725
+1,768,32.4273333333333
+1,769,34.2688333333333
+1,770,39.0736666666667
+1,771,34.9673333333333
+1,772,37.2321666666667
+1,773,33.147
+1,774,34.6498333333333
+1,775,35.0943333333333
+1,776,34.3111666666667
+1,777,37.6978333333333
+1,778,32.385
+1,779,33.6973333333333
+1,780,42.3333333333333
+1,781,29.845
+1,782,29.8873333333333
+1,783,26.162
+1,784,35.2636666666667
+1,785,23.622
+1,786,31.6018333333333
+1,787,30.2471666666667
+1,788,34.3535
+1,789,32.1098333333333
+1,790,34.8191666666667
+1,791,33.4433333333333
+1,792,35.8986666666667
+1,793,32.385
+1,794,34.2688333333333
+1,795,41.2538333333333
+1,796,31.7076666666667
+1,797,41.402
+1,798,37.8248333333333
+1,799,41.4866666666667
+1,800,35.3695
+1,801,42.799
+1,802,33.909
+1,803,41.3596666666667
+1,804,30.8398333333333
+1,805,35.3483333333333
+1,806,26.3101666666667
+1,807,28.5115
+1,808,39.3276666666667
+1,809,36.2585
+1,810,36.9358333333333
+1,811,31.1573333333333
+1,812,28.9348333333333
+1,813,34.1206666666667
+1,814,29.2946666666667
+1,815,37.2533333333333
+1,816,26.2255
+1,817,32.4908333333333
+1,818,29.9931666666667
+1,819,33.909
+1,820,31.0303333333333
+1,821,22.7118333333333
+1,822,34.0995
+1,823,35.6023333333333
+1,824,33.1046666666667
+1,825,37.8671666666667
+1,826,35.8351666666667
+1,827,25.0401666666667
+1,828,28.3845
+1,829,32.5755
+1,830,33.9513333333333
+1,831,34.0148333333333
+1,832,39.7086666666667
+1,833,32.2156666666667
+1,834,30.5646666666667
+1,835,27.9188333333333
+1,836,34.417
+1,837,37.6766666666667
+1,838,29.464
+1,839,34.2053333333333
+1,840,29.1676666666667
+1,841,32.6601666666667
+1,842,30.0566666666667
+1,843,26.9028333333333
+1,844,35.3483333333333
+1,845,36.322
+1,846,32.4485
+1,847,33.7608333333333
+1,848,31.115
+1,849,36.83
+1,850,41.5501666666667
+1,851,35.306
+1,852,31.6018333333333
+1,853,38.4386666666667
+1,854,41.5501666666667
+1,855,36.7665
+1,856,36.7453333333333
+1,857,35.4541666666667
+1,858,35.2848333333333
+1,859,31.877
+1,860,40.3225
+1,861,31.877
+1,862,36.4913333333333
+1,863,31.8346666666667
+1,864,34.7133333333333
+1,865,30.734
+1,866,31.0303333333333
+1,867,32.893
+1,868,35.9833333333333
+1,869,27.6013333333333
+1,870,32.3003333333333
+1,871,28.3421666666667
+1,872,31.6018333333333
+1,873,40.6611666666667
+1,874,27.051
+1,875,31.8558333333333
+1,876,39.2853333333333
+1,877,29.9296666666667
+1,878,38.9678333333333
+1,879,37.6766666666667
+1,880,31.4325
+1,881,27.9823333333333
+1,882,32.9565
+1,883,33.147
+1,884,31.1361666666667
+1,885,32.8083333333333
+1,886,31.1573333333333
+1,887,30.861
+1,888,36.9781666666667
+1,889,31.115
+1,890,35.56
+1,891,32.3638333333333
+1,892,34.5651666666667
+1,893,33.3163333333333
+1,894,37.2745
+1,895,29.1253333333333
+1,896,33.9936666666667
+1,897,31.5383333333333
+1,898,34.5016666666667
+1,899,42.2063333333333
+1,900,36.9993333333333
+1,901,31.1573333333333
+1,902,45.0638333333333
+1,903,30.1836666666667
+1,904,33.5068333333333
+1,905,37.6978333333333
+1,906,34.7556666666667
+1,907,28.2363333333333
+1,908,41.6136666666667
+1,909,37.5708333333333
+1,910,33.2105
+1,911,39.9626666666667
+1,912,33.6761666666667
+1,913,28.0035
+1,914,32.3638333333333
+1,915,34.5228333333333
+1,916,31.3266666666667
+1,917,29.464
+1,918,32.7025
+1,919,36.9358333333333
+1,920,35.179
+1,921,36.6606666666667
+1,922,32.7025
+1,923,24.1723333333333
+1,924,40.64
+1,925,22.7541666666667
+1,926,34.5863333333333
+1,927,38.862
+1,928,34.0148333333333
+1,929,29.9508333333333
+1,930,31.6865
+1,931,36.7665
+1,932,33.0835
+1,933,33.6338333333333
+1,934,37.9306666666667
+1,935,35.5811666666667
+1,936,41.1056666666667
+1,937,31.6653333333333
+1,938,33.4645
+1,939,35.306
+1,940,28.7655
+1,941,33.3375
+1,942,30.6493333333333
+1,943,33.274
+1,944,31.0091666666667
+1,945,32.258
+1,946,30.2048333333333
+1,947,33.1681666666667
+1,948,31.75
+1,949,23.2198333333333
+1,950,33.401
+1,951,32.4273333333333
+1,952,29.2735
+1,953,37.2956666666667
+1,954,33.02
+1,955,37.9095
+1,956,32.3638333333333
+1,957,31.496
+1,958,36.1103333333333
+1,959,36.4066666666667
+1,960,31.3055
+1,961,37.2745
+1,962,27.0298333333333
+1,963,41.8041666666667
+1,964,32.1098333333333
+1,965,35.9833333333333
+1,966,35.7505
+1,967,36.5125
+1,968,35.8563333333333
+1,969,36.0891666666667
+1,970,33.401
+1,971,31.9828333333333
+1,972,32.9565
+1,973,42.6085
+1,974,38.8196666666667
+1,975,30.5011666666667
+1,976,29.8238333333333
+1,977,33.655
+1,978,27.6436666666667
+1,979,29.972
+1,980,29.5275
+1,981,33.274
+1,982,34.4805
+1,983,32.9141666666667
+1,984,29.4216666666667
+1,985,31.9828333333333
+1,986,32.8506666666667
+1,987,34.7556666666667
+1,988,33.4221666666667
+1,989,29.0618333333333
+1,990,27.7706666666667
+1,991,34.5651666666667
+1,992,32.512
+1,993,35.2425
+1,994,31.4325
+1,995,34.7556666666667
+1,996,37.1263333333333
+1,997,30.9245
+1,998,33.401
+1,999,33.02
+1,1000,34.925
+2,1,23.876
+2,2,26.9028333333333
+2,3,32.8718333333333
+2,4,27.8765
+2,5,25.0825
+2,6,24.5533333333333
+2,7,23.0505
+2,8,26.5006666666667
+2,9,22.6906666666667
+2,10,25.6328333333333
+2,11,26.543
+2,12,28.7231666666667
+2,13,22.7118333333333
+2,14,25.1671666666667
+2,15,21.336
+2,16,25.9715
+2,17,20.2565
+2,18,34.3535
+2,19,24.1511666666667
+2,20,30.2471666666667
+2,21,27.9188333333333
+2,22,22.5636666666667
+2,23,29.2946666666667
+2,24,24.5745
+2,25,30.3318333333333
+2,26,30.3741666666667
+2,27,21.1666666666667
+2,28,26.035
+2,29,24.9555
+2,30,25.5481666666667
+2,31,27.7495
+2,32,23.8548333333333
+2,33,25.5481666666667
+2,34,26.4371666666667
+2,35,21.971
+2,36,23.4738333333333
+2,37,26.5006666666667
+2,38,30.0566666666667
+2,39,26.9028333333333
+2,40,25.3365
+2,41,31.6865
+2,42,26.6488333333333
+2,43,24.8708333333333
+2,44,28.3633333333333
+2,45,23.9183333333333
+2,46,31.115
+2,47,27.9188333333333
+2,48,23.7066666666667
+2,49,28.8713333333333
+2,50,21.8651666666667
+2,51,36.068
+2,52,20.5951666666667
+2,53,32.4908333333333
+2,54,27.3685
+2,55,23.6643333333333
+2,56,20.9973333333333
+2,57,23.3468333333333
+2,58,28.0035
+2,59,26.2043333333333
+2,60,25.527
+2,61,28.2575
+2,62,26.797
+2,63,26.8605
+2,64,23.1986666666667
+2,65,26.1408333333333
+2,66,25.1036666666667
+2,67,20.066
+2,68,25.146
+2,69,27.3261666666667
+2,70,20.8915
+2,71,29.337
+2,72,25.527
+2,73,26.6911666666667
+2,74,23.6643333333333
+2,75,23.9183333333333
+2,76,25.3576666666667
+2,77,29.6333333333333
+2,78,27.813
+2,79,30.9456666666667
+2,80,16.9121666666667
+2,81,24.8708333333333
+2,82,24.257
+2,83,25.9503333333333
+2,84,29.0406666666667
+2,85,28.4691666666667
+2,86,29.5698333333333
+2,87,29.8661666666667
+2,88,25.6328333333333
+2,89,26.8816666666667
+2,90,22.2461666666667
+2,91,24.5321666666667
+2,92,26.7123333333333
+2,93,27.9188333333333
+2,94,24.1088333333333
+2,95,23.8548333333333
+2,96,26.2466666666667
+2,97,26.1831666666667
+2,98,27.9823333333333
+2,99,26.162
+2,100,28.7655
+2,101,26.797
+2,102,33.1258333333333
+2,103,26.3101666666667
+2,104,24.8073333333333
+2,105,30.0566666666667
+2,106,22.8388333333333
+2,107,28.6385
+2,108,24.1511666666667
+2,109,23.2833333333333
+2,110,22.098
+2,111,27.7283333333333
+2,112,28.575
+2,113,27.1568333333333
+2,114,27.4531666666667
+2,115,24.4051666666667
+2,116,27.8341666666667
+2,117,29.0406666666667
+2,118,24.5321666666667
+2,119,22.86
+2,120,25.2518333333333
+2,121,23.7913333333333
+2,122,24.0665
+2,123,22.4155
+2,124,26.5853333333333
+2,125,22.7753333333333
+2,126,25.9291666666667
+2,127,24.7861666666667
+2,128,22.7753333333333
+2,129,28.4056666666667
+2,130,27.0086666666667
+2,131,27.6013333333333
+2,132,23.1986666666667
+2,133,28.9136666666667
+2,134,24.4051666666667
+2,135,25.6963333333333
+2,136,19.2405
+2,137,23.8971666666667
+2,138,26.3101666666667
+2,139,24.9766666666667
+2,140,28.6596666666667
+2,141,26.5006666666667
+2,142,28.0035
+2,143,25.654
+2,144,29.5275
+2,145,23.7278333333333
+2,146,26.924
+2,147,27.5166666666667
+2,148,23.114
+2,149,20.3623333333333
+2,150,22.479
+2,151,20.8491666666667
+2,152,27.2203333333333
+2,153,24.8073333333333
+2,154,24.1935
+2,155,24.5956666666667
+2,156,22.5425
+2,157,27.6436666666667
+2,158,27.5801666666667
+2,159,21.082
+2,160,25.2518333333333
+2,161,32.3638333333333
+2,162,20.5528333333333
+2,163,29.4428333333333
+2,164,23.4738333333333
+2,165,28.7231666666667
+2,166,26.1196666666667
+2,167,21.8863333333333
+2,168,24.4686666666667
+2,169,20.4258333333333
+2,170,28.4056666666667
+2,171,33.3375
+2,172,23.3468333333333
+2,173,27.4743333333333
+2,174,23.9606666666667
+2,175,26.0138333333333
+2,176,30.8821666666667
+2,177,32.2156666666667
+2,178,29.972
+2,179,23.876
+2,180,27.9611666666667
+2,181,32.004
+2,182,26.6065
+2,183,27.051
+2,184,30.3318333333333
+2,185,31.4113333333333
+2,186,27.6648333333333
+2,187,31.7076666666667
+2,188,22.9446666666667
+2,189,23.9183333333333
+2,190,25.8233333333333
+2,191,30.3106666666667
+2,192,30.353
+2,193,27.0086666666667
+2,194,25.6751666666667
+2,195,26.8816666666667
+2,196,27.4108333333333
+2,197,26.416
+2,198,26.2043333333333
+2,199,28.3633333333333
+2,200,27.5378333333333
+2,201,30.1201666666667
+2,202,24.6168333333333
+2,203,26.9663333333333
+2,204,25.9926666666667
+2,205,23.7278333333333
+2,206,28.0458333333333
+2,207,27.432
+2,208,21.1031666666667
+2,209,24.5321666666667
+2,210,29.718
+2,211,32.4908333333333
+2,212,32.0886666666667
+2,213,25.019
+2,214,25.8445
+2,215,25.2306666666667
+2,216,28.9771666666667
+2,217,23.1351666666667
+2,218,21.7805
+2,219,24.1935
+2,220,27.3896666666667
+2,221,23.7278333333333
+2,222,25.3365
+2,223,24.3416666666667
+2,224,22.0768333333333
+2,225,20.32
+2,226,24.3205
+2,227,27.0721666666667
+2,228,30.5435
+2,229,26.2043333333333
+2,230,25.5905
+2,231,21.6111666666667
+2,232,27.4743333333333
+2,233,26.7546666666667
+2,234,21.0608333333333
+2,235,28.9136666666667
+2,236,31.2631666666667
+2,237,24.6803333333333
+2,238,27.6436666666667
+2,239,24.7861666666667
+2,240,25.1671666666667
+2,241,24.5533333333333
+2,242,27.0721666666667
+2,243,22.1403333333333
+2,244,27.6436666666667
+2,245,28.7443333333333
+2,246,21.717
+2,247,25.1248333333333
+2,248,28.7655
+2,249,30.226
+2,250,26.1196666666667
+2,251,25.2518333333333
+2,252,20.6798333333333
+2,253,26.4583333333333
+2,254,28.1305
+2,255,25.7175
+2,256,23.241
+2,257,24.9978333333333
+2,258,25.7386666666667
+2,259,22.9446666666667
+2,260,25.146
+2,261,25.3576666666667
+2,262,28.0458333333333
+2,263,27.0298333333333
+2,264,25.1883333333333
+2,265,26.2678333333333
+2,266,27.8765
+2,267,24.5745
+2,268,25.4211666666667
+2,269,24.6168333333333
+2,270,23.4103333333333
+2,271,25.2095
+2,272,27.432
+2,273,23.6855
+2,274,23.2833333333333
+2,275,21.9286666666667
+2,276,19.0711666666667
+2,277,25.9926666666667
+2,278,23.4526666666667
+2,279,27.4955
+2,280,27.4955
+2,281,27.7918333333333
+2,282,27.1356666666667
+2,283,24.8708333333333
+2,284,28.2575
+2,285,21.0608333333333
+2,286,23.495
+2,287,27.0298333333333
+2,288,21.6958333333333
+2,289,25.5693333333333
+2,290,26.8605
+2,291,20.6375
+2,292,21.5265
+2,293,20.4046666666667
+2,294,29.9508333333333
+2,295,24.2993333333333
+2,296,24.257
+2,297,24.8708333333333
+2,298,25.4211666666667
+2,299,30.2048333333333
+2,300,29.845
+2,301,25.2518333333333
+2,302,27.6648333333333
+2,303,28.2575
+2,304,29.21
+2,305,25.8233333333333
+2,306,23.0716666666667
+2,307,28.2786666666667
+2,308,24.13
+2,309,28.7655
+2,310,25.4
+2,311,30.7975
+2,312,24.1723333333333
+2,313,27.9188333333333
+2,314,29.9296666666667
+2,315,30.0143333333333
+2,316,30.2895
+2,317,22.9658333333333
+2,318,27.6436666666667
+2,319,29.8238333333333
+2,320,30.8186666666667
+2,321,27.7283333333333
+2,322,28.7866666666667
+2,323,28.321
+2,324,29.3158333333333
+2,325,25.5693333333333
+2,326,29.5698333333333
+2,327,30.6493333333333
+2,328,25.019
+2,329,30.0355
+2,330,22.2461666666667
+2,331,21.8651666666667
+2,332,26.3313333333333
+2,333,27.1568333333333
+2,334,24.4051666666667
+2,335,32.8506666666667
+2,336,26.6276666666667
+2,337,26.3736666666667
+2,338,30.2683333333333
+2,339,22.6695
+2,340,29.0195
+2,341,31.4113333333333
+2,342,24.511
+2,343,30.5435
+2,344,20.6586666666667
+2,345,28.067
+2,346,26.6065
+2,347,22.5213333333333
+2,348,27.9611666666667
+2,349,23.749
+2,350,28.6808333333333
+2,351,26.7758333333333
+2,352,26.8605
+2,353,25.9926666666667
+2,354,24.638
+2,355,27.8765
+2,356,23.1351666666667
+2,357,22.6271666666667
+2,358,26.8393333333333
+2,359,26.2678333333333
+2,360,25.5058333333333
+2,361,27.2203333333333
+2,362,26.8605
+2,363,28.7443333333333
+2,364,23.0505
+2,365,25.4423333333333
+2,366,25.5905
+2,367,22.6271666666667
+2,368,23.5585
+2,369,31.115
+2,370,26.543
+2,371,20.8068333333333
+2,372,26.2466666666667
+2,373,23.8971666666667
+2,374,24.6803333333333
+2,375,33.3586666666667
+2,376,24.3628333333333
+2,377,25.781
+2,378,29.972
+2,379,20.2776666666667
+2,380,21.2725
+2,381,27.6013333333333
+2,382,26.2255
+2,383,19.431
+2,384,25.8233333333333
+2,385,28.3845
+2,386,24.0241666666667
+2,387,24.257
+2,388,25.5905
+2,389,25.527
+2,390,28.8713333333333
+2,391,27.813
+2,392,23.114
+2,393,27.432
+2,394,27.6648333333333
+2,395,26.2255
+2,396,23.7913333333333
+2,397,31.8135
+2,398,24.8496666666667
+2,399,25.273
+2,400,32.766
+2,401,19.812
+2,402,27.3896666666667
+2,403,30.9668333333333
+2,404,29.7603333333333
+2,405,27.9823333333333
+2,406,30.861
+2,407,22.1826666666667
+2,408,23.3468333333333
+2,409,26.4795
+2,410,20.6375
+2,411,32.385
+2,412,21.4206666666667
+2,413,27.432
+2,414,25.8656666666667
+2,415,30.861
+2,416,23.7278333333333
+2,417,26.2678333333333
+2,418,29.2946666666667
+2,419,21.3783333333333
+2,420,28.6808333333333
+2,421,29.083
+2,422,22.987
+2,423,30.3741666666667
+2,424,24.9343333333333
+2,425,30.353
+2,426,24.13
+2,427,29.9931666666667
+2,428,31.75
+2,429,31.3266666666667
+2,430,20.3623333333333
+2,431,24.638
+2,432,22.9446666666667
+2,433,27.8553333333333
+2,434,23.8971666666667
+2,435,32.7871666666667
+2,436,26.035
+2,437,25.273
+2,438,27.559
+2,439,28.5115
+2,440,29.2735
+2,441,31.3478333333333
+2,442,26.1408333333333
+2,443,27.9823333333333
+2,444,27.9188333333333
+2,445,24.5321666666667
+2,446,27.6225
+2,447,26.543
+2,448,20.7433333333333
+2,449,19.685
+2,450,23.7278333333333
+2,451,25.2518333333333
+2,452,29.083
+2,453,28.448
+2,454,29.6968333333333
+2,455,24.4051666666667
+2,456,24.9978333333333
+2,457,22.098
+2,458,24.765
+2,459,25.8021666666667
+2,460,27.8765
+2,461,26.4371666666667
+2,462,37.1051666666667
+2,463,26.035
+2,464,25.1036666666667
+2,465,27.4743333333333
+2,466,25.0613333333333
+2,467,24.2358333333333
+2,468,26.3948333333333
+2,469,25.019
+2,470,19.3251666666667
+2,471,27.7071666666667
+2,472,31.5383333333333
+2,473,19.558
+2,474,21.717
+2,475,24.638
+2,476,27.559
+2,477,23.0716666666667
+2,478,23.8971666666667
+2,479,27.9188333333333
+2,480,24.1935
+2,481,24.9131666666667
+2,482,25.0825
+2,483,24.2146666666667
+2,484,25.908
+2,485,30.2683333333333
+2,486,24.9978333333333
+2,487,27.9611666666667
+2,488,24.4263333333333
+2,489,26.8605
+2,490,33.8031666666667
+2,491,26.416
+2,492,28.4903333333333
+2,493,30.6916666666667
+2,494,25.5481666666667
+2,495,23.241
+2,496,20.8703333333333
+2,497,22.3308333333333
+2,498,31.9616666666667
+2,499,29.7391666666667
+2,500,23.4526666666667
+2,501,25.6963333333333
+2,502,27.7706666666667
+2,503,27.813
+2,504,25.0613333333333
+2,505,20.574
+2,506,25.2941666666667
+2,507,24.0876666666667
+2,508,24.8073333333333
+2,509,23.5373333333333
+2,510,26.3525
+2,511,29.0406666666667
+2,512,31.0303333333333
+2,513,27.2203333333333
+2,514,24.4051666666667
+2,515,28.2998333333333
+2,516,24.7226666666667
+2,517,21.844
+2,518,20.0448333333333
+2,519,26.0985
+2,520,28.2998333333333
+2,521,24.638
+2,522,25.4846666666667
+2,523,27.4108333333333
+2,524,25.5481666666667
+2,525,24.5321666666667
+2,526,27.7918333333333
+2,527,18.4785
+2,528,24.3205
+2,529,28.0035
+2,530,24.2358333333333
+2,531,24.5321666666667
+2,532,27.6225
+2,533,31.369
+2,534,27.2626666666667
+2,535,25.3153333333333
+2,536,20.2988333333333
+2,537,30.7763333333333
+2,538,25.4635
+2,539,25.5481666666667
+2,540,24.9343333333333
+2,541,27.8341666666667
+2,542,24.511
+2,543,17.8223333333333
+2,544,28.1728333333333
+2,545,30.7551666666667
+2,546,24.0241666666667
+2,547,24.8496666666667
+2,548,28.6173333333333
+2,549,26.9028333333333
+2,550,27.686
+2,551,29.7603333333333
+2,552,25.908
+2,553,32.2791666666667
+2,554,30.1625
+2,555,28.9348333333333
+2,556,26.2678333333333
+2,557,25.019
+2,558,26.5218333333333
+2,559,29.0406666666667
+2,560,27.813
+2,561,23.114
+2,562,30.0143333333333
+2,563,21.9075
+2,564,24.1088333333333
+2,565,26.3101666666667
+2,566,23.7066666666667
+2,567,28.6385
+2,568,28.5326666666667
+2,569,25.2306666666667
+2,570,24.8073333333333
+2,571,27.2838333333333
+2,572,28.2151666666667
+2,573,24.257
+2,574,31.242
+2,575,28.2786666666667
+2,576,25.781
+2,577,26.4371666666667
+2,578,26.0138333333333
+2,579,25.6751666666667
+2,580,25.6751666666667
+2,581,27.8765
+2,582,26.1831666666667
+2,583,25.2518333333333
+2,584,23.0293333333333
+2,585,26.2466666666667
+2,586,24.3628333333333
+2,587,27.432
+2,588,22.9023333333333
+2,589,22.6483333333333
+2,590,27.178
+2,591,23.5585
+2,592,24.1935
+2,593,24.5321666666667
+2,594,26.9028333333333
+2,595,29.7603333333333
+2,596,23.9606666666667
+2,597,28.3421666666667
+2,598,32.5543333333333
+2,599,25.4211666666667
+2,600,27.6013333333333
+2,601,25.6751666666667
+2,602,28.8078333333333
+2,603,25.6116666666667
+2,604,24.8285
+2,605,28.2575
+2,606,26.4371666666667
+2,607,25.3153333333333
+2,608,20.3623333333333
+2,609,29.972
+2,610,23.6431666666667
+2,611,27.7283333333333
+2,612,25.8656666666667
+2,613,26.3313333333333
+2,614,23.1563333333333
+2,615,30.4588333333333
+2,616,30.6281666666667
+2,617,28.7231666666667
+2,618,24.9131666666667
+2,619,25.1248333333333
+2,620,23.114
+2,621,29.718
+2,622,26.543
+2,623,20.9973333333333
+2,624,23.7066666666667
+2,625,28.2575
+2,626,25.0613333333333
+2,627,28.7443333333333
+2,628,24.1511666666667
+2,629,29.9085
+2,630,30.0355
+2,631,23.1351666666667
+2,632,21.9498333333333
+2,633,25.3576666666667
+2,634,23.0505
+2,635,22.9023333333333
+2,636,24.892
+2,637,24.4263333333333
+2,638,25.5693333333333
+2,639,20.32
+2,640,23.9818333333333
+2,641,26.4371666666667
+2,642,27.5801666666667
+2,643,21.4418333333333
+2,644,23.5373333333333
+2,645,20.1506666666667
+2,646,26.9875
+2,647,23.622
+2,648,29.591
+2,649,26.9875
+2,650,27.2415
+2,651,26.035
+2,652,22.9446666666667
+2,653,25.019
+2,654,28.0881666666667
+2,655,22.1615
+2,656,23.8336666666667
+2,657,25.6116666666667
+2,658,25.5905
+2,659,24.4686666666667
+2,660,32.4061666666667
+2,661,23.9183333333333
+2,662,21.8016666666667
+2,663,25.6116666666667
+2,664,27.4955
+2,665,27.2203333333333
+2,666,25.8868333333333
+2,667,27.4108333333333
+2,668,29.7603333333333
+2,669,27.7495
+2,670,28.2998333333333
+2,671,29.21
+2,672,25.9503333333333
+2,673,27.2415
+2,674,25.527
+2,675,25.1036666666667
+2,676,26.797
+2,677,22.86
+2,678,27.686
+2,679,22.0133333333333
+2,680,27.94
+2,681,27.6436666666667
+2,682,24.1511666666667
+2,683,23.7701666666667
+2,684,26.4583333333333
+2,685,28.702
+2,686,29.0195
+2,687,26.9028333333333
+2,688,27.559
+2,689,27.2626666666667
+2,690,25.7175
+2,691,28.5538333333333
+2,692,28.0246666666667
+2,693,21.9921666666667
+2,694,22.9023333333333
+2,695,24.8708333333333
+2,696,24.7861666666667
+2,697,25.019
+2,698,24.003
+2,699,25.6751666666667
+2,700,26.7335
+2,701,26.4371666666667
+2,702,27.2838333333333
+2,703,24.2146666666667
+2,704,26.6911666666667
+2,705,27.8553333333333
+2,706,24.9131666666667
+2,707,25.9926666666667
+2,708,22.3731666666667
+2,709,22.3731666666667
+2,710,24.8496666666667
+2,711,28.1305
+2,712,23.5373333333333
+2,713,26.1408333333333
+2,714,28.0246666666667
+2,715,26.2043333333333
+2,716,18.2033333333333
+2,717,22.3096666666667
+2,718,21.8863333333333
+2,719,30.0143333333333
+2,720,31.3901666666667
+2,721,29.6756666666667
+2,722,23.4103333333333
+2,723,26.9875
+2,724,29.4851666666667
+2,725,28.448
+2,726,24.6591666666667
+2,727,25.1036666666667
+2,728,24.2146666666667
+2,729,26.8816666666667
+2,730,26.4795
+2,731,26.6911666666667
+2,732,26.2043333333333
+2,733,34.3111666666667
+2,734,24.638
+2,735,32.4273333333333
+2,736,24.5956666666667
+2,737,28.2151666666667
+2,738,22.8388333333333
+2,739,24.13
+2,740,24.9343333333333
+2,741,26.8393333333333
+2,742,19.8331666666667
+2,743,25.9715
+2,744,26.6065
+2,745,25.1248333333333
+2,746,23.1986666666667
+2,747,24.9555
+2,748,27.0298333333333
+2,749,28.321
+2,750,23.8336666666667
+2,751,25.527
+2,752,29.1253333333333
+2,753,25.9291666666667
+2,754,18.4361666666667
+2,755,28.7443333333333
+2,756,26.67
+2,757,26.9875
+2,758,27.5378333333333
+2,759,27.3261666666667
+2,760,25.8233333333333
+2,761,31.496
+2,762,25.6116666666667
+2,763,29.8661666666667
+2,764,28.5961666666667
+2,765,24.9555
+2,766,28.2363333333333
+2,767,27.3685
+2,768,23.1775
+2,769,24.13
+2,770,22.2461666666667
+2,771,32.8506666666667
+2,772,25.3788333333333
+2,773,33.5491666666667
+2,774,27.1568333333333
+2,775,28.1728333333333
+2,776,20.5316666666667
+2,777,24.2358333333333
+2,778,24.1935
+2,779,27.2838333333333
+2,780,22.5848333333333
+2,781,23.3468333333333
+2,782,26.0985
+2,783,25.3788333333333
+2,784,25.6751666666667
+2,785,27.8765
+2,786,34.671
+2,787,31.8135
+2,788,29.4216666666667
+2,789,26.9028333333333
+2,790,22.3731666666667
+2,791,24.3416666666667
+2,792,25.1883333333333
+2,793,27.3896666666667
+2,794,25.5693333333333
+2,795,28.3421666666667
+2,796,26.3313333333333
+2,797,26.543
+2,798,26.2466666666667
+2,799,22.5848333333333
+2,800,20.7856666666667
+2,801,25.9503333333333
+2,802,22.6271666666667
+2,803,26.6276666666667
+2,804,26.7123333333333
+2,805,26.8393333333333
+2,806,25.019
+2,807,24.1723333333333
+2,808,24.384
+2,809,22.3308333333333
+2,810,30.099
+2,811,25.7386666666667
+2,812,29.0195
+2,813,22.0345
+2,814,31.1573333333333
+2,815,27.3261666666667
+2,816,27.0933333333333
+2,817,24.0665
+2,818,26.3736666666667
+2,819,26.035
+2,820,20.4258333333333
+2,821,28.1305
+2,822,22.2673333333333
+2,823,26.7546666666667
+2,824,23.6643333333333
+2,825,23.3468333333333
+2,826,24.6591666666667
+2,827,24.8708333333333
+2,828,21.336
+2,829,31.242
+2,830,19.2828333333333
+2,831,23.2621666666667
+2,832,26.4795
+2,833,28.7443333333333
+2,834,22.3731666666667
+2,835,24.0876666666667
+2,836,27.7071666666667
+2,837,25.8233333333333
+2,838,22.2673333333333
+2,839,24.892
+2,840,26.2255
+2,841,25.4
+2,842,17.78
+2,843,33.782
+2,844,27.4531666666667
+2,845,26.8393333333333
+2,846,25.3788333333333
+2,847,25.2306666666667
+2,848,29.5486666666667
+2,849,27.1356666666667
+2,850,26.0138333333333
+2,851,21.59
+2,852,27.5166666666667
+2,853,23.6431666666667
+2,854,25.8868333333333
+2,855,26.543
+2,856,23.4738333333333
+2,857,24.4898333333333
+2,858,24.6591666666667
+2,859,27.2626666666667
+2,860,29.6968333333333
+2,861,31.4536666666667
+2,862,25.3365
+2,863,33.7608333333333
+2,864,26.3525
+2,865,25.3365
+2,866,27.8765
+2,867,27.8976666666667
+2,868,21.8228333333333
+2,869,28.702
+2,870,29.3581666666667
+2,871,25.0401666666667
+2,872,23.7066666666667
+2,873,24.9555
+2,874,28.0881666666667
+2,875,23.2833333333333
+2,876,28.3633333333333
+2,877,22.5213333333333
+2,878,24.9978333333333
+2,879,24.1935
+2,880,28.7231666666667
+2,881,22.987
+2,882,24.892
+2,883,22.352
+2,884,24.5321666666667
+2,885,26.2466666666667
+2,886,24.1511666666667
+2,887,25.4846666666667
+2,888,28.5961666666667
+2,889,22.5425
+2,890,25.6328333333333
+2,891,32.0886666666667
+2,892,28.3845
+2,893,28.6385
+2,894,34.8191666666667
+2,895,25.1671666666667
+2,896,27.1145
+2,897,26.5218333333333
+2,898,29.8026666666667
+2,899,24.0241666666667
+2,900,28.2151666666667
+2,901,23.495
+2,902,27.94
+2,903,23.7701666666667
+2,904,27.6225
+2,905,25.1883333333333
+2,906,28.2575
+2,907,19.939
+2,908,27.0933333333333
+2,909,26.8181666666667
+2,910,28.6596666666667
+2,911,23.6643333333333
+2,912,25.6116666666667
+2,913,23.4315
+2,914,23.4103333333333
+2,915,22.5848333333333
+2,916,26.7546666666667
+2,917,30.48
+2,918,23.8125
+2,919,26.162
+2,920,24.6803333333333
+2,921,27.5801666666667
+2,922,24.2146666666667
+2,923,24.0665
+2,924,33.1046666666667
+2,925,28.5538333333333
+2,926,23.8971666666667
+2,927,24.8708333333333
+2,928,25.3576666666667
+2,929,24.3205
+2,930,27.6648333333333
+2,931,28.194
+2,932,28.067
+2,933,24.7438333333333
+2,934,20.9126666666667
+2,935,21.7381666666667
+2,936,22.6483333333333
+2,937,28.8078333333333
+2,938,26.797
+2,939,25.6328333333333
+2,940,32.893
+2,941,24.2781666666667
+2,942,25.1883333333333
+2,943,27.4108333333333
+2,944,23.4526666666667
+2,945,26.543
+2,946,20.0236666666667
+2,947,29.5275
+2,948,23.9183333333333
+2,949,25.9715
+2,950,23.6431666666667
+2,951,24.9343333333333
+2,952,24.1935
+2,953,30.3318333333333
+2,954,26.3525
+2,955,26.416
+2,956,24.003
+2,957,25.8656666666667
+2,958,27.8976666666667
+2,959,23.3045
+2,960,30.7551666666667
+2,961,29.4851666666667
+2,962,21.082
+2,963,27.5801666666667
+2,964,28.2786666666667
+2,965,21.717
+2,966,25.3788333333333
+2,967,25.3365
+2,968,30.6916666666667
+2,969,29.0618333333333
+2,970,22.7541666666667
+2,971,31.1996666666667
+2,972,22.8811666666667
+2,973,27.4531666666667
+2,974,26.1408333333333
+2,975,23.876
+2,976,23.1563333333333
+2,977,29.0618333333333
+2,978,23.3468333333333
+2,979,22.3943333333333
+2,980,21.463
+2,981,28.5115
+2,982,25.7175
+2,983,26.2678333333333
+2,984,27.2838333333333
+2,985,27.8553333333333
+2,986,28.2575
+2,987,31.5171666666667
+2,988,27.7495
+2,989,22.479
+2,990,26.6488333333333
+2,991,28.9983333333333
+2,992,22.1403333333333
+2,993,29.972
+2,994,22.1826666666667
+2,995,32.5331666666667
+2,996,27.8341666666667
+2,997,25.9926666666667
+2,998,23.495
+2,999,25.9291666666667
+2,1000,26.3525
+3,1,15.0071666666667
+3,2,23.6643333333333
+3,3,23.8336666666667
+3,4,21.1455
+3,5,27.1145
+3,6,19.9601666666667
+3,7,20.4046666666667
+3,8,23.6008333333333
+3,9,19.6426666666667
+3,10,23.8971666666667
+3,11,23.6643333333333
+3,12,20.6163333333333
+3,13,20.0236666666667
+3,14,15.2611666666667
+3,15,22.1403333333333
+3,16,23.8548333333333
+3,17,29.5698333333333
+3,18,27.4531666666667
+3,19,24.9766666666667
+3,20,21.2936666666667
+3,21,25.6116666666667
+3,22,26.9663333333333
+3,23,17.9493333333333
+3,24,24.9555
+3,25,19.431
+3,26,20.2565
+3,27,22.6695
+3,28,22.7118333333333
+3,29,17.1238333333333
+3,30,23.2621666666667
+3,31,19.2193333333333
+3,32,20.6586666666667
+3,33,20.5951666666667
+3,34,24.6803333333333
+3,35,15.5151666666667
+3,36,22.6695
+3,37,24.0876666666667
+3,38,20.193
+3,39,23.6643333333333
+3,40,25.4635
+3,41,20.8491666666667
+3,42,16.8486666666667
+3,43,28.8713333333333
+3,44,19.7908333333333
+3,45,24.4898333333333
+3,46,26.543
+3,47,18.1821666666667
+3,48,18.9865
+3,49,23.1986666666667
+3,50,18.6266666666667
+3,51,27.1991666666667
+3,52,18.3091666666667
+3,53,17.5683333333333
+3,54,20.7221666666667
+3,55,28.8078333333333
+3,56,26.8393333333333
+3,57,23.1563333333333
+3,58,19.812
+3,59,14.2663333333333
+3,60,22.3096666666667
+3,61,18.0128333333333
+3,62,16.9968333333333
+3,63,21.0608333333333
+3,64,24.1511666666667
+3,65,18.6266666666667
+3,66,26.3313333333333
+3,67,19.0288333333333
+3,68,21.1455
+3,69,20.4893333333333
+3,70,23.6643333333333
+3,71,17.78
+3,72,17.2296666666667
+3,73,31.0938333333333
+3,74,25.146
+3,75,16.6581666666667
+3,76,29.9931666666667
+3,77,31.8135
+3,78,17.3778333333333
+3,79,21.6535
+3,80,28.3845
+3,81,22.1403333333333
+3,82,19.6003333333333
+3,83,27.6225
+3,84,21.1455
+3,85,22.6271666666667
+3,86,23.2621666666667
+3,87,21.3148333333333
+3,88,24.1511666666667
+3,89,18.9865
+3,90,19.4945
+3,91,17.9281666666667
+3,92,14.5626666666667
+3,93,19.3886666666667
+3,94,22.2673333333333
+3,95,22.6906666666667
+3,96,23.0716666666667
+3,97,22.733
+3,98,24.8285
+3,99,18.9865
+3,100,25.5693333333333
+3,101,19.6426666666667
+3,102,26.035
+3,103,24.1511666666667
+3,104,20.6798333333333
+3,105,16.8486666666667
+3,106,22.4155
+3,107,18.6266666666667
+3,108,22.7118333333333
+3,109,19.8331666666667
+3,110,25.9291666666667
+3,111,23.9818333333333
+3,112,28.6385
+3,113,25.654
+3,114,24.8285
+3,115,24.0241666666667
+3,116,20.5316666666667
+3,117,20.2565
+3,118,25.3365
+3,119,23.2621666666667
+3,120,20.2988333333333
+3,121,24.5745
+3,122,26.7335
+3,123,21.3148333333333
+3,124,28.7231666666667
+3,125,27.7283333333333
+3,126,21.6958333333333
+3,127,17.8858333333333
+3,128,18.9653333333333
+3,129,19.7485
+3,130,19.558
+3,131,16.7005
+3,132,19.1981666666667
+3,133,20.0025
+3,134,23.7066666666667
+3,135,16.1501666666667
+3,136,18.7113333333333
+3,137,19.2828333333333
+3,138,29.0195
+3,139,25.5693333333333
+3,140,17.6106666666667
+3,141,22.479
+3,142,24.0453333333333
+3,143,18.542
+3,144,19.431
+3,145,15.0918333333333
+3,146,26.543
+3,147,17.2085
+3,148,18.6055
+3,149,25.8021666666667
+3,150,21.6746666666667
+3,151,16.9333333333333
+3,152,27.9611666666667
+3,153,20.4681666666667
+3,154,18.8171666666667
+3,155,24.0876666666667
+3,156,18.4785
+3,157,16.7005
+3,158,20.1506666666667
+3,159,19.0288333333333
+3,160,25.654
+3,161,25.4211666666667
+3,162,24.2358333333333
+3,163,17.8435
+3,164,23.3256666666667
+3,165,24.9555
+3,166,25.9926666666667
+3,167,21.0608333333333
+3,168,20.447
+3,169,33.2951666666667
+3,170,18.9653333333333
+3,171,23.0505
+3,172,14.351
+3,173,22.6695
+3,174,22.2673333333333
+3,175,20.3623333333333
+3,176,14.2875
+3,177,18.8171666666667
+3,178,25.6328333333333
+3,179,26.035
+3,180,21.7805
+3,181,21.336
+3,182,21.8016666666667
+3,183,24.0665
+3,184,26.1831666666667
+3,185,18.6478333333333
+3,186,27.0086666666667
+3,187,20.066
+3,188,23.6008333333333
+3,189,18.5843333333333
+3,190,19.1135
+3,191,18.1398333333333
+3,192,25.1036666666667
+3,193,26.416
+3,194,17.2931666666667
+3,195,20.9338333333333
+3,196,19.3463333333333
+3,197,19.685
+3,198,23.6008333333333
+3,199,22.5425
+3,200,21.5053333333333
+3,201,16.7428333333333
+3,202,22.4578333333333
+3,203,21.3148333333333
+3,204,27.178
+3,205,19.6426666666667
+3,206,24.9555
+3,207,22.9023333333333
+3,208,16.7851666666667
+3,209,20.32
+3,210,24.0665
+3,211,23.1563333333333
+3,212,21.7805
+3,213,22.987
+3,214,19.3251666666667
+3,215,13.6525
+3,216,20.3623333333333
+3,217,24.2993333333333
+3,218,22.0345
+3,219,18.3303333333333
+3,220,19.304
+3,221,22.5001666666667
+3,222,26.289
+3,223,22.606
+3,224,21.8651666666667
+3,225,24.9766666666667
+3,226,18.7748333333333
+3,227,21.2725
+3,228,19.5156666666667
+3,229,24.638
+3,230,21.7381666666667
+3,231,23.495
+3,232,24.9766666666667
+3,233,20.3623333333333
+3,234,18.0551666666667
+3,235,22.8176666666667
+3,236,21.2301666666667
+3,237,20.6163333333333
+3,238,25.019
+3,239,22.733
+3,240,15.1765
+3,241,24.0453333333333
+3,242,19.7273333333333
+3,243,14.3933333333333
+3,244,21.2936666666667
+3,245,19.05
+3,246,22.1615
+3,247,20.32
+3,248,27.3473333333333
+3,249,21.8228333333333
+3,250,26.4583333333333
+3,251,19.8543333333333
+3,252,20.0025
+3,253,16.4465
+3,254,19.9601666666667
+3,255,22.8811666666667
+3,256,22.7541666666667
+3,257,14.8801666666667
+3,258,28.956
+3,259,25.4
+3,260,17.3566666666667
+3,261,26.162
+3,262,23.8548333333333
+3,263,16.002
+3,264,18.923
+3,265,23.0716666666667
+3,266,18.669
+3,267,22.8811666666667
+3,268,22.1191666666667
+3,269,25.9503333333333
+3,270,22.5001666666667
+3,271,22.7118333333333
+3,272,14.9225
+3,273,29.0618333333333
+3,274,17.5048333333333
+3,275,24.8496666666667
+3,276,20.0871666666667
+3,277,16.7428333333333
+3,278,28.194
+3,279,19.6215
+3,280,22.225
+3,281,24.1511666666667
+3,282,22.225
+3,283,20.1083333333333
+3,284,21.1031666666667
+3,285,16.6158333333333
+3,286,23.0505
+3,287,19.3251666666667
+3,288,18.3515
+3,289,25.781
+3,290,23.4738333333333
+3,291,22.225
+3,292,17.653
+3,293,19.7908333333333
+3,294,25.3576666666667
+3,295,18.034
+3,296,27.3473333333333
+3,297,19.3675
+3,298,15.113
+3,299,21.2301666666667
+3,300,25.527
+3,301,25.5058333333333
+3,302,22.1191666666667
+3,303,20.3623333333333
+3,304,20.8703333333333
+3,305,18.796
+3,306,26.162
+3,307,26.8605
+3,308,17.2508333333333
+3,309,16.51
+3,310,26.1831666666667
+3,311,19.8543333333333
+3,312,19.7273333333333
+3,313,25.6963333333333
+3,314,23.876
+3,315,20.574
+3,316,23.0505
+3,317,21.3783333333333
+3,318,22.2461666666667
+3,319,24.0876666666667
+3,320,18.0128333333333
+3,321,17.7376666666667
+3,322,24.7015
+3,323,21.3783333333333
+3,324,28.3421666666667
+3,325,21.1878333333333
+3,326,16.6158333333333
+3,327,19.7061666666667
+3,328,16.51
+3,329,21.8651666666667
+3,330,25.2095
+3,331,27.1991666666667
+3,332,23.3891666666667
+3,333,23.1351666666667
+3,334,26.67
+3,335,24.1511666666667
+3,336,23.9395
+3,337,18.1186666666667
+3,338,26.162
+3,339,16.256
+3,340,23.1351666666667
+3,341,21.844
+3,342,15.7903333333333
+3,343,21.7805
+3,344,27.0298333333333
+3,345,24.2781666666667
+3,346,22.3308333333333
+3,347,26.7546666666667
+3,348,16.9545
+3,349,29.4428333333333
+3,350,24.2146666666667
+3,351,25.5058333333333
+3,352,20.8703333333333
+3,353,25.0613333333333
+3,354,14.7108333333333
+3,355,18.2033333333333
+3,356,27.6648333333333
+3,357,23.495
+3,358,26.7758333333333
+3,359,22.0345
+3,360,24.6803333333333
+3,361,22.4366666666667
+3,362,15.0071666666667
+3,363,18.6055
+3,364,24.765
+3,365,24.1723333333333
+3,366,21.9921666666667
+3,367,21.1243333333333
+3,368,23.6643333333333
+3,369,25.9291666666667
+3,370,24.1511666666667
+3,371,26.7758333333333
+3,372,26.1831666666667
+3,373,21.9921666666667
+3,374,26.9028333333333
+3,375,20.193
+3,376,16.7851666666667
+3,377,23.9606666666667
+3,378,25.1248333333333
+3,379,21.2725
+3,380,21.1455
+3,381,31.3055
+3,382,19.05
+3,383,27.4531666666667
+3,384,15.7268333333333
+3,385,22.3731666666667
+3,386,21.3995
+3,387,22.606
+3,388,20.4258333333333
+3,389,21.082
+3,390,27.1356666666667
+3,391,24.4263333333333
+3,392,23.9818333333333
+3,393,24.5321666666667
+3,394,18.2245
+3,395,19.304
+3,396,26.6065
+3,397,22.1615
+3,398,17.4413333333333
+3,399,21.209
+3,400,20.3411666666667
+3,401,18.5208333333333
+3,402,21.463
+3,403,21.8863333333333
+3,404,20.1718333333333
+3,405,16.7005
+3,406,39.9415
+3,407,22.0768333333333
+3,408,16.9545
+3,409,31.2631666666667
+3,410,23.7066666666667
+3,411,26.9028333333333
+3,412,20.8491666666667
+3,413,29.4851666666667
+3,414,23.876
+3,415,15.5363333333333
+3,416,21.844
+3,417,22.2885
+3,418,23.1351666666667
+3,419,24.8708333333333
+3,420,30.8398333333333
+3,421,20.7221666666667
+3,422,23.5373333333333
+3,423,13.9276666666667
+3,424,23.8125
+3,425,22.0133333333333
+3,426,30.0566666666667
+3,427,26.5641666666667
+3,428,26.543
+3,429,22.8811666666667
+3,430,23.8971666666667
+3,431,22.225
+3,432,17.8858333333333
+3,433,27.7706666666667
+3,434,25.146
+3,435,21.4206666666667
+3,436,20.4893333333333
+3,437,25.0825
+3,438,25.527
+3,439,26.035
+3,440,25.2518333333333
+3,441,15.1976666666667
+3,442,26.7123333333333
+3,443,22.8811666666667
+3,444,17.2931666666667
+3,445,20.4046666666667
+3,446,25.6116666666667
+3,447,25.9503333333333
+3,448,24.8708333333333
+3,449,18.3303333333333
+3,450,21.2725
+3,451,22.4155
+3,452,24.2358333333333
+3,453,28.7231666666667
+3,454,25.5481666666667
+3,455,17.2508333333333
+3,456,20.0025
+3,457,27.3896666666667
+3,458,21.0185
+3,459,31.115
+3,460,26.1831666666667
+3,461,21.6535
+3,462,21.1878333333333
+3,463,19.4521666666667
+3,464,23.4315
+3,465,29.0195
+3,466,21.9286666666667
+3,467,19.8755
+3,468,23.8125
+3,469,23.4738333333333
+3,470,21.0185
+3,471,13.6101666666667
+3,472,20.0025
+3,473,24.13
+3,474,22.9446666666667
+3,475,17.5471666666667
+3,476,24.0876666666667
+3,477,22.8811666666667
+3,478,20.1718333333333
+3,479,20.955
+3,480,23.7701666666667
+3,481,19.1981666666667
+3,482,25.8233333333333
+3,483,21.8016666666667
+3,484,18.9653333333333
+3,485,23.7701666666667
+3,486,20.8915
+3,487,28.7655
+3,488,20.828
+3,489,18.2456666666667
+3,490,29.2946666666667
+3,491,27.7918333333333
+3,492,26.0773333333333
+3,493,17.5683333333333
+3,494,24.2781666666667
+3,495,18.6055
+3,496,22.2885
+3,497,13.2715
+3,498,23.2621666666667
+3,499,22.3308333333333
+3,500,24.2146666666667
+3,501,21.3995
+3,502,15.875
+3,503,18.0975
+3,504,28.9136666666667
+3,505,22.0768333333333
+3,506,27.2626666666667
+3,507,19.1346666666667
+3,508,21.1455
+3,509,22.7541666666667
+3,510,22.7118333333333
+3,511,21.6111666666667
+3,512,17.2296666666667
+3,513,22.9235
+3,514,29.21
+3,515,17.145
+3,516,25.3576666666667
+3,517,18.8383333333333
+3,518,24.7226666666667
+3,519,28.7443333333333
+3,520,27.4531666666667
+3,521,21.1031666666667
+3,522,13.4831666666667
+3,523,17.7376666666667
+3,524,18.5843333333333
+3,525,23.0505
+3,526,21.4206666666667
+3,527,19.6426666666667
+3,528,19.7908333333333
+3,529,17.9705
+3,530,21.336
+3,531,21.6535
+3,532,24.003
+3,533,21.6323333333333
+3,534,29.6756666666667
+3,535,20.2353333333333
+3,536,19.0711666666667
+3,537,23.1351666666667
+3,538,23.6855
+3,539,22.7118333333333
+3,540,16.5523333333333
+3,541,22.733
+3,542,24.5956666666667
+3,543,25.019
+3,544,23.495
+3,545,29.1253333333333
+3,546,23.9818333333333
+3,547,21.0185
+3,548,28.5538333333333
+3,549,16.9756666666667
+3,550,17.4836666666667
+3,551,15.8115
+3,552,19.6003333333333
+3,553,23.5161666666667
+3,554,20.7645
+3,555,25.146
+3,556,18.4785
+3,557,26.162
+3,558,17.9281666666667
+3,559,17.8435
+3,560,19.8331666666667
+3,561,18.288
+3,562,22.987
+3,563,16.9121666666667
+3,564,25.8021666666667
+3,565,25.2095
+3,566,20.9338333333333
+3,567,23.0928333333333
+3,568,20.066
+3,569,15.9596666666667
+3,570,24.2781666666667
+3,571,27.178
+3,572,24.3416666666667
+3,573,25.1036666666667
+3,574,27.9823333333333
+3,575,25.6751666666667
+3,576,23.0293333333333
+3,577,16.4888333333333
+3,578,21.0608333333333
+3,579,21.7593333333333
+3,580,27.3473333333333
+3,581,15.5363333333333
+3,582,18.2245
+3,583,24.1723333333333
+3,584,24.1723333333333
+3,585,13.7583333333333
+3,586,20.9973333333333
+3,587,26.6488333333333
+3,588,19.0923333333333
+3,589,18.6901666666667
+3,590,29.4851666666667
+3,591,23.495
+3,592,17.3143333333333
+3,593,25.654
+3,594,22.606
+3,595,12.2978333333333
+3,596,20.7433333333333
+3,597,25.1248333333333
+3,598,25.3365
+3,599,21.1878333333333
+3,600,26.924
+3,601,21.1243333333333
+3,602,30.5223333333333
+3,603,23.6643333333333
+3,604,17.6106666666667
+3,605,22.2885
+3,606,27.4955
+3,607,20.7645
+3,608,23.1351666666667
+3,609,26.8181666666667
+3,610,25.1671666666667
+3,611,19.5156666666667
+3,612,23.4526666666667
+3,613,25.8656666666667
+3,614,18.9653333333333
+3,615,24.8496666666667
+3,616,23.0293333333333
+3,617,18.7536666666667
+3,618,25.2941666666667
+3,619,20.701
+3,620,23.8971666666667
+3,621,26.797
+3,622,24.4051666666667
+3,623,20.9973333333333
+3,624,17.2296666666667
+3,625,20.5528333333333
+3,626,20.9973333333333
+3,627,23.2833333333333
+3,628,27.3896666666667
+3,629,17.7376666666667
+3,630,22.6906666666667
+3,631,30.1201666666667
+3,632,18.4573333333333
+3,633,20.7856666666667
+3,634,18.4573333333333
+3,635,28.3845
+3,636,21.5688333333333
+3,637,18.3515
+3,638,21.3148333333333
+3,639,25.1036666666667
+3,640,18.669
+3,641,22.5213333333333
+3,642,24.9343333333333
+3,643,22.733
+3,644,19.8755
+3,645,23.7701666666667
+3,646,28.6808333333333
+3,647,16.8698333333333
+3,648,26.7123333333333
+3,649,20.8491666666667
+3,650,19.4098333333333
+3,651,23.8125
+3,652,24.1088333333333
+3,653,28.0035
+3,654,12.827
+3,655,27.2415
+3,656,21.0185
+3,657,22.4366666666667
+3,658,23.1775
+3,659,19.6426666666667
+3,660,20.828
+3,661,24.2358333333333
+3,662,14.2028333333333
+3,663,24.2358333333333
+3,664,21.9921666666667
+3,665,23.8336666666667
+3,666,25.1248333333333
+3,667,19.2193333333333
+3,668,20.6163333333333
+3,669,17.907
+3,670,19.7696666666667
+3,671,26.7546666666667
+3,672,26.4371666666667
+3,673,21.209
+3,674,18.9865
+3,675,23.1351666666667
+3,676,22.2673333333333
+3,677,26.0138333333333
+3,678,20.8491666666667
+3,679,25.908
+3,680,21.3783333333333
+3,681,13.1868333333333
+3,682,22.733
+3,683,19.6638333333333
+3,684,31.7076666666667
+3,685,12.6365
+3,686,25.4
+3,687,29.0195
+3,688,18.1398333333333
+3,689,21.5476666666667
+3,690,25.7598333333333
+3,691,22.987
+3,692,25.6328333333333
+3,693,27.2838333333333
+3,694,23.7913333333333
+3,695,21.7381666666667
+3,696,28.0035
+3,697,21.4206666666667
+3,698,25.3576666666667
+3,699,17.907
+3,700,24.384
+3,701,29.3581666666667
+3,702,17.2296666666667
+3,703,25.8233333333333
+3,704,20.9126666666667
+3,705,13.8853333333333
+3,706,22.86
+3,707,22.9023333333333
+3,708,26.1196666666667
+3,709,21.8651666666667
+3,710,21.6111666666667
+3,711,22.2461666666667
+3,712,16.637
+3,713,23.8125
+3,714,23.749
+3,715,22.2461666666667
+3,716,23.0716666666667
+3,717,18.2245
+3,718,15.3458333333333
+3,719,18.3091666666667
+3,720,18.9865
+3,721,19.2193333333333
+3,722,24.9131666666667
+3,723,21.7593333333333
+3,724,17.653
+3,725,28.0246666666667
+3,726,22.1191666666667
+3,727,24.2993333333333
+3,728,24.6591666666667
+3,729,23.8336666666667
+3,730,23.0928333333333
+3,731,32.5543333333333
+3,732,21.336
+3,733,22.4578333333333
+3,734,26.0985
+3,735,25.4846666666667
+3,736,17.018
+3,737,25.5693333333333
+3,738,24.9555
+3,739,20.2776666666667
+3,740,28.1093333333333
+3,741,19.177
+3,742,19.4098333333333
+3,743,18.7536666666667
+3,744,14.9648333333333
+3,745,19.5368333333333
+3,746,28.321
+3,747,24.2993333333333
+3,748,21.7593333333333
+3,749,22.6483333333333
+3,750,21.9075
+3,751,30.4588333333333
+3,752,23.9183333333333
+3,753,26.035
+3,754,22.86
+3,755,26.67
+3,756,21.0396666666667
+3,757,15.8538333333333
+3,758,28.5961666666667
+3,759,22.7965
+3,760,18.9865
+3,761,25.146
+3,762,25.1248333333333
+3,763,16.8063333333333
+3,764,21.5476666666667
+3,765,27.9823333333333
+3,766,21.1878333333333
+3,767,19.9601666666667
+3,768,22.0345
+3,769,20.9126666666667
+3,770,21.209
+3,771,17.5471666666667
+3,772,24.2358333333333
+3,773,27.4955
+3,774,27.5801666666667
+3,775,26.4583333333333
+3,776,22.4366666666667
+3,777,24.4686666666667
+3,778,27.0933333333333
+3,779,23.5373333333333
+3,780,24.5745
+3,781,19.4521666666667
+3,782,19.8543333333333
+3,783,31.8981666666667
+3,784,25.8445
+3,785,25.6116666666667
+3,786,26.0773333333333
+3,787,24.8073333333333
+3,788,24.5956666666667
+3,789,27.7071666666667
+3,790,14.3298333333333
+3,791,23.6643333333333
+3,792,16.8063333333333
+3,793,23.3045
+3,794,29.1888333333333
+3,795,22.3731666666667
+3,796,22.3308333333333
+3,797,13.8641666666667
+3,798,32.1521666666667
+3,799,21.717
+3,800,18.8595
+3,801,25.6751666666667
+3,802,24.2781666666667
+3,803,21.6535
+3,804,19.1558333333333
+3,805,18.5843333333333
+3,806,24.1935
+3,807,23.2833333333333
+3,808,17.8435
+3,809,20.955
+3,810,21.1243333333333
+3,811,16.4676666666667
+3,812,22.8811666666667
+3,813,23.2833333333333
+3,814,25.8656666666667
+3,815,20.8068333333333
+3,816,22.098
+3,817,17.907
+3,818,26.4795
+3,819,26.9875
+3,820,20.6163333333333
+3,821,23.876
+3,822,18.7536666666667
+3,823,25.0401666666667
+3,824,22.9446666666667
+3,825,18.5208333333333
+3,826,24.4686666666667
+3,827,26.8181666666667
+3,828,21.2725
+3,829,19.8755
+3,830,18.6901666666667
+3,831,26.7335
+3,832,22.5213333333333
+3,833,19.6638333333333
+3,834,18.2668333333333
+3,835,23.114
+3,836,22.0768333333333
+3,837,17.6741666666667
+3,838,26.289
+3,839,25.273
+3,840,20.8915
+3,841,27.4955
+3,842,28.321
+3,843,20.7433333333333
+3,844,24.1935
+3,845,26.0138333333333
+3,846,24.3416666666667
+3,847,25.1671666666667
+3,848,17.4201666666667
+3,849,23.0928333333333
+3,850,23.114
+3,851,18.7113333333333
+3,852,24.6168333333333
+3,853,16.1501666666667
+3,854,24.3628333333333
+3,855,22.8176666666667
+3,856,23.5585
+3,857,14.2028333333333
+3,858,23.0716666666667
+3,859,23.0716666666667
+3,860,19.939
+3,861,23.2198333333333
+3,862,16.5735
+3,863,25.9715
+3,864,19.8543333333333
+3,865,22.5848333333333
+3,866,17.8646666666667
+3,867,23.4738333333333
+3,868,25.0613333333333
+3,869,24.892
+3,870,20.828
+3,871,21.9921666666667
+3,872,30.1625
+3,873,18.4361666666667
+3,874,17.8011666666667
+3,875,23.368
+3,876,24.2781666666667
+3,877,26.6911666666667
+3,878,22.098
+3,879,26.0138333333333
+3,880,27.3261666666667
+3,881,21.0608333333333
+3,882,23.0928333333333
+3,883,26.5641666666667
+3,884,21.6958333333333
+3,885,23.2198333333333
+3,886,22.2673333333333
+3,887,19.558
+3,888,24.9978333333333
+3,889,22.5425
+3,890,30.099
+3,891,25.7598333333333
+3,892,19.4733333333333
+3,893,19.4521666666667
+3,894,28.702
+3,895,21.209
+3,896,24.0241666666667
+3,897,19.304
+3,898,21.59
+3,899,26.4583333333333
+3,900,18.8595
+3,901,24.1723333333333
+3,902,28.321
+3,903,28.3633333333333
+3,904,21.7805
+3,905,18.7325
+3,906,22.9446666666667
+3,907,20.701
+3,908,23.8125
+3,909,21.463
+3,910,24.4898333333333
+3,911,18.2456666666667
+3,912,19.3675
+3,913,22.7118333333333
+3,914,24.9343333333333
+3,915,20.2353333333333
+3,916,24.8496666666667
+3,917,20.3411666666667
+3,918,23.241
+3,919,16.7005
+3,920,25.0825
+3,921,22.7118333333333
+3,922,20.8703333333333
+3,923,17.2931666666667
+3,924,19.5368333333333
+3,925,19.812
+3,926,24.9555
+3,927,22.9023333333333
+3,928,26.9451666666667
+3,929,22.2461666666667
+3,930,25.8021666666667
+3,931,14.7743333333333
+3,932,16.5311666666667
+3,933,20.9761666666667
+3,934,32.5966666666667
+3,935,25.2941666666667
+3,936,20.3411666666667
+3,937,22.5848333333333
+3,938,26.0138333333333
+3,939,22.5425
+3,940,25.0613333333333
+3,941,17.5683333333333
+3,942,26.6065
+3,943,26.2466666666667
+3,944,19.6003333333333
+3,945,22.9446666666667
+3,946,26.2255
+3,947,16.9756666666667
+3,948,20.7645
+3,949,19.8755
+3,950,17.5683333333333
+3,951,21.6323333333333
+3,952,17.8858333333333
+3,953,17.145
+3,954,22.1615
+3,955,20.1083333333333
+3,956,25.6963333333333
+3,957,21.5265
+3,958,17.7165
+3,959,22.606
+3,960,27.9188333333333
+3,961,22.7118333333333
+3,962,23.8548333333333
+3,963,30.9245
+3,964,23.1986666666667
+3,965,24.9978333333333
+3,966,18.8806666666667
+3,967,29.5698333333333
+3,968,21.7805
+3,969,27.7495
+3,970,28.6173333333333
+3,971,16.0655
+3,972,19.2405
+3,973,22.225
+3,974,19.8543333333333
+3,975,27.4108333333333
+3,976,21.5688333333333
+3,977,20.4046666666667
+3,978,23.0505
+3,979,22.9658333333333
+3,980,17.3143333333333
+3,981,17.907
+3,982,19.4945
+3,983,21.7381666666667
+3,984,14.7743333333333
+3,985,16.4676666666667
+3,986,18.1398333333333
+3,987,18.7536666666667
+3,988,20.7433333333333
+3,989,21.6746666666667
+3,990,22.987
+3,991,21.6323333333333
+3,992,14.732
+3,993,20.1718333333333
+3,994,18.1821666666667
+3,995,17.018
+3,996,22.86
+3,997,24.892
+3,998,21.1243333333333
+3,999,22.0345
+3,1000,21.1455
+4,1,31.8346666666667
+4,2,41.8676666666667
+4,3,32.4696666666667
+4,4,33.3586666666667
+4,5,22.6695
+4,6,19.0923333333333
+4,7,32.7025
+4,8,27.5378333333333
+4,9,29.4216666666667
+4,10,27.5801666666667
+4,11,27.5166666666667
+4,12,20.8703333333333
+4,13,26.4371666666667
+4,14,31.9193333333333
+4,15,22.352
+4,16,32.1733333333333
+4,17,28.0458333333333
+4,18,25.7598333333333
+4,19,29.1253333333333
+4,20,30.4376666666667
+4,21,30.6705
+4,22,28.067
+4,23,25.6328333333333
+4,24,27.7283333333333
+4,25,24.8285
+4,26,32.1945
+4,27,19.1558333333333
+4,28,30.5011666666667
+4,29,25.4211666666667
+4,30,24.5956666666667
+4,31,20.9973333333333
+4,32,29.1465
+4,33,28.6808333333333
+4,34,27.9188333333333
+4,35,30.988
+4,36,26.2043333333333
+4,37,27.178
+4,38,20.955
+4,39,23.8548333333333
+4,40,28.2575
+4,41,28.4903333333333
+4,42,23.9395
+4,43,24.5533333333333
+4,44,23.5161666666667
+4,45,25.4423333333333
+4,46,22.1615
+4,47,23.4738333333333
+4,48,24.2358333333333
+4,49,26.6911666666667
+4,50,26.7123333333333
+4,51,33.5703333333333
+4,52,26.0985
+4,53,25.0613333333333
+4,54,16.6581666666667
+4,55,34.0148333333333
+4,56,26.924
+4,57,24.638
+4,58,34.9038333333333
+4,59,34.7133333333333
+4,60,32.0463333333333
+4,61,26.5853333333333
+4,62,23.9606666666667
+4,63,29.0195
+4,64,27.4108333333333
+4,65,27.559
+4,66,33.3375
+4,67,24.4475
+4,68,29.7391666666667
+4,69,27.0086666666667
+4,70,30.5858333333333
+4,71,30.6916666666667
+4,72,25.3576666666667
+4,73,31.9405
+4,74,25.1248333333333
+4,75,28.5538333333333
+4,76,29.8873333333333
+4,77,24.9555
+4,78,36.4066666666667
+4,79,26.797
+4,80,28.7866666666667
+4,81,22.8176666666667
+4,82,22.2673333333333
+4,83,32.004
+4,84,22.86
+4,85,26.9875
+4,86,21.4841666666667
+4,87,22.9235
+4,88,32.0886666666667
+4,89,27.6225
+4,90,31.8558333333333
+4,91,24.9131666666667
+4,92,20.6798333333333
+4,93,23.8336666666667
+4,94,31.9616666666667
+4,95,30.861
+4,96,28.8925
+4,97,29.337
+4,98,22.0345
+4,99,26.0773333333333
+4,100,25.7598333333333
+4,101,33.5915
+4,102,23.6643333333333
+4,103,24.9555
+4,104,25.8868333333333
+4,105,25.1036666666667
+4,106,32.6178333333333
+4,107,27.7918333333333
+4,108,31.0303333333333
+4,109,28.575
+4,110,31.7923333333333
+4,111,30.9668333333333
+4,112,21.1666666666667
+4,113,27.559
+4,114,28.4903333333333
+4,115,26.3948333333333
+4,116,30.4588333333333
+4,117,24.638
+4,118,21.4841666666667
+4,119,29.464
+4,120,26.3525
+4,121,28.0035
+4,122,24.5321666666667
+4,123,30.2471666666667
+4,124,32.7236666666667
+4,125,30.6493333333333
+4,126,26.7546666666667
+4,127,22.3943333333333
+4,128,30.1413333333333
+4,129,27.8553333333333
+4,130,29.9508333333333
+4,131,29.083
+4,132,26.1831666666667
+4,133,25.4846666666667
+4,134,22.8811666666667
+4,135,34.2476666666667
+4,136,29.6333333333333
+4,137,33.0411666666667
+4,138,32.0675
+4,139,24.384
+4,140,29.7603333333333
+4,141,25.0613333333333
+4,142,28.6808333333333
+4,143,32.9141666666667
+4,144,37.2321666666667
+4,145,34.29
+4,146,30.1836666666667
+4,147,26.5006666666667
+4,148,20.2565
+4,149,28.6173333333333
+4,150,26.2678333333333
+4,151,25.7175
+4,152,26.9663333333333
+4,153,27.432
+4,154,27.4743333333333
+4,155,30.353
+4,156,32.766
+4,157,26.416
+4,158,28.1516666666667
+4,159,24.0876666666667
+4,160,22.4578333333333
+4,161,25.654
+4,162,23.6855
+4,163,28.5538333333333
+4,164,19.7061666666667
+4,165,31.4113333333333
+4,166,28.9983333333333
+4,167,23.4103333333333
+4,168,29.464
+4,169,26.924
+4,170,27.051
+4,171,24.0665
+4,172,27.0933333333333
+4,173,30.5011666666667
+4,174,27.2626666666667
+4,175,24.6803333333333
+4,176,33.1893333333333
+4,177,28.067
+4,178,28.067
+4,179,24.9343333333333
+4,180,30.4165
+4,181,29.0618333333333
+4,182,28.194
+4,183,29.9508333333333
+4,184,26.1831666666667
+4,185,33.2105
+4,186,25.6751666666667
+4,187,29.0618333333333
+4,188,31.7923333333333
+4,189,25.7175
+4,190,36.9993333333333
+4,191,30.2683333333333
+4,192,37.4861666666667
+4,193,27.4531666666667
+4,194,29.718
+4,195,31.115
+4,196,24.892
+4,197,28.7866666666667
+4,198,25.2306666666667
+4,199,25.0825
+4,200,34.3746666666667
+4,201,32.0251666666667
+4,202,23.4315
+4,203,24.2358333333333
+4,204,23.2833333333333
+4,205,33.8878333333333
+4,206,30.3106666666667
+4,207,24.2993333333333
+4,208,32.258
+4,209,22.5213333333333
+4,210,21.59
+4,211,24.8708333333333
+4,212,29.0195
+4,213,21.4206666666667
+4,214,30.1836666666667
+4,215,29.464
+4,216,25.7386666666667
+4,217,25.273
+4,218,24.638
+4,219,34.5863333333333
+4,220,24.2146666666667
+4,221,37.5073333333333
+4,222,28.9983333333333
+4,223,27.1568333333333
+4,224,25.781
+4,225,35.5176666666667
+4,226,29.3793333333333
+4,227,31.3055
+4,228,27.2203333333333
+4,229,25.4
+4,230,24.9131666666667
+4,231,30.5858333333333
+4,232,25.3153333333333
+4,233,22.9235
+4,234,31.2208333333333
+4,235,25.6751666666667
+4,236,29.8661666666667
+4,237,31.9828333333333
+4,238,24.4475
+4,239,28.702
+4,240,35.3906666666667
+4,241,31.5383333333333
+4,242,30.9033333333333
+4,243,34.1418333333333
+4,244,26.3736666666667
+4,245,29.2311666666667
+4,246,27.813
+4,247,27.0933333333333
+4,248,27.9611666666667
+4,249,28.5326666666667
+4,250,34.2053333333333
+4,251,31.0726666666667
+4,252,25.8445
+4,253,25.6116666666667
+4,254,27.4108333333333
+4,255,34.1418333333333
+4,256,30.5223333333333
+4,257,28.321
+4,258,24.257
+4,259,26.035
+4,260,23.9606666666667
+4,261,26.7546666666667
+4,262,29.5698333333333
+4,263,24.0453333333333
+4,264,25.3576666666667
+4,265,20.4681666666667
+4,266,33.4856666666667
+4,267,29.4216666666667
+4,268,24.8496666666667
+4,269,28.321
+4,270,25.273
+4,271,26.2043333333333
+4,272,21.6111666666667
+4,273,28.7655
+4,274,25.8868333333333
+4,275,31.4536666666667
+4,276,23.8336666666667
+4,277,24.0241666666667
+4,278,26.0985
+4,279,29.4005
+4,280,27.813
+4,281,24.7015
+4,282,34.8615
+4,283,29.4428333333333
+4,284,25.7598333333333
+4,285,26.289
+4,286,32.0886666666667
+4,287,22.7965
+4,288,30.9668333333333
+4,289,27.8765
+4,290,26.3101666666667
+4,291,23.8971666666667
+4,292,32.0463333333333
+4,293,31.877
+4,294,25.2095
+4,295,23.1563333333333
+4,296,31.7711666666667
+4,297,27.4955
+4,298,21.3995
+4,299,29.6545
+4,300,23.8971666666667
+4,301,24.8073333333333
+4,302,31.5806666666667
+4,303,28.575
+4,304,25.4211666666667
+4,305,29.3581666666667
+4,306,32.0886666666667
+4,307,24.2993333333333
+4,308,28.4056666666667
+4,309,29.4216666666667
+4,310,29.4851666666667
+4,311,24.6591666666667
+4,312,24.3205
+4,313,21.8651666666667
+4,314,20.32
+4,315,24.4686666666667
+4,316,28.7866666666667
+4,317,25.3365
+4,318,18.3091666666667
+4,319,26.6488333333333
+4,320,30.2895
+4,321,32.385
+4,322,30.099
+4,323,26.2255
+4,324,27.3896666666667
+4,325,20.955
+4,326,22.0768333333333
+4,327,32.5755
+4,328,28.4268333333333
+4,329,29.6545
+4,330,18.7536666666667
+4,331,29.6968333333333
+4,332,25.2306666666667
+4,333,32.8506666666667
+4,334,28.9983333333333
+4,335,32.8506666666667
+4,336,27.8341666666667
+4,337,31.3901666666667
+4,338,33.5703333333333
+4,339,26.5006666666667
+4,340,26.4583333333333
+4,341,34.3535
+4,342,27.813
+4,343,28.9983333333333
+4,344,25.019
+4,345,22.0345
+4,346,36.0891666666667
+4,347,20.2988333333333
+4,348,26.5853333333333
+4,349,37.8883333333333
+4,350,30.5435
+4,351,31.496
+4,352,33.5068333333333
+4,353,21.5265
+4,354,23.5161666666667
+4,355,32.1521666666667
+4,356,27.1568333333333
+4,357,28.956
+4,358,32.5331666666667
+4,359,33.4856666666667
+4,360,27.3896666666667
+4,361,33.147
+4,362,32.131
+4,363,30.226
+4,364,26.8181666666667
+4,365,21.7593333333333
+4,366,24.3628333333333
+4,367,25.8656666666667
+4,368,32.6601666666667
+4,369,23.5796666666667
+4,370,25.2306666666667
+4,371,34.925
+4,372,32.258
+4,373,32.4061666666667
+4,374,29.337
+4,375,24.5533333333333
+4,376,25.0825
+4,377,28.702
+4,378,27.1356666666667
+4,379,28.194
+4,380,28.2998333333333
+4,381,23.2198333333333
+4,382,28.956
+4,383,22.4155
+4,384,26.9451666666667
+4,385,30.0566666666667
+4,386,24.6803333333333
+4,387,20.4046666666667
+4,388,28.5115
+4,389,28.7231666666667
+4,390,29.1465
+4,391,23.4526666666667
+4,392,26.8605
+4,393,29.1888333333333
+4,394,27.0298333333333
+4,395,23.4103333333333
+4,396,21.6746666666667
+4,397,25.3788333333333
+4,398,23.4315
+4,399,26.7546666666667
+4,400,24.0876666666667
+4,401,27.9823333333333
+4,402,26.7335
+4,403,21.9286666666667
+4,404,25.8233333333333
+4,405,27.3896666666667
+4,406,31.8135
+4,407,26.416
+4,408,31.0938333333333
+4,409,26.416
+4,410,34.2265
+4,411,19.4945
+4,412,24.9343333333333
+4,413,26.7123333333333
+4,414,28.4691666666667
+4,415,29.3158333333333
+4,416,25.4
+4,417,27.9823333333333
+4,418,28.0035
+4,419,31.8558333333333
+4,420,25.146
+4,421,27.2203333333333
+4,422,25.9715
+4,423,27.432
+4,424,34.0995
+4,425,30.2895
+4,426,31.1361666666667
+4,427,27.8765
+4,428,25.5693333333333
+4,429,28.9983333333333
+4,430,25.2941666666667
+4,431,23.7913333333333
+4,432,31.5595
+4,433,21.9075
+4,434,22.7965
+4,435,26.7546666666667
+4,436,21.0396666666667
+4,437,27.6013333333333
+4,438,29.3158333333333
+4,439,27.5166666666667
+4,440,29.3793333333333
+4,441,26.3736666666667
+4,442,25.1248333333333
+4,443,26.924
+4,444,25.3153333333333
+4,445,23.241
+4,446,31.8558333333333
+4,447,27.4955
+4,448,29.8238333333333
+4,449,27.7918333333333
+4,450,25.8021666666667
+4,451,36.5336666666667
+4,452,29.8873333333333
+4,453,24.6803333333333
+4,454,27.7706666666667
+4,455,29.6333333333333
+4,456,22.7753333333333
+4,457,28.9348333333333
+4,458,33.9936666666667
+4,459,27.5801666666667
+4,460,23.9395
+4,461,28.8713333333333
+4,462,28.5115
+4,463,21.4841666666667
+4,464,28.9136666666667
+4,465,34.671
+4,466,34.9461666666667
+4,467,35.3906666666667
+4,468,32.3003333333333
+4,469,34.7768333333333
+4,470,23.7066666666667
+4,471,28.5538333333333
+4,472,28.1305
+4,473,17.6106666666667
+4,474,24.9978333333333
+4,475,23.6008333333333
+4,476,32.2156666666667
+4,477,29.6756666666667
+4,478,25.5058333333333
+4,479,26.8393333333333
+4,480,24.892
+4,481,22.5425
+4,482,23.3045
+4,483,24.7226666666667
+4,484,31.623
+4,485,27.8341666666667
+4,486,25.1883333333333
+4,487,25.2941666666667
+4,488,27.9823333333333
+4,489,29.6333333333333
+4,490,31.3266666666667
+4,491,30.2895
+4,492,28.9771666666667
+4,493,28.1728333333333
+4,494,20.2353333333333
+4,495,23.4103333333333
+4,496,25.0613333333333
+4,497,26.6276666666667
+4,498,29.6545
+4,499,30.5011666666667
+4,500,28.7866666666667
+4,501,25.019
+4,502,31.369
+4,503,27.7495
+4,504,26.67
+4,505,30.9245
+4,506,29.3793333333333
+4,507,25.781
+4,508,31.0303333333333
+4,509,27.7071666666667
+4,510,26.8393333333333
+4,511,24.4898333333333
+4,512,26.797
+4,513,27.6013333333333
+4,514,29.083
+4,515,23.7278333333333
+4,516,26.7335
+4,517,31.7076666666667
+4,518,31.9193333333333
+4,519,30.7763333333333
+4,520,25.019
+4,521,26.4795
+4,522,26.5006666666667
+4,523,37.9095
+4,524,23.3468333333333
+4,525,26.8393333333333
+4,526,26.7546666666667
+4,527,24.9766666666667
+4,528,31.5171666666667
+4,529,29.3158333333333
+4,530,30.4588333333333
+4,531,29.6333333333333
+4,532,33.3586666666667
+4,533,30.0778333333333
+4,534,30.7975
+4,535,28.8713333333333
+4,536,26.543
+4,537,24.003
+4,538,36.2585
+4,539,29.1041666666667
+4,540,25.4423333333333
+4,541,26.7335
+4,542,27.6013333333333
+4,543,20.0448333333333
+4,544,28.7443333333333
+4,545,35.8351666666667
+4,546,26.924
+4,547,30.2683333333333
+4,548,31.242
+4,549,26.0985
+4,550,27.5801666666667
+4,551,24.765
+4,552,29.7603333333333
+4,553,27.305
+4,554,32.3638333333333
+4,555,30.2471666666667
+4,556,27.5801666666667
+4,557,29.7815
+4,558,22.3308333333333
+4,559,27.0086666666667
+4,560,21.6111666666667
+4,561,34.5228333333333
+4,562,36.2585
+4,563,27.1356666666667
+4,564,25.908
+4,565,23.876
+4,566,32.512
+4,567,24.4475
+4,568,27.9823333333333
+4,569,35.1578333333333
+4,570,28.956
+4,571,26.8816666666667
+4,572,18.6266666666667
+4,573,25.0613333333333
+4,574,24.9766666666667
+4,575,26.5218333333333
+4,576,27.305
+4,577,37.9095
+4,578,24.6803333333333
+4,579,27.432
+4,580,32.1521666666667
+4,581,23.241
+4,582,24.1723333333333
+4,583,22.0345
+4,584,30.3106666666667
+4,585,23.876
+4,586,26.2255
+4,587,28.3633333333333
+4,588,28.9136666666667
+4,589,34.5863333333333
+4,590,20.2776666666667
+4,591,33.0411666666667
+4,592,26.6488333333333
+4,593,32.7871666666667
+4,594,24.3628333333333
+4,595,23.9183333333333
+4,596,35.433
+4,597,27.2415
+4,598,24.7861666666667
+4,599,23.6008333333333
+4,600,30.607
+4,601,28.5961666666667
+4,602,28.3421666666667
+4,603,33.5703333333333
+4,604,29.1041666666667
+4,605,22.2038333333333
+4,606,30.5223333333333
+4,607,36.4913333333333
+4,608,24.6168333333333
+4,609,20.2353333333333
+4,610,27.4531666666667
+4,611,29.3581666666667
+4,612,29.0618333333333
+4,613,28.2363333333333
+4,614,30.7128333333333
+4,615,30.6916666666667
+4,616,26.543
+4,617,29.9296666666667
+4,618,26.924
+4,619,32.4908333333333
+4,620,28.6173333333333
+4,621,19.1558333333333
+4,622,21.3783333333333
+4,623,29.9931666666667
+4,624,21.971
+4,625,33.6126666666667
+4,626,29.9296666666667
+4,627,29.464
+4,628,29.1888333333333
+4,629,23.4103333333333
+4,630,23.0928333333333
+4,631,25.4635
+4,632,30.0355
+4,633,27.4955
+4,634,26.6276666666667
+4,635,21.9921666666667
+4,636,26.3948333333333
+4,637,34.4381666666667
+4,638,30.9668333333333
+4,639,29.9296666666667
+4,640,29.972
+4,641,29.6968333333333
+4,642,25.2518333333333
+4,643,30.353
+4,644,30.3318333333333
+4,645,17.2931666666667
+4,646,29.8661666666667
+4,647,28.9348333333333
+4,648,33.7396666666667
+4,649,28.5115
+4,650,29.972
+4,651,27.5378333333333
+4,652,31.2631666666667
+4,653,30.099
+4,654,29.9085
+4,655,29.7391666666667
+4,656,29.337
+4,657,31.3266666666667
+4,658,32.0675
+4,659,25.5481666666667
+4,660,20.8915
+4,661,22.9446666666667
+4,662,32.258
+4,663,32.7871666666667
+4,664,23.5373333333333
+4,665,23.241
+4,666,25.2941666666667
+4,667,29.591
+4,668,33.0411666666667
+4,669,32.9776666666667
+4,670,29.6333333333333
+4,671,29.4428333333333
+4,672,24.6591666666667
+4,673,30.8186666666667
+4,674,27.4955
+4,675,25.7598333333333
+4,676,24.8285
+4,677,31.3478333333333
+4,678,27.1568333333333
+4,679,25.4211666666667
+4,680,23.6431666666667
+4,681,27.178
+4,682,25.9926666666667
+4,683,25.0613333333333
+4,684,28.1516666666667
+4,685,28.9136666666667
+4,686,26.67
+4,687,31.4325
+4,688,29.845
+4,689,26.3313333333333
+4,690,27.9188333333333
+4,691,34.3323333333333
+4,692,27.5166666666667
+4,693,32.1098333333333
+4,694,30.0143333333333
+4,695,31.7076666666667
+4,696,28.7443333333333
+4,697,32.893
+4,698,27.559
+4,699,28.7443333333333
+4,700,30.2683333333333
+4,701,23.3468333333333
+4,702,29.337
+4,703,28.4268333333333
+4,704,22.7753333333333
+4,705,28.3421666666667
+4,706,23.5161666666667
+4,707,28.5961666666667
+4,708,28.2575
+4,709,31.7711666666667
+4,710,25.2095
+4,711,32.2368333333333
+4,712,35.5388333333333
+4,713,29.5486666666667
+4,714,22.7965
+4,715,19.0923333333333
+4,716,24.9978333333333
+4,717,21.8863333333333
+4,718,36.7876666666667
+4,719,26.4583333333333
+4,720,24.1511666666667
+4,721,24.1935
+4,722,32.7236666666667
+4,723,21.2301666666667
+4,724,32.6813333333333
+4,725,26.2255
+4,726,24.9131666666667
+4,727,26.6276666666667
+4,728,24.7438333333333
+4,729,27.3685
+4,730,26.5641666666667
+4,731,26.67
+4,732,24.8496666666667
+4,733,24.638
+4,734,32.6601666666667
+4,735,23.1563333333333
+4,736,34.0571666666667
+4,737,22.6906666666667
+4,738,29.8238333333333
+4,739,28.1728333333333
+4,740,24.1723333333333
+4,741,29.6968333333333
+4,742,32.6813333333333
+4,743,26.1408333333333
+4,744,30.1625
+4,745,33.3163333333333
+4,746,27.813
+4,747,30.48
+4,748,25.6963333333333
+4,749,26.7123333333333
+4,750,29.8238333333333
+4,751,28.575
+4,752,27.9611666666667
+4,753,30.099
+4,754,34.0783333333333
+4,755,33.7396666666667
+4,756,30.3741666666667
+4,757,30.1201666666667
+4,758,24.2146666666667
+4,759,28.9983333333333
+4,760,29.2735
+4,761,26.7335
+4,762,28.7866666666667
+4,763,25.9291666666667
+4,764,25.2518333333333
+4,765,26.3525
+4,766,26.3313333333333
+4,767,24.638
+4,768,22.2038333333333
+4,769,22.8811666666667
+4,770,29.1888333333333
+4,771,31.6653333333333
+4,772,31.2631666666667
+4,773,28.9348333333333
+4,774,36.6395
+4,775,25.0825
+4,776,23.8971666666667
+4,777,32.8295
+4,778,29.5486666666667
+4,779,28.702
+4,780,20.2141666666667
+4,781,28.5115
+4,782,27.6436666666667
+4,783,25.9715
+4,784,24.9131666666667
+4,785,30.3741666666667
+4,786,23.1351666666667
+4,787,26.3736666666667
+4,788,33.4221666666667
+4,789,28.4691666666667
+4,790,28.9136666666667
+4,791,29.7603333333333
+4,792,32.8718333333333
+4,793,27.0721666666667
+4,794,37.1051666666667
+4,795,26.67
+4,796,26.416
+4,797,30.3741666666667
+4,798,23.9183333333333
+4,799,25.1671666666667
+4,800,28.1093333333333
+4,801,22.606
+4,802,29.2311666666667
+4,803,33.655
+4,804,33.1893333333333
+4,805,22.4578333333333
+4,806,31.2631666666667
+4,807,28.3421666666667
+4,808,29.2311666666667
+4,809,26.035
+4,810,30.5223333333333
+4,811,26.5218333333333
+4,812,27.1356666666667
+4,813,28.2998333333333
+4,814,24.3205
+4,815,27.2626666666667
+4,816,27.0721666666667
+4,817,31.3478333333333
+4,818,30.0355
+4,819,29.7815
+4,820,28.956
+4,821,27.2626666666667
+4,822,26.4371666666667
+4,823,35.7716666666667
+4,824,23.4103333333333
+4,825,31.7923333333333
+4,826,24.5956666666667
+4,827,31.242
+4,828,23.5585
+4,829,21.844
+4,830,24.6591666666667
+4,831,27.178
+4,832,30.3953333333333
+4,833,25.8868333333333
+4,834,28.3633333333333
+4,835,25.6328333333333
+4,836,25.5481666666667
+4,837,28.5326666666667
+4,838,25.908
+4,839,23.1351666666667
+4,840,29.5698333333333
+4,841,25.3153333333333
+4,842,28.702
+4,843,26.6911666666667
+4,844,30.0566666666667
+4,845,33.3798333333333
+4,846,25.8656666666667
+4,847,26.5218333333333
+4,848,32.639
+4,849,23.8336666666667
+4,850,26.8605
+4,851,22.7541666666667
+4,852,24.0453333333333
+4,853,27.559
+4,854,28.6173333333333
+4,855,23.1775
+4,856,25.6963333333333
+4,857,31.4536666666667
+4,858,27.5801666666667
+4,859,29.6121666666667
+4,860,28.4691666666667
+4,861,29.7603333333333
+4,862,27.305
+4,863,32.9353333333333
+4,864,23.5796666666667
+4,865,34.2688333333333
+4,866,28.2998333333333
+4,867,28.2151666666667
+4,868,31.0303333333333
+4,869,26.7546666666667
+4,870,27.8976666666667
+4,871,29.5063333333333
+4,872,28.6173333333333
+4,873,24.4051666666667
+4,874,30.6705
+4,875,29.9508333333333
+4,876,25.781
+4,877,29.337
+4,878,27.432
+4,879,24.2993333333333
+4,880,28.829
+4,881,34.0148333333333
+4,882,31.0726666666667
+4,883,21.4841666666667
+4,884,25.4211666666667
+4,885,31.877
+4,886,24.2993333333333
+4,887,25.8656666666667
+4,888,25.1671666666667
+4,889,25.2941666666667
+4,890,18.6478333333333
+4,891,30.353
+4,892,21.971
+4,893,27.6648333333333
+4,894,36.8511666666667
+4,895,19.8331666666667
+4,896,26.2255
+4,897,25.4
+4,898,25.908
+4,899,30.734
+4,900,24.2146666666667
+4,901,26.0985
+4,902,31.242
+4,903,30.607
+4,904,29.8873333333333
+4,905,25.0401666666667
+4,906,26.289
+4,907,28.7443333333333
+4,908,30.0355
+4,909,24.7438333333333
+4,910,24.8496666666667
+4,911,29.464
+4,912,22.9235
+4,913,33.3163333333333
+4,914,22.5425
+4,915,25.7386666666667
+4,916,27.1568333333333
+4,917,24.5533333333333
+4,918,28.1093333333333
+4,919,27.5378333333333
+4,920,24.2146666666667
+4,921,30.3318333333333
+4,922,22.2673333333333
+4,923,25.2518333333333
+4,924,26.9663333333333
+4,925,27.559
+4,926,24.5956666666667
+4,927,31.9616666666667
+4,928,27.2415
+4,929,32.4485
+4,930,25.273
+4,931,26.0985
+4,932,28.9771666666667
+4,933,29.5063333333333
+4,934,30.1413333333333
+4,935,24.9978333333333
+4,936,34.3958333333333
+4,937,32.385
+4,938,31.9616666666667
+4,939,32.3215
+4,940,26.2255
+4,941,32.2791666666667
+4,942,16.7428333333333
+4,943,29.9085
+4,944,29.4851666666667
+4,945,29.9085
+4,946,25.2095
+4,947,23.8125
+4,948,21.0396666666667
+4,949,29.7815
+4,950,24.3205
+4,951,29.6968333333333
+4,952,25.3788333333333
+4,953,20.3411666666667
+4,954,31.3478333333333
+4,955,32.3638333333333
+4,956,27.8976666666667
+4,957,27.8976666666667
+4,958,23.9395
+4,959,25.7386666666667
+4,960,27.94
+4,961,33.6761666666667
+4,962,29.1888333333333
+4,963,24.0876666666667
+4,964,26.9875
+4,965,24.6803333333333
+4,966,25.1248333333333
+4,967,28.4903333333333
+4,968,26.6065
+4,969,33.8455
+4,970,24.6591666666667
+4,971,20.7433333333333
+4,972,24.4263333333333
+4,973,27.3896666666667
+4,974,20.7221666666667
+4,975,34.5651666666667
+4,976,24.8285
+4,977,29.083
+4,978,23.8971666666667
+4,979,27.686
+4,980,22.0345
+4,981,26.2255
+4,982,25.654
+4,983,23.0081666666667
+4,984,25.4211666666667
+4,985,27.6648333333333
+4,986,32.385
+4,987,24.384
+4,988,37.7825
+4,989,27.8765
+4,990,28.194
+4,991,28.194
+4,992,24.7438333333333
+4,993,32.258
+4,994,27.7706666666667
+4,995,33.7608333333333
+4,996,28.7866666666667
+4,997,23.7066666666667
+4,998,26.4371666666667
+4,999,20.701
+4,1000,27.0298333333333
+5,1,21.9286666666667
+5,2,22.3731666666667
+5,3,27.6436666666667
+5,4,25.2095
+5,5,25.019
+5,6,21.5476666666667
+5,7,23.1563333333333
+5,8,19.5368333333333
+5,9,20.8491666666667
+5,10,27.3261666666667
+5,11,20.3623333333333
+5,12,19.9813333333333
+5,13,20.7221666666667
+5,14,24.5745
+5,15,21.8863333333333
+5,16,19.6003333333333
+5,17,27.2203333333333
+5,18,21.4206666666667
+5,19,21.3571666666667
+5,20,21.8016666666667
+5,21,20.5316666666667
+5,22,25.1671666666667
+5,23,21.5265
+5,24,20.0871666666667
+5,25,19.1558333333333
+5,26,19.0711666666667
+5,27,22.2461666666667
+5,28,28.0881666666667
+5,29,18.4361666666667
+5,30,22.1615
+5,31,19.2616666666667
+5,32,23.5796666666667
+5,33,22.8388333333333
+5,34,21.5688333333333
+5,35,25.6751666666667
+5,36,20.701
+5,37,21.336
+5,38,17.9281666666667
+5,39,22.5425
+5,40,21.6323333333333
+5,41,18.8806666666667
+5,42,25.8445
+5,43,21.9921666666667
+5,44,26.7758333333333
+5,45,23.1563333333333
+5,46,18.3515
+5,47,17.9493333333333
+5,48,22.606
+5,49,21.3148333333333
+5,50,18.5208333333333
+5,51,19.4945
+5,52,22.5636666666667
+5,53,21.3783333333333
+5,54,26.1408333333333
+5,55,24.9131666666667
+5,56,28.4691666666667
+5,57,27.6436666666667
+5,58,21.8863333333333
+5,59,21.1243333333333
+5,60,29.5698333333333
+5,61,26.2255
+5,62,22.0345
+5,63,24.765
+5,64,19.558
+5,65,20.955
+5,66,21.59
+5,67,31.7076666666667
+5,68,20.0871666666667
+5,69,22.3943333333333
+5,70,23.6855
+5,71,20.4681666666667
+5,72,24.6803333333333
+5,73,27.5166666666667
+5,74,17.9705
+5,75,21.336
+5,76,24.0876666666667
+5,77,24.2993333333333
+5,78,19.8966666666667
+5,79,21.9498333333333
+5,80,19.5368333333333
+5,81,24.2146666666667
+5,82,23.4315
+5,83,25.2306666666667
+5,84,21.8228333333333
+5,85,24.4686666666667
+5,86,26.0138333333333
+5,87,25.4846666666667
+5,88,18.8595
+5,89,19.5791666666667
+5,90,22.8176666666667
+5,91,16.8275
+5,92,23.7066666666667
+5,93,25.1036666666667
+5,94,19.7273333333333
+5,95,19.1981666666667
+5,96,19.4733333333333
+5,97,17.7376666666667
+5,98,27.1991666666667
+5,99,23.3045
+5,100,20.6798333333333
+5,101,18.2456666666667
+5,102,23.368
+5,103,28.7231666666667
+5,104,23.749
+5,105,26.6911666666667
+5,106,25.1036666666667
+5,107,16.8698333333333
+5,108,26.7123333333333
+5,109,26.8393333333333
+5,110,16.8698333333333
+5,111,22.6695
+5,112,19.0288333333333
+5,113,18.7748333333333
+5,114,22.7753333333333
+5,115,24.0241666666667
+5,116,24.8708333333333
+5,117,22.3943333333333
+5,118,17.145
+5,119,23.0505
+5,120,20.5951666666667
+5,121,24.9978333333333
+5,122,21.7593333333333
+5,123,28.2151666666667
+5,124,19.9601666666667
+5,125,31.4113333333333
+5,126,22.7118333333333
+5,127,23.5585
+5,128,23.0505
+5,129,24.7861666666667
+5,130,28.7866666666667
+5,131,22.2038333333333
+5,132,26.0773333333333
+5,133,17.9493333333333
+5,134,26.5641666666667
+5,135,17.907
+5,136,23.0081666666667
+5,137,17.1026666666667
+5,138,20.0871666666667
+5,139,25.146
+5,140,23.1986666666667
+5,141,24.13
+5,142,18.4996666666667
+5,143,20.2776666666667
+5,144,17.9281666666667
+5,145,16.7428333333333
+5,146,23.7066666666667
+5,147,16.6158333333333
+5,148,23.9395
+5,149,27.1145
+5,150,25.5905
+5,151,18.3726666666667
+5,152,23.5161666666667
+5,153,27.432
+5,154,19.1981666666667
+5,155,26.5218333333333
+5,156,16.2136666666667
+5,157,23.3045
+5,158,19.4945
+5,159,19.6638333333333
+5,160,26.5641666666667
+5,161,24.7226666666667
+5,162,25.2095
+5,163,19.8755
+5,164,28.2575
+5,165,28.1093333333333
+5,166,22.0345
+5,167,21.3571666666667
+5,168,23.9606666666667
+5,169,25.8233333333333
+5,170,21.336
+5,171,25.5058333333333
+5,172,19.4733333333333
+5,173,21.8016666666667
+5,174,22.2673333333333
+5,175,21.6958333333333
+5,176,20.701
+5,177,20.3623333333333
+5,178,19.8331666666667
+5,179,21.209
+5,180,24.13
+5,181,26.3525
+5,182,22.7118333333333
+5,183,25.908
+5,184,18.6266666666667
+5,185,19.8755
+5,186,25.9715
+5,187,21.7805
+5,188,21.3148333333333
+5,189,22.225
+5,190,29.1676666666667
+5,191,20.1718333333333
+5,192,20.7221666666667
+5,193,21.0185
+5,194,27.0086666666667
+5,195,21.6958333333333
+5,196,29.2523333333333
+5,197,20.32
+5,198,25.0825
+5,199,25.0613333333333
+5,200,22.1826666666667
+5,201,18.7325
+5,202,17.8011666666667
+5,203,26.1196666666667
+5,204,19.7061666666667
+5,205,19.6003333333333
+5,206,19.8966666666667
+5,207,27.1356666666667
+5,208,24.4263333333333
+5,209,20.2565
+5,210,18.415
+5,211,20.9126666666667
+5,212,28.2575
+5,213,19.6638333333333
+5,214,19.7273333333333
+5,215,18.6478333333333
+5,216,16.3195
+5,217,24.5533333333333
+5,218,21.4841666666667
+5,219,22.987
+5,220,27.1145
+5,221,27.4955
+5,222,18.542
+5,223,22.2461666666667
+5,224,23.6008333333333
+5,225,23.8971666666667
+5,226,24.9766666666667
+5,227,21.5265
+5,228,22.352
+5,229,19.8331666666667
+5,230,26.6911666666667
+5,231,20.066
+5,232,27.6225
+5,233,26.0561666666667
+5,234,25.1671666666667
+5,235,24.13
+5,236,21.209
+5,237,30.5858333333333
+5,238,20.1718333333333
+5,239,23.3045
+5,240,17.9493333333333
+5,241,19.3463333333333
+5,242,20.5528333333333
+5,243,17.272
+5,244,22.4366666666667
+5,245,23.1775
+5,246,22.5213333333333
+5,247,19.5156666666667
+5,248,21.1031666666667
+5,249,20.5316666666667
+5,250,23.6643333333333
+5,251,20.32
+5,252,22.7118333333333
+5,253,21.2936666666667
+5,254,20.3623333333333
+5,255,23.5373333333333
+5,256,23.5161666666667
+5,257,24.257
+5,258,21.5688333333333
+5,259,24.384
+5,260,25.273
+5,261,23.622
+5,262,20.0236666666667
+5,263,22.0345
+5,264,27.3685
+5,265,30.4165
+5,266,22.3096666666667
+5,267,24.4475
+5,268,21.6958333333333
+5,269,20.2353333333333
+5,270,24.2781666666667
+5,271,19.9813333333333
+5,272,22.4155
+5,273,24.003
+5,274,23.0293333333333
+5,275,22.9235
+5,276,32.9141666666667
+5,277,23.8548333333333
+5,278,22.2461666666667
+5,279,22.4366666666667
+5,280,19.177
+5,281,16.8275
+5,282,19.9178333333333
+5,283,20.5951666666667
+5,284,21.209
+5,285,19.5156666666667
+5,286,20.3411666666667
+5,287,20.1506666666667
+5,288,23.0081666666667
+5,289,21.717
+5,290,26.6065
+5,291,22.0345
+5,292,19.5791666666667
+5,293,19.939
+5,294,23.0081666666667
+5,295,24.0453333333333
+5,296,22.225
+5,297,23.9818333333333
+5,298,19.8331666666667
+5,299,21.844
+5,300,18.2033333333333
+5,301,22.0556666666667
+5,302,26.6911666666667
+5,303,24.8496666666667
+5,304,22.0133333333333
+5,305,20.7221666666667
+5,306,25.7175
+5,307,27.305
+5,308,18.5208333333333
+5,309,15.4728333333333
+5,310,26.6065
+5,311,29.7815
+5,312,20.5316666666667
+5,313,23.7066666666667
+5,314,18.542
+5,315,21.6746666666667
+5,316,25.654
+5,317,23.114
+5,318,18.669
+5,319,23.5796666666667
+5,320,21.0608333333333
+5,321,24.2993333333333
+5,322,25.4635
+5,323,25.6751666666667
+5,324,24.9343333333333
+5,325,21.6958333333333
+5,326,22.7118333333333
+5,327,19.177
+5,328,24.1723333333333
+5,329,22.9023333333333
+5,330,20.5316666666667
+5,331,20.2565
+5,332,22.9446666666667
+5,333,20.8491666666667
+5,334,20.447
+5,335,24.384
+5,336,27.2838333333333
+5,337,20.9338333333333
+5,338,25.0401666666667
+5,339,21.6111666666667
+5,340,20.5951666666667
+5,341,14.5626666666667
+5,342,21.5265
+5,343,24.5321666666667
+5,344,18.7325
+5,345,24.003
+5,346,19.2405
+5,347,24.2993333333333
+5,348,26.162
+5,349,17.653
+5,350,20.0448333333333
+5,351,23.4738333333333
+5,352,22.4366666666667
+5,353,17.2931666666667
+5,354,16.5523333333333
+5,355,20.5951666666667
+5,356,22.1403333333333
+5,357,23.5796666666667
+5,358,17.6106666666667
+5,359,25.8021666666667
+5,360,23.6431666666667
+5,361,21.5476666666667
+5,362,21.59
+5,363,22.9023333333333
+5,364,16.1713333333333
+5,365,19.9601666666667
+5,366,19.05
+5,367,22.2885
+5,368,23.8548333333333
+5,369,22.8388333333333
+5,370,28.4056666666667
+5,371,20.0236666666667
+5,372,22.3308333333333
+5,373,20.6586666666667
+5,374,28.2998333333333
+5,375,22.3308333333333
+5,376,19.0923333333333
+5,377,22.2885
+5,378,21.336
+5,379,31.6653333333333
+5,380,17.9916666666667
+5,381,17.5048333333333
+5,382,20.6375
+5,383,14.9013333333333
+5,384,24.7226666666667
+5,385,20.5105
+5,386,22.2038333333333
+5,387,21.8863333333333
+5,388,31.5806666666667
+5,389,26.0138333333333
+5,390,23.9183333333333
+5,391,27.051
+5,392,19.4098333333333
+5,393,19.1346666666667
+5,394,21.9498333333333
+5,395,21.4206666666667
+5,396,18.9018333333333
+5,397,26.0773333333333
+5,398,29.9931666666667
+5,399,22.6483333333333
+5,400,20.4681666666667
+5,401,27.3473333333333
+5,402,26.9451666666667
+5,403,21.4206666666667
+5,404,19.1558333333333
+5,405,16.9333333333333
+5,406,22.1191666666667
+5,407,20.3411666666667
+5,408,23.8548333333333
+5,409,18.542
+5,410,25.8656666666667
+5,411,21.3783333333333
+5,412,21.6111666666667
+5,413,25.9291666666667
+5,414,20.6375
+5,415,22.606
+5,416,18.4361666666667
+5,417,19.1135
+5,418,22.0556666666667
+5,419,23.0293333333333
+5,420,27.3473333333333
+5,421,25.0613333333333
+5,422,24.6803333333333
+5,423,22.5636666666667
+5,424,18.5843333333333
+5,425,20.6375
+5,426,25.4846666666667
+5,427,19.7485
+5,428,20.1083333333333
+5,429,22.9658333333333
+5,430,21.3148333333333
+5,431,22.5213333333333
+5,432,22.352
+5,433,22.2885
+5,434,19.6215
+5,435,27.7918333333333
+5,436,26.5006666666667
+5,437,20.7856666666667
+5,438,25.5905
+5,439,21.082
+5,440,24.765
+5,441,24.9555
+5,442,21.6111666666667
+5,443,25.2518333333333
+5,444,26.035
+5,445,24.1723333333333
+5,446,21.3148333333333
+5,447,20.5951666666667
+5,448,24.5533333333333
+5,449,22.5848333333333
+5,450,22.1403333333333
+5,451,19.7273333333333
+5,452,18.034
+5,453,23.6008333333333
+5,454,19.0923333333333
+5,455,20.828
+5,456,26.5641666666667
+5,457,22.7753333333333
+5,458,21.8863333333333
+5,459,19.4945
+5,460,20.8915
+5,461,17.9493333333333
+5,462,18.1821666666667
+5,463,25.7598333333333
+5,464,24.2146666666667
+5,465,24.9343333333333
+5,466,30.2048333333333
+5,467,21.3148333333333
+5,468,22.8811666666667
+5,469,23.0081666666667
+5,470,19.5368333333333
+5,471,32.4273333333333
+5,472,24.5745
+5,473,21.5476666666667
+5,474,30.353
+5,475,22.098
+5,476,23.0293333333333
+5,477,19.939
+5,478,18.415
+5,479,23.2198333333333
+5,480,26.7335
+5,481,26.6911666666667
+5,482,26.1831666666667
+5,483,23.1563333333333
+5,484,14.0546666666667
+5,485,20.066
+5,486,21.8651666666667
+5,487,22.8811666666667
+5,488,20.3623333333333
+5,489,25.9291666666667
+5,490,22.3308333333333
+5,491,28.3421666666667
+5,492,23.0293333333333
+5,493,21.4206666666667
+5,494,28.194
+5,495,20.9338333333333
+5,496,21.2301666666667
+5,497,23.6431666666667
+5,498,27.4531666666667
+5,499,26.543
+5,500,25.7175
+5,501,22.2038333333333
+5,502,22.3943333333333
+5,503,19.8755
+5,504,26.0138333333333
+5,505,26.0773333333333
+5,506,20.2141666666667
+5,507,24.1935
+5,508,17.9705
+5,509,20.2565
+5,510,26.7335
+5,511,24.384
+5,512,18.5843333333333
+5,513,25.0825
+5,514,23.0293333333333
+5,515,22.0133333333333
+5,516,24.4263333333333
+5,517,21.209
+5,518,16.0866666666667
+5,519,21.1031666666667
+5,520,23.749
+5,521,23.2198333333333
+5,522,20.4258333333333
+5,523,28.4691666666667
+5,524,23.1351666666667
+5,525,22.987
+5,526,18.669
+5,527,19.6003333333333
+5,528,21.6323333333333
+5,529,19.9601666666667
+5,530,19.5156666666667
+5,531,19.177
+5,532,21.1243333333333
+5,533,18.3091666666667
+5,534,22.1826666666667
+5,535,18.161
+5,536,23.0716666666667
+5,537,25.3788333333333
+5,538,22.7118333333333
+5,539,21.6535
+5,540,21.7593333333333
+5,541,13.9911666666667
+5,542,17.9281666666667
+5,543,24.4686666666667
+5,544,19.7485
+5,545,20.701
+5,546,22.5636666666667
+5,547,19.2405
+5,548,26.1408333333333
+5,549,27.94
+5,550,21.0185
+5,551,21.1243333333333
+5,552,28.067
+5,553,26.2043333333333
+5,554,24.0665
+5,555,20.6586666666667
+5,556,24.3628333333333
+5,557,26.9028333333333
+5,558,18.6266666666667
+5,559,23.6643333333333
+5,560,21.0396666666667
+5,561,20.8068333333333
+5,562,21.3571666666667
+5,563,17.5048333333333
+5,564,23.3468333333333
+5,565,25.1883333333333
+5,566,25.9926666666667
+5,567,26.9028333333333
+5,568,19.8331666666667
+5,569,20.574
+5,570,23.8548333333333
+5,571,18.542
+5,572,23.5161666666667
+5,573,21.7805
+5,574,20.3411666666667
+5,575,23.3256666666667
+5,576,28.575
+5,577,18.034
+5,578,19.8543333333333
+5,579,23.0505
+5,580,21.2725
+5,581,20.32
+5,582,24.0876666666667
+5,583,20.8491666666667
+5,584,20.32
+5,585,23.9606666666667
+5,586,25.8868333333333
+5,587,22.2673333333333
+5,588,27.2626666666667
+5,589,24.0665
+5,590,25.781
+5,591,28.9136666666667
+5,592,19.812
+5,593,23.1986666666667
+5,594,20.7433333333333
+5,595,22.8176666666667
+5,596,18.7325
+5,597,19.4945
+5,598,23.8336666666667
+5,599,21.1878333333333
+5,600,24.5956666666667
+5,601,22.1615
+5,602,28.1305
+5,603,23.2621666666667
+5,604,18.8595
+5,605,26.8181666666667
+5,606,22.7965
+5,607,26.2466666666667
+5,608,24.511
+5,609,20.7856666666667
+5,610,18.923
+5,611,19.1135
+5,612,19.8966666666667
+5,613,22.2038333333333
+5,614,24.2358333333333
+5,615,17.0603333333333
+5,616,23.8125
+5,617,20.5528333333333
+5,618,24.6591666666667
+5,619,18.3726666666667
+5,620,26.6276666666667
+5,621,26.8181666666667
+5,622,20.9126666666667
+5,623,18.4361666666667
+5,624,22.4578333333333
+5,625,21.082
+5,626,20.5951666666667
+5,627,23.876
+5,628,20.4258333333333
+5,629,23.4103333333333
+5,630,24.4051666666667
+5,631,19.5791666666667
+5,632,27.1145
+5,633,20.193
+5,634,20.1083333333333
+5,635,24.0241666666667
+5,636,21.3148333333333
+5,637,18.1186666666667
+5,638,19.6215
+5,639,20.4046666666667
+5,640,17.4201666666667
+5,641,26.924
+5,642,22.7753333333333
+5,643,24.6803333333333
+5,644,22.8388333333333
+5,645,26.1408333333333
+5,646,21.9075
+5,647,25.9291666666667
+5,648,19.177
+5,649,18.4361666666667
+5,650,24.4475
+5,651,23.114
+5,652,25.8868333333333
+5,653,16.9121666666667
+5,654,21.844
+5,655,24.13
+5,656,23.4315
+5,657,17.78
+5,658,21.2301666666667
+5,659,22.606
+5,660,21.1455
+5,661,21.5476666666667
+5,662,24.13
+5,663,29.972
+5,664,22.5213333333333
+5,665,16.7005
+5,666,17.78
+5,667,21.7593333333333
+5,668,23.3468333333333
+5,669,17.8223333333333
+5,670,20.9973333333333
+5,671,20.1506666666667
+5,672,26.9028333333333
+5,673,21.9286666666667
+5,674,30.099
+5,675,26.3525
+5,676,18.8806666666667
+5,677,23.495
+5,678,19.431
+5,679,20.1506666666667
+5,680,19.05
+5,681,18.5208333333333
+5,682,21.8651666666667
+5,683,26.9451666666667
+5,684,17.78
+5,685,21.9286666666667
+5,686,23.4103333333333
+5,687,22.2885
+5,688,18.0551666666667
+5,689,20.9973333333333
+5,690,25.3365
+5,691,21.3148333333333
+5,692,24.9131666666667
+5,693,23.241
+5,694,18.6478333333333
+5,695,20.701
+5,696,18.9018333333333
+5,697,19.2193333333333
+5,698,27.8553333333333
+5,699,21.5688333333333
+5,700,23.368
+5,701,23.241
+5,702,25.8868333333333
+5,703,27.5801666666667
+5,704,20.2565
+5,705,24.384
+5,706,15.9385
+5,707,19.2193333333333
+5,708,19.7273333333333
+5,709,21.463
+5,710,22.352
+5,711,16.2983333333333
+5,712,21.9921666666667
+5,713,29.7815
+5,714,22.733
+5,715,17.0391666666667
+5,716,17.5895
+5,717,20.955
+5,718,23.0716666666667
+5,719,20.5316666666667
+5,720,20.955
+5,721,17.6741666666667
+5,722,19.939
+5,723,20.4258333333333
+5,724,27.7071666666667
+5,725,18.5631666666667
+5,726,20.6586666666667
+5,727,25.5905
+5,728,22.7118333333333
+5,729,19.0076666666667
+5,730,26.5853333333333
+5,731,23.0293333333333
+5,732,18.6478333333333
+5,733,23.7278333333333
+5,734,22.7541666666667
+5,735,21.2301666666667
+5,736,22.9023333333333
+5,737,18.796
+5,738,21.1666666666667
+5,739,23.0081666666667
+5,740,24.4475
+5,741,23.1775
+5,742,16.9968333333333
+5,743,23.241
+5,744,22.3731666666667
+5,745,28.4903333333333
+5,746,19.8331666666667
+5,747,24.511
+5,748,28.575
+5,749,25.4
+5,750,25.2306666666667
+5,751,20.8491666666667
+5,752,22.2885
+5,753,26.2466666666667
+5,754,21.717
+5,755,20.1083333333333
+5,756,18.6901666666667
+5,757,26.0985
+5,758,19.8755
+5,759,26.5006666666667
+5,760,18.4361666666667
+5,761,16.9545
+5,762,24.6168333333333
+5,763,25.1036666666667
+5,764,22.1826666666667
+5,765,21.7805
+5,766,25.4846666666667
+5,767,24.8708333333333
+5,768,29.2311666666667
+5,769,19.4521666666667
+5,770,20.8703333333333
+5,771,26.2043333333333
+5,772,22.4366666666667
+5,773,18.1398333333333
+5,774,21.9498333333333
+5,775,18.7325
+5,776,25.8656666666667
+5,777,21.8651666666667
+5,778,23.0081666666667
+5,779,19.3251666666667
+5,780,23.1986666666667
+5,781,28.6596666666667
+5,782,26.2466666666667
+5,783,20.5528333333333
+5,784,18.6901666666667
+5,785,24.3628333333333
+5,786,16.7428333333333
+5,787,23.0293333333333
+5,788,28.067
+5,789,28.8925
+5,790,21.3571666666667
+5,791,21.6535
+5,792,16.7851666666667
+5,793,24.511
+5,794,24.384
+5,795,26.6488333333333
+5,796,21.8863333333333
+5,797,26.7758333333333
+5,798,22.5425
+5,799,25.4423333333333
+5,800,26.0985
+5,801,26.5853333333333
+5,802,20.447
+5,803,23.4526666666667
+5,804,18.7748333333333
+5,805,22.3096666666667
+5,806,19.2193333333333
+5,807,26.5641666666667
+5,808,24.5321666666667
+5,809,25.8868333333333
+5,810,23.4526666666667
+5,811,22.098
+5,812,22.733
+5,813,18.7113333333333
+5,814,20.066
+5,815,25.5905
+5,816,26.289
+5,817,16.383
+5,818,22.9658333333333
+5,819,23.0293333333333
+5,820,18.161
+5,821,22.0768333333333
+5,822,22.5848333333333
+5,823,25.2518333333333
+5,824,25.654
+5,825,21.5265
+5,826,25.4
+5,827,19.9601666666667
+5,828,23.1563333333333
+5,829,18.7325
+5,830,19.4521666666667
+5,831,13.208
+5,832,19.558
+5,833,24.5956666666667
+5,834,26.289
+5,835,19.6003333333333
+5,836,20.6375
+5,837,22.4155
+5,838,22.4578333333333
+5,839,23.368
+5,840,17.6106666666667
+5,841,19.8331666666667
+5,842,19.4945
+5,843,25.4635
+5,844,16.51
+5,845,29.2735
+5,846,29.0195
+5,847,18.8595
+5,848,25.8233333333333
+5,849,22.733
+5,850,22.6483333333333
+5,851,26.6065
+5,852,17.7376666666667
+5,853,25.4
+5,854,22.0768333333333
+5,855,17.2931666666667
+5,856,30.9245
+5,857,21.5265
+5,858,19.558
+5,859,22.352
+5,860,30.5223333333333
+5,861,27.0933333333333
+5,862,22.5001666666667
+5,863,18.3938333333333
+5,864,22.2673333333333
+5,865,19.4098333333333
+5,866,16.7428333333333
+5,867,18.2245
+5,868,23.7278333333333
+5,869,24.9131666666667
+5,870,19.7273333333333
+5,871,20.2776666666667
+5,872,24.4263333333333
+5,873,19.4733333333333
+5,874,25.5058333333333
+5,875,19.3886666666667
+5,876,22.0133333333333
+5,877,20.4893333333333
+5,878,25.6116666666667
+5,879,18.9441666666667
+5,880,18.1186666666667
+5,881,22.2461666666667
+5,882,22.733
+5,883,20.1506666666667
+5,884,22.6906666666667
+5,885,22.5001666666667
+5,886,20.574
+5,887,21.1666666666667
+5,888,15.621
+5,889,18.5631666666667
+5,890,17.1873333333333
+5,891,23.622
+5,892,20.574
+5,893,22.8176666666667
+5,894,26.67
+5,895,26.9028333333333
+5,896,18.8171666666667
+5,897,24.3205
+5,898,21.7593333333333
+5,899,17.4413333333333
+5,900,24.13
+5,901,23.2833333333333
+5,902,18.3303333333333
+5,903,22.352
+5,904,24.3628333333333
+5,905,19.9178333333333
+5,906,17.272
+5,907,21.463
+5,908,19.2193333333333
+5,909,23.6431666666667
+5,910,21.8863333333333
+5,911,23.8548333333333
+5,912,24.8496666666667
+5,913,21.5476666666667
+5,914,21.2513333333333
+5,915,18.3091666666667
+5,916,20.9973333333333
+5,917,22.86
+5,918,15.748
+5,919,19.8331666666667
+5,920,22.8811666666667
+5,921,19.8331666666667
+5,922,19.2828333333333
+5,923,20.3411666666667
+5,924,17.7376666666667
+5,925,24.0453333333333
+5,926,20.6375
+5,927,20.2353333333333
+5,928,15.3035
+5,929,19.7273333333333
+5,930,17.018
+5,931,21.844
+5,932,23.4526666666667
+5,933,22.4578333333333
+5,934,20.8703333333333
+5,935,17.5895
+5,936,29.9085
+5,937,21.5053333333333
+5,938,21.1243333333333
+5,939,22.9023333333333
+5,940,19.0923333333333
+5,941,16.8698333333333
+5,942,24.3205
+5,943,22.2038333333333
+5,944,19.7696666666667
+5,945,17.3143333333333
+5,946,19.4733333333333
+5,947,28.4691666666667
+5,948,26.924
+5,949,26.416
+5,950,22.0768333333333
+5,951,26.6488333333333
+5,952,25.1671666666667
+5,953,19.9813333333333
+5,954,20.4893333333333
+5,955,18.7113333333333
+5,956,24.1723333333333
+5,957,31.4536666666667
+5,958,22.225
+5,959,19.1135
+5,960,19.558
+5,961,19.812
+5,962,24.8285
+5,963,22.225
+5,964,23.876
+5,965,13.6948333333333
+5,966,19.5791666666667
+5,967,24.1088333333333
+5,968,20.9973333333333
+5,969,17.6953333333333
+5,970,18.9653333333333
+5,971,20.6163333333333
+5,972,19.4733333333333
+5,973,24.3416666666667
+5,974,21.9075
+5,975,16.2983333333333
+5,976,24.9131666666667
+5,977,24.7226666666667
+5,978,23.4315
+5,979,23.6855
+5,980,15.6421666666667
+5,981,20.3623333333333
+5,982,21.6958333333333
+5,983,19.8331666666667
+5,984,21.8651666666667
+5,985,20.5105
+5,986,16.3618333333333
+5,987,21.3571666666667
+5,988,24.1088333333333
+5,989,22.0768333333333
+5,990,26.924
+5,991,18.415
+5,992,23.3045
+5,993,19.8966666666667
+5,994,18.3938333333333
+5,995,19.0288333333333
+5,996,21.1455
+5,997,24.2993333333333
+5,998,23.3045
+5,999,17.8646666666667
+5,1000,20.6375
+6,1,30.607
+6,2,37.973
+6,3,30.3741666666667
+6,4,38.989
+6,5,24.003
+6,6,27.0298333333333
+6,7,28.829
+6,8,21.9286666666667
+6,9,33.2316666666667
+6,10,28.448
+6,11,27.8976666666667
+6,12,30.0566666666667
+6,13,25.273
+6,14,34.3111666666667
+6,15,23.6855
+6,16,18.6478333333333
+6,17,28.1516666666667
+6,18,32.258
+6,19,29.083
+6,20,22.9023333333333
+6,21,33.4645
+6,22,24.4051666666667
+6,23,30.9033333333333
+6,24,31.4748333333333
+6,25,26.543
+6,26,32.8718333333333
+6,27,24.9131666666667
+6,28,27.3685
+6,29,34.0148333333333
+6,30,37.5285
+6,31,39.3276666666667
+6,32,25.527
+6,33,45.0215
+6,34,29.1676666666667
+6,35,33.6126666666667
+6,36,29.1253333333333
+6,37,26.797
+6,38,25.3365
+6,39,33.147
+6,40,24.2781666666667
+6,41,30.2471666666667
+6,42,43.9843333333333
+6,43,34.8403333333333
+6,44,27.2203333333333
+6,45,27.3473333333333
+6,46,29.3158333333333
+6,47,32.6178333333333
+6,48,28.6808333333333
+6,49,25.5481666666667
+6,50,33.8455
+6,51,25.9926666666667
+6,52,20.828
+6,53,33.1681666666667
+6,54,26.8816666666667
+6,55,24.7861666666667
+6,56,27.7706666666667
+6,57,30.3318333333333
+6,58,28.3421666666667
+6,59,32.5966666666667
+6,60,30.1625
+6,61,30.2683333333333
+6,62,25.4211666666667
+6,63,31.5383333333333
+6,64,29.2946666666667
+6,65,32.1733333333333
+6,66,39.5816666666667
+6,67,26.5641666666667
+6,68,33.9725
+6,69,31.8981666666667
+6,70,32.0675
+6,71,27.5801666666667
+6,72,28.5538333333333
+6,73,31.7711666666667
+6,74,35.2848333333333
+6,75,36.2796666666667
+6,76,35.7928333333333
+6,77,24.511
+6,78,35.6235
+6,79,33.1681666666667
+6,80,26.3525
+6,81,23.0928333333333
+6,82,26.0561666666667
+6,83,22.1615
+6,84,35.433
+6,85,30.734
+6,86,26.2678333333333
+6,87,39.8145
+6,88,25.8233333333333
+6,89,20.6375
+6,90,30.1836666666667
+6,91,26.289
+6,92,29.337
+6,93,24.8285
+6,94,34.1206666666667
+6,95,41.7618333333333
+6,96,32.8295
+6,97,25.2518333333333
+6,98,26.9451666666667
+6,99,25.527
+6,100,21.5053333333333
+6,101,27.3473333333333
+6,102,33.8878333333333
+6,103,26.2466666666667
+6,104,36.1526666666667
+6,105,23.3891666666667
+6,106,34.0571666666667
+6,107,27.051
+6,108,31.4748333333333
+6,109,36.8723333333333
+6,110,38.1
+6,111,38.227
+6,112,29.6333333333333
+6,113,26.5218333333333
+6,114,24.8496666666667
+6,115,34.1418333333333
+6,116,27.2838333333333
+6,117,27.8765
+6,118,21.209
+6,119,31.4113333333333
+6,120,26.2678333333333
+6,121,30.9456666666667
+6,122,26.8393333333333
+6,123,29.1253333333333
+6,124,26.8605
+6,125,23.1986666666667
+6,126,30.8186666666667
+6,127,27.7283333333333
+6,128,23.0505
+6,129,30.6705
+6,130,31.0303333333333
+6,131,27.6225
+6,132,34.9038333333333
+6,133,20.5316666666667
+6,134,34.8826666666667
+6,135,27.7283333333333
+6,136,29.718
+6,137,26.5006666666667
+6,138,20.9761666666667
+6,139,31.75
+6,140,29.1676666666667
+6,141,21.9498333333333
+6,142,25.6751666666667
+6,143,25.9926666666667
+6,144,25.6116666666667
+6,145,25.0825
+6,146,28.0246666666667
+6,147,27.432
+6,148,26.3101666666667
+6,149,22.8388333333333
+6,150,35.3906666666667
+6,151,25.4423333333333
+6,152,27.7706666666667
+6,153,30.353
+6,154,27.8553333333333
+6,155,28.9771666666667
+6,156,34.8403333333333
+6,157,28.7231666666667
+6,158,33.2316666666667
+6,159,21.3148333333333
+6,160,29.9296666666667
+6,161,39.5393333333333
+6,162,28.8713333333333
+6,163,41.4443333333333
+6,164,32.7025
+6,165,35.6446666666667
+6,166,29.5486666666667
+6,167,26.9663333333333
+6,168,24.6168333333333
+6,169,23.9818333333333
+6,170,31.5171666666667
+6,171,33.7396666666667
+6,172,31.2843333333333
+6,173,26.416
+6,174,34.3111666666667
+6,175,36.8088333333333
+6,176,25.8021666666667
+6,177,32.8083333333333
+6,178,28.1516666666667
+6,179,34.5228333333333
+6,180,32.1945
+6,181,35.179
+6,182,28.3845
+6,183,37.084
+6,184,29.9931666666667
+6,185,32.1733333333333
+6,186,39.4546666666667
+6,187,28.8713333333333
+6,188,32.2368333333333
+6,189,38.3751666666667
+6,190,29.3793333333333
+6,191,29.8238333333333
+6,192,18.8806666666667
+6,193,34.9885
+6,194,28.4056666666667
+6,195,31.8981666666667
+6,196,30.099
+6,197,28.575
+6,198,32.2791666666667
+6,199,36.703
+6,200,32.5543333333333
+6,201,38.989
+6,202,24.4263333333333
+6,203,22.606
+6,204,29.8238333333333
+6,205,37.0205
+6,206,29.21
+6,207,43.307
+6,208,30.5646666666667
+6,209,29.4851666666667
+6,210,27.559
+6,211,27.9611666666667
+6,212,36.2373333333333
+6,213,29.9085
+6,214,31.877
+6,215,33.1681666666667
+6,216,29.337
+6,217,21.717
+6,218,32.131
+6,219,34.036
+6,220,28.8078333333333
+6,221,25.5481666666667
+6,222,29.8238333333333
+6,223,29.718
+6,224,32.4273333333333
+6,225,28.0881666666667
+6,226,27.8553333333333
+6,227,37.0205
+6,228,21.0608333333333
+6,229,28.7655
+6,230,37.6978333333333
+6,231,39.2641666666667
+6,232,31.8135
+6,233,29.5275
+6,234,29.21
+6,235,27.9611666666667
+6,236,24.765
+6,237,35.9833333333333
+6,238,31.6441666666667
+6,239,29.1465
+6,240,26.0985
+6,241,26.8181666666667
+6,242,35.6446666666667
+6,243,30.8186666666667
+6,244,28.6385
+6,245,31.1996666666667
+6,246,29.6333333333333
+6,247,31.75
+6,248,36.8511666666667
+6,249,28.2998333333333
+6,250,29.3581666666667
+6,251,25.8021666666667
+6,252,32.8295
+6,253,36.1315
+6,254,28.3845
+6,255,29.972
+6,256,30.607
+6,257,24.0665
+6,258,36.0045
+6,259,21.8863333333333
+6,260,28.8713333333333
+6,261,23.6431666666667
+6,262,31.2631666666667
+6,263,35.8351666666667
+6,264,33.2528333333333
+6,265,38.9466666666667
+6,266,32.1098333333333
+6,267,21.9921666666667
+6,268,34.2476666666667
+6,269,31.6018333333333
+6,270,23.7066666666667
+6,271,30.5223333333333
+6,272,31.0091666666667
+6,273,28.067
+6,274,27.9823333333333
+6,275,28.0035
+6,276,32.0886666666667
+6,277,33.3586666666667
+6,278,26.5006666666667
+6,279,28.2786666666667
+6,280,30.7128333333333
+6,281,24.3628333333333
+6,282,36.7876666666667
+6,283,26.3313333333333
+6,284,22.4366666666667
+6,285,30.5435
+6,286,28.0458333333333
+6,287,36.322
+6,288,24.1723333333333
+6,289,37.1475
+6,290,30.988
+6,291,31.3055
+6,292,29.5275
+6,293,23.8336666666667
+6,294,25.9503333333333
+6,295,41.7195
+6,296,37.3591666666667
+6,297,25.8021666666667
+6,298,26.3313333333333
+6,299,25.908
+6,300,36.0045
+6,301,32.8083333333333
+6,302,39.7721666666667
+6,303,41.4231666666667
+6,304,29.2311666666667
+6,305,32.0463333333333
+6,306,25.0825
+6,307,37.3591666666667
+6,308,28.3845
+6,309,37.6131666666667
+6,310,25.3576666666667
+6,311,27.7495
+6,312,30.1836666666667
+6,313,22.7118333333333
+6,314,28.7231666666667
+6,315,23.5796666666667
+6,316,32.1098333333333
+6,317,26.0773333333333
+6,318,33.9936666666667
+6,319,29.9296666666667
+6,320,32.639
+6,321,18.8595
+6,322,31.2631666666667
+6,323,22.6271666666667
+6,324,30.9245
+6,325,31.9193333333333
+6,326,32.3638333333333
+6,327,29.2735
+6,328,32.9141666666667
+6,329,33.9725
+6,330,29.7391666666667
+6,331,31.0515
+6,332,38.5233333333333
+6,333,24.3628333333333
+6,334,32.2156666666667
+6,335,29.4851666666667
+6,336,38.989
+6,337,29.9296666666667
+6,338,26.1831666666667
+6,339,28.2575
+6,340,29.2311666666667
+6,341,39.8356666666667
+6,342,29.4216666666667
+6,343,29.9931666666667
+6,344,30.0778333333333
+6,345,26.6065
+6,346,24.7861666666667
+6,347,38.7985
+6,348,28.5115
+6,349,34.6286666666667
+6,350,33.2105
+6,351,32.639
+6,352,41.148
+6,353,30.9033333333333
+6,354,26.9028333333333
+6,355,26.3525
+6,356,26.1196666666667
+6,357,31.7711666666667
+6,358,32.639
+6,359,27.305
+6,360,34.4593333333333
+6,361,29.0618333333333
+6,362,30.607
+6,363,25.654
+6,364,32.5966666666667
+6,365,28.2998333333333
+6,366,29.7815
+6,367,28.0035
+6,368,21.717
+6,369,28.2575
+6,370,28.6596666666667
+6,371,35.7928333333333
+6,372,27.432
+6,373,25.6751666666667
+6,374,20.2141666666667
+6,375,19.5368333333333
+6,376,32.131
+6,377,23.6855
+6,378,42.5238333333333
+6,379,33.1681666666667
+6,380,29.1888333333333
+6,381,26.9663333333333
+6,382,33.0835
+6,383,36.9146666666667
+6,384,26.0773333333333
+6,385,32.8506666666667
+6,386,31.6441666666667
+6,387,37.7825
+6,388,35.306
+6,389,25.1248333333333
+6,390,28.7231666666667
+6,391,25.8021666666667
+6,392,29.337
+6,393,30.6281666666667
+6,394,21.1243333333333
+6,395,28.0458333333333
+6,396,43.307
+6,397,32.2368333333333
+6,398,35.814
+6,399,21.5688333333333
+6,400,31.5595
+6,401,25.9715
+6,402,28.3845
+6,403,31.0938333333333
+6,404,27.7283333333333
+6,405,30.099
+6,406,31.496
+6,407,39.2853333333333
+6,408,31.369
+6,409,30.099
+6,410,34.0148333333333
+6,411,29.7391666666667
+6,412,22.2673333333333
+6,413,33.6761666666667
+6,414,34.8403333333333
+6,415,22.479
+6,416,24.257
+6,417,27.8341666666667
+6,418,29.6333333333333
+6,419,26.8816666666667
+6,420,38.5233333333333
+6,421,24.0876666666667
+6,422,25.8868333333333
+6,423,32.1098333333333
+6,424,22.9658333333333
+6,425,24.257
+6,426,34.1418333333333
+6,427,27.1145
+6,428,30.226
+6,429,28.321
+6,430,27.6648333333333
+6,431,33.4645
+6,432,40.6188333333333
+6,433,27.0933333333333
+6,434,26.1831666666667
+6,435,32.7448333333333
+6,436,27.686
+6,437,29.8026666666667
+6,438,24.1935
+6,439,29.5275
+6,440,22.3731666666667
+6,441,27.8765
+6,442,24.3416666666667
+6,443,31.5171666666667
+6,444,30.9033333333333
+6,445,25.2518333333333
+6,446,25.5481666666667
+6,447,26.3736666666667
+6,448,37.8671666666667
+6,449,32.5755
+6,450,37.0205
+6,451,32.0675
+6,452,25.2518333333333
+6,453,26.0561666666667
+6,454,32.0886666666667
+6,455,35.3271666666667
+6,456,38.3963333333333
+6,457,27.4531666666667
+6,458,40.2166666666667
+6,459,25.8445
+6,460,37.8036666666667
+6,461,34.5016666666667
+6,462,24.8708333333333
+6,463,29.4005
+6,464,27.4531666666667
+6,465,23.8336666666667
+6,466,34.8826666666667
+6,467,37.4438333333333
+6,468,28.5326666666667
+6,469,34.3958333333333
+6,470,33.1893333333333
+6,471,31.0091666666667
+6,472,27.8341666666667
+6,473,33.5703333333333
+6,474,24.8073333333333
+6,475,26.2466666666667
+6,476,28.5961666666667
+6,477,32.639
+6,478,26.8181666666667
+6,479,29.3581666666667
+6,480,23.876
+6,481,27.686
+6,482,29.4851666666667
+6,483,27.1145
+6,484,31.496
+6,485,30.9245
+6,486,26.7546666666667
+6,487,32.0251666666667
+6,488,37.084
+6,489,24.511
+6,490,32.5543333333333
+6,491,24.2146666666667
+6,492,29.6545
+6,493,35.433
+6,494,28.2998333333333
+6,495,22.6695
+6,496,26.3948333333333
+6,497,29.8661666666667
+6,498,22.7753333333333
+6,499,32.004
+6,500,28.1093333333333
+6,501,34.6286666666667
+6,502,34.5228333333333
+6,503,30.0355
+6,504,26.0985
+6,505,36.83
+6,506,30.3953333333333
+6,507,28.7655
+6,508,29.1465
+6,509,34.163
+6,510,27.178
+6,511,32.9353333333333
+6,512,29.3793333333333
+6,513,31.4325
+6,514,25.5058333333333
+6,515,30.099
+6,516,32.5331666666667
+6,517,28.9136666666667
+6,518,28.3633333333333
+6,519,34.0148333333333
+6,520,21.5688333333333
+6,521,32.0675
+6,522,29.5698333333333
+6,523,27.0298333333333
+6,524,27.9611666666667
+6,525,26.0985
+6,526,34.4381666666667
+6,527,32.3638333333333
+6,528,26.3101666666667
+6,529,30.734
+6,530,28.6596666666667
+6,531,29.0195
+6,532,26.5218333333333
+6,533,26.8181666666667
+6,534,37.4226666666667
+6,535,33.782
+6,536,39.0736666666667
+6,537,33.655
+6,538,25.4635
+6,539,30.1836666666667
+6,540,37.4438333333333
+6,541,25.0825
+6,542,26.1196666666667
+6,543,26.6065
+6,544,32.639
+6,545,30.2683333333333
+6,546,36.703
+6,547,24.6168333333333
+6,548,27.2203333333333
+6,549,29.718
+6,550,28.7866666666667
+6,551,22.2461666666667
+6,552,29.1041666666667
+6,553,32.2156666666667
+6,554,24.003
+6,555,26.9875
+6,556,35.2213333333333
+6,557,27.8976666666667
+6,558,31.877
+6,559,27.4108333333333
+6,560,30.48
+6,561,34.1418333333333
+6,562,33.6973333333333
+6,563,30.988
+6,564,27.6225
+6,565,27.559
+6,566,26.9875
+6,567,30.0778333333333
+6,568,28.9136666666667
+6,569,31.4113333333333
+6,570,26.7123333333333
+6,571,32.2156666666667
+6,572,28.5326666666667
+6,573,27.4108333333333
+6,574,23.9606666666667
+6,575,28.2363333333333
+6,576,33.6126666666667
+6,577,31.1361666666667
+6,578,36.5548333333333
+6,579,35.5811666666667
+6,580,28.0035
+6,581,33.3586666666667
+6,582,32.0463333333333
+6,583,32.5755
+6,584,26.8816666666667
+6,585,32.9988333333333
+6,586,23.6855
+6,587,26.8393333333333
+6,588,25.5058333333333
+6,589,28.3421666666667
+6,590,32.1521666666667
+6,591,38.5021666666667
+6,592,21.6535
+6,593,34.925
+6,594,28.0035
+6,595,34.6498333333333
+6,596,29.1253333333333
+6,597,33.7396666666667
+6,598,36.068
+6,599,26.3525
+6,600,33.655
+6,601,31.3478333333333
+6,602,35.0308333333333
+6,603,25.0613333333333
+6,604,32.9353333333333
+6,605,30.5858333333333
+6,606,29.845
+6,607,29.5698333333333
+6,608,18.5208333333333
+6,609,33.9301666666667
+6,610,36.1738333333333
+6,611,32.5966666666667
+6,612,27.94
+6,613,32.6601666666667
+6,614,36.1103333333333
+6,615,29.7603333333333
+6,616,28.8078333333333
+6,617,24.257
+6,618,29.5063333333333
+6,619,21.4206666666667
+6,620,31.623
+6,621,29.6333333333333
+6,622,28.448
+6,623,34.3746666666667
+6,624,28.8713333333333
+6,625,25.8445
+6,626,33.7396666666667
+6,627,27.6225
+6,628,31.2631666666667
+6,629,29.9931666666667
+6,630,31.0091666666667
+6,631,27.1991666666667
+6,632,39.116
+6,633,26.2678333333333
+6,634,33.1681666666667
+6,635,31.9828333333333
+6,636,27.3896666666667
+6,637,26.1196666666667
+6,638,34.6286666666667
+6,639,24.4475
+6,640,30.0143333333333
+6,641,26.4583333333333
+6,642,34.9461666666667
+6,643,24.3628333333333
+6,644,31.7288333333333
+6,645,27.7283333333333
+6,646,29.6545
+6,647,24.765
+6,648,30.3953333333333
+6,649,24.9766666666667
+6,650,31.5171666666667
+6,651,26.162
+6,652,26.5006666666667
+6,653,24.0876666666667
+6,654,31.2843333333333
+6,655,29.464
+6,656,33.2528333333333
+6,657,32.4061666666667
+6,658,23.4315
+6,659,32.1945
+6,660,30.2683333333333
+6,661,33.1893333333333
+6,662,27.559
+6,663,34.9885
+6,664,29.2946666666667
+6,665,28.5961666666667
+6,666,24.3628333333333
+6,667,25.1248333333333
+6,668,36.3431666666667
+6,669,29.591
+6,670,30.1413333333333
+6,671,24.9131666666667
+6,672,28.956
+6,673,31.115
+6,674,29.6545
+6,675,40.9575
+6,676,27.1568333333333
+6,677,30.4376666666667
+6,678,29.6121666666667
+6,679,35.0943333333333
+6,680,27.178
+6,681,26.67
+6,682,31.623
+6,683,25.4
+6,684,29.845
+6,685,25.4211666666667
+6,686,30.861
+6,687,41.3808333333333
+6,688,26.9451666666667
+6,689,33.401
+6,690,31.9828333333333
+6,691,33.3798333333333
+6,692,37.9518333333333
+6,693,33.2951666666667
+6,694,26.162
+6,695,36.83
+6,696,29.6968333333333
+6,697,23.8548333333333
+6,698,26.6911666666667
+6,699,26.8816666666667
+6,700,35.7081666666667
+6,701,27.7918333333333
+6,702,32.4908333333333
+6,703,29.6968333333333
+6,704,37.0416666666667
+6,705,22.3731666666667
+6,706,34.2265
+6,707,38.9466666666667
+6,708,26.4583333333333
+6,709,31.9616666666667
+6,710,32.8295
+6,711,32.385
+6,712,26.0561666666667
+6,713,30.0355
+6,714,33.3375
+6,715,36.4913333333333
+6,716,22.7965
+6,717,27.4531666666667
+6,718,35.052
+6,719,26.8181666666667
+6,720,30.0143333333333
+6,721,25.2095
+6,722,31.4113333333333
+6,723,24.4686666666667
+6,724,21.209
+6,725,38.1423333333333
+6,726,28.9348333333333
+6,727,31.1996666666667
+6,728,34.544
+6,729,30.8821666666667
+6,730,33.3798333333333
+6,731,23.7913333333333
+6,732,27.0721666666667
+6,733,31.8135
+6,734,27.9823333333333
+6,735,36.3643333333333
+6,736,27.9823333333333
+6,737,32.8506666666667
+6,738,26.162
+6,739,32.0675
+6,740,42.3333333333333
+6,741,32.8295
+6,742,35.3695
+6,743,43.0953333333333
+6,744,25.908
+6,745,21.463
+6,746,21.3571666666667
+6,747,34.9673333333333
+6,748,30.734
+6,749,27.7495
+6,750,22.8388333333333
+6,751,29.5486666666667
+6,752,34.4381666666667
+6,753,25.8656666666667
+6,754,36.1738333333333
+6,755,28.6173333333333
+6,756,30.607
+6,757,31.3055
+6,758,36.4278333333333
+6,759,27.5801666666667
+6,760,33.528
+6,761,28.2151666666667
+6,762,29.6333333333333
+6,763,24.3416666666667
+6,764,28.6596666666667
+6,765,33.4433333333333
+6,766,29.4216666666667
+6,767,30.0355
+6,768,32.5966666666667
+6,769,34.3323333333333
+6,770,34.4381666666667
+6,771,33.6973333333333
+6,772,31.2843333333333
+6,773,26.2466666666667
+6,774,39.3911666666667
+6,775,35.433
+6,776,34.925
+6,777,27.5801666666667
+6,778,34.036
+6,779,27.3261666666667
+6,780,30.1836666666667
+6,781,20.1718333333333
+6,782,29.083
+6,783,32.0886666666667
+6,784,23.495
+6,785,20.9761666666667
+6,786,34.6286666666667
+6,787,24.2358333333333
+6,788,30.5646666666667
+6,789,30.2683333333333
+6,790,24.1511666666667
+6,791,36.1315
+6,792,34.671
+6,793,29.2735
+6,794,29.8661666666667
+6,795,29.3793333333333
+6,796,32.4485
+6,797,31.2631666666667
+6,798,33.7396666666667
+6,799,32.1098333333333
+6,800,31.9193333333333
+6,801,25.9715
+6,802,26.2255
+6,803,35.4965
+6,804,30.3318333333333
+6,805,35.5176666666667
+6,806,31.4325
+6,807,25.8445
+6,808,27.0298333333333
+6,809,33.7608333333333
+6,810,35.941
+6,811,27.1568333333333
+6,812,39.4546666666667
+6,813,31.2631666666667
+6,814,25.8656666666667
+6,815,30.5223333333333
+6,816,25.3576666666667
+6,817,24.003
+6,818,33.0411666666667
+6,819,29.464
+6,820,33.8031666666667
+6,821,42.8625
+6,822,28.2575
+6,823,31.3266666666667
+6,824,35.7716666666667
+6,825,36.1738333333333
+6,826,34.3323333333333
+6,827,30.099
+6,828,40.8305
+6,829,32.7025
+6,830,24.6803333333333
+6,831,36.1315
+6,832,31.5171666666667
+6,833,20.5105
+6,834,29.1465
+6,835,30.2471666666667
+6,836,32.3215
+6,837,37.5496666666667
+6,838,34.8615
+6,839,21.9921666666667
+6,840,34.544
+6,841,29.5486666666667
+6,842,34.8403333333333
+6,843,28.4903333333333
+6,844,35.0308333333333
+6,845,26.4371666666667
+6,846,32.512
+6,847,36.4066666666667
+6,848,25.8021666666667
+6,849,32.5331666666667
+6,850,31.0726666666667
+6,851,37.6131666666667
+6,852,29.9296666666667
+6,853,28.2786666666667
+6,854,23.0293333333333
+6,855,20.6798333333333
+6,856,30.4588333333333
+6,857,29.2311666666667
+6,858,28.8925
+6,859,39.2006666666667
+6,860,38.8408333333333
+6,861,31.1996666666667
+6,862,27.94
+6,863,26.9663333333333
+6,864,38.7561666666667
+6,865,29.591
+6,866,33.782
+6,867,41.1268333333333
+6,868,36.195
+6,869,30.1836666666667
+6,870,24.1935
+6,871,32.258
+6,872,25.7175
+6,873,33.0835
+6,874,26.4583333333333
+6,875,27.813
+6,876,31.8346666666667
+6,877,34.036
+6,878,39.8145
+6,879,26.0138333333333
+6,880,28.0246666666667
+6,881,30.5011666666667
+6,882,22.0768333333333
+6,883,29.5486666666667
+6,884,29.083
+6,885,30.5646666666667
+6,886,30.6705
+6,887,28.702
+6,888,32.4908333333333
+6,889,36.0468333333333
+6,890,32.3003333333333
+6,891,33.0835
+6,892,25.4
+6,893,33.2528333333333
+6,894,30.0355
+6,895,27.2626666666667
+6,896,26.2466666666667
+6,897,25.2941666666667
+6,898,25.4211666666667
+6,899,33.5491666666667
+6,900,25.9291666666667
+6,901,31.6653333333333
+6,902,29.6756666666667
+6,903,32.2368333333333
+6,904,31.6018333333333
+6,905,29.464
+6,906,30.988
+6,907,32.4908333333333
+6,908,29.2311666666667
+6,909,21.7593333333333
+6,910,25.7175
+6,911,35.56
+6,912,27.9611666666667
+6,913,34.3746666666667
+6,914,26.5641666666667
+6,915,34.2265
+6,916,34.3746666666667
+6,917,28.8925
+6,918,37.3168333333333
+6,919,30.7763333333333
+6,920,34.3535
+6,921,32.7448333333333
+6,922,28.7231666666667
+6,923,30.5858333333333
+6,924,28.575
+6,925,28.5326666666667
+6,926,35.8775
+6,927,25.5905
+6,928,35.9198333333333
+6,929,22.3096666666667
+6,930,29.8238333333333
+6,931,24.4051666666667
+6,932,28.194
+6,933,37.0205
+6,934,22.8388333333333
+6,935,32.9141666666667
+6,936,33.5491666666667
+6,937,28.067
+6,938,27.4743333333333
+6,939,33.3375
+6,940,39.0948333333333
+6,941,30.6493333333333
+6,942,28.4903333333333
+6,943,29.2523333333333
+6,944,22.4366666666667
+6,945,37.2956666666667
+6,946,23.4103333333333
+6,947,37.9941666666667
+6,948,29.6968333333333
+6,949,33.5703333333333
+6,950,38.6291666666667
+6,951,28.5961666666667
+6,952,28.8501666666667
+6,953,25.0825
+6,954,38.1211666666667
+6,955,20.6798333333333
+6,956,25.2941666666667
+6,957,33.9725
+6,958,30.2895
+6,959,32.4696666666667
+6,960,36.6395
+6,961,29.591
+6,962,22.9446666666667
+6,963,28.0881666666667
+6,964,19.5791666666667
+6,965,29.9931666666667
+6,966,30.9033333333333
+6,967,26.0138333333333
+6,968,28.956
+6,969,25.908
+6,970,27.305
+6,971,27.2626666666667
+6,972,30.988
+6,973,30.5858333333333
+6,974,31.2843333333333
+6,975,32.2368333333333
+6,976,34.9885
+6,977,44.0901666666667
+6,978,31.2843333333333
+6,979,35.7505
+6,980,25.7598333333333
+6,981,40.2166666666667
+6,982,38.7561666666667
+6,983,35.7928333333333
+6,984,27.4955
+6,985,30.5223333333333
+6,986,27.4955
+6,987,33.2951666666667
+6,988,26.6276666666667
+6,989,35.1366666666667
+6,990,32.639
+6,991,34.4805
+6,992,27.2838333333333
+6,993,24.5745
+6,994,30.2895
+6,995,22.9023333333333
+6,996,33.4645
+6,997,30.48
+6,998,21.717
+6,999,29.4216666666667
+6,1000,22.2461666666667
+7,1,31.1996666666667
+7,2,34.8403333333333
+7,3,25.8021666666667
+7,4,30.8821666666667
+7,5,39.0525
+7,6,31.2208333333333
+7,7,27.7071666666667
+7,8,38.227
+7,9,37.973
+7,10,19.5156666666667
+7,11,29.718
+7,12,28.9348333333333
+7,13,35.4753333333333
+7,14,26.0985
+7,15,24.1088333333333
+7,16,26.8605
+7,17,29.845
+7,18,32.3426666666667
+7,19,28.7231666666667
+7,20,25.654
+7,21,36.3431666666667
+7,22,36.0891666666667
+7,23,26.67
+7,24,31.5171666666667
+7,25,35.56
+7,26,27.0298333333333
+7,27,24.1088333333333
+7,28,32.893
+7,29,45.466
+7,30,41.2538333333333
+7,31,29.5063333333333
+7,32,31.0515
+7,33,24.3205
+7,34,31.0726666666667
+7,35,31.0938333333333
+7,36,29.2735
+7,37,26.8816666666667
+7,38,33.0835
+7,39,27.686
+7,40,28.6385
+7,41,30.7763333333333
+7,42,29.845
+7,43,33.0835
+7,44,36.3643333333333
+7,45,25.908
+7,46,27.0298333333333
+7,47,34.0148333333333
+7,48,27.4955
+7,49,30.48
+7,50,39.878
+7,51,29.3581666666667
+7,52,30.3741666666667
+7,53,34.0571666666667
+7,54,34.5651666666667
+7,55,34.7133333333333
+7,56,30.2048333333333
+7,57,27.2838333333333
+7,58,27.4108333333333
+7,59,32.9988333333333
+7,60,31.7076666666667
+7,61,32.2368333333333
+7,62,30.2895
+7,63,28.1728333333333
+7,64,30.1413333333333
+7,65,29.9508333333333
+7,66,35.9621666666667
+7,67,34.6921666666667
+7,68,32.6813333333333
+7,69,32.4061666666667
+7,70,27.4743333333333
+7,71,37.1051666666667
+7,72,23.9818333333333
+7,73,24.6591666666667
+7,74,23.9606666666667
+7,75,26.7123333333333
+7,76,26.8393333333333
+7,77,23.2621666666667
+7,78,33.0835
+7,79,30.226
+7,80,29.6333333333333
+7,81,30.48
+7,82,28.4268333333333
+7,83,32.9141666666667
+7,84,29.1888333333333
+7,85,34.0783333333333
+7,86,26.416
+7,87,29.1041666666667
+7,88,32.5755
+7,89,30.353
+7,90,35.4965
+7,91,29.0406666666667
+7,92,26.543
+7,93,31.3478333333333
+7,94,32.4485
+7,95,41.9523333333333
+7,96,28.321
+7,97,28.956
+7,98,28.2363333333333
+7,99,27.6013333333333
+7,100,27.8976666666667
+7,101,31.623
+7,102,32.004
+7,103,29.4851666666667
+7,104,35.7505
+7,105,22.098
+7,106,26.7123333333333
+7,107,34.3323333333333
+7,108,32.8718333333333
+7,109,30.0778333333333
+7,110,25.4846666666667
+7,111,35.1578333333333
+7,112,32.3638333333333
+7,113,31.4325
+7,114,29.464
+7,115,35.0943333333333
+7,116,33.7185
+7,117,29.1465
+7,118,35.4541666666667
+7,119,36.7665
+7,120,34.1418333333333
+7,121,34.0571666666667
+7,122,24.892
+7,123,34.6075
+7,124,26.6065
+7,125,28.2151666666667
+7,126,28.2786666666667
+7,127,27.1145
+7,128,33.2951666666667
+7,129,26.924
+7,130,24.1511666666667
+7,131,26.924
+7,132,31.6653333333333
+7,133,29.1888333333333
+7,134,24.511
+7,135,32.5543333333333
+7,136,28.2151666666667
+7,137,36.449
+7,138,35.4753333333333
+7,139,18.6055
+7,140,33.9301666666667
+7,141,34.163
+7,142,36.9146666666667
+7,143,33.4221666666667
+7,144,29.2523333333333
+7,145,35.433
+7,146,30.48
+7,147,33.3375
+7,148,24.638
+7,149,34.8403333333333
+7,150,37.8036666666667
+7,151,27.2626666666667
+7,152,36.7241666666667
+7,153,27.432
+7,154,30.2895
+7,155,21.4418333333333
+7,156,29.1253333333333
+7,157,30.7975
+7,158,31.0091666666667
+7,159,31.5595
+7,160,28.067
+7,161,28.321
+7,162,32.3426666666667
+7,163,27.5378333333333
+7,164,35.4753333333333
+7,165,32.6178333333333
+7,166,34.8615
+7,167,27.6648333333333
+7,168,28.9348333333333
+7,169,24.257
+7,170,25.5058333333333
+7,171,27.3896666666667
+7,172,35.4965
+7,173,32.3426666666667
+7,174,28.1516666666667
+7,175,30.734
+7,176,31.115
+7,177,32.004
+7,178,26.416
+7,179,34.1841666666667
+7,180,28.0458333333333
+7,181,34.9673333333333
+7,182,31.5383333333333
+7,183,28.1093333333333
+7,184,30.1625
+7,185,28.2363333333333
+7,186,28.7231666666667
+7,187,21.4841666666667
+7,188,23.8336666666667
+7,189,28.5115
+7,190,26.3525
+7,191,26.67
+7,192,30.9245
+7,193,27.3261666666667
+7,194,28.2575
+7,195,26.3948333333333
+7,196,29.3581666666667
+7,197,31.6865
+7,198,24.13
+7,199,27.7071666666667
+7,200,27.7283333333333
+7,201,35.0096666666667
+7,202,29.8026666666667
+7,203,26.8816666666667
+7,204,27.8553333333333
+7,205,25.8445
+7,206,29.5275
+7,207,28.0035
+7,208,28.4268333333333
+7,209,36.4066666666667
+7,210,30.9033333333333
+7,211,29.6968333333333
+7,212,25.9503333333333
+7,213,33.0411666666667
+7,214,31.8981666666667
+7,215,29.083
+7,216,27.5378333333333
+7,217,26.5641666666667
+7,218,22.9235
+7,219,33.8031666666667
+7,220,29.5698333333333
+7,221,31.75
+7,222,26.67
+7,223,26.6488333333333
+7,224,28.6385
+7,225,25.3365
+7,226,28.1093333333333
+7,227,27.178
+7,228,22.5001666666667
+7,229,37.1051666666667
+7,230,31.75
+7,231,25.4846666666667
+7,232,28.5115
+7,233,22.5636666666667
+7,234,30.5435
+7,235,39.9203333333333
+7,236,38.0365
+7,237,27.305
+7,238,27.7283333333333
+7,239,29.4428333333333
+7,240,37.6766666666667
+7,241,29.5698333333333
+7,242,37.7401666666667
+7,243,33.0835
+7,244,30.7975
+7,245,26.4795
+7,246,29.1253333333333
+7,247,27.5166666666667
+7,248,31.2208333333333
+7,249,34.2476666666667
+7,250,35.1578333333333
+7,251,39.1795
+7,252,20.5316666666667
+7,253,25.6963333333333
+7,254,35.0731666666667
+7,255,30.7975
+7,256,25.7386666666667
+7,257,28.4268333333333
+7,258,25.654
+7,259,27.9823333333333
+7,260,20.9973333333333
+7,261,28.4903333333333
+7,262,32.2368333333333
+7,263,34.3111666666667
+7,264,35.7081666666667
+7,265,29.3581666666667
+7,266,34.6498333333333
+7,267,30.0778333333333
+7,268,31.9616666666667
+7,269,34.8826666666667
+7,270,36.8723333333333
+7,271,26.543
+7,272,36.0891666666667
+7,273,28.194
+7,274,35.0943333333333
+7,275,34.2476666666667
+7,276,29.2311666666667
+7,277,37.1898333333333
+7,278,35.9621666666667
+7,279,28.5326666666667
+7,280,35.0943333333333
+7,281,26.416
+7,282,23.9606666666667
+7,283,26.5853333333333
+7,284,32.9988333333333
+7,285,27.4531666666667
+7,286,33.2105
+7,287,29.5063333333333
+7,288,31.0515
+7,289,29.2311666666667
+7,290,26.7335
+7,291,33.8878333333333
+7,292,29.2311666666667
+7,293,35.0731666666667
+7,294,32.3003333333333
+7,295,28.2575
+7,296,32.7871666666667
+7,297,27.9611666666667
+7,298,39.243
+7,299,37.4861666666667
+7,300,31.3266666666667
+7,301,31.5383333333333
+7,302,28.0881666666667
+7,303,26.543
+7,304,38.3116666666667
+7,305,18.796
+7,306,28.8713333333333
+7,307,30.4588333333333
+7,308,17.3778333333333
+7,309,31.1573333333333
+7,310,32.385
+7,311,26.0773333333333
+7,312,36.1315
+7,313,36.576
+7,314,27.1356666666667
+7,315,35.3483333333333
+7,316,25.7175
+7,317,26.6065
+7,318,23.6855
+7,319,27.3685
+7,320,28.2786666666667
+7,321,19.177
+7,322,35.687
+7,323,30.6916666666667
+7,324,29.4851666666667
+7,325,27.0298333333333
+7,326,29.6968333333333
+7,327,31.6653333333333
+7,328,31.7288333333333
+7,329,28.4691666666667
+7,330,35.6235
+7,331,32.7448333333333
+7,332,34.7133333333333
+7,333,31.4748333333333
+7,334,26.7546666666667
+7,335,26.2255
+7,336,38.862
+7,337,38.7985
+7,338,36.068
+7,339,36.0468333333333
+7,340,42.672
+7,341,24.7861666666667
+7,342,34.544
+7,343,33.4856666666667
+7,344,28.1516666666667
+7,345,31.8135
+7,346,22.479
+7,347,34.3323333333333
+7,348,34.7345
+7,349,34.0783333333333
+7,350,29.083
+7,351,31.3478333333333
+7,352,29.2311666666667
+7,353,24.6803333333333
+7,354,27.3261666666667
+7,355,32.4485
+7,356,25.1883333333333
+7,357,37.2956666666667
+7,358,24.6168333333333
+7,359,27.1991666666667
+7,360,27.686
+7,361,28.9136666666667
+7,362,32.639
+7,363,29.5486666666667
+7,364,28.1728333333333
+7,365,31.9193333333333
+7,366,29.0406666666667
+7,367,36.4913333333333
+7,368,27.2203333333333
+7,369,23.7066666666667
+7,370,31.4748333333333
+7,371,29.6968333333333
+7,372,28.8925
+7,373,37.4015
+7,374,31.8135
+7,375,34.1418333333333
+7,376,25.4423333333333
+7,377,27.8765
+7,378,26.3313333333333
+7,379,27.5378333333333
+7,380,30.226
+7,381,28.448
+7,382,33.1258333333333
+7,383,30.353
+7,384,25.9503333333333
+7,385,23.495
+7,386,33.528
+7,387,27.1991666666667
+7,388,30.1413333333333
+7,389,29.7815
+7,390,22.1615
+7,391,23.0081666666667
+7,392,31.369
+7,393,36.576
+7,394,26.3948333333333
+7,395,25.527
+7,396,32.3638333333333
+7,397,28.6808333333333
+7,398,28.1305
+7,399,25.6963333333333
+7,400,28.2998333333333
+7,401,28.7443333333333
+7,402,30.3953333333333
+7,403,26.2678333333333
+7,404,29.2946666666667
+7,405,29.0618333333333
+7,406,37.846
+7,407,25.5693333333333
+7,408,31.8346666666667
+7,409,24.003
+7,410,24.2993333333333
+7,411,31.4113333333333
+7,412,39.0101666666667
+7,413,30.7551666666667
+7,414,32.5966666666667
+7,415,34.5863333333333
+7,416,29.0406666666667
+7,417,32.3426666666667
+7,418,30.1625
+7,419,26.0561666666667
+7,420,30.5646666666667
+7,421,24.8708333333333
+7,422,25.4635
+7,423,33.6973333333333
+7,424,37.3168333333333
+7,425,38.2481666666667
+7,426,29.2735
+7,427,32.3426666666667
+7,428,22.8811666666667
+7,429,21.7593333333333
+7,430,33.5491666666667
+7,431,38.5021666666667
+7,432,26.416
+7,433,30.7975
+7,434,30.5435
+7,435,43.3705
+7,436,36.1738333333333
+7,437,33.9513333333333
+7,438,29.6756666666667
+7,439,28.1305
+7,440,31.4325
+7,441,22.0133333333333
+7,442,31.9828333333333
+7,443,33.0835
+7,444,28.2151666666667
+7,445,28.1728333333333
+7,446,30.1625
+7,447,34.2688333333333
+7,448,31.115
+7,449,30.7763333333333
+7,450,34.3111666666667
+7,451,25.0613333333333
+7,452,31.0515
+7,453,27.7495
+7,454,32.1733333333333
+7,455,26.2043333333333
+7,456,29.5698333333333
+7,457,29.0406666666667
+7,458,38.989
+7,459,24.1511666666667
+7,460,30.0355
+7,461,27.3473333333333
+7,462,27.9188333333333
+7,463,30.988
+7,464,26.6911666666667
+7,465,23.3891666666667
+7,466,30.6916666666667
+7,467,33.2951666666667
+7,468,32.512
+7,469,36.8935
+7,470,30.1413333333333
+7,471,26.797
+7,472,24.9766666666667
+7,473,31.623
+7,474,28.194
+7,475,39.3276666666667
+7,476,32.3003333333333
+7,477,29.5486666666667
+7,478,32.3426666666667
+7,479,33.401
+7,480,33.7396666666667
+7,481,30.3953333333333
+7,482,28.8713333333333
+7,483,31.2208333333333
+7,484,28.5538333333333
+7,485,28.1305
+7,486,32.893
+7,487,22.9235
+7,488,41.148
+7,489,30.7763333333333
+7,490,33.2105
+7,491,26.3948333333333
+7,492,26.8816666666667
+7,493,26.3525
+7,494,35.0096666666667
+7,495,38.7138333333333
+7,496,22.7965
+7,497,33.5491666666667
+7,498,21.6535
+7,499,23.3468333333333
+7,500,33.6338333333333
+7,501,31.7923333333333
+7,502,29.1041666666667
+7,503,31.4325
+7,504,31.4113333333333
+7,505,25.1883333333333
+7,506,29.2523333333333
+7,507,30.7551666666667
+7,508,42.0581666666667
+7,509,24.3416666666667
+7,510,32.258
+7,511,32.4485
+7,512,33.2105
+7,513,33.1681666666667
+7,514,21.9921666666667
+7,515,31.8981666666667
+7,516,27.178
+7,517,33.02
+7,518,26.7123333333333
+7,519,35.4118333333333
+7,520,28.6173333333333
+7,521,25.6116666666667
+7,522,34.9461666666667
+7,523,32.3638333333333
+7,524,30.6281666666667
+7,525,25.0825
+7,526,32.9353333333333
+7,527,28.7866666666667
+7,528,33.5703333333333
+7,529,28.702
+7,530,20.0871666666667
+7,531,28.6173333333333
+7,532,34.0148333333333
+7,533,24.1935
+7,534,35.306
+7,535,30.226
+7,536,28.829
+7,537,33.5915
+7,538,22.2038333333333
+7,539,30.0143333333333
+7,540,26.3948333333333
+7,541,25.0613333333333
+7,542,28.194
+7,543,22.7541666666667
+7,544,33.0623333333333
+7,545,27.432
+7,546,37.5073333333333
+7,547,22.0768333333333
+7,548,30.5011666666667
+7,549,28.3421666666667
+7,550,33.147
+7,551,32.6178333333333
+7,552,36.7453333333333
+7,553,45.339
+7,554,21.5476666666667
+7,555,33.147
+7,556,36.3855
+7,557,33.0623333333333
+7,558,36.9781666666667
+7,559,35.052
+7,560,32.4485
+7,561,27.8341666666667
+7,562,27.7706666666667
+7,563,32.766
+7,564,31.7711666666667
+7,565,24.5956666666667
+7,566,26.797
+7,567,27.3896666666667
+7,568,40.4071666666667
+7,569,29.1465
+7,570,36.7876666666667
+7,571,35.4118333333333
+7,572,34.163
+7,573,43.6668333333333
+7,574,35.0308333333333
+7,575,32.7236666666667
+7,576,30.2895
+7,577,27.2203333333333
+7,578,30.226
+7,579,36.9993333333333
+7,580,20.4681666666667
+7,581,32.7236666666667
+7,582,30.6281666666667
+7,583,33.8243333333333
+7,584,29.3793333333333
+7,585,24.2358333333333
+7,586,31.1996666666667
+7,587,27.4955
+7,588,29.1253333333333
+7,589,32.004
+7,590,28.194
+7,591,25.3153333333333
+7,592,34.417
+7,593,23.9606666666667
+7,594,27.432
+7,595,37.4226666666667
+7,596,25.0613333333333
+7,597,32.4696666666667
+7,598,23.7066666666667
+7,599,24.8496666666667
+7,600,33.8878333333333
+7,601,26.7758333333333
+7,602,30.9668333333333
+7,603,31.6653333333333
+7,604,27.1991666666667
+7,605,23.6008333333333
+7,606,25.654
+7,607,25.5905
+7,608,29.7603333333333
+7,609,27.6013333333333
+7,610,33.782
+7,611,26.6911666666667
+7,612,28.0458333333333
+7,613,25.1248333333333
+7,614,31.4748333333333
+7,615,30.4165
+7,616,35.3271666666667
+7,617,25.781
+7,618,31.6653333333333
+7,619,27.305
+7,620,29.4216666666667
+7,621,23.6431666666667
+7,622,29.3581666666667
+7,623,25.0613333333333
+7,624,27.2626666666667
+7,625,31.496
+7,626,28.829
+7,627,22.5848333333333
+7,628,29.972
+7,629,31.8558333333333
+7,630,32.3426666666667
+7,631,29.972
+7,632,30.5435
+7,633,31.0303333333333
+7,634,32.004
+7,635,27.3473333333333
+7,636,39.8991666666667
+7,637,30.5223333333333
+7,638,21.8228333333333
+7,639,27.1568333333333
+7,640,23.3891666666667
+7,641,21.4841666666667
+7,642,32.6813333333333
+7,643,25.1248333333333
+7,644,21.971
+7,645,26.543
+7,646,33.8455
+7,647,28.5538333333333
+7,648,24.9978333333333
+7,649,27.0298333333333
+7,650,38.5656666666667
+7,651,30.988
+7,652,34.8403333333333
+7,653,36.8935
+7,654,27.0086666666667
+7,655,24.9343333333333
+7,656,34.9461666666667
+7,657,34.7133333333333
+7,658,29.5698333333333
+7,659,32.512
+7,660,24.1935
+7,661,30.2895
+7,662,31.8558333333333
+7,663,31.2208333333333
+7,664,25.0613333333333
+7,665,31.242
+7,666,31.0303333333333
+7,667,36.8088333333333
+7,668,33.147
+7,669,27.0086666666667
+7,670,31.1785
+7,671,27.4743333333333
+7,672,27.8765
+7,673,30.3953333333333
+7,674,30.099
+7,675,27.2626666666667
+7,676,22.1403333333333
+7,677,27.305
+7,678,33.6338333333333
+7,679,37.9941666666667
+7,680,30.861
+7,681,32.1733333333333
+7,682,30.734
+7,683,23.9395
+7,684,31.496
+7,685,21.3995
+7,686,31.623
+7,687,25.2941666666667
+7,688,26.9451666666667
+7,689,34.2476666666667
+7,690,37.719
+7,691,25.2306666666667
+7,692,24.3416666666667
+7,693,23.9395
+7,694,30.3953333333333
+7,695,34.0783333333333
+7,696,23.2833333333333
+7,697,29.464
+7,698,24.0453333333333
+7,699,31.9193333333333
+7,700,35.4118333333333
+7,701,30.5435
+7,702,29.9296666666667
+7,703,41.4443333333333
+7,704,27.1991666666667
+7,705,32.639
+7,706,32.6601666666667
+7,707,24.892
+7,708,35.1155
+7,709,34.036
+7,710,29.8661666666667
+7,711,30.1836666666667
+7,712,30.6916666666667
+7,713,30.9456666666667
+7,714,20.7856666666667
+7,715,33.0411666666667
+7,716,29.2946666666667
+7,717,27.4531666666667
+7,718,25.9503333333333
+7,719,26.8393333333333
+7,720,36.7876666666667
+7,721,26.416
+7,722,25.273
+7,723,28.4903333333333
+7,724,28.0881666666667
+7,725,29.21
+7,726,26.67
+7,727,28.8713333333333
+7,728,31.0726666666667
+7,729,28.067
+7,730,30.4376666666667
+7,731,29.3581666666667
+7,732,24.0453333333333
+7,733,25.6116666666667
+7,734,31.0515
+7,735,31.6441666666667
+7,736,34.8615
+7,737,40.1108333333333
+7,738,28.3845
+7,739,28.7655
+7,740,35.9833333333333
+7,741,27.8976666666667
+7,742,19.0076666666667
+7,743,25.6328333333333
+7,744,32.9141666666667
+7,745,38.9043333333333
+7,746,28.1516666666667
+7,747,28.5961666666667
+7,748,35.5176666666667
+7,749,29.0195
+7,750,32.8083333333333
+7,751,29.5486666666667
+7,752,31.5171666666667
+7,753,25.1671666666667
+7,754,27.6013333333333
+7,755,27.2203333333333
+7,756,22.5001666666667
+7,757,29.4005
+7,758,35.687
+7,759,29.0406666666667
+7,760,27.7495
+7,761,17.2085
+7,762,33.1681666666667
+7,763,35.433
+7,764,33.2105
+7,765,22.3731666666667
+7,766,28.4268333333333
+7,767,23.8336666666667
+7,768,34.2265
+7,769,29.2735
+7,770,32.385
+7,771,24.384
+7,772,29.9085
+7,773,25.5481666666667
+7,774,33.0411666666667
+7,775,28.6596666666667
+7,776,39.7086666666667
+7,777,30.226
+7,778,30.5435
+7,779,30.1836666666667
+7,780,33.274
+7,781,40.64
+7,782,40.7246666666667
+7,783,25.781
+7,784,26.7123333333333
+7,785,33.5915
+7,786,26.8605
+7,787,32.0463333333333
+7,788,29.6545
+7,789,30.4376666666667
+7,790,26.0138333333333
+7,791,21.4418333333333
+7,792,32.639
+7,793,27.0721666666667
+7,794,32.1098333333333
+7,795,38.4598333333333
+7,796,27.1568333333333
+7,797,33.8666666666667
+7,798,22.352
+7,799,22.1191666666667
+7,800,24.0876666666667
+7,801,37.8248333333333
+7,802,31.6018333333333
+7,803,30.4165
+7,804,30.5646666666667
+7,805,27.7283333333333
+7,806,29.5275
+7,807,34.5863333333333
+7,808,26.7123333333333
+7,809,23.3468333333333
+7,810,39.5393333333333
+7,811,32.5331666666667
+7,812,25.6116666666667
+7,813,26.035
+7,814,32.6601666666667
+7,815,27.6436666666667
+7,816,31.5383333333333
+7,817,32.2791666666667
+7,818,26.8181666666667
+7,819,29.083
+7,820,35.814
+7,821,26.543
+7,822,30.1413333333333
+7,823,33.9936666666667
+7,824,34.9885
+7,825,28.575
+7,826,27.1568333333333
+7,827,33.6338333333333
+7,828,27.6225
+7,829,28.5115
+7,830,34.6498333333333
+7,831,26.8605
+7,832,28.6173333333333
+7,833,23.622
+7,834,26.9451666666667
+7,835,28.8713333333333
+7,836,38.5233333333333
+7,837,34.1206666666667
+7,838,25.0825
+7,839,31.3266666666667
+7,840,23.3045
+7,841,37.7613333333333
+7,842,31.5383333333333
+7,843,29.5275
+7,844,33.274
+7,845,22.7753333333333
+7,846,32.5543333333333
+7,847,30.4588333333333
+7,848,30.5223333333333
+7,849,30.0778333333333
+7,850,34.3958333333333
+7,851,28.702
+7,852,37.5708333333333
+7,853,30.3318333333333
+7,854,28.5115
+7,855,28.6596666666667
+7,856,31.6018333333333
+7,857,36.6395
+7,858,23.7278333333333
+7,859,27.2838333333333
+7,860,26.035
+7,861,36.2585
+7,862,27.5801666666667
+7,863,33.7185
+7,864,28.956
+7,865,33.2105
+7,866,20.5316666666667
+7,867,26.4371666666667
+7,868,28.6173333333333
+7,869,34.925
+7,870,30.6705
+7,871,36.0256666666667
+7,872,25.7175
+7,873,34.1206666666667
+7,874,37.1475
+7,875,27.4743333333333
+7,876,25.8868333333333
+7,877,27.6013333333333
+7,878,32.0886666666667
+7,879,23.368
+7,880,31.6653333333333
+7,881,30.9033333333333
+7,882,29.6968333333333
+7,883,37.9095
+7,884,39.3488333333333
+7,885,28.2363333333333
+7,886,30.3106666666667
+7,887,28.2151666666667
+7,888,29.337
+7,889,42.5238333333333
+7,890,24.4263333333333
+7,891,32.131
+7,892,24.0453333333333
+7,893,29.4428333333333
+7,894,28.2363333333333
+7,895,27.2415
+7,896,37.3591666666667
+7,897,27.559
+7,898,28.0035
+7,899,35.5176666666667
+7,900,25.9291666666667
+7,901,31.2843333333333
+7,902,25.8445
+7,903,30.099
+7,904,35.5176666666667
+7,905,31.0303333333333
+7,906,28.1093333333333
+7,907,22.9023333333333
+7,908,36.6395
+7,909,29.9296666666667
+7,910,27.5801666666667
+7,911,23.368
+7,912,32.0463333333333
+7,913,24.0665
+7,914,23.5373333333333
+7,915,22.5848333333333
+7,916,22.9023333333333
+7,917,22.0133333333333
+7,918,34.5016666666667
+7,919,30.5435
+7,920,21.209
+7,921,30.8398333333333
+7,922,29.3581666666667
+7,923,28.7231666666667
+7,924,34.9461666666667
+7,925,33.7608333333333
+7,926,30.353
+7,927,29.1676666666667
+7,928,22.733
+7,929,25.4211666666667
+7,930,30.7128333333333
+7,931,28.5538333333333
+7,932,25.6963333333333
+7,933,31.7288333333333
+7,934,22.6695
+7,935,29.9085
+7,936,31.1573333333333
+7,937,26.924
+7,938,37.465
+7,939,24.5745
+7,940,25.2941666666667
+7,941,22.2461666666667
+7,942,33.9513333333333
+7,943,30.0355
+7,944,29.4005
+7,945,36.8935
+7,946,24.892
+7,947,23.749
+7,948,20.2353333333333
+7,949,29.4216666666667
+7,950,27.6013333333333
+7,951,33.6338333333333
+7,952,39.9415
+7,953,33.528
+7,954,20.4681666666667
+7,955,33.9513333333333
+7,956,28.8078333333333
+7,957,29.5063333333333
+7,958,37.1898333333333
+7,959,36.0468333333333
+7,960,26.2043333333333
+7,961,26.9663333333333
+7,962,34.544
+7,963,33.2528333333333
+7,964,29.972
+7,965,24.0665
+7,966,38.0153333333333
+7,967,28.575
+7,968,31.2208333333333
+7,969,42.7778333333333
+7,970,29.9931666666667
+7,971,26.2255
+7,972,39.1583333333333
+7,973,35.2848333333333
+7,974,39.1795
+7,975,45.72
+7,976,33.3586666666667
+7,977,32.7025
+7,978,31.369
+7,979,22.2038333333333
+7,980,31.7923333333333
+7,981,29.464
+7,982,30.734
+7,983,28.4903333333333
+7,984,34.671
+7,985,36.8935
+7,986,39.6663333333333
+7,987,37.3591666666667
+7,988,31.4325
+7,989,28.2151666666667
+7,990,32.004
+7,991,26.0773333333333
+7,992,34.9885
+7,993,36.068
+7,994,32.512
+7,995,35.814
+7,996,32.1733333333333
+7,997,23.0716666666667
+7,998,26.5218333333333
+7,999,30.988
+7,1000,28.6596666666667
+8,1,20.9507666666667
+8,2,21.9075
+8,3,23.7659333333333
+8,4,19.8077666666667
+8,5,23.1013
+8,6,22.9658333333333
+8,7,23.0251
+8,8,24.1850333333333
+8,9,31.1361666666667
+8,10,24.765
+8,11,23.9987666666667
+8,12,26.1112
+8,13,23.0505
+8,14,26.3355666666667
+8,15,18.9145333333333
+8,16,24.9131666666667
+8,17,27.813
+8,18,23.6855
+8,19,21.3487
+8,20,19.3886666666667
+8,21,23.4526666666667
+8,22,18.9187666666667
+8,23,19.9601666666667
+8,24,19.0034333333333
+8,25,24.0622666666667
+8,26,22.4747666666667
+8,27,23.5161666666667
+8,28,27.1145
+8,29,24.1046
+8,30,22.2123
+8,31,25.2306666666667
+8,32,25.654
+8,33,21.7085333333333
+8,34,20.6967666666667
+8,35,22.6483333333333
+8,36,17.3566666666667
+8,37,18.5631666666667
+8,38,22.1784333333333
+8,39,20.828
+8,40,28.9263666666667
+8,41,21.1201
+8,42,22.9616
+8,43,28.7570333333333
+8,44,18.8976
+8,45,19.0669333333333
+8,46,28.7612666666667
+8,47,24.257
+8,48,22.6864333333333
+8,49,24.1850333333333
+8,50,21.7932
+8,51,20.1887666666667
+8,52,24.3332
+8,53,26.3017
+8,54,29.2311666666667
+8,55,24.7988666666667
+8,56,33.4433333333333
+8,57,20.701
+8,58,22.9362
+8,59,23.2833333333333
+8,60,22.4747666666667
+8,61,27.8680333333333
+8,62,25.4846666666667
+8,63,21.7932
+8,64,28.8459333333333
+8,65,23.7278333333333
+8,66,22.6441
+8,67,27.3177
+8,68,18.7536666666667
+8,69,26.5853333333333
+8,70,22.3054333333333
+8,71,29.6883666666667
+8,72,28.9517666666667
+8,73,19.7612
+8,74,25.7556
+8,75,20.7814333333333
+8,76,25.7132666666667
+8,77,27.7198666666667
+8,78,22.1361
+8,79,23.0843666666667
+8,80,20.8915
+8,81,22.3435333333333
+8,82,24.6126
+8,83,29.5063333333333
+8,84,17.4836666666667
+8,85,22.3308333333333
+8,86,30.7043666666667
+8,87,30.2852666666667
+8,88,22.6906666666667
+8,89,24.6930333333333
+8,90,26.9409333333333
+8,91,24.0876666666667
+8,92,21.3317666666667
+8,93,22.0937666666667
+8,94,23.9183333333333
+8,95,27.1441333333333
+8,96,28.4861
+8,97,19.9982666666667
+8,98,29.0618333333333
+8,99,18.4954333333333
+8,100,18.7706
+8,101,22.7457
+8,102,22.098
+8,103,23.9564333333333
+8,104,17.8731333333333
+8,105,23.1055333333333
+8,106,22.8727
+8,107,21.6069333333333
+8,108,25.2476
+8,109,26.7081
+8,110,26.1323666666667
+8,111,23.4907666666667
+8,112,17.6318333333333
+8,113,28.4268333333333
+8,114,21.1031666666667
+8,115,30.4546
+8,116,21.8609333333333
+8,117,19.8543333333333
+8,118,27.3388666666667
+8,119,18.9780333333333
+8,120,27.7495
+8,121,20.0998666666667
+8,122,17.2085
+8,123,21.4545333333333
+8,124,25.3111
+8,125,20.9084333333333
+8,126,19.8289333333333
+8,127,31.0430333333333
+8,128,22.098
+8,129,22.0345
+8,130,23.1309333333333
+8,131,19.6003333333333
+8,132,18.4277
+8,133,21.6958333333333
+8,134,21.8228333333333
+8,135,21.7127666666667
+8,136,21.8609333333333
+8,137,25.146
+8,138,20.0448333333333
+8,139,21.336
+8,140,22.4578333333333
+8,141,23.2113666666667
+8,142,27.305
+8,143,22.6229333333333
+8,144,23.9564333333333
+8,145,20.8661
+8,146,22.733
+8,147,20.3581
+8,148,22.5382666666667
+8,149,28.1432
+8,150,27.7410333333333
+8,151,21.4206666666667
+8,152,25.8106333333333
+8,153,23.5077
+8,154,21.3275333333333
+8,155,22.1530333333333
+8,156,25.1206
+8,157,22.4282
+8,158,24.8073333333333
+8,159,22.0514333333333
+8,160,23.7278333333333
+8,161,26.8139333333333
+8,162,22.6652666666667
+8,163,22.9023333333333
+8,164,24.8242666666667
+8,165,22.4959333333333
+8,166,26.0731
+8,167,24.0622666666667
+8,168,24.2781666666667
+8,169,23.1521
+8,170,21.7551
+8,171,17.9027666666667
+8,172,19.1135
+8,173,19.304
+8,174,23.6812666666667
+8,175,22.0937666666667
+8,176,24.1088333333333
+8,177,24.2697
+8,178,23.7828666666667
+8,179,20.8788
+8,180,22.0260333333333
+8,181,21.5646
+8,182,26.7123333333333
+8,183,24.0622666666667
+8,184,18.4700333333333
+8,185,24.1003666666667
+8,186,22.6779666666667
+8,187,23.1902
+8,188,20.0871666666667
+8,189,23.5542666666667
+8,190,19.2616666666667
+8,191,18.6605333333333
+8,192,24.6972666666667
+8,193,19.8712666666667
+8,194,22.5298
+8,195,23.5966
+8,196,27.3812
+8,197,27.5039666666667
+8,198,27.7495
+8,199,20.2311
+8,200,23.0462666666667
+8,201,20.7645
+8,202,20.2311
+8,203,28.2067
+8,204,27.0721666666667
+8,205,23.241
+8,206,24.638
+8,207,23.9776
+8,208,24.7692333333333
+8,209,25.3957666666667
+8,210,28.4310666666667
+8,211,27.4955
+8,212,23.9987666666667
+8,213,24.5279333333333
+8,214,21.9075
+8,215,22.4155
+8,216,23.0505
+8,217,20.6544333333333
+8,218,19.9178333333333
+8,219,26.2339666666667
+8,220,24.9470333333333
+8,221,29.2227
+8,222,26.4795
+8,223,26.5599333333333
+8,224,22.2038333333333
+8,225,21.8101333333333
+8,226,25.1629333333333
+8,227,23.8294333333333
+8,228,21.9921666666667
+8,229,25.8360333333333
+8,230,26.1366
+8,231,28.1643666666667
+8,232,22.6822
+8,233,29.5613666666667
+8,234,23.3002666666667
+8,235,22.1191666666667
+8,236,22.8557666666667
+8,237,22.4959333333333
+8,238,16.256
+8,239,24.5067666666667
+8,240,21.1031666666667
+8,241,16.6285333333333
+8,242,26.8181666666667
+8,243,21.6916
+8,244,19.7442666666667
+8,245,22.7922666666667
+8,246,27.5166666666667
+8,247,22.5636666666667
+8,248,22.3054333333333
+8,249,26.1112
+8,250,24.638
+8,251,28.1686
+8,252,20.0363666666667
+8,253,24.3586
+8,254,27.1907
+8,255,22.4536
+8,256,31.0218666666667
+8,257,20.6544333333333
+8,258,24.8285
+8,259,26.7250333333333
+8,260,23.1097666666667
+8,261,19.5156666666667
+8,262,21.6873666666667
+8,263,22.4324333333333
+8,264,27.559
+8,265,18.8764333333333
+8,266,20.447
+8,267,18.6012666666667
+8,268,19.2320333333333
+8,269,26.6573
+8,270,26.2212666666667
+8,271,22.7838
+8,272,21.4799333333333
+8,273,19.9178333333333
+8,274,29.8407666666667
+8,275,24.1892666666667
+8,276,22.2885
+8,277,21.3529333333333
+8,278,19.812
+8,279,19.4479333333333
+8,280,21.6492666666667
+8,281,22.4959333333333
+8,282,26.7673666666667
+8,283,24.8835333333333
+8,284,29.8873333333333
+8,285,23.7659333333333
+8,286,24.6718666666667
+8,287,23.5796666666667
+8,288,22.4536
+8,289,17.6911
+8,290,21.1455
+8,291,20.5105
+8,292,18.7452
+8,293,27.0086666666667
+8,294,22.8811666666667
+8,295,24.3374333333333
+8,296,17.5048333333333
+8,297,24.1850333333333
+8,298,23.0505
+8,299,17.7588333333333
+8,300,26.1831666666667
+8,301,22.8854
+8,302,26.1112
+8,303,20.2946
+8,304,20.3581
+8,305,20.9126666666667
+8,306,24.4898333333333
+8,307,18.9611
+8,308,26.1069666666667
+8,309,24.9936
+8,310,17.7165
+8,311,24.4009333333333
+8,312,24.4009333333333
+8,313,26.4710333333333
+8,314,18.9780333333333
+8,315,25.9418666666667
+8,316,23.8294333333333
+8,317,26.1154333333333
+8,318,26.6615333333333
+8,319,23.7024333333333
+8,320,25.9291666666667
+8,321,26.7038666666667
+8,322,25.0952
+8,323,23.6431666666667
+8,324,29.2311666666667
+8,325,21.8186
+8,326,28.1262666666667
+8,327,22.9023333333333
+8,328,26.0985
+8,329,20.6883
+8,330,24.4813666666667
+8,331,26.3313333333333
+8,332,24.0368666666667
+8,333,30.5858333333333
+8,334,22.0429666666667
+8,335,25.4211666666667
+8,336,29.4005
+8,337,25.7937
+8,338,17.6276
+8,339,25.2857
+8,340,24.4686666666667
+8,341,23.2960333333333
+8,342,19.9559333333333
+8,343,25.2179666666667
+8,344,25.5820333333333
+8,345,21.8778666666667
+8,346,24.0495666666667
+8,347,23.4865333333333
+8,348,24.7734666666667
+8,349,21.6238666666667
+8,350,21.5434333333333
+8,351,21.1793666666667
+8,352,22.7287666666667
+8,353,21.2598
+8,354,20.7856666666667
+8,355,21.2513333333333
+8,356,21.1455
+8,357,18.2202666666667
+8,358,20.9338333333333
+8,359,22.6822
+8,360,20.9931
+8,361,20.8153
+8,362,23.6601
+8,363,27.5124333333333
+8,364,28.9263666666667
+8,365,19.4521666666667
+8,366,26.3059333333333
+8,367,26.6403666666667
+8,368,23.2833333333333
+8,369,27.8045333333333
+8,370,22.1361
+8,371,17.9662666666667
+8,372,20.2776666666667
+8,373,22.0726
+8,374,21.6958333333333
+8,375,24.6126
+8,376,22.8346
+8,377,23.4103333333333
+8,378,20.9507666666667
+8,379,19.8670333333333
+8,380,16.6793333333333
+8,381,20.32
+8,382,25.2857
+8,383,26.3694333333333
+8,384,22.7965
+8,385,23.4484333333333
+8,386,19.6977
+8,387,20.9084333333333
+8,388,26.67
+8,389,22.9616
+8,390,23.3214333333333
+8,391,22.7541666666667
+8,392,28.2575
+8,393,17.4582666666667
+8,394,26.7250333333333
+8,395,22.8557666666667
+8,396,18.3261
+8,397,20.7602666666667
+8,398,28.3633333333333
+8,399,20.3030666666667
+8,400,26.6615333333333
+8,401,24.1638666666667
+8,402,23.368
+8,403,19.3378666666667
+8,404,26.035
+8,405,27.1441333333333
+8,406,19.0881
+8,407,21.5857666666667
+8,408,25.0571
+8,409,28.6808333333333
+8,410,23.0716666666667
+8,411,22.5806
+8,412,24.2951
+8,413,23.7574666666667
+8,414,22.3308333333333
+8,415,21.9879333333333
+8,416,23.4738333333333
+8,417,21.4333666666667
+8,418,31.0557333333333
+8,419,26.3271
+8,420,21.8397666666667
+8,421,19.0923333333333
+8,422,24.0241666666667
+8,423,22.3943333333333
+8,424,20.9677
+8,425,23.4611333333333
+8,426,21.0185
+8,427,22.1149333333333
+8,428,16.9545
+8,429,31.9024
+8,430,24.3416666666667
+8,431,24.1511666666667
+8,432,17.3947666666667
+8,433,20.8872666666667
+8,434,25.3322666666667
+8,435,21.6662
+8,436,21.1878333333333
+8,437,24.0622666666667
+8,438,21.3952666666667
+8,439,28.2956
+8,440,21.3783333333333
+8,441,28.1855333333333
+8,442,23.3172
+8,443,24.3205
+8,444,24.8242666666667
+8,445,22.4578333333333
+8,446,25.0994333333333
+8,447,23.7193666666667
+8,448,22.7457
+8,449,24.8242666666667
+8,450,26.8139333333333
+8,451,21.4841666666667
+8,452,23.6177666666667
+8,453,19.6638333333333
+8,454,21.4333666666667
+8,455,18.2668333333333
+8,456,20.1041
+8,457,21.3063666666667
+8,458,18.9441666666667
+8,459,19.6299666666667
+8,460,25.5439333333333
+8,461,24.9639666666667
+8,462,22.5340333333333
+8,463,24.2104333333333
+8,464,25.9799666666667
+8,465,21.8990333333333
+8,466,25.5778
+8,467,25.3365
+8,468,25.5439333333333
+8,469,24.1215333333333
+8,470,16.7132
+8,471,18.6605333333333
+8,472,19.0415333333333
+8,473,21.7551
+8,474,27.2203333333333
+8,475,19.2362666666667
+8,476,22.1149333333333
+8,477,26.0138333333333
+8,478,18.9611
+8,479,21.8609333333333
+8,480,24.0749666666667
+8,481,22.733
+8,482,24.5914333333333
+8,483,22.5425
+8,484,23.5077
+8,485,24.0241666666667
+8,486,27.0213666666667
+8,487,18.9568666666667
+8,488,20.8915
+8,489,24.1046
+8,490,26.2424333333333
+8,491,25.4
+8,492,23.6812666666667
+8,493,23.9141
+8,494,22.1572666666667
+8,495,24.511
+8,496,19.3886666666667
+8,497,24.1469333333333
+8,498,22.4324333333333
+8,499,21.1328
+8,500,18.5928
+8,501,20.9296
+8,502,23.1944333333333
+8,503,27.0256
+8,504,24.3332
+8,505,23.4907666666667
+8,506,21.082
+8,507,21.3148333333333
+8,508,18.9822666666667
+8,509,23.0716666666667
+8,510,21.4545333333333
+8,511,17.5852666666667
+8,512,22.1530333333333
+8,513,19.6596
+8,514,21.9032666666667
+8,515,23.7405333333333
+8,516,25.019
+8,517,19.5368333333333
+8,518,19.0034333333333
+8,519,19.2616666666667
+8,520,20.7983666666667
+8,521,22.6441
+8,522,24.5067666666667
+8,523,23.5712
+8,524,22.8388333333333
+8,525,23.9987666666667
+8,526,26.3863666666667
+8,527,23.4526666666667
+8,528,25.146
+8,529,26.4752666666667
+8,530,27.5293666666667
+8,531,22.5806
+8,532,20.701
+8,533,25.3576666666667
+8,534,21.5603666666667
+8,535,22.479
+8,536,19.7654333333333
+8,537,23.8040333333333
+8,538,24.7015
+8,539,25.4973666666667
+8,540,27.8595666666667
+8,541,20.1718333333333
+8,542,24.13
+8,543,25.6328333333333
+8,544,23.6135333333333
+8,545,22.8346
+8,546,21.2217
+8,547,19.9559333333333
+8,548,27.3896666666667
+8,549,25.2010333333333
+8,550,21.3487
+8,551,24.7988666666667
+8,552,19.6596
+8,553,27.0721666666667
+8,554,22.3223666666667
+8,555,21.0100333333333
+8,556,19.6384333333333
+8,557,24.7565333333333
+8,558,21.9032666666667
+8,559,23.6135333333333
+8,560,22.987
+8,561,21.9032666666667
+8,562,18.0975
+8,563,24.7777
+8,564,21.4799333333333
+8,565,23.1902
+8,566,20.3623333333333
+8,567,20.5486
+8,568,20.2311
+8,569,27.3007666666667
+8,570,21.0185
+8,571,18.5843333333333
+8,572,27.305
+8,573,23.3214333333333
+8,574,28.2490333333333
+8,575,26.5853333333333
+8,576,19.3251666666667
+8,577,21.4714666666667
+8,578,19.8501
+8,579,26.3863666666667
+8,580,19.3463333333333
+8,581,22.4324333333333
+8,582,20.6798333333333
+8,583,24.1892666666667
+8,584,22.7076
+8,585,20.8026
+8,586,27.5336
+8,587,21.5815333333333
+8,588,23.6643333333333
+8,589,27.8045333333333
+8,590,29.5825333333333
+8,591,22.6652666666667
+8,592,24.4856
+8,593,28.2405666666667
+8,594,34.29
+8,595,25.7598333333333
+8,596,20.5528333333333
+8,597,23.4526666666667
+8,598,19.9559333333333
+8,599,25.6074333333333
+8,600,24.3162666666667
+8,601,21.3529333333333
+8,602,22.1318666666667
+8,603,19.939
+8,604,19.6172666666667
+8,605,25.5016
+8,606,20.0236666666667
+8,607,23.1309333333333
+8,608,25.3576666666667
+8,609,23.5796666666667
+8,610,19.5156666666667
+8,611,27.0848666666667
+8,612,25.2899333333333
+8,613,17.5852666666667
+8,614,22.7118333333333
+8,615,22.6017666666667
+8,616,23.4907666666667
+8,617,22.5636666666667
+8,618,21.2005333333333
+8,619,21.2259333333333
+8,620,23.4865333333333
+8,621,20.32
+8,622,23.4188
+8,623,20.5105
+8,624,24.8031
+8,625,23.876
+8,626,18.1821666666667
+8,627,24.5533333333333
+8,628,18.2414333333333
+8,629,26.1789333333333
+8,630,20.6078666666667
+8,631,17.8308
+8,632,23.1902
+8,633,26.3948333333333
+8,634,24.1088333333333
+8,635,27.6013333333333
+8,636,26.289
+8,637,22.0514333333333
+8,638,24.8200333333333
+8,639,16.3152666666667
+8,640,22.4663
+8,641,25.7513666666667
+8,642,20.3962
+8,643,24.5491
+8,644,23.4653666666667
+8,645,27.0679333333333
+8,646,27.4447
+8,647,23.241
+8,648,18.3896
+8,649,21.6535
+8,650,22.5001666666667
+8,651,24.5533333333333
+8,652,20.2903666666667
+8,653,22.1996
+8,654,18.1356
+8,655,19.7696666666667
+8,656,20.8364666666667
+8,657,21.0439
+8,658,21.9202
+8,659,28.2532666666667
+8,660,19.1939333333333
+8,661,17.907
+8,662,22.0599
+8,663,25.9503333333333
+8,664,18.2668333333333
+8,665,20.2988333333333
+8,666,20.5951666666667
+8,667,22.6398666666667
+8,668,25.7894666666667
+8,669,17.5852666666667
+8,670,25.0740333333333
+8,671,25.3534333333333
+8,672,22.4578333333333
+8,673,24.0665
+8,674,22.3731666666667
+8,675,21.2513333333333
+8,676,19.2151
+8,677,25.6243666666667
+8,678,25.8191
+8,679,24.6041333333333
+8,680,26.1323666666667
+8,681,18.4573333333333
+8,682,22.3901
+8,683,22.1572666666667
+8,684,18.1737
+8,685,23.5373333333333
+8,686,28.575
+8,687,23.876
+8,688,21.6535
+8,689,20.8237666666667
+8,690,20.8491666666667
+8,691,21.6323333333333
+8,692,22.6483333333333
+8,693,29.4343666666667
+8,694,23.9945333333333
+8,695,25.2264333333333
+8,696,24.3205
+8,697,20.2522666666667
+8,698,22.4070333333333
+8,699,20.0448333333333
+8,700,22.9150333333333
+8,701,25.9842
+8,702,22.8388333333333
+8,703,21.7085333333333
+8,704,26.6446
+8,705,21.6958333333333
+8,706,26.7673666666667
+8,707,20.1506666666667
+8,708,24.384
+8,709,24.7819333333333
+8,710,29.5656
+8,711,24.8031
+8,712,27.7706666666667
+8,713,26.4498666666667
+8,714,22.4282
+8,715,24.8073333333333
+8,716,24.4051666666667
+8,717,19.4098333333333
+8,718,18.6436
+8,719,22.6695
+8,720,22.2165333333333
+8,721,24.2104333333333
+8,722,18.7452
+8,723,25.2264333333333
+8,724,22.4155
+8,725,24.3162666666667
+8,726,22.8473
+8,727,24.5491
+8,728,21.6958333333333
+8,729,19.9136
+8,730,20.5020333333333
+8,731,19.1304333333333
+8,732,23.7024333333333
+8,733,24.1935
+8,734,26.6403666666667
+8,735,18.8044666666667
+8,736,25.6243666666667
+8,737,24.7015
+8,738,22.6864333333333
+8,739,22.8981
+8,740,29.0745333333333
+8,741,22.5806
+8,742,19.9178333333333
+8,743,26.5387666666667
+8,744,23.0081666666667
+8,745,20.6925333333333
+8,746,24.6083666666667
+8,747,20.2565
+8,748,22.0556666666667
+8,749,20.1845333333333
+8,750,20.6332666666667
+8,751,24.8666
+8,752,24.0665
+8,753,25.5651
+8,754,20.8026
+8,755,20.4427666666667
+8,756,21.8397666666667
+8,757,29.3073666666667
+8,758,21.9583
+8,759,25.7598333333333
+8,760,18.4488666666667
+8,761,31.3224333333333
+8,762,27.0256
+8,763,24.3628333333333
+8,764,20.9507666666667
+8,765,21.7678
+8,766,30.6281666666667
+8,767,21.6069333333333
+8,768,21.0185
+8,769,19.2362666666667
+8,770,19.1304333333333
+8,771,23.5077
+8,772,19.5326
+8,773,18.3303333333333
+8,774,22.9658333333333
+8,775,23.7109
+8,776,21.8143666666667
+8,777,26.3948333333333
+8,778,22.9616
+8,779,23.5585
+8,780,23.8252
+8,781,25.2264333333333
+8,782,19.5791666666667
+8,783,24.0411
+8,784,18.9611
+8,785,19.8077666666667
+8,786,23.3637666666667
+8,787,20.3623333333333
+8,788,26.2043333333333
+8,789,22.4155
+8,790,19.6807666666667
+8,791,24.7015
+8,792,25.0994333333333
+8,793,21.8567
+8,794,24.9724333333333
+8,795,24.2908666666667
+8,796,23.0166333333333
+8,797,22.6017666666667
+8,798,23.1563333333333
+8,799,21.8313
+8,800,23.0928333333333
+8,801,20.1422
+8,802,28.1643666666667
+8,803,27.2626666666667
+8,804,27.3854333333333
+8,805,23.6389333333333
+8,806,23.0716666666667
+8,807,21.0735333333333
+8,808,23.9564333333333
+8,809,26.3313333333333
+8,810,18.7071
+8,811,23.6347
+8,812,24.4686666666667
+8,813,28.9306
+8,814,22.5001666666667
+8,815,20.3411666666667
+8,816,25.9926666666667
+8,817,22.7922666666667
+8,818,22.0895333333333
+8,819,30.4588333333333
+8,820,33.8920666666667
+8,821,23.9564333333333
+8,822,20.1718333333333
+8,823,21.1412666666667
+8,824,23.8802333333333
+8,825,23.4230333333333
+8,826,22.2165333333333
+8,827,23.7786333333333
+8,828,18.1186666666667
+8,829,26.9832666666667
+8,830,23.2367666666667
+8,831,24.0453333333333
+8,832,20.7306333333333
+8,833,19.6088
+8,834,21.0947
+8,835,27.9611666666667
+8,836,24.3205
+8,837,21.1243333333333
+8,838,22.9658333333333
+8,839,22.8769333333333
+8,840,23.4103333333333
+8,841,29.718
+8,842,24.7015
+8,843,21.0777666666667
+8,844,23.3891666666667
+8,845,26.5345333333333
+8,846,21.2725
+8,847,27.6394333333333
+8,848,22.8473
+8,849,28.6088666666667
+8,850,21.0989333333333
+8,851,25.2476
+8,852,23.5966
+8,853,23.0420333333333
+8,854,27.0933333333333
+8,855,23.368
+8,856,22.7076
+8,857,28.1686
+8,858,18.9357
+8,859,21.9202
+8,860,21.971
+8,861,19.8966666666667
+8,862,23.2579333333333
+8,863,17.8816
+8,864,20.9126666666667
+8,865,26.5176
+8,866,21.0777666666667
+8,867,28.1305
+8,868,22.2673333333333
+8,869,24.3628333333333
+8,870,21.8821
+8,871,21.4545333333333
+8,872,23.1055333333333
+8,873,26.8774333333333
+8,874,24.1892666666667
+8,875,17.8223333333333
+8,876,29.6502666666667
+8,877,24.2781666666667
+8,878,21.6323333333333
+8,879,25.6159
+8,880,24.2993333333333
+8,881,28.6342666666667
+8,882,18.1144333333333
+8,883,19.5072
+8,884,25.5481666666667
+8,885,23.3595333333333
+8,886,20.0448333333333
+8,887,23.8463666666667
+8,888,28.3802666666667
+8,889,19.7696666666667
+8,890,29.1041666666667
+8,891,21.1158666666667
+8,892,23.8252
+8,893,19.4733333333333
+8,894,28.8925
+8,895,23.7913333333333
+8,896,17.3101
+8,897,24.8454333333333
+8,898,26.4879666666667
+8,899,23.5754333333333
+8,900,23.7236
+8,901,31.4113333333333
+8,902,20.9973333333333
+8,903,22.3308333333333
+8,904,22.098
+8,905,22.9446666666667
+8,906,21.717
+8,907,20.9126666666667
+8,908,24.13
+8,909,22.4366666666667
+8,910,22.6652666666667
+8,911,28.5242
+8,912,20.9931
+8,913,19.4691
+8,914,27.8553333333333
+8,915,24.13
+8,916,26.8605
+8,917,22.2631
+8,918,21.4418333333333
+8,919,23.6812666666667
+8,920,22.5425
+8,921,31.8516
+8,922,22.5128666666667
+8,923,23.5288666666667
+8,924,20.4597
+8,925,23.6939666666667
+8,926,23.8082666666667
+8,927,20.5105
+8,928,29.6545
+8,929,22.5382666666667
+8,930,26.8181666666667
+8,931,20.9719333333333
+8,932,20.9719333333333
+8,933,25.5651
+8,934,26.162
+8,935,22.1361
+8,936,25.8656666666667
+8,937,22.3731666666667
+8,938,25.0147666666667
+8,939,24.8242666666667
+8,940,26.1323666666667
+8,941,18.8087
+8,942,21.9202
+8,943,21.2852
+8,944,22.2461666666667
+8,945,24.6972666666667
+8,946,21.1158666666667
+8,947,24.3289666666667
+8,948,27.3261666666667
+8,949,24.257
+8,950,25.7894666666667
+8,951,22.7668666666667
+8,952,20.3623333333333
+8,953,26.3948333333333
+8,954,26.8351
+8,955,21.3106
+8,956,29.6502666666667
+8,957,18.1356
+8,958,21.0608333333333
+8,959,23.0716666666667
+8,960,27.8468666666667
+8,961,25.2941666666667
+8,962,19.5791666666667
+8,963,18.5208333333333
+8,964,26.7038666666667
+8,965,20.6502
+8,966,25.5862666666667
+8,967,21.0185
+8,968,18.3684333333333
+8,969,23.3045
+8,970,24.2358333333333
+8,971,24.1596333333333
+8,972,19.3209333333333
+8,973,21.4587666666667
+8,974,19.05
+8,975,26.5006666666667
+8,976,21.1031666666667
+8,977,23.4315
+8,978,26.8732
+8,979,17.8816
+8,980,21.2301666666667
+8,981,20.6798333333333
+8,982,23.8040333333333
+8,983,25.2095
+8,984,23.0420333333333
+8,985,25.8741333333333
+8,986,18.542
+8,987,24.6761
+8,988,21.8609333333333
+8,989,23.6008333333333
+8,990,22.3731666666667
+8,991,28.321
+8,992,27.2626666666667
+8,993,22.6822
+8,994,28.9898666666667
+8,995,19.2151
+8,996,20.8788
+8,997,24.638
+8,998,20.6375
+8,999,25.4804333333333
+8,1000,24.7988666666667
+9,1,26.416
+9,2,34.3958333333333
+9,3,35.4118333333333
+9,4,25.3153333333333
+9,5,30.7551666666667
+9,6,25.5481666666667
+9,7,32.9141666666667
+9,8,24.765
+9,9,30.5223333333333
+9,10,31.369
+9,11,37.6978333333333
+9,12,32.1521666666667
+9,13,35.2425
+9,14,29.8238333333333
+9,15,28.2575
+9,16,32.8295
+9,17,25.9291666666667
+9,18,28.8925
+9,19,24.7226666666667
+9,20,34.3535
+9,21,32.4061666666667
+9,22,30.3741666666667
+9,23,27.559
+9,24,31.6441666666667
+9,25,28.1516666666667
+9,26,29.21
+9,27,30.7551666666667
+9,28,23.8971666666667
+9,29,27.3473333333333
+9,30,28.9348333333333
+9,31,33.2316666666667
+9,32,31.6441666666667
+9,33,31.0938333333333
+9,34,30.7975
+9,35,31.3266666666667
+9,36,31.9193333333333
+9,37,29.1041666666667
+9,38,28.194
+9,39,25.908
+9,40,32.4696666666667
+9,41,38.9043333333333
+9,42,29.7815
+9,43,32.893
+9,44,26.1408333333333
+9,45,25.019
+9,46,25.7175
+9,47,31.0938333333333
+9,48,29.4428333333333
+9,49,33.9725
+9,50,29.337
+9,51,27.3473333333333
+9,52,32.2156666666667
+9,53,36.1103333333333
+9,54,31.2631666666667
+9,55,31.5171666666667
+9,56,26.4371666666667
+9,57,36.8088333333333
+9,58,31.3478333333333
+9,59,35.1155
+9,60,27.7495
+9,61,28.9771666666667
+9,62,24.4686666666667
+9,63,34.29
+9,64,26.7546666666667
+9,65,27.2626666666667
+9,66,32.0251666666667
+9,67,27.4955
+9,68,28.0881666666667
+9,69,34.4805
+9,70,25.9715
+9,71,30.4165
+9,72,35.6658333333333
+9,73,29.5486666666667
+9,74,23.7913333333333
+9,75,33.782
+9,76,22.2461666666667
+9,77,26.6911666666667
+9,78,31.877
+9,79,28.4056666666667
+9,80,29.2523333333333
+9,81,27.5166666666667
+9,82,31.9193333333333
+9,83,41.402
+9,84,34.6286666666667
+9,85,27.94
+9,86,27.305
+9,87,26.7335
+9,88,27.7918333333333
+9,89,24.1935
+9,90,25.3153333333333
+9,91,28.7866666666667
+9,92,27.1145
+9,93,27.305
+9,94,34.29
+9,95,31.2843333333333
+9,96,29.9296666666667
+9,97,31.8135
+9,98,27.5801666666667
+9,99,29.2946666666667
+9,100,25.7386666666667
+9,101,30.0143333333333
+9,102,30.2895
+9,103,35.6023333333333
+9,104,31.9405
+9,105,28.9348333333333
+9,106,23.2621666666667
+9,107,25.4
+9,108,25.4846666666667
+9,109,28.3845
+9,110,24.5956666666667
+9,111,32.766
+9,112,32.9776666666667
+9,113,27.5166666666667
+9,114,29.9085
+9,115,29.3581666666667
+9,116,32.8083333333333
+9,117,24.1935
+9,118,30.4376666666667
+9,119,29.1253333333333
+9,120,29.972
+9,121,29.2311666666667
+9,122,31.6865
+9,123,24.9131666666667
+9,124,25.8445
+9,125,29.3793333333333
+9,126,37.4226666666667
+9,127,22.7965
+9,128,29.5486666666667
+9,129,24.9131666666667
+9,130,27.2203333333333
+9,131,32.5331666666667
+9,132,28.5538333333333
+9,133,29.3158333333333
+9,134,34.5863333333333
+9,135,24.8073333333333
+9,136,22.225
+9,137,33.7185
+9,138,32.5331666666667
+9,139,28.9136666666667
+9,140,26.0773333333333
+9,141,35.4965
+9,142,26.5853333333333
+9,143,28.0035
+9,144,33.1893333333333
+9,145,32.5331666666667
+9,146,27.7495
+9,147,28.321
+9,148,28.7866666666667
+9,149,34.1418333333333
+9,150,28.1093333333333
+9,151,30.8186666666667
+9,152,25.0401666666667
+9,153,25.273
+9,154,26.2043333333333
+9,155,33.8455
+9,156,30.4376666666667
+9,157,32.5543333333333
+9,158,25.654
+9,159,24.8708333333333
+9,160,27.432
+9,161,31.8558333333333
+9,162,22.7541666666667
+9,163,29.4428333333333
+9,164,27.9823333333333
+9,165,28.2998333333333
+9,166,33.3375
+9,167,26.3313333333333
+9,168,26.4371666666667
+9,169,29.9085
+9,170,23.3256666666667
+9,171,29.4851666666667
+9,172,31.7076666666667
+9,173,31.0515
+9,174,25.146
+9,175,32.7236666666667
+9,176,26.4371666666667
+9,177,27.6013333333333
+9,178,28.2151666666667
+9,179,30.3318333333333
+9,180,26.6488333333333
+9,181,35.5176666666667
+9,182,30.5223333333333
+9,183,32.131
+9,184,29.3793333333333
+9,185,30.8398333333333
+9,186,32.4273333333333
+9,187,35.1578333333333
+9,188,28.702
+9,189,27.1356666666667
+9,190,31.5595
+9,191,24.638
+9,192,34.1418333333333
+9,193,29.0406666666667
+9,194,28.7231666666667
+9,195,29.464
+9,196,29.8873333333333
+9,197,25.8868333333333
+9,198,33.401
+9,199,29.6756666666667
+9,200,27.7706666666667
+9,201,32.5331666666667
+9,202,27.432
+9,203,38.3751666666667
+9,204,34.2053333333333
+9,205,32.004
+9,206,31.2208333333333
+9,207,30.0566666666667
+9,208,34.7345
+9,209,24.1511666666667
+9,210,34.29
+9,211,25.0825
+9,212,33.2105
+9,213,31.115
+9,214,28.448
+9,215,34.2476666666667
+9,216,31.7923333333333
+9,217,25.7386666666667
+9,218,32.0675
+9,219,26.7123333333333
+9,220,22.2673333333333
+9,221,32.2791666666667
+9,222,31.7711666666667
+9,223,29.21
+9,224,31.0726666666667
+9,225,25.8868333333333
+9,226,28.0881666666667
+9,227,28.4056666666667
+9,228,31.0938333333333
+9,229,31.496
+9,230,27.6436666666667
+9,231,26.7335
+9,232,27.9611666666667
+9,233,28.6808333333333
+9,234,25.9926666666667
+9,235,30.607
+9,236,30.5223333333333
+9,237,29.5486666666667
+9,238,34.036
+9,239,37.8036666666667
+9,240,31.0091666666667
+9,241,33.8031666666667
+9,242,26.7758333333333
+9,243,31.3055
+9,244,30.1413333333333
+9,245,30.7975
+9,246,23.5373333333333
+9,247,33.5703333333333
+9,248,33.1893333333333
+9,249,25.8656666666667
+9,250,31.115
+9,251,32.131
+9,252,34.2265
+9,253,28.7443333333333
+9,254,27.9188333333333
+9,255,31.242
+9,256,31.3266666666667
+9,257,28.9983333333333
+9,258,26.4583333333333
+9,259,27.6013333333333
+9,260,23.3256666666667
+9,261,29.4851666666667
+9,262,27.7071666666667
+9,263,22.9023333333333
+9,264,32.1521666666667
+9,265,36.4913333333333
+9,266,37.6343333333333
+9,267,32.5543333333333
+9,268,26.7123333333333
+9,269,26.4583333333333
+9,270,29.8661666666667
+9,271,26.5006666666667
+9,272,27.2838333333333
+9,273,28.2151666666667
+9,274,28.448
+9,275,29.4005
+9,276,28.6808333333333
+9,277,25.6963333333333
+9,278,33.5068333333333
+9,279,31.2843333333333
+9,280,25.1036666666667
+9,281,30.7975
+9,282,31.8981666666667
+9,283,31.0303333333333
+9,284,25.0613333333333
+9,285,25.527
+9,286,35.4118333333333
+9,287,28.2363333333333
+9,288,27.5378333333333
+9,289,30.6705
+9,290,30.4588333333333
+9,291,22.3096666666667
+9,292,29.2946666666667
+9,293,32.4061666666667
+9,294,31.3055
+9,295,28.7231666666667
+9,296,30.9033333333333
+9,297,31.3901666666667
+9,298,36.6818333333333
+9,299,26.2678333333333
+9,300,29.6545
+9,301,26.3948333333333
+9,302,27.4531666666667
+9,303,35.2213333333333
+9,304,31.5595
+9,305,34.29
+9,306,32.004
+9,307,33.8243333333333
+9,308,36.8723333333333
+9,309,28.2786666666667
+9,310,26.035
+9,311,30.2895
+9,312,31.623
+9,313,27.5378333333333
+9,314,28.3633333333333
+9,315,34.7768333333333
+9,316,28.4056666666667
+9,317,31.1573333333333
+9,318,36.1738333333333
+9,319,29.4428333333333
+9,320,29.5486666666667
+9,321,29.6333333333333
+9,322,30.2048333333333
+9,323,37.084
+9,324,31.5595
+9,325,33.2105
+9,326,28.8078333333333
+9,327,24.1935
+9,328,35.0731666666667
+9,329,25.8445
+9,330,30.734
+9,331,27.7283333333333
+9,332,34.0148333333333
+9,333,34.4805
+9,334,31.1996666666667
+9,335,21.209
+9,336,27.2838333333333
+9,337,33.8031666666667
+9,338,25.8868333333333
+9,339,35.7928333333333
+9,340,28.1093333333333
+9,341,31.3055
+9,342,28.956
+9,343,35.0943333333333
+9,344,34.29
+9,345,28.2786666666667
+9,346,35.433
+9,347,30.8398333333333
+9,348,28.829
+9,349,31.4748333333333
+9,350,31.8558333333333
+9,351,40.9998333333333
+9,352,28.2786666666667
+9,353,27.1145
+9,354,27.051
+9,355,37.846
+9,356,34.8615
+9,357,38.0576666666667
+9,358,31.2843333333333
+9,359,27.178
+9,360,27.1991666666667
+9,361,34.7345
+9,362,31.8135
+9,363,29.5063333333333
+9,364,30.3953333333333
+9,365,34.3323333333333
+9,366,26.0773333333333
+9,367,32.5966666666667
+9,368,35.1366666666667
+9,369,28.4056666666667
+9,370,35.4118333333333
+9,371,34.1841666666667
+9,372,29.8238333333333
+9,373,28.829
+9,374,28.448
+9,375,32.6813333333333
+9,376,37.4438333333333
+9,377,32.2156666666667
+9,378,30.48
+9,379,34.9038333333333
+9,380,30.8821666666667
+9,381,28.321
+9,382,30.0566666666667
+9,383,33.2316666666667
+9,384,31.75
+9,385,29.4428333333333
+9,386,37.1898333333333
+9,387,29.3158333333333
+9,388,31.1785
+9,389,31.1785
+9,390,31.3266666666667
+9,391,29.1253333333333
+9,392,30.1201666666667
+9,393,32.4696666666667
+9,394,24.9555
+9,395,31.2208333333333
+9,396,27.559
+9,397,27.686
+9,398,30.7975
+9,399,30.4376666666667
+9,400,26.6065
+9,401,31.5806666666667
+9,402,28.194
+9,403,28.6173333333333
+9,404,26.0561666666667
+9,405,34.6921666666667
+9,406,35.8563333333333
+9,407,29.5275
+9,408,39.7298333333333
+9,409,33.9936666666667
+9,410,30.2048333333333
+9,411,31.1996666666667
+9,412,36.4913333333333
+9,413,27.8553333333333
+9,414,33.8666666666667
+9,415,35.3695
+9,416,33.7396666666667
+9,417,30.1201666666667
+9,418,35.306
+9,419,34.7768333333333
+9,420,32.1521666666667
+9,421,33.3798333333333
+9,422,33.4645
+9,423,27.7495
+9,424,25.1036666666667
+9,425,33.4221666666667
+9,426,27.1991666666667
+9,427,26.9028333333333
+9,428,34.4805
+9,429,39.6028333333333
+9,430,27.559
+9,431,26.9663333333333
+9,432,29.972
+9,433,28.7866666666667
+9,434,30.0143333333333
+9,435,30.8398333333333
+9,436,27.9188333333333
+9,437,30.5223333333333
+9,438,26.5641666666667
+9,439,28.8078333333333
+9,440,32.3003333333333
+9,441,31.2208333333333
+9,442,24.3628333333333
+9,443,34.7768333333333
+9,444,29.1253333333333
+9,445,24.765
+9,446,29.5275
+9,447,31.369
+9,448,29.7391666666667
+9,449,34.8615
+9,450,32.8718333333333
+9,451,30.0143333333333
+9,452,31.623
+9,453,30.2895
+9,454,32.6178333333333
+9,455,28.2363333333333
+9,456,33.8455
+9,457,25.2941666666667
+9,458,39.4758333333333
+9,459,34.9461666666667
+9,460,27.305
+9,461,33.6126666666667
+9,462,29.5063333333333
+9,463,30.0566666666667
+9,464,22.8811666666667
+9,465,31.9405
+9,466,31.9405
+9,467,28.7443333333333
+9,468,32.004
+9,469,31.7288333333333
+9,470,34.8615
+9,471,28.7655
+9,472,29.3158333333333
+9,473,28.8078333333333
+9,474,31.3055
+9,475,34.036
+9,476,30.2471666666667
+9,477,31.2843333333333
+9,478,28.2151666666667
+9,479,21.6111666666667
+9,480,25.9926666666667
+9,481,28.4691666666667
+9,482,30.3318333333333
+9,483,31.75
+9,484,32.8295
+9,485,30.1625
+9,486,28.9136666666667
+9,487,37.4861666666667
+9,488,29.2523333333333
+9,489,26.5006666666667
+9,490,29.4005
+9,491,24.5533333333333
+9,492,26.3736666666667
+9,493,27.7283333333333
+9,494,35.1155
+9,495,32.9141666666667
+9,496,28.829
+9,497,32.2791666666667
+9,498,30.9668333333333
+9,499,24.7015
+9,500,30.3106666666667
+9,501,25.7598333333333
+9,502,23.0505
+9,503,31.5171666666667
+9,504,27.2203333333333
+9,505,27.3261666666667
+9,506,32.0675
+9,507,31.0303333333333
+9,508,30.861
+9,509,25.9715
+9,510,30.8398333333333
+9,511,34.2053333333333
+9,512,33.2951666666667
+9,513,32.9141666666667
+9,514,27.7071666666667
+9,515,38.1
+9,516,36.2373333333333
+9,517,28.0458333333333
+9,518,31.5595
+9,519,31.6865
+9,520,29.8026666666667
+9,521,31.5806666666667
+9,522,28.2363333333333
+9,523,31.2843333333333
+9,524,27.5166666666667
+9,525,30.0778333333333
+9,526,34.3323333333333
+9,527,27.5378333333333
+9,528,24.7226666666667
+9,529,30.861
+9,530,29.9508333333333
+9,531,27.3896666666667
+9,532,29.1253333333333
+9,533,33.9936666666667
+9,534,30.2048333333333
+9,535,32.1733333333333
+9,536,21.8863333333333
+9,537,29.6333333333333
+9,538,32.7236666666667
+9,539,25.3788333333333
+9,540,30.4588333333333
+9,541,31.0303333333333
+9,542,30.0566666666667
+9,543,30.226
+9,544,31.3901666666667
+9,545,31.5171666666667
+9,546,28.5538333333333
+9,547,26.289
+9,548,29.972
+9,549,38.5868333333333
+9,550,40.4495
+9,551,25.654
+9,552,29.6545
+9,553,27.7918333333333
+9,554,31.0303333333333
+9,555,27.0086666666667
+9,556,30.3953333333333
+9,557,28.2363333333333
+9,558,26.6276666666667
+9,559,30.9668333333333
+9,560,34.4593333333333
+9,561,31.6018333333333
+9,562,32.8506666666667
+9,563,26.6276666666667
+9,564,35.2213333333333
+9,565,33.6338333333333
+9,566,21.4841666666667
+9,567,19.177
+9,568,31.0726666666667
+9,569,28.5538333333333
+9,570,32.7025
+9,571,28.829
+9,572,32.2368333333333
+9,573,29.5275
+9,574,30.9245
+9,575,28.4056666666667
+9,576,39.4546666666667
+9,577,31.1785
+9,578,37.0416666666667
+9,579,30.9668333333333
+9,580,27.7706666666667
+9,581,32.0886666666667
+9,582,27.0721666666667
+9,583,27.432
+9,584,31.5383333333333
+9,585,23.9818333333333
+9,586,26.8605
+9,587,33.2105
+9,588,28.6385
+9,589,30.353
+9,590,33.528
+9,591,35.2213333333333
+9,592,30.7763333333333
+9,593,24.5533333333333
+9,594,26.3101666666667
+9,595,26.3736666666667
+9,596,33.0623333333333
+9,597,22.3731666666667
+9,598,28.7655
+9,599,30.4376666666667
+9,600,34.3323333333333
+9,601,34.29
+9,602,33.655
+9,603,35.0731666666667
+9,604,30.861
+9,605,29.6121666666667
+9,606,28.5961666666667
+9,607,30.4588333333333
+9,608,26.7546666666667
+9,609,34.8191666666667
+9,610,34.7556666666667
+9,611,30.1625
+9,612,34.3746666666667
+9,613,27.0933333333333
+9,614,32.4908333333333
+9,615,32.4485
+9,616,29.9296666666667
+9,617,32.8718333333333
+9,618,31.115
+9,619,35.56
+9,620,30.5858333333333
+9,621,29.5063333333333
+9,622,27.813
+9,623,29.591
+9,624,27.8553333333333
+9,625,27.686
+9,626,32.6601666666667
+9,627,28.7231666666667
+9,628,26.3313333333333
+9,629,24.0665
+9,630,35.4965
+9,631,31.877
+9,632,27.305
+9,633,35.6023333333333
+9,634,31.877
+9,635,30.7551666666667
+9,636,38.3116666666667
+9,637,23.8971666666667
+9,638,30.3106666666667
+9,639,29.3158333333333
+9,640,30.0143333333333
+9,641,28.9771666666667
+9,642,25.8445
+9,643,32.0251666666667
+9,644,35.2001666666667
+9,645,33.0623333333333
+9,646,36.2796666666667
+9,647,31.3055
+9,648,32.1733333333333
+9,649,32.1733333333333
+9,650,30.9245
+9,651,31.5595
+9,652,26.0138333333333
+9,653,32.512
+9,654,28.9771666666667
+9,655,29.2311666666667
+9,656,28.4056666666667
+9,657,26.6065
+9,658,31.4113333333333
+9,659,32.0886666666667
+9,660,31.0726666666667
+9,661,35.5388333333333
+9,662,31.5383333333333
+9,663,36.6606666666667
+9,664,33.8878333333333
+9,665,31.6441666666667
+9,666,33.528
+9,667,27.1568333333333
+9,668,29.2311666666667
+9,669,33.9725
+9,670,24.9343333333333
+9,671,22.3943333333333
+9,672,27.813
+9,673,26.0561666666667
+9,674,22.9658333333333
+9,675,28.6173333333333
+9,676,30.2895
+9,677,28.6596666666667
+9,678,34.036
+9,679,25.2306666666667
+9,680,27.559
+9,681,30.7975
+9,682,32.6601666666667
+9,683,33.8666666666667
+9,684,34.29
+9,685,26.5641666666667
+9,686,28.4056666666667
+9,687,32.7448333333333
+9,688,40.1955
+9,689,33.8878333333333
+9,690,29.4216666666667
+9,691,31.2208333333333
+9,692,32.4696666666667
+9,693,24.9131666666667
+9,694,26.7546666666667
+9,695,23.5796666666667
+9,696,30.4376666666667
+9,697,33.5703333333333
+9,698,30.5646666666667
+9,699,35.1578333333333
+9,700,26.5641666666667
+9,701,29.2946666666667
+9,702,28.4056666666667
+9,703,27.4108333333333
+9,704,29.7815
+9,705,29.4216666666667
+9,706,32.258
+9,707,31.4748333333333
+9,708,35.1366666666667
+9,709,32.4696666666667
+9,710,29.5063333333333
+9,711,28.5961666666667
+9,712,26.416
+9,713,30.2471666666667
+9,714,36.6818333333333
+9,715,27.7283333333333
+9,716,32.7236666666667
+9,717,30.3741666666667
+9,718,30.861
+9,719,38.5656666666667
+9,720,29.591
+9,721,35.9198333333333
+9,722,31.9405
+9,723,22.5001666666667
+9,724,31.7711666666667
+9,725,24.5321666666667
+9,726,29.7391666666667
+9,727,29.4428333333333
+9,728,33.2951666666667
+9,729,30.8821666666667
+9,730,33.0411666666667
+9,731,30.9668333333333
+9,732,29.5486666666667
+9,733,25.9715
+9,734,37.211
+9,735,26.0985
+9,736,25.6963333333333
+9,737,32.2791666666667
+9,738,31.8346666666667
+9,739,27.8553333333333
+9,740,28.0035
+9,741,29.6756666666667
+9,742,24.384
+9,743,26.1408333333333
+9,744,32.385
+9,745,27.6013333333333
+9,746,32.6813333333333
+9,747,37.6766666666667
+9,748,29.2735
+9,749,29.1465
+9,750,31.0726666666667
+9,751,35.7928333333333
+9,752,24.8285
+9,753,31.1361666666667
+9,754,30.6493333333333
+9,755,31.6018333333333
+9,756,35.052
+9,757,27.9611666666667
+9,758,34.7133333333333
+9,759,29.591
+9,760,32.8083333333333
+9,761,27.5801666666667
+9,762,32.2156666666667
+9,763,29.7391666666667
+9,764,30.5646666666667
+9,765,28.9771666666667
+9,766,31.7288333333333
+9,767,26.3101666666667
+9,768,30.734
+9,769,27.2415
+9,770,33.0623333333333
+9,771,28.4691666666667
+9,772,30.6493333333333
+9,773,30.2048333333333
+9,774,33.7608333333333
+9,775,21.4206666666667
+9,776,26.0773333333333
+9,777,32.8295
+9,778,37.6766666666667
+9,779,25.4
+9,780,29.1041666666667
+9,781,34.544
+9,782,32.893
+9,783,29.718
+9,784,27.0933333333333
+9,785,29.8873333333333
+9,786,31.496
+9,787,27.2626666666667
+9,788,28.067
+9,789,25.7386666666667
+9,790,31.7076666666667
+9,791,32.5543333333333
+9,792,28.702
+9,793,25.8233333333333
+9,794,30.353
+9,795,27.2838333333333
+9,796,31.3055
+9,797,29.3158333333333
+9,798,28.2363333333333
+9,799,33.274
+9,800,30.5858333333333
+9,801,28.067
+9,802,29.9296666666667
+9,803,24.7226666666667
+9,804,33.8878333333333
+9,805,26.3948333333333
+9,806,25.2095
+9,807,32.131
+9,808,32.9565
+9,809,39.1371666666667
+9,810,27.7706666666667
+9,811,26.8393333333333
+9,812,33.3163333333333
+9,813,32.639
+9,814,29.5698333333333
+9,815,26.0773333333333
+9,816,32.7448333333333
+9,817,31.3055
+9,818,27.5801666666667
+9,819,32.5755
+9,820,22.5848333333333
+9,821,30.48
+9,822,31.2208333333333
+9,823,26.6276666666667
+9,824,37.7401666666667
+9,825,30.0143333333333
+9,826,33.1258333333333
+9,827,32.6813333333333
+9,828,27.8341666666667
+9,829,29.6968333333333
+9,830,34.0148333333333
+9,831,35.6446666666667
+9,832,24.2146666666667
+9,833,31.2208333333333
+9,834,27.0721666666667
+9,835,29.7391666666667
+9,836,28.9348333333333
+9,837,30.9245
+9,838,30.5223333333333
+9,839,28.9771666666667
+9,840,26.7758333333333
+9,841,32.512
+9,842,27.8976666666667
+9,843,34.6075
+9,844,32.1521666666667
+9,845,33.6761666666667
+9,846,36.6183333333333
+9,847,28.0246666666667
+9,848,30.7975
+9,849,33.1046666666667
+9,850,25.527
+9,851,33.1893333333333
+9,852,26.6276666666667
+9,853,33.9513333333333
+9,854,35.052
+9,855,25.273
+9,856,28.5538333333333
+9,857,33.147
+9,858,31.6441666666667
+9,859,37.9518333333333
+9,860,29.8661666666667
+9,861,34.8403333333333
+9,862,34.3323333333333
+9,863,33.9513333333333
+9,864,25.1883333333333
+9,865,34.7345
+9,866,28.8713333333333
+9,867,29.9508333333333
+9,868,33.1893333333333
+9,869,37.592
+9,870,24.2993333333333
+9,871,33.02
+9,872,26.3101666666667
+9,873,22.5425
+9,874,30.353
+9,875,35.2425
+9,876,31.4325
+9,877,37.1898333333333
+9,878,31.6018333333333
+9,879,32.9141666666667
+9,880,30.7551666666667
+9,881,30.861
+9,882,31.4748333333333
+9,883,28.0458333333333
+9,884,25.146
+9,885,32.2791666666667
+9,886,26.7335
+9,887,29.718
+9,888,25.9503333333333
+9,889,30.5646666666667
+9,890,31.5383333333333
+9,891,28.0458333333333
+9,892,30.6705
+9,893,27.94
+9,894,32.5966666666667
+9,895,28.194
+9,896,33.6126666666667
+9,897,31.0303333333333
+9,898,33.528
+9,899,33.1893333333333
+9,900,28.1728333333333
+9,901,31.75
+9,902,32.0886666666667
+9,903,26.7546666666667
+9,904,32.9776666666667
+9,905,30.0778333333333
+9,906,33.8455
+9,907,34.4805
+9,908,37.8036666666667
+9,909,31.496
+9,910,23.6431666666667
+9,911,31.0938333333333
+9,912,33.3375
+9,913,35.3271666666667
+9,914,31.9828333333333
+9,915,34.29
+9,916,31.7076666666667
+9,917,32.5331666666667
+9,918,27.1145
+9,919,30.2471666666667
+9,920,28.6596666666667
+9,921,38.4175
+9,922,29.0618333333333
+9,923,23.495
+9,924,24.4475
+9,925,33.274
+9,926,31.5595
+9,927,32.766
+9,928,29.2946666666667
+9,929,27.4108333333333
+9,930,27.8553333333333
+9,931,32.4061666666667
+9,932,26.3736666666667
+9,933,30.099
+9,934,34.0995
+9,935,30.988
+9,936,25.9291666666667
+9,937,36.6395
+9,938,28.9136666666667
+9,939,28.829
+9,940,32.9776666666667
+9,941,29.6756666666667
+9,942,38.1635
+9,943,25.527
+9,944,25.8021666666667
+9,945,37.9941666666667
+9,946,32.6178333333333
+9,947,31.5595
+9,948,28.0246666666667
+9,949,31.9828333333333
+9,950,32.385
+9,951,31.1996666666667
+9,952,30.0355
+9,953,21.336
+9,954,32.7871666666667
+9,955,28.3845
+9,956,28.0881666666667
+9,957,26.8393333333333
+9,958,35.6446666666667
+9,959,31.115
+9,960,31.7711666666667
+9,961,27.813
+9,962,33.7396666666667
+9,963,25.9715
+9,964,28.702
+9,965,26.9663333333333
+9,966,27.686
+9,967,35.2001666666667
+9,968,30.9456666666667
+9,969,33.5068333333333
+9,970,29.5063333333333
+9,971,32.131
+9,972,28.9348333333333
+9,973,29.1041666666667
+9,974,30.9668333333333
+9,975,30.2048333333333
+9,976,24.384
+9,977,24.6803333333333
+9,978,26.924
+9,979,23.5585
+9,980,36.3008333333333
+9,981,26.3101666666667
+9,982,30.9668333333333
+9,983,36.1103333333333
+9,984,29.7391666666667
+9,985,25.2518333333333
+9,986,30.9668333333333
+9,987,27.2626666666667
+9,988,34.3958333333333
+9,989,33.7185
+9,990,37.6555
+9,991,25.4
+9,992,31.4536666666667
+9,993,28.702
+9,994,33.1681666666667
+9,995,28.0458333333333
+9,996,29.591
+9,997,28.6385
+9,998,32.1733333333333
+9,999,27.1145
+9,1000,31.8346666666667
+10,1,21.8694
+10,2,18.415
+10,3,20.0490666666667
+10,4,18.0382333333333
+10,5,26.9917333333333
+10,6,26.2678333333333
+10,7,19.558
+10,8,17.8435
+10,9,22.606
+10,10,19.4352333333333
+10,11,16.3449
+10,12,22.4578333333333
+10,13,20.4258333333333
+10,14,23.8590666666667
+10,15,27.5505333333333
+10,16,29.6799
+10,17,23.4103333333333
+10,18,21.0227333333333
+10,19,17.3143333333333
+10,20,18.9653333333333
+10,21,20.8703333333333
+10,22,25.9969
+10,23,21.6831333333333
+10,24,17.4667333333333
+10,25,18.9314666666667
+10,26,17.6784
+10,27,17.7419
+10,28,26.5895666666667
+10,29,19.7950666666667
+10,30,30.9456666666667
+10,31,21.971
+10,32,15.1384
+10,33,16.5354
+10,34,23.0547333333333
+10,35,22.1657333333333
+10,36,17.7588333333333
+10,37,20.8110666666667
+10,38,17.8646666666667
+10,39,20.5570666666667
+10,40,17.1704
+10,41,26.4879666666667
+10,42,23.0293333333333
+10,43,22.479
+10,44,14.6473333333333
+10,45,11.6416666666667
+10,46,30.5223333333333
+10,47,18.9653333333333
+10,48,23.0124
+10,49,25.1290666666667
+10,50,14.8166666666667
+10,51,16.4930666666667
+10,52,24.4390333333333
+10,53,24.9978333333333
+10,54,19.6215
+10,55,19.6215
+10,56,22.3350666666667
+10,57,22.1234
+10,58,22.5636666666667
+10,59,20.8999666666667
+10,60,21.2386333333333
+10,61,23.7955666666667
+10,62,28.2575
+10,63,32.6474666666667
+10,64,22.5425
+10,65,22.2123
+10,66,25.3026333333333
+10,67,21.4460666666667
+10,68,22.2927333333333
+10,69,24.0284
+10,70,27.7114
+10,71,17.6360666666667
+10,72,23.8633
+10,73,23.8167333333333
+10,74,23.6516333333333
+10,75,21.4291333333333
+10,76,21.8143666666667
+10,77,18.0551666666667
+10,78,24.7269
+10,79,14.8378333333333
+10,80,23.3849333333333
+10,81,21.1285666666667
+10,82,19.5410666666667
+10,83,22.2080666666667
+10,84,24.8073333333333
+10,85,17.4201666666667
+10,86,23.3045
+10,87,17.8308
+10,88,20.9634666666667
+10,89,21.3148333333333
+10,90,23.7109
+10,91,25.6413
+10,92,18.288
+10,93,19.5791666666667
+10,94,26.4075333333333
+10,95,19.2193333333333
+10,96,22.2758
+10,97,20.7264
+10,98,22.8176666666667
+10,99,23.1182333333333
+10,100,20.0025
+10,101,16.8613666666667
+10,102,23.4611333333333
+10,103,22.5001666666667
+10,104,27.0298333333333
+10,105,17.8223333333333
+10,106,17.1026666666667
+10,107,26.8012333333333
+10,108,21.9498333333333
+10,109,16.256
+10,110,25.2772333333333
+10,111,18.0001333333333
+10,112,18.5208333333333
+10,113,26.162
+10,114,27.3473333333333
+10,115,20.1549
+10,116,18.4869666666667
+10,117,20.6163333333333
+10,118,22.3350666666667
+10,119,18.4996666666667
+10,120,25.9926666666667
+10,121,26.3990666666667
+10,122,18.7409666666667
+10,123,17.5979666666667
+10,124,22.3774
+10,125,19.9432333333333
+10,126,22.5890666666667
+10,127,17.8435
+10,128,28.0881666666667
+10,129,20.4724
+10,130,21.3190666666667
+10,131,17.4074666666667
+10,132,15.4601333333333
+10,133,29.1930666666667
+10,134,16.764
+10,135,20.2819
+10,136,16.5184666666667
+10,137,23.9903
+10,138,24.4517333333333
+10,139,26.6742333333333
+10,140,20.3030666666667
+10,141,18.0128333333333
+10,142,23.1775
+10,143,26.4371666666667
+10,144,13.1233333333333
+10,145,23.3087333333333
+10,146,22.1403333333333
+10,147,20.2141666666667
+10,148,18.6520666666667
+10,149,25.6243666666667
+10,150,20.32
+10,151,26.5049
+10,152,20.8407
+10,153,19.8374
+10,154,14.3975666666667
+10,155,23.1394
+10,156,17.7419
+10,157,21.8482333333333
+10,158,24.2866333333333
+10,159,19.4521666666667
+10,160,24.0453333333333
+10,161,19.3929
+10,162,23.622
+10,163,26.6446
+10,164,20.7475666666667
+10,165,16.4973
+10,166,14.7150666666667
+10,167,20.8915
+10,168,14.4356666666667
+10,169,24.4898333333333
+10,170,16.7216666666667
+10,171,22.5975333333333
+10,172,22.7541666666667
+10,173,26.3313333333333
+10,174,25.0571
+10,175,20.7899
+10,176,18.8637333333333
+10,177,24.6634
+10,178,19.4352333333333
+10,179,23.241
+10,180,20.9338333333333
+10,181,25.4296333333333
+10,182,16.8571333333333
+10,183,23.0547333333333
+10,184,22.1699666666667
+10,185,23.6643333333333
+10,186,25.5566333333333
+10,187,28.7866666666667
+10,188,20.3030666666667
+10,189,26.3567333333333
+10,190,21.6577333333333
+10,191,25.9926666666667
+10,192,17.4836666666667
+10,193,19.5622333333333
+10,194,18.2499
+10,195,21.9117333333333
+10,196,19.9855666666667
+10,197,19.9263
+10,198,24.638
+10,199,18.923
+10,200,24.6591666666667
+10,201,18.2922333333333
+10,202,18.8002333333333
+10,203,21.8270666666667
+10,204,20.4046666666667
+10,205,24.2612333333333
+10,206,24.2824
+10,207,19.9305333333333
+10,208,19.4818
+10,209,26.0392333333333
+10,210,23.0505
+10,211,23.6050666666667
+10,212,21.1328
+10,213,26.6573
+10,214,22.6822
+10,215,28.7443333333333
+10,216,23.7744
+10,217,19.8204666666667
+10,218,33.1343
+10,219,23.0547333333333
+10,220,22.9489
+10,221,21.6154
+10,222,25.1036666666667
+10,223,27.6055666666667
+10,224,25.3619
+10,225,20.2353333333333
+10,226,25.0952
+10,227,21.7847333333333
+10,228,18.4996666666667
+10,229,15.9639
+10,230,20.5824666666667
+10,231,21.1497333333333
+10,232,16.5354
+10,233,14.0546666666667
+10,234,12.5941666666667
+10,235,21.9964
+10,236,20.3708
+10,237,19.7950666666667
+10,238,22.4409
+10,239,24.5618
+10,240,25.2772333333333
+10,241,18.1271333333333
+10,242,19.2193333333333
+10,243,22.1488
+10,244,17.9916666666667
+10,245,21.5730666666667
+10,246,16.5946666666667
+10,247,26.2212666666667
+10,248,20.6671333333333
+10,249,22.4620666666667
+10,250,20.1760666666667
+10,251,26.3313333333333
+10,252,23.7320666666667
+10,253,17.1238333333333
+10,254,20.9761666666667
+10,255,21.7847333333333
+10,256,24.8750666666667
+10,257,20.2988333333333
+10,258,23.5669666666667
+10,259,24.8793
+10,260,19.2870666666667
+10,261,19.4775666666667
+10,262,19.5622333333333
+10,263,19.1643
+10,264,24.2654666666667
+10,265,24.5956666666667
+10,266,20.8703333333333
+10,267,19.1219666666667
+10,268,24.1808
+10,269,17.2635333333333
+10,270,25.2349
+10,271,18.7325
+10,272,20.5994
+10,273,26.3779
+10,274,22.479
+10,275,12.319
+10,276,22.0768333333333
+10,277,16.6158333333333
+10,278,21.3868
+10,279,24.2019666666667
+10,280,19.304
+10,281,17.907
+10,282,23.4103333333333
+10,283,18.3345666666667
+10,284,30.8864
+10,285,17.1026666666667
+10,286,17.8900666666667
+10,287,26.2551333333333
+10,288,15.4347333333333
+10,289,19.7358
+10,290,20.9423
+10,291,20.955
+10,292,20.2819
+10,293,25.7894666666667
+10,294,20.7687333333333
+10,295,21.0227333333333
+10,296,24.2062
+10,297,22.9446666666667
+10,298,19.7146333333333
+10,299,24.8581333333333
+10,300,28.4564666666667
+10,301,21.0481333333333
+10,302,22.7160666666667
+10,303,20.0236666666667
+10,304,17.9112333333333
+10,305,24.0072333333333
+10,306,21.8313
+10,307,16.5396333333333
+10,308,19.3886666666667
+10,309,20.7729666666667
+10,310,20.9380666666667
+10,311,18.3345666666667
+10,312,22.6271666666667
+10,313,26.9875
+10,314,28.4268333333333
+10,315,31.3351333333333
+10,316,18.1821666666667
+10,317,16.9121666666667
+10,318,23.5627333333333
+10,319,23.9098666666667
+10,320,23.4992333333333
+10,321,22.7118333333333
+10,322,19.6003333333333
+10,323,19.0796333333333
+10,324,21.2979
+10,325,21.0947
+10,326,21.2936666666667
+10,327,24.5999
+10,328,20.6417333333333
+10,329,20.3454
+10,330,19.7696666666667
+10,331,23.4569
+10,332,22.2885
+10,333,22.8346
+10,334,24.9131666666667
+10,335,19.2193333333333
+10,336,16.256
+10,337,30.0566666666667
+10,338,24.7269
+10,339,17.3651333333333
+10,340,23.8802333333333
+10,341,19.8331666666667
+10,342,23.8844666666667
+10,343,23.0081666666667
+10,344,27.5886333333333
+10,345,25.6370666666667
+10,346,19.5029666666667
+10,347,18.6817
+10,348,20.3030666666667
+10,349,19.5156666666667
+10,350,23.2960333333333
+10,351,19.5156666666667
+10,352,19.431
+10,353,28.5369
+10,354,20.7306333333333
+10,355,18.9695666666667
+10,356,23.7998
+10,357,27.7071666666667
+10,358,19.9855666666667
+10,359,25.0825
+10,360,20.5951666666667
+10,361,22.3096666666667
+10,362,19.1389
+10,363,20.9169
+10,364,23.5839
+10,365,22.3943333333333
+10,366,18.6901666666667
+10,367,22.4578333333333
+10,368,21.6535
+10,369,20.5147333333333
+10,370,20.6375
+10,371,25.1333
+10,372,21.2767333333333
+10,373,22.1869
+10,374,23.1563333333333
+10,375,24.7692333333333
+10,376,20.5824666666667
+10,377,20.9846333333333
+10,378,20.2988333333333
+10,379,17.2339
+10,380,19.3082333333333
+10,381,15.0071666666667
+10,382,15.8538333333333
+10,383,21.6789
+10,384,23.3807
+10,385,22.6906666666667
+10,386,21.5265
+10,387,22.4620666666667
+10,388,25.7429
+10,389,31.4409666666667
+10,390,20.955
+10,391,15.0283333333333
+10,392,18.796
+10,393,21.2555666666667
+10,394,21.2386333333333
+10,395,25.2349
+10,396,21.2344
+10,397,15.9173333333333
+10,398,19.9263
+10,399,16.4295666666667
+10,400,16.4465
+10,401,16.9164
+10,402,22.5001666666667
+10,403,23.9183333333333
+10,404,24.0114666666667
+10,405,24.1554
+10,406,24.0241666666667
+10,407,19.7908333333333
+10,408,21.7424
+10,409,18.2710666666667
+10,410,21.7212333333333
+10,411,24.3967
+10,412,12.1115666666667
+10,413,26.3779
+10,414,24.0453333333333
+10,415,19.9644
+10,416,18.2499
+10,417,30.7128333333333
+10,418,17.4413333333333
+10,419,13.7202333333333
+10,420,18.8383333333333
+10,421,15.8580666666667
+10,422,21.3995
+10,423,22.606
+10,424,18.1186666666667
+10,425,17.9324
+10,426,18.5504666666667
+10,427,19.1558333333333
+10,428,22.5636666666667
+10,429,23.3722333333333
+10,430,16.764
+10,431,23.7363
+10,432,20.0109666666667
+10,433,27.4531666666667
+10,434,17.3016333333333
+10,435,23.2960333333333
+10,436,23.1986666666667
+10,437,20.7221666666667
+10,438,20.2395666666667
+10,439,19.0584666666667
+10,440,22.1276333333333
+10,441,27.2034
+10,442,20.4258333333333
+10,443,26.2043333333333
+10,444,18.1694666666667
+10,445,22.2673333333333
+10,446,29.5486666666667
+10,447,20.0829333333333
+10,448,23.3934
+10,449,29.4513
+10,450,23.4230333333333
+10,451,20.1337333333333
+10,452,19.6257333333333
+10,453,23.3214333333333
+10,454,19.4098333333333
+10,455,21.6196333333333
+10,456,19.0711666666667
+10,457,23.2537
+10,458,20.6163333333333
+10,459,20.8788
+10,460,22.2673333333333
+10,461,17.2974
+10,462,19.5410666666667
+10,463,17.8731333333333
+10,464,22.2927333333333
+10,465,26.5345333333333
+10,466,19.0161333333333
+10,467,16.9121666666667
+10,468,25.6201333333333
+10,469,22.0345
+10,470,23.622
+10,471,25.0020666666667
+10,472,26.9070666666667
+10,473,24.8581333333333
+10,474,24.5999
+10,475,19.7104
+10,476,27.9146
+10,477,21.2725
+10,478,26.2297333333333
+10,479,26.7123333333333
+10,480,20.5189666666667
+10,481,14.859
+10,482,27.7537333333333
+10,483,25.0401666666667
+10,484,22.3731666666667
+10,485,20.8534
+10,486,24.511
+10,487,19.2828333333333
+10,488,23.3383666666667
+10,489,16.6158333333333
+10,490,20.5528333333333
+10,491,20.9846333333333
+10,492,21.7635666666667
+10,493,29.1168666666667
+10,494,16.5142333333333
+10,495,20.9169
+10,496,21.8355333333333
+10,497,23.1605666666667
+10,498,24.9597333333333
+10,499,19.1854666666667
+10,500,19.6426666666667
+10,501,19.6553666666667
+10,502,25.273
+10,503,27.7114
+10,504,22.5552
+10,505,17.9493333333333
+10,506,17.9281666666667
+10,507,12.7635
+10,508,23.5923666666667
+10,509,22.9446666666667
+10,510,19.9898
+10,511,21.4672333333333
+10,512,15.6633333333333
+10,513,18.415
+10,514,17.0645666666667
+10,515,29.2142333333333
+10,516,17.8943
+10,517,14.6981333333333
+10,518,27.9146
+10,519,22.2885
+10,520,23.368
+10,521,25.7005666666667
+10,522,20.2776666666667
+10,523,21.5519
+10,524,17.4286333333333
+10,525,18.8425666666667
+10,526,25.4211666666667
+10,527,25.3068666666667
+10,528,24.2781666666667
+10,529,24.5660333333333
+10,530,20.6840666666667
+10,531,23.0081666666667
+10,532,19.5791666666667
+10,533,16.3195
+10,534,27.0594666666667
+10,535,23.5585
+10,536,23.2875666666667
+10,537,17.9324
+10,538,12.8947333333333
+10,539,28.0035
+10,540,23.4611333333333
+10,541,16.7894
+10,542,26.2466666666667
+10,543,22.8642333333333
+10,544,26.2974666666667
+10,545,20.4893333333333
+10,546,28.9179
+10,547,18.9907333333333
+10,548,20.1125666666667
+10,549,24.6253
+10,550,26.8435666666667
+10,551,19.1473666666667
+10,552,19.4987333333333
+10,553,19.3124666666667
+10,554,23.3891666666667
+10,555,28.0458333333333
+10,556,17.6360666666667
+10,557,29.1253333333333
+10,558,14.3086666666667
+10,559,16.7724666666667
+10,560,18.2710666666667
+10,561,25.5100666666667
+10,562,20.6798333333333
+10,563,20.2184
+10,564,22.2715666666667
+10,565,16.1755666666667
+10,566,18.7917666666667
+10,567,16.2983333333333
+10,568,16.7047333333333
+10,569,21.0227333333333
+10,570,19.9644
+10,571,27.4108333333333
+10,572,14.3933333333333
+10,573,27.6479
+10,574,22.1022333333333
+10,575,18.1440666666667
+10,576,19.7104
+10,577,19.1389
+10,578,21.3614
+10,579,22.3774
+10,580,19.2235666666667
+10,581,20.6840666666667
+10,582,24.8750666666667
+10,583,24.2993333333333
+10,584,22.1911333333333
+10,585,25.2560666666667
+10,586,26.924
+10,587,23.3934
+10,588,15.5829
+10,589,19.5241333333333
+10,590,14.0377333333333
+10,591,21.6027
+10,592,20.9169
+10,593,16.8275
+10,594,26.8308666666667
+10,595,22.7795666666667
+10,596,23.0928333333333
+10,597,20.9423
+10,598,17.6784
+10,599,19.7781333333333
+10,600,25.0232333333333
+10,601,22.0429666666667
+10,602,19.3294
+10,603,22.9912333333333
+10,604,25.9503333333333
+10,605,22.2673333333333
+10,606,20.5570666666667
+10,607,26.1196666666667
+10,608,19.4564
+10,609,17.2762333333333
+10,610,18.4277
+10,611,22.9785333333333
+10,612,23.0208666666667
+10,613,22.5890666666667
+10,614,25.4677333333333
+10,615,16.0866666666667
+10,616,16.6200666666667
+10,617,17.6403
+10,618,24.6845666666667
+10,619,24.5745
+10,620,22.6949
+10,621,19.1981666666667
+10,622,20.5147333333333
+10,623,23.2071333333333
+10,624,20.3454
+10,625,20.6417333333333
+10,626,21.9540666666667
+10,627,21.6196333333333
+10,628,18.7833
+10,629,23.7151333333333
+10,630,20.8999666666667
+10,631,30.2090666666667
+10,632,18.3303333333333
+10,633,27.559
+10,634,25.3830666666667
+10,635,23.1013
+10,636,24.8496666666667
+10,637,20.7264
+10,638,19.0754
+10,639,20.701
+10,640,21.0015666666667
+10,641,21.1666666666667
+10,642,22.0599
+10,643,25.3830666666667
+10,644,19.7696666666667
+10,645,24.5745
+10,646,20.6078666666667
+10,647,27.3558
+10,648,27.9950333333333
+10,649,20.9973333333333
+10,650,25.7725333333333
+10,651,18.796
+10,652,29.0660666666667
+10,653,15.8157333333333
+10,654,23.9310333333333
+10,655,27.7579666666667
+10,656,18.8298666666667
+10,657,20.193
+10,658,20.0025
+10,659,18.0170666666667
+10,660,20.8745666666667
+10,661,21.1285666666667
+10,662,17.9959
+10,663,13.2334
+10,664,28.4395333333333
+10,665,20.1337333333333
+10,666,23.2664
+10,667,24.3459
+10,668,24.1596333333333
+10,669,22.4874666666667
+10,670,19.0754
+10,671,26.1874
+10,672,19.4818
+10,673,19.5199
+10,674,19.6045666666667
+10,675,21.7466333333333
+10,676,22.5425
+10,677,20.5867
+10,678,25.5693333333333
+10,679,22.0768333333333
+10,680,22.8811666666667
+10,681,21.4249
+10,682,24.7692333333333
+10,683,16.8105666666667
+10,684,25.9291666666667
+10,685,20.1803
+10,686,19.3717333333333
+10,687,21.7847333333333
+10,688,26.6530666666667
+10,689,21.5307333333333
+10,690,15.7945666666667
+10,691,19.4098333333333
+10,692,22.9997
+10,693,26.9282333333333
+10,694,17.6741666666667
+10,695,21.2936666666667
+10,696,19.5029666666667
+10,697,24.1003666666667
+10,698,19.3251666666667
+10,699,16.5989
+10,700,22.9150333333333
+10,701,18.542
+10,702,25.7725333333333
+10,703,18.2541333333333
+10,704,23.1224666666667
+10,705,23.5585
+10,706,29.6545
+10,707,18.0594
+10,708,26.5218333333333
+10,709,21.4037333333333
+10,710,19.7358
+10,711,23.6431666666667
+10,712,22.1869
+10,713,28.0839333333333
+10,714,18.542
+10,715,23.2198333333333
+10,716,18.0678666666667
+10,717,22.5679
+10,718,31.9659
+10,719,25.9164666666667
+10,720,28.6723666666667
+10,721,18.9441666666667
+10,722,14.4018
+10,723,20.1506666666667
+10,724,20.5232
+10,725,18.923
+10,726,18.0975
+10,727,19.0076666666667
+10,728,16.9418
+10,729,19.0119
+10,730,22.606
+10,731,24.6210666666667
+10,732,20.7856666666667
+10,733,20.6586666666667
+10,734,25.2984
+10,735,19.431
+10,736,17.1661666666667
+10,737,19.4945
+10,738,23.7066666666667
+10,739,22.5298
+10,740,22.5044
+10,741,20.2861333333333
+10,742,21.5688333333333
+10,743,15.9173333333333
+10,744,22.098
+10,745,19.3675
+10,746,19.7908333333333
+10,747,21.1497333333333
+10,748,19.5876333333333
+10,749,20.5105
+10,750,23.4738333333333
+10,751,25.7259666666667
+10,752,23.6685666666667
+10,753,23.6685666666667
+10,754,18.9357
+10,755,21.8651666666667
+10,756,28.4734
+10,757,27.3515666666667
+10,758,18.9695666666667
+10,759,18.415
+10,760,21.3402333333333
+10,761,21.2725
+10,762,26.9705666666667
+10,763,21.1963
+10,764,26.1239
+10,765,18.8425666666667
+10,766,25.6328333333333
+10,767,24.0919
+10,768,22.352
+10,769,21.3021333333333
+10,770,25.5058333333333
+10,771,23.7532333333333
+10,772,17.0815
+10,773,19.0923333333333
+10,774,22.4578333333333
+10,775,28.8586333333333
+10,776,22.5933
+10,777,23.2240666666667
+10,778,20.6375
+10,779,25.4042333333333
+10,780,24.0834333333333
+10,781,19.4352333333333
+10,782,22.3943333333333
+10,783,23.2198333333333
+10,784,20.6375
+10,785,21.8016666666667
+10,786,20.9804
+10,787,18.5843333333333
+10,788,20.5105
+10,789,22.8684666666667
+10,790,23.9056333333333
+10,791,21.1751333333333
+10,792,26.9875
+10,793,25.0232333333333
+10,794,24.1681
+10,795,21.9879333333333
+10,796,22.9108
+10,797,22.5975333333333
+10,798,18.4192333333333
+10,799,21.6365666666667
+10,800,19.1135
+10,801,20.4089
+10,802,30.7170666666667
+10,803,23.8590666666667
+10,804,22.2758
+10,805,15.9639
+10,806,22.6271666666667
+10,807,23.3299
+10,808,22.8642333333333
+10,809,21.5095666666667
+10,810,17.6826333333333
+10,811,22.8219
+10,812,18.5843333333333
+10,813,20.1125666666667
+10,814,22.5509666666667
+10,815,20.701
+10,816,26.6954
+10,817,17.2550666666667
+10,818,23.7066666666667
+10,819,22.2758
+10,820,18.1821666666667
+10,821,30.0820666666667
+10,822,24.3543666666667
+10,823,16.4930666666667
+10,824,19.5791666666667
+10,825,19.7273333333333
+10,826,23.4442
+10,827,17.3820666666667
+10,828,21.3402333333333
+10,829,18.7579
+10,830,24.7015
+10,831,20.4046666666667
+10,832,25.3492
+10,833,15.6845
+10,834,21.3995
+10,835,25.5058333333333
+10,836,22.1403333333333
+10,837,20.7729666666667
+10,838,23.0505
+10,839,18.9907333333333
+10,840,18.8425666666667
+10,841,18.7790666666667
+10,842,24.1977333333333
+10,843,19.8755
+10,844,15.8665333333333
+10,845,22.2207666666667
+10,846,21.2809666666667
+10,847,21.5095666666667
+10,848,20.4427666666667
+10,849,17.3397333333333
+10,850,15.2188333333333
+10,851,28.5834666666667
+10,852,15.7945666666667
+10,853,33.1935666666667
+10,854,25.7344333333333
+10,855,18.3176333333333
+10,856,31.1996666666667
+10,857,23.9225666666667
+10,858,17.5471666666667
+10,859,25.2941666666667
+10,860,24.1342333333333
+10,861,28.4776333333333
+10,862,23.1182333333333
+10,863,16.8698333333333
+10,864,16.2348333333333
+10,865,20.5528333333333
+10,866,23.4780666666667
+10,867,21.5561333333333
+10,868,22.225
+10,869,24.4686666666667
+10,870,23.5373333333333
+10,871,16.2814
+10,872,24.7015
+10,873,21.1963
+10,874,23.5627333333333
+10,875,22.5636666666667
+10,876,20.7052333333333
+10,877,16.637
+10,878,27.3727333333333
+10,879,19.3929
+10,880,19.4733333333333
+10,881,22.0218
+10,882,23.1394
+10,883,24.9555
+10,884,19.2913
+10,885,22.5213333333333
+10,886,24.5152333333333
+10,887,24.8793
+10,888,18.4065333333333
+10,889,18.4996666666667
+10,890,20.2353333333333
+10,891,17.7630666666667
+10,892,26.9959666666667
+10,893,20.5147333333333
+10,894,25.3492
+10,895,19.9855666666667
+10,896,30.6705
+10,897,17.399
+10,898,19.558
+10,899,23.1859666666667
+10,900,20.3030666666667
+10,901,20.9931
+10,902,25.2518333333333
+10,903,19.0796333333333
+10,904,19.5622333333333
+10,905,20.5486
+10,906,21.8482333333333
+10,907,20.4935666666667
+10,908,24.8327333333333
+10,909,21.1116333333333
+10,910,17.9789666666667
+10,911,27.2245666666667
+10,912,29.1846
+10,913,23.1986666666667
+10,914,19.0923333333333
+10,915,20.6671333333333
+10,916,25.2814666666667
+10,917,20.4089
+10,918,20.4512333333333
+10,919,20.0236666666667
+10,920,21.4249
+10,921,20.8915
+10,922,16.3195
+10,923,28.7443333333333
+10,924,26.1027333333333
+10,925,15.1976666666667
+10,926,21.717
+10,927,22.2504
+10,928,20.5782333333333
+10,929,20.5951666666667
+10,930,23.2071333333333
+10,931,16.6158333333333
+10,932,25.0825
+10,933,16.9121666666667
+10,934,20.8068333333333
+10,935,25.5058333333333
+10,936,18.2499
+10,937,22.5890666666667
+10,938,23.6050666666667
+10,939,16.9629666666667
+10,940,21.6789
+10,941,21.2979
+10,942,19.7696666666667
+10,943,23.2283
+10,944,25.2306666666667
+10,945,28.1389666666667
+10,946,20.7518
+10,947,19.6003333333333
+10,948,18.5674
+10,949,22.1657333333333
+10,950,17.2593
+10,951,19.7315666666667
+10,952,21.8694
+10,953,25.0867333333333
+10,954,14.0165666666667
+10,955,25.5693333333333
+10,956,17.8011666666667
+10,957,21.6577333333333
+10,958,16.3195
+10,959,21.1497333333333
+10,960,22.2546333333333
+10,961,24.8750666666667
+10,962,23.9056333333333
+10,963,25.9757333333333
+10,964,21.3190666666667
+10,965,18.0213
+10,966,23.8336666666667
+10,967,28.7485666666667
+10,968,26.8816666666667
+10,969,23.0716666666667
+10,970,21.4206666666667
+10,971,11.811
+10,972,19.9432333333333
+10,973,15.7691666666667
+10,974,17.1873333333333
+10,975,21.9794666666667
+10,976,17.145
+10,977,23.1436333333333
+10,978,23.2875666666667
+10,979,20.0448333333333
+10,980,30.7043666666667
+10,981,21.971
+10,982,29.5486666666667
+10,983,19.8755
+10,984,18.3557333333333
+10,985,22.1699666666667
+10,986,25.5185333333333
+10,987,19.2870666666667
+10,988,25.5481666666667
+10,989,22.8811666666667
+10,990,21.2513333333333
+10,991,19.0711666666667
+10,992,21.3656333333333
+10,993,18.3134
+10,994,19.5199
+10,995,19.2193333333333
+10,996,25.7937
+10,997,20.3623333333333
+10,998,27.5420666666667
+10,999,19.9644
+10,1000,19.8374
+11,1,33.8455
+11,2,27.178
+11,3,31.2843333333333
+11,4,31.0726666666667
+11,5,30.861
+11,6,35.052
+11,7,29.337
+11,8,30.607
+11,9,32.5331666666667
+11,10,35.687
+11,11,29.6333333333333
+11,12,29.4851666666667
+11,13,35.0096666666667
+11,14,34.5228333333333
+11,15,28.9348333333333
+11,16,27.0721666666667
+11,17,28.3421666666667
+11,18,39.5605
+11,19,34.0995
+11,20,30.7763333333333
+11,21,30.7975
+11,22,32.2368333333333
+11,23,23.7278333333333
+11,24,32.8718333333333
+11,25,30.5223333333333
+11,26,28.0035
+11,27,35.0731666666667
+11,28,30.4588333333333
+11,29,30.4376666666667
+11,30,31.7923333333333
+11,31,36.7241666666667
+11,32,32.5966666666667
+11,33,29.4428333333333
+11,34,27.3896666666667
+11,35,28.2363333333333
+11,36,27.8976666666667
+11,37,31.6865
+11,38,25.6751666666667
+11,39,24.3416666666667
+11,40,28.8078333333333
+11,41,29.4005
+11,42,26.8181666666667
+11,43,31.115
+11,44,27.4108333333333
+11,45,30.7128333333333
+11,46,25.9503333333333
+11,47,26.162
+11,48,32.0886666666667
+11,49,33.2951666666667
+11,50,32.5755
+11,51,30.6493333333333
+11,52,35.5388333333333
+11,53,32.512
+11,54,38.1635
+11,55,33.9725
+11,56,30.6916666666667
+11,57,30.8821666666667
+11,58,26.8393333333333
+11,59,31.4325
+11,60,29.2735
+11,61,23.3468333333333
+11,62,26.1196666666667
+11,63,27.0086666666667
+11,64,30.1413333333333
+11,65,29.5063333333333
+11,66,26.9663333333333
+11,67,30.0566666666667
+11,68,27.9823333333333
+11,69,29.2311666666667
+11,70,29.0618333333333
+11,71,33.1681666666667
+11,72,27.3685
+11,73,27.4108333333333
+11,74,32.7236666666667
+11,75,30.0355
+11,76,32.9141666666667
+11,77,29.2735
+11,78,29.2946666666667
+11,79,31.369
+11,80,33.9301666666667
+11,81,28.702
+11,82,25.8868333333333
+11,83,28.8925
+11,84,33.5491666666667
+11,85,32.6601666666667
+11,86,22.1403333333333
+11,87,25.0401666666667
+11,88,27.8553333333333
+11,89,24.9131666666667
+11,90,30.1625
+11,91,26.035
+11,92,29.9296666666667
+11,93,32.4061666666667
+11,94,27.7918333333333
+11,95,30.2683333333333
+11,96,31.9616666666667
+11,97,33.5915
+11,98,30.1201666666667
+11,99,32.385
+11,100,31.0938333333333
+11,101,29.9296666666667
+11,102,30.8186666666667
+11,103,27.7918333333333
+11,104,30.5646666666667
+11,105,31.6865
+11,106,34.9461666666667
+11,107,26.9663333333333
+11,108,31.3266666666667
+11,109,32.9988333333333
+11,110,28.4691666666667
+11,111,32.8506666666667
+11,112,31.6018333333333
+11,113,29.8238333333333
+11,114,31.0515
+11,115,32.8295
+11,116,32.9776666666667
+11,117,32.512
+11,118,27.9188333333333
+11,119,30.3318333333333
+11,120,23.3045
+11,121,27.8765
+11,122,26.162
+11,123,30.6705
+11,124,27.1145
+11,125,26.7123333333333
+11,126,31.0091666666667
+11,127,31.2631666666667
+11,128,29.718
+11,129,33.1893333333333
+11,130,30.734
+11,131,26.1196666666667
+11,132,36.4278333333333
+11,133,34.7133333333333
+11,134,25.0825
+11,135,35.4118333333333
+11,136,27.7918333333333
+11,137,28.7866666666667
+11,138,34.5228333333333
+11,139,29.8873333333333
+11,140,25.7598333333333
+11,141,27.1145
+11,142,33.3586666666667
+11,143,40.5553333333333
+11,144,25.8445
+11,145,28.0035
+11,146,24.638
+11,147,23.1351666666667
+11,148,31.3266666666667
+11,149,25.4211666666667
+11,150,31.9193333333333
+11,151,28.4691666666667
+11,152,33.401
+11,153,29.1253333333333
+11,154,31.877
+11,155,24.4898333333333
+11,156,30.0778333333333
+11,157,24.5533333333333
+11,158,26.5853333333333
+11,159,35.8775
+11,160,35.3271666666667
+11,161,31.115
+11,162,30.8186666666667
+11,163,27.4531666666667
+11,164,30.7975
+11,165,25.1883333333333
+11,166,33.4645
+11,167,35.2001666666667
+11,168,29.6756666666667
+11,169,35.8351666666667
+11,170,25.6751666666667
+11,171,27.8765
+11,172,33.147
+11,173,34.0571666666667
+11,174,32.4061666666667
+11,175,36.8088333333333
+11,176,27.2626666666667
+11,177,23.6008333333333
+11,178,32.3215
+11,179,24.5321666666667
+11,180,25.6963333333333
+11,181,32.385
+11,182,28.5961666666667
+11,183,34.7133333333333
+11,184,33.2105
+11,185,25.4
+11,186,30.861
+11,187,31.2208333333333
+11,188,31.4536666666667
+11,189,31.9828333333333
+11,190,28.321
+11,191,26.2466666666667
+11,192,26.7546666666667
+11,193,31.9405
+11,194,27.2415
+11,195,32.3638333333333
+11,196,38.8408333333333
+11,197,40.386
+11,198,28.9771666666667
+11,199,30.5858333333333
+11,200,35.9198333333333
+11,201,29.6968333333333
+11,202,29.6968333333333
+11,203,29.6333333333333
+11,204,33.2951666666667
+11,205,29.6968333333333
+11,206,37.9941666666667
+11,207,32.258
+11,208,29.6968333333333
+11,209,32.8083333333333
+11,210,30.2895
+11,211,28.956
+11,212,26.7546666666667
+11,213,32.258
+11,214,33.7185
+11,215,32.6601666666667
+11,216,29.2523333333333
+11,217,25.4
+11,218,23.6855
+11,219,33.909
+11,220,31.9616666666667
+11,221,32.893
+11,222,26.4371666666667
+11,223,34.3111666666667
+11,224,35.8986666666667
+11,225,26.9663333333333
+11,226,26.3313333333333
+11,227,25.5693333333333
+11,228,30.4588333333333
+11,229,29.8238333333333
+11,230,27.6225
+11,231,29.0195
+11,232,34.2265
+11,233,31.8346666666667
+11,234,34.925
+11,235,29.5063333333333
+11,236,29.1676666666667
+11,237,30.2048333333333
+11,238,30.9033333333333
+11,239,30.7128333333333
+11,240,28.7443333333333
+11,241,40.1531666666667
+11,242,42.6508333333333
+11,243,31.7076666666667
+11,244,32.1733333333333
+11,245,34.1841666666667
+11,246,28.0458333333333
+11,247,27.6436666666667
+11,248,28.194
+11,249,30.0778333333333
+11,250,25.019
+11,251,24.5956666666667
+11,252,35.3271666666667
+11,253,28.7231666666667
+11,254,31.8558333333333
+11,255,25.9503333333333
+11,256,34.036
+11,257,30.6493333333333
+11,258,29.8238333333333
+11,259,27.432
+11,260,31.7288333333333
+11,261,41.5078333333333
+11,262,30.607
+11,263,27.3685
+11,264,26.5218333333333
+11,265,25.7598333333333
+11,266,28.448
+11,267,30.5858333333333
+11,268,27.305
+11,269,34.036
+11,270,34.0571666666667
+11,271,25.9926666666667
+11,272,27.9823333333333
+11,273,33.6126666666667
+11,274,29.718
+11,275,23.0928333333333
+11,276,26.3101666666667
+11,277,33.2105
+11,278,26.6276666666667
+11,279,23.9395
+11,280,31.2843333333333
+11,281,31.2631666666667
+11,282,33.2951666666667
+11,283,25.1248333333333
+11,284,26.416
+11,285,29.0406666666667
+11,286,32.5543333333333
+11,287,29.6333333333333
+11,288,26.6488333333333
+11,289,30.2895
+11,290,31.7076666666667
+11,291,29.2946666666667
+11,292,27.8765
+11,293,27.1991666666667
+11,294,30.607
+11,295,30.2048333333333
+11,296,31.623
+11,297,25.9503333333333
+11,298,37.592
+11,299,32.8718333333333
+11,300,32.3426666666667
+11,301,27.4108333333333
+11,302,29.6756666666667
+11,303,27.9611666666667
+11,304,26.3525
+11,305,32.512
+11,306,28.7231666666667
+11,307,37.592
+11,308,26.5641666666667
+11,309,26.6065
+11,310,29.9085
+11,311,28.0458333333333
+11,312,30.8186666666667
+11,313,33.2105
+11,314,32.4696666666667
+11,315,28.4056666666667
+11,316,29.1888333333333
+11,317,32.5966666666667
+11,318,31.8135
+11,319,29.591
+11,320,36.5548333333333
+11,321,33.9301666666667
+11,322,31.7076666666667
+11,323,35.9833333333333
+11,324,26.6488333333333
+11,325,25.7175
+11,326,30.0355
+11,327,29.7603333333333
+11,328,29.2946666666667
+11,329,33.2528333333333
+11,330,33.2951666666667
+11,331,30.3318333333333
+11,332,25.4211666666667
+11,333,30.6493333333333
+11,334,31.2208333333333
+11,335,34.1418333333333
+11,336,28.6173333333333
+11,337,26.3101666666667
+11,338,32.512
+11,339,32.8295
+11,340,26.6911666666667
+11,341,27.4531666666667
+11,342,28.5538333333333
+11,343,33.9936666666667
+11,344,28.9771666666667
+11,345,30.0355
+11,346,32.7025
+11,347,28.8713333333333
+11,348,32.1098333333333
+11,349,25.0613333333333
+11,350,26.2043333333333
+11,351,31.5806666666667
+11,352,21.336
+11,353,28.4691666666667
+11,354,28.9771666666667
+11,355,31.5806666666667
+11,356,32.9988333333333
+11,357,29.8661666666667
+11,358,26.4583333333333
+11,359,25.3365
+11,360,30.0778333333333
+11,361,27.1991666666667
+11,362,24.9978333333333
+11,363,23.1351666666667
+11,364,34.417
+11,365,24.765
+11,366,36.8511666666667
+11,367,28.0458333333333
+11,368,34.925
+11,369,26.6065
+11,370,27.0298333333333
+11,371,28.5115
+11,372,32.5755
+11,373,32.1945
+11,374,25.2518333333333
+11,375,29.718
+11,376,26.1196666666667
+11,377,33.2105
+11,378,34.3111666666667
+11,379,33.0411666666667
+11,380,26.6276666666667
+11,381,34.3746666666667
+11,382,29.9296666666667
+11,383,28.448
+11,384,32.1733333333333
+11,385,24.511
+11,386,27.6225
+11,387,28.7655
+11,388,34.5228333333333
+11,389,31.0091666666667
+11,390,31.6441666666667
+11,391,32.5755
+11,392,27.7283333333333
+11,393,32.3638333333333
+11,394,30.8398333333333
+11,395,30.5646666666667
+11,396,34.6286666666667
+11,397,28.1305
+11,398,32.4273333333333
+11,399,29.6968333333333
+11,400,24.8496666666667
+11,401,24.2358333333333
+11,402,28.9348333333333
+11,403,27.178
+11,404,38.1635
+11,405,32.2156666666667
+11,406,26.9451666666667
+11,407,28.7443333333333
+11,408,32.9353333333333
+11,409,33.2528333333333
+11,410,25.1248333333333
+11,411,36.8723333333333
+11,412,29.7391666666667
+11,413,24.4051666666667
+11,414,28.4691666666667
+11,415,35.8775
+11,416,31.75
+11,417,24.1088333333333
+11,418,30.7763333333333
+11,419,32.5966666666667
+11,420,34.4593333333333
+11,421,28.575
+11,422,32.4485
+11,423,34.2053333333333
+11,424,32.1521666666667
+11,425,21.9921666666667
+11,426,28.5115
+11,427,34.0148333333333
+11,428,33.528
+11,429,26.924
+11,430,37.084
+11,431,26.0138333333333
+11,432,33.5491666666667
+11,433,23.7913333333333
+11,434,29.718
+11,435,38.227
+11,436,30.8186666666667
+11,437,24.2993333333333
+11,438,29.718
+11,439,31.2843333333333
+11,440,28.1516666666667
+11,441,31.1361666666667
+11,442,30.9245
+11,443,34.8826666666667
+11,444,35.306
+11,445,31.9616666666667
+11,446,31.4113333333333
+11,447,27.178
+11,448,26.3525
+11,449,35.2213333333333
+11,450,34.2476666666667
+11,451,30.9033333333333
+11,452,34.5863333333333
+11,453,28.0035
+11,454,29.9931666666667
+11,455,29.2523333333333
+11,456,22.7541666666667
+11,457,30.4376666666667
+11,458,34.0571666666667
+11,459,28.7231666666667
+11,460,26.924
+11,461,24.5956666666667
+11,462,30.0566666666667
+11,463,24.7015
+11,464,26.2255
+11,465,28.3633333333333
+11,466,31.7288333333333
+11,467,26.6065
+11,468,29.972
+11,469,31.5806666666667
+11,470,29.3581666666667
+11,471,35.2848333333333
+11,472,24.2146666666667
+11,473,31.7923333333333
+11,474,27.1356666666667
+11,475,22.5636666666667
+11,476,24.8073333333333
+11,477,32.9776666666667
+11,478,32.2368333333333
+11,479,31.5595
+11,480,28.067
+11,481,28.7655
+11,482,32.6178333333333
+11,483,33.2528333333333
+11,484,33.2105
+11,485,29.6756666666667
+11,486,31.3266666666667
+11,487,31.5595
+11,488,22.5848333333333
+11,489,31.7923333333333
+11,490,28.7231666666667
+11,491,30.9033333333333
+11,492,26.8605
+11,493,26.7123333333333
+11,494,31.5595
+11,495,28.6385
+11,496,24.4263333333333
+11,497,30.3953333333333
+11,498,29.0195
+11,499,33.8878333333333
+11,500,31.1361666666667
+11,501,32.2368333333333
+11,502,31.0515
+11,503,31.4325
+11,504,28.1305
+11,505,25.9715
+11,506,29.4005
+11,507,26.5641666666667
+11,508,30.9033333333333
+11,509,23.2833333333333
+11,510,33.1046666666667
+11,511,35.2848333333333
+11,512,25.273
+11,513,32.3003333333333
+11,514,33.2105
+11,515,27.1145
+11,516,31.8346666666667
+11,517,38.354
+11,518,35.0308333333333
+11,519,30.0566666666667
+11,520,34.3958333333333
+11,521,26.289
+11,522,28.8501666666667
+11,523,32.258
+11,524,31.623
+11,525,31.115
+11,526,34.3111666666667
+11,527,33.4221666666667
+11,528,32.9988333333333
+11,529,32.6601666666667
+11,530,27.4743333333333
+11,531,30.9245
+11,532,30.099
+11,533,27.0298333333333
+11,534,25.4211666666667
+11,535,30.353
+11,536,36.1103333333333
+11,537,32.5543333333333
+11,538,34.29
+11,539,29.9296666666667
+11,540,28.2151666666667
+11,541,26.924
+11,542,34.0783333333333
+11,543,30.5223333333333
+11,544,30.607
+11,545,31.7923333333333
+11,546,29.6968333333333
+11,547,31.7923333333333
+11,548,28.7655
+11,549,32.2368333333333
+11,550,30.607
+11,551,30.5435
+11,552,32.512
+11,553,32.5755
+11,554,28.6596666666667
+11,555,29.1465
+11,556,29.6545
+11,557,33.9301666666667
+11,558,34.417
+11,559,31.3266666666667
+11,560,27.432
+11,561,35.8563333333333
+11,562,27.0933333333333
+11,563,25.7386666666667
+11,564,32.9353333333333
+11,565,39.8145
+11,566,33.3586666666667
+11,567,35.6235
+11,568,29.0618333333333
+11,569,26.4583333333333
+11,570,32.3003333333333
+11,571,27.8341666666667
+11,572,40.386
+11,573,29.0195
+11,574,29.3793333333333
+11,575,33.6973333333333
+11,576,27.1356666666667
+11,577,29.7391666666667
+11,578,28.6808333333333
+11,579,27.1568333333333
+11,580,29.464
+11,581,33.6338333333333
+11,582,31.1573333333333
+11,583,30.2048333333333
+11,584,27.9188333333333
+11,585,25.654
+11,586,34.4381666666667
+11,587,29.1676666666667
+11,588,33.3586666666667
+11,589,35.6658333333333
+11,590,29.8873333333333
+11,591,26.9451666666667
+11,592,25.8868333333333
+11,593,26.4371666666667
+11,594,24.1723333333333
+11,595,33.1893333333333
+11,596,35.4965
+11,597,30.4588333333333
+11,598,31.0091666666667
+11,599,27.3261666666667
+11,600,34.671
+11,601,31.6653333333333
+11,602,25.0613333333333
+11,603,35.4753333333333
+11,604,30.6281666666667
+11,605,29.337
+11,606,26.6911666666667
+11,607,24.2993333333333
+11,608,26.5006666666667
+11,609,25.5693333333333
+11,610,27.813
+11,611,31.0091666666667
+11,612,25.3788333333333
+11,613,33.0623333333333
+11,614,31.7923333333333
+11,615,25.0401666666667
+11,616,23.8125
+11,617,24.2993333333333
+11,618,32.0886666666667
+11,619,28.829
+11,620,30.3318333333333
+11,621,30.8186666666667
+11,622,37.2956666666667
+11,623,30.3318333333333
+11,624,29.2735
+11,625,30.607
+11,626,20.7221666666667
+11,627,35.4753333333333
+11,628,34.2265
+11,629,39.7721666666667
+11,630,33.274
+11,631,30.1625
+11,632,31.623
+11,633,27.051
+11,634,30.607
+11,635,32.0886666666667
+11,636,33.8455
+11,637,31.115
+11,638,36.0891666666667
+11,639,32.0463333333333
+11,640,29.0406666666667
+11,641,26.9028333333333
+11,642,27.559
+11,643,27.559
+11,644,31.9193333333333
+11,645,28.0881666666667
+11,646,27.2203333333333
+11,647,35.687
+11,648,34.2053333333333
+11,649,28.2786666666667
+11,650,33.4221666666667
+11,651,29.4005
+11,652,30.48
+11,653,30.3741666666667
+11,654,26.9663333333333
+11,655,28.1516666666667
+11,656,35.3271666666667
+11,657,35.3906666666667
+11,658,33.9301666666667
+11,659,34.9885
+11,660,28.321
+11,661,27.6225
+11,662,30.099
+11,663,29.8026666666667
+11,664,27.3473333333333
+11,665,25.2306666666667
+11,666,31.4748333333333
+11,667,36.8511666666667
+11,668,29.4851666666667
+11,669,35.9198333333333
+11,670,31.1996666666667
+11,671,27.2203333333333
+11,672,34.0571666666667
+11,673,29.8238333333333
+11,674,30.6281666666667
+11,675,29.4851666666667
+11,676,29.464
+11,677,27.6436666666667
+11,678,23.368
+11,679,34.29
+11,680,33.3375
+11,681,25.5693333333333
+11,682,35.052
+11,683,31.2843333333333
+11,684,29.845
+11,685,31.1361666666667
+11,686,28.2998333333333
+11,687,20.9973333333333
+11,688,35.3695
+11,689,25.527
+11,690,27.4743333333333
+11,691,23.5161666666667
+11,692,30.5646666666667
+11,693,32.5966666666667
+11,694,24.4686666666667
+11,695,34.2265
+11,696,25.5693333333333
+11,697,36.1526666666667
+11,698,35.306
+11,699,31.3055
+11,700,29.4216666666667
+11,701,34.5016666666667
+11,702,35.0943333333333
+11,703,32.5543333333333
+11,704,35.0943333333333
+11,705,28.0881666666667
+11,706,29.0406666666667
+11,707,21.3995
+11,708,31.3266666666667
+11,709,28.5961666666667
+11,710,30.9245
+11,711,32.9353333333333
+11,712,22.5636666666667
+11,713,30.5011666666667
+11,714,38.0365
+11,715,24.5956666666667
+11,716,38.3328333333333
+11,717,31.2843333333333
+11,718,24.3628333333333
+11,719,32.1521666666667
+11,720,25.5905
+11,721,27.8976666666667
+11,722,27.3473333333333
+11,723,28.5961666666667
+11,724,31.6018333333333
+11,725,23.5585
+11,726,29.5698333333333
+11,727,28.9771666666667
+11,728,34.3111666666667
+11,729,30.3953333333333
+11,730,27.7706666666667
+11,731,27.1145
+11,732,27.2415
+11,733,33.2105
+11,734,30.2895
+11,735,38.2481666666667
+11,736,29.9931666666667
+11,737,32.6601666666667
+11,738,22.1826666666667
+11,739,29.2311666666667
+11,740,30.7975
+11,741,24.1723333333333
+11,742,33.2105
+11,743,28.5538333333333
+11,744,30.6281666666667
+11,745,35.6446666666667
+11,746,25.7386666666667
+11,747,27.432
+11,748,30.9456666666667
+11,749,31.4536666666667
+11,750,33.8666666666667
+11,751,27.3685
+11,752,31.7288333333333
+11,753,31.7923333333333
+11,754,25.3365
+11,755,32.9988333333333
+11,756,32.9353333333333
+11,757,32.0251666666667
+11,758,25.8445
+11,759,31.75
+11,760,28.7443333333333
+11,761,24.9131666666667
+11,762,34.7133333333333
+11,763,26.3101666666667
+11,764,29.0195
+11,765,26.7546666666667
+11,766,29.5063333333333
+11,767,27.9823333333333
+11,768,32.3003333333333
+11,769,31.0938333333333
+11,770,30.8186666666667
+11,771,36.7876666666667
+11,772,33.5703333333333
+11,773,29.6121666666667
+11,774,30.7128333333333
+11,775,30.6705
+11,776,32.3215
+11,777,26.5641666666667
+11,778,35.6023333333333
+11,779,29.1888333333333
+11,780,21.6535
+11,781,35.1155
+11,782,34.8615
+11,783,27.5801666666667
+11,784,37.1898333333333
+11,785,25.3788333333333
+11,786,30.2683333333333
+11,787,21.5265
+11,788,33.3163333333333
+11,789,29.0618333333333
+11,790,30.3318333333333
+11,791,32.1945
+11,792,31.2843333333333
+11,793,26.924
+11,794,31.242
+11,795,29.9508333333333
+11,796,30.4588333333333
+11,797,37.3591666666667
+11,798,31.3901666666667
+11,799,28.2575
+11,800,30.5858333333333
+11,801,28.956
+11,802,30.3741666666667
+11,803,25.908
+11,804,24.384
+11,805,30.6493333333333
+11,806,30.8186666666667
+11,807,31.6018333333333
+11,808,30.0566666666667
+11,809,23.7278333333333
+11,810,33.2528333333333
+11,811,35.3483333333333
+11,812,28.4691666666667
+11,813,38.7138333333333
+11,814,33.782
+11,815,23.7701666666667
+11,816,25.8021666666667
+11,817,31.3266666666667
+11,818,32.4061666666667
+11,819,30.0143333333333
+11,820,30.2048333333333
+11,821,30.48
+11,822,24.13
+11,823,28.0035
+11,824,27.4531666666667
+11,825,27.4531666666667
+11,826,28.829
+11,827,30.3106666666667
+11,828,31.4325
+11,829,28.6808333333333
+11,830,32.3638333333333
+11,831,31.6441666666667
+11,832,29.972
+11,833,29.0195
+11,834,27.7071666666667
+11,835,26.1196666666667
+11,836,25.5481666666667
+11,837,30.4588333333333
+11,838,28.575
+11,839,29.4216666666667
+11,840,28.1516666666667
+11,841,31.4748333333333
+11,842,30.8398333333333
+11,843,29.972
+11,844,29.718
+11,845,31.115
+11,846,28.6808333333333
+11,847,29.464
+11,848,28.0458333333333
+11,849,35.6446666666667
+11,850,32.893
+11,851,24.9343333333333
+11,852,28.1516666666667
+11,853,22.733
+11,854,31.1996666666667
+11,855,30.3106666666667
+11,856,33.9725
+11,857,30.0566666666667
+11,858,33.147
+11,859,32.1521666666667
+11,860,30.5223333333333
+11,861,24.2358333333333
+11,862,29.0618333333333
+11,863,29.0195
+11,864,28.9983333333333
+11,865,23.368
+11,866,32.2156666666667
+11,867,33.2951666666667
+11,868,23.7701666666667
+11,869,37.0628333333333
+11,870,27.9188333333333
+11,871,30.734
+11,872,33.3163333333333
+11,873,34.3535
+11,874,28.4056666666667
+11,875,31.4325
+11,876,31.1785
+11,877,27.6013333333333
+11,878,31.6441666666667
+11,879,28.2151666666667
+11,880,31.115
+11,881,27.1356666666667
+11,882,32.1521666666667
+11,883,29.0406666666667
+11,884,32.512
+11,885,29.1465
+11,886,27.178
+11,887,25.8233333333333
+11,888,27.8765
+11,889,26.162
+11,890,34.1418333333333
+11,891,31.8135
+11,892,29.6968333333333
+11,893,30.5646666666667
+11,894,34.4593333333333
+11,895,26.67
+11,896,33.528
+11,897,31.7923333333333
+11,898,27.2626666666667
+11,899,26.8181666666667
+11,900,33.4856666666667
+11,901,27.5378333333333
+11,902,29.8661666666667
+11,903,25.908
+11,904,35.8775
+11,905,30.2048333333333
+11,906,33.9936666666667
+11,907,26.2678333333333
+11,908,32.5331666666667
+11,909,34.7556666666667
+11,910,30.3953333333333
+11,911,25.146
+11,912,27.7283333333333
+11,913,31.877
+11,914,33.4645
+11,915,26.6276666666667
+11,916,27.6648333333333
+11,917,37.1475
+11,918,27.8976666666667
+11,919,36.3431666666667
+11,920,30.9245
+11,921,30.8821666666667
+11,922,25.9715
+11,923,39.6028333333333
+11,924,28.448
+11,925,26.924
+11,926,34.417
+11,927,34.9461666666667
+11,928,26.6911666666667
+11,929,31.6018333333333
+11,930,27.6013333333333
+11,931,32.131
+11,932,27.94
+11,933,29.2311666666667
+11,934,34.9885
+11,935,25.5693333333333
+11,936,24.6591666666667
+11,937,31.7711666666667
+11,938,27.7918333333333
+11,939,28.1516666666667
+11,940,31.0515
+11,941,33.9936666666667
+11,942,28.8078333333333
+11,943,32.8295
+11,944,34.5228333333333
+11,945,31.0726666666667
+11,946,24.892
+11,947,32.4696666666667
+11,948,32.131
+11,949,34.9038333333333
+11,950,27.178
+11,951,24.1511666666667
+11,952,27.3685
+11,953,26.2466666666667
+11,954,35.2848333333333
+11,955,32.9565
+11,956,26.6276666666667
+11,957,29.8026666666667
+11,958,37.5496666666667
+11,959,29.3793333333333
+11,960,28.2786666666667
+11,961,36.3855
+11,962,31.7923333333333
+11,963,30.988
+11,964,30.7551666666667
+11,965,30.2471666666667
+11,966,29.9508333333333
+11,967,33.6338333333333
+11,968,27.8976666666667
+11,969,27.178
+11,970,33.2951666666667
+11,971,31.5383333333333
+11,972,25.8233333333333
+11,973,29.464
+11,974,24.1723333333333
+11,975,31.9193333333333
+11,976,22.6483333333333
+11,977,24.13
+11,978,28.4056666666667
+11,979,29.591
+11,980,26.4583333333333
+11,981,33.0623333333333
+11,982,32.004
+11,983,26.2466666666667
+11,984,35.9198333333333
+11,985,36.0256666666667
+11,986,34.7768333333333
+11,987,29.591
+11,988,28.702
+11,989,32.385
+11,990,30.3741666666667
+11,991,36.8511666666667
+11,992,26.7123333333333
+11,993,24.0665
+11,994,36.9993333333333
+11,995,25.7175
+11,996,31.1996666666667
+11,997,28.194
+11,998,29.9296666666667
+11,999,37.084
+11,1000,21.4841666666667
+12,1,32.639
+12,2,34.7133333333333
+12,3,29.718
+12,4,30.1625
+12,5,28.6808333333333
+12,6,34.4805
+12,7,28.9348333333333
+12,8,29.5698333333333
+12,9,30.2683333333333
+12,10,30.3953333333333
+12,11,25.5481666666667
+12,12,30.5223333333333
+12,13,33.9301666666667
+12,14,32.893
+12,15,24.7226666666667
+12,16,28.6385
+12,17,26.2043333333333
+12,18,26.5218333333333
+12,19,22.2673333333333
+12,20,28.5538333333333
+12,21,27.9823333333333
+12,22,24.9766666666667
+12,23,28.6808333333333
+12,24,35.2425
+12,25,27.5166666666667
+12,26,26.9028333333333
+12,27,32.4908333333333
+12,28,31.5171666666667
+12,29,29.5486666666667
+12,30,30.5011666666667
+12,31,31.7288333333333
+12,32,36.8723333333333
+12,33,31.5806666666667
+12,34,25.5905
+12,35,28.7231666666667
+12,36,29.1676666666667
+12,37,29.718
+12,38,26.924
+12,39,29.6121666666667
+12,40,29.6545
+12,41,30.4376666666667
+12,42,22.9658333333333
+12,43,29.1888333333333
+12,44,30.099
+12,45,24.1088333333333
+12,46,33.7185
+12,47,22.7753333333333
+12,48,29.6545
+12,49,24.4051666666667
+12,50,26.7758333333333
+12,51,26.5006666666667
+12,52,30.4588333333333
+12,53,30.6493333333333
+12,54,30.5646666666667
+12,55,27.5378333333333
+12,56,30.3741666666667
+12,57,32.8295
+12,58,28.1093333333333
+12,59,29.2523333333333
+12,60,28.2786666666667
+12,61,27.0298333333333
+12,62,32.6178333333333
+12,63,25.6328333333333
+12,64,30.9456666666667
+12,65,25.7175
+12,66,20.3835
+12,67,22.9658333333333
+12,68,27.5166666666667
+12,69,29.845
+12,70,32.0886666666667
+12,71,25.6963333333333
+12,72,24.2781666666667
+12,73,34.9673333333333
+12,74,28.6385
+12,75,27.4531666666667
+12,76,24.0665
+12,77,22.5848333333333
+12,78,26.3313333333333
+12,79,24.257
+12,80,27.5166666666667
+12,81,34.9673333333333
+12,82,30.2683333333333
+12,83,26.8816666666667
+12,84,36.2796666666667
+12,85,34.5651666666667
+12,86,22.606
+12,87,26.3101666666667
+12,88,31.6018333333333
+12,89,25.1883333333333
+12,90,26.5006666666667
+12,91,34.671
+12,92,25.3365
+12,93,29.7391666666667
+12,94,28.4268333333333
+12,95,28.1093333333333
+12,96,30.6705
+12,97,28.2363333333333
+12,98,33.1258333333333
+12,99,28.1728333333333
+12,100,29.1041666666667
+12,101,29.21
+12,102,30.5223333333333
+12,103,37.0205
+12,104,29.1676666666667
+12,105,24.9766666666667
+12,106,24.4898333333333
+12,107,35.1578333333333
+12,108,29.9296666666667
+12,109,30.2471666666667
+12,110,29.5698333333333
+12,111,29.0195
+12,112,30.8186666666667
+12,113,30.7763333333333
+12,114,25.8656666666667
+12,115,34.1418333333333
+12,116,31.3901666666667
+12,117,28.0035
+12,118,26.7546666666667
+12,119,27.2415
+12,120,35.2848333333333
+12,121,30.8821666666667
+12,122,37.5496666666667
+12,123,27.9823333333333
+12,124,28.9983333333333
+12,125,32.7448333333333
+12,126,31.7288333333333
+12,127,25.8656666666667
+12,128,25.9291666666667
+12,129,28.9136666666667
+12,130,26.8181666666667
+12,131,26.5641666666667
+12,132,24.1511666666667
+12,133,25.5058333333333
+12,134,29.5698333333333
+12,135,32.7871666666667
+12,136,27.9611666666667
+12,137,26.8181666666667
+12,138,28.067
+12,139,26.8393333333333
+12,140,30.7551666666667
+12,141,29.1041666666667
+12,142,24.4686666666667
+12,143,25.8233333333333
+12,144,26.924
+12,145,22.2885
+12,146,31.0515
+12,147,27.0298333333333
+12,148,33.8878333333333
+12,149,29.6756666666667
+12,150,30.9668333333333
+12,151,27.94
+12,152,32.4273333333333
+12,153,26.5853333333333
+12,154,23.4526666666667
+12,155,28.321
+12,156,29.6968333333333
+12,157,30.0355
+12,158,28.4268333333333
+12,159,25.9715
+12,160,25.4846666666667
+12,161,26.1196666666667
+12,162,23.7278333333333
+12,163,26.6488333333333
+12,164,26.0561666666667
+12,165,30.1413333333333
+12,166,27.6436666666667
+12,167,26.2255
+12,168,31.9193333333333
+12,169,28.9136666666667
+12,170,27.1991666666667
+12,171,26.6065
+12,172,31.3901666666667
+12,173,32.9353333333333
+12,174,23.5373333333333
+12,175,32.6813333333333
+12,176,34.798
+12,177,31.4748333333333
+12,178,28.321
+12,179,31.3901666666667
+12,180,27.4531666666667
+12,181,29.718
+12,182,39.4546666666667
+12,183,33.1046666666667
+12,184,29.9931666666667
+12,185,30.4376666666667
+12,186,27.6648333333333
+12,187,29.5063333333333
+12,188,28.5538333333333
+12,189,28.3845
+12,190,23.495
+12,191,28.6596666666667
+12,192,27.3261666666667
+12,193,33.909
+12,194,30.4376666666667
+12,195,24.7226666666667
+12,196,29.4216666666667
+12,197,24.638
+12,198,28.6173333333333
+12,199,23.3045
+12,200,24.4898333333333
+12,201,26.543
+12,202,24.5745
+12,203,25.9503333333333
+12,204,25.5905
+12,205,33.7185
+12,206,36.4278333333333
+12,207,27.2203333333333
+12,208,27.6225
+12,209,29.4216666666667
+12,210,29.083
+12,211,25.2306666666667
+12,212,26.5641666666667
+12,213,24.3628333333333
+12,214,31.8346666666667
+12,215,23.7701666666667
+12,216,28.8501666666667
+12,217,32.4908333333333
+12,218,29.6333333333333
+12,219,28.4056666666667
+12,220,19.4098333333333
+12,221,31.496
+12,222,29.6756666666667
+12,223,37.084
+12,224,31.9616666666667
+12,225,32.3003333333333
+12,226,25.654
+12,227,24.6803333333333
+12,228,28.5538333333333
+12,229,24.9766666666667
+12,230,28.067
+12,231,27.813
+12,232,32.4485
+12,233,29.9085
+12,234,19.6426666666667
+12,235,28.6173333333333
+12,236,31.3901666666667
+12,237,34.7133333333333
+12,238,32.8295
+12,239,29.1041666666667
+12,240,29.5698333333333
+12,241,27.6225
+12,242,29.4005
+12,243,25.6328333333333
+12,244,22.8811666666667
+12,245,26.7546666666667
+12,246,25.6328333333333
+12,247,31.9828333333333
+12,248,26.7123333333333
+12,249,27.432
+12,250,39.3488333333333
+12,251,30.1836666666667
+12,252,22.8388333333333
+12,253,31.8981666666667
+12,254,26.543
+12,255,28.702
+12,256,33.02
+12,257,28.2151666666667
+12,258,24.9343333333333
+12,259,31.0515
+12,260,32.6813333333333
+12,261,26.6276666666667
+12,262,34.5228333333333
+12,263,30.9456666666667
+12,264,32.6813333333333
+12,265,28.6385
+12,266,35.3483333333333
+12,267,29.8661666666667
+12,268,26.5006666666667
+12,269,32.1733333333333
+12,270,27.94
+12,271,26.8605
+12,272,22.6695
+12,273,28.9136666666667
+12,274,32.6601666666667
+12,275,22.606
+12,276,31.3901666666667
+12,277,34.3958333333333
+12,278,27.0298333333333
+12,279,26.289
+12,280,30.6493333333333
+12,281,26.8393333333333
+12,282,29.4216666666667
+12,283,25.2518333333333
+12,284,25.7175
+12,285,31.0091666666667
+12,286,24.5956666666667
+12,287,31.6865
+12,288,25.6328333333333
+12,289,30.353
+12,290,26.1408333333333
+12,291,21.9286666666667
+12,292,34.1841666666667
+12,293,27.1356666666667
+12,294,26.416
+12,295,30.9245
+12,296,31.1785
+12,297,30.0143333333333
+12,298,25.4
+12,299,32.9353333333333
+12,300,33.528
+12,301,28.2151666666667
+12,302,28.7655
+12,303,28.9983333333333
+12,304,24.892
+12,305,23.1986666666667
+12,306,30.3953333333333
+12,307,28.4056666666667
+12,308,28.9136666666667
+12,309,23.8548333333333
+12,310,38.608
+12,311,28.9136666666667
+12,312,29.2523333333333
+12,313,23.7913333333333
+12,314,28.9136666666667
+12,315,28.0881666666667
+12,316,26.8393333333333
+12,317,27.8765
+12,318,29.845
+12,319,31.115
+12,320,26.7335
+12,321,34.5651666666667
+12,322,29.9508333333333
+12,323,29.2735
+12,324,26.0561666666667
+12,325,29.9085
+12,326,30.5223333333333
+12,327,27.94
+12,328,32.3638333333333
+12,329,26.2678333333333
+12,330,33.0835
+12,331,27.3896666666667
+12,332,24.3628333333333
+12,333,40.4706666666667
+12,334,22.9235
+12,335,35.5388333333333
+12,336,33.8243333333333
+12,337,27.9823333333333
+12,338,32.9776666666667
+12,339,20.32
+12,340,28.2998333333333
+12,341,27.2626666666667
+12,342,29.5486666666667
+12,343,22.8388333333333
+12,344,26.6911666666667
+12,345,21.7805
+12,346,32.6178333333333
+12,347,29.9931666666667
+12,348,28.194
+12,349,28.0881666666667
+12,350,22.86
+12,351,31.3055
+12,352,28.702
+12,353,31.5806666666667
+12,354,28.575
+12,355,34.3746666666667
+12,356,24.5956666666667
+12,357,26.8181666666667
+12,358,34.5228333333333
+12,359,22.9446666666667
+12,360,31.0726666666667
+12,361,34.1418333333333
+12,362,24.4051666666667
+12,363,28.3845
+12,364,24.2358333333333
+12,365,31.4325
+12,366,31.0303333333333
+12,367,33.2951666666667
+12,368,23.3891666666667
+12,369,31.1573333333333
+12,370,30.0143333333333
+12,371,27.813
+12,372,25.4423333333333
+12,373,25.019
+12,374,29.8661666666667
+12,375,29.972
+12,376,29.4851666666667
+12,377,27.7071666666667
+12,378,26.7335
+12,379,28.956
+12,380,24.892
+12,381,23.2833333333333
+12,382,29.972
+12,383,30.7128333333333
+12,384,23.4103333333333
+12,385,31.4536666666667
+12,386,29.845
+12,387,25.6751666666667
+12,388,36.0891666666667
+12,389,33.9936666666667
+12,390,26.7335
+12,391,25.1671666666667
+12,392,27.4531666666667
+12,393,24.3205
+12,394,30.5646666666667
+12,395,25.781
+12,396,24.5321666666667
+12,397,26.2043333333333
+12,398,27.7283333333333
+12,399,26.924
+12,400,27.178
+12,401,27.8765
+12,402,29.8238333333333
+12,403,24.1511666666667
+12,404,24.257
+12,405,27.3685
+12,406,22.6906666666667
+12,407,28.8078333333333
+12,408,32.6601666666667
+12,409,26.7123333333333
+12,410,30.1836666666667
+12,411,27.559
+12,412,23.368
+12,413,30.9668333333333
+12,414,24.6168333333333
+12,415,28.3633333333333
+12,416,30.6493333333333
+12,417,25.7386666666667
+12,418,29.5698333333333
+12,419,32.4696666666667
+12,420,29.1888333333333
+12,421,31.75
+12,422,23.8971666666667
+12,423,24.7438333333333
+12,424,30.3318333333333
+12,425,24.3628333333333
+12,426,26.2043333333333
+12,427,29.464
+12,428,34.036
+12,429,26.3948333333333
+12,430,30.9668333333333
+12,431,28.1728333333333
+12,432,27.2415
+12,433,32.9141666666667
+12,434,28.9348333333333
+12,435,27.7918333333333
+12,436,31.8135
+12,437,24.8708333333333
+12,438,26.3736666666667
+12,439,28.2998333333333
+12,440,25.6963333333333
+12,441,31.3055
+12,442,26.1831666666667
+12,443,27.178
+12,444,27.432
+12,445,29.6121666666667
+12,446,31.0938333333333
+12,447,32.5331666666667
+12,448,27.7495
+12,449,28.0881666666667
+12,450,30.734
+12,451,27.7283333333333
+12,452,20.1083333333333
+12,453,23.7913333333333
+12,454,30.9668333333333
+12,455,25.7386666666667
+12,456,28.829
+12,457,26.5641666666667
+12,458,30.1625
+12,459,24.8285
+12,460,28.2363333333333
+12,461,24.384
+12,462,27.6436666666667
+12,463,29.0406666666667
+12,464,28.3845
+12,465,29.8873333333333
+12,466,23.6643333333333
+12,467,28.6385
+12,468,27.5801666666667
+12,469,29.1253333333333
+12,470,28.1516666666667
+12,471,23.2198333333333
+12,472,34.544
+12,473,30.7763333333333
+12,474,27.8341666666667
+12,475,27.1356666666667
+12,476,23.9183333333333
+12,477,34.0148333333333
+12,478,29.3158333333333
+12,479,27.4108333333333
+12,480,30.861
+12,481,22.1615
+12,482,28.9771666666667
+12,483,26.0138333333333
+12,484,32.1521666666667
+12,485,26.9663333333333
+12,486,28.1093333333333
+12,487,32.6813333333333
+12,488,31.0303333333333
+12,489,31.623
+12,490,29.2946666666667
+12,491,27.9823333333333
+12,492,30.4376666666667
+12,493,23.6431666666667
+12,494,26.0138333333333
+12,495,31.877
+12,496,24.0876666666667
+12,497,31.5806666666667
+12,498,32.385
+12,499,32.2368333333333
+12,500,33.274
+12,501,28.702
+12,502,27.5801666666667
+12,503,27.4955
+12,504,21.9075
+12,505,24.638
+12,506,25.0401666666667
+12,507,33.3798333333333
+12,508,29.6545
+12,509,31.7288333333333
+12,510,31.0515
+12,511,30.0566666666667
+12,512,30.0566666666667
+12,513,27.7495
+12,514,34.163
+12,515,31.4536666666667
+12,516,28.6385
+12,517,31.4113333333333
+12,518,25.0825
+12,519,23.2198333333333
+12,520,29.9508333333333
+12,521,29.6545
+12,522,22.3731666666667
+12,523,36.068
+12,524,32.6813333333333
+12,525,27.7495
+12,526,27.8341666666667
+12,527,24.13
+12,528,29.2523333333333
+12,529,25.527
+12,530,31.7288333333333
+12,531,27.4743333333333
+12,532,31.9828333333333
+12,533,34.417
+12,534,33.8031666666667
+12,535,34.5228333333333
+12,536,29.5698333333333
+12,537,28.8501666666667
+12,538,35.1578333333333
+12,539,30.48
+12,540,30.6916666666667
+12,541,35.3271666666667
+12,542,30.5435
+12,543,27.2838333333333
+12,544,29.1465
+12,545,29.9508333333333
+12,546,30.0143333333333
+12,547,35.6658333333333
+12,548,23.4526666666667
+12,549,28.4691666666667
+12,550,28.6596666666667
+12,551,30.3106666666667
+12,552,24.13
+12,553,34.1841666666667
+12,554,25.6751666666667
+12,555,33.1258333333333
+12,556,26.5006666666667
+12,557,30.734
+12,558,28.2998333333333
+12,559,33.8455
+12,560,34.163
+12,561,30.9245
+12,562,27.5378333333333
+12,563,29.7603333333333
+12,564,28.5538333333333
+12,565,26.5218333333333
+12,566,32.1733333333333
+12,567,30.1625
+12,568,28.9983333333333
+12,569,19.4945
+12,570,26.1196666666667
+12,571,24.9131666666667
+12,572,30.0566666666667
+12,573,36.6818333333333
+12,574,33.3163333333333
+12,575,30.3741666666667
+12,576,27.7071666666667
+12,577,31.5595
+12,578,30.353
+12,579,30.4376666666667
+12,580,28.2786666666667
+12,581,27.9611666666667
+12,582,26.3948333333333
+12,583,19.9813333333333
+12,584,32.0675
+12,585,26.6276666666667
+12,586,28.6596666666667
+12,587,30.5223333333333
+12,588,27.0298333333333
+12,589,25.8233333333333
+12,590,31.6018333333333
+12,591,24.511
+12,592,27.9611666666667
+12,593,26.543
+12,594,28.321
+12,595,30.8821666666667
+12,596,27.2838333333333
+12,597,28.9771666666667
+12,598,28.0881666666667
+12,599,26.6065
+12,600,28.9771666666667
+12,601,26.5641666666667
+12,602,28.6385
+12,603,29.9296666666667
+12,604,25.4211666666667
+12,605,33.2528333333333
+12,606,34.544
+12,607,30.8186666666667
+12,608,32.9353333333333
+12,609,35.3483333333333
+12,610,27.5166666666667
+12,611,34.0571666666667
+12,612,23.7701666666667
+12,613,23.4738333333333
+12,614,30.353
+12,615,32.2156666666667
+12,616,36.2373333333333
+12,617,30.8398333333333
+12,618,27.0721666666667
+12,619,29.1041666666667
+12,620,25.1883333333333
+12,621,32.2368333333333
+12,622,33.7185
+12,623,27.3473333333333
+12,624,29.0195
+12,625,28.9136666666667
+12,626,25.8656666666667
+12,627,34.6921666666667
+12,628,30.353
+12,629,30.6493333333333
+12,630,33.1046666666667
+12,631,27.4108333333333
+12,632,28.1728333333333
+12,633,25.781
+12,634,33.5068333333333
+12,635,25.273
+12,636,27.7918333333333
+12,637,28.3633333333333
+12,638,32.9776666666667
+12,639,31.5595
+12,640,26.3313333333333
+12,641,28.5115
+12,642,30.1625
+12,643,25.2306666666667
+12,644,30.0566666666667
+12,645,26.0561666666667
+12,646,20.4893333333333
+12,647,32.5543333333333
+12,648,25.2518333333333
+12,649,24.2993333333333
+12,650,29.1465
+12,651,30.3741666666667
+12,652,27.6648333333333
+12,653,24.1935
+12,654,26.8393333333333
+12,655,32.4908333333333
+12,656,25.8233333333333
+12,657,26.6065
+12,658,26.8816666666667
+12,659,24.511
+12,660,32.0463333333333
+12,661,30.6916666666667
+12,662,28.2998333333333
+12,663,30.607
+12,664,25.8233333333333
+12,665,25.9503333333333
+12,666,28.194
+12,667,26.3313333333333
+12,668,33.1893333333333
+12,669,30.2471666666667
+12,670,30.2048333333333
+12,671,26.3101666666667
+12,672,36.9358333333333
+12,673,28.448
+12,674,24.384
+12,675,25.3365
+12,676,32.004
+12,677,26.2678333333333
+12,678,31.1573333333333
+12,679,28.4903333333333
+12,680,29.5063333333333
+12,681,30.3106666666667
+12,682,32.8506666666667
+12,683,24.8708333333333
+12,684,27.813
+12,685,24.0241666666667
+12,686,29.5486666666667
+12,687,28.7655
+12,688,29.0406666666667
+12,689,28.5115
+12,690,28.6596666666667
+12,691,31.0726666666667
+12,692,22.4366666666667
+12,693,33.5915
+12,694,32.3215
+12,695,21.9286666666667
+12,696,27.5166666666667
+12,697,39.3911666666667
+12,698,24.257
+12,699,25.8445
+12,700,23.7278333333333
+12,701,31.6018333333333
+12,702,22.9658333333333
+12,703,30.9245
+12,704,28.4691666666667
+12,705,26.2466666666667
+12,706,28.8078333333333
+12,707,26.924
+12,708,30.9033333333333
+12,709,27.6225
+12,710,29.6121666666667
+12,711,28.4691666666667
+12,712,22.4366666666667
+12,713,27.6225
+12,714,33.4221666666667
+12,715,36.1738333333333
+12,716,32.4908333333333
+12,717,18.7113333333333
+12,718,29.8873333333333
+12,719,25.2095
+12,720,18.8595
+12,721,34.1206666666667
+12,722,31.877
+12,723,30.9245
+12,724,32.2791666666667
+12,725,33.3375
+12,726,28.6173333333333
+12,727,35.4118333333333
+12,728,22.8388333333333
+12,729,31.4113333333333
+12,730,22.5636666666667
+12,731,37.8248333333333
+12,732,26.162
+12,733,30.0355
+12,734,26.416
+12,735,30.099
+12,736,30.226
+12,737,31.7711666666667
+12,738,23.876
+12,739,31.4536666666667
+12,740,27.3261666666667
+12,741,30.7975
+12,742,30.226
+12,743,26.543
+12,744,26.67
+12,745,19.1981666666667
+12,746,34.2476666666667
+12,747,26.3948333333333
+12,748,23.8336666666667
+12,749,29.2311666666667
+12,750,33.6761666666667
+12,751,32.7236666666667
+12,752,25.4
+12,753,27.559
+12,754,32.2791666666667
+12,755,23.7278333333333
+12,756,27.9611666666667
+12,757,22.2885
+12,758,31.1785
+12,759,29.9085
+12,760,27.2838333333333
+12,761,27.686
+12,762,27.3261666666667
+12,763,28.3845
+12,764,29.591
+12,765,27.559
+12,766,26.0773333333333
+12,767,27.6436666666667
+12,768,27.8976666666667
+12,769,24.4051666666667
+12,770,28.8078333333333
+12,771,31.4536666666667
+12,772,29.845
+12,773,33.2316666666667
+12,774,28.1305
+12,775,32.9141666666667
+12,776,25.146
+12,777,29.6545
+12,778,28.2998333333333
+12,779,30.6705
+12,780,29.083
+12,781,22.7118333333333
+12,782,25.8233333333333
+12,783,25.4423333333333
+12,784,29.3793333333333
+12,785,36.8511666666667
+12,786,33.782
+12,787,25.9291666666667
+12,788,30.5646666666667
+12,789,27.432
+12,790,30.4588333333333
+12,791,33.1258333333333
+12,792,25.2306666666667
+12,793,25.8021666666667
+12,794,36.7453333333333
+12,795,28.1728333333333
+12,796,26.6488333333333
+12,797,25.7175
+12,798,29.9508333333333
+12,799,23.4103333333333
+12,800,30.9033333333333
+12,801,30.48
+12,802,27.6436666666667
+12,803,33.6126666666667
+12,804,29.0195
+12,805,33.6338333333333
+12,806,27.305
+12,807,30.3953333333333
+12,808,27.2203333333333
+12,809,30.4376666666667
+12,810,32.8295
+12,811,31.4113333333333
+12,812,21.9498333333333
+12,813,30.353
+12,814,24.6803333333333
+12,815,33.02
+12,816,30.1836666666667
+12,817,26.5853333333333
+12,818,33.528
+12,819,27.5801666666667
+12,820,40.2166666666667
+12,821,30.734
+12,822,25.8233333333333
+12,823,30.1625
+12,824,29.0195
+12,825,32.512
+12,826,29.5486666666667
+12,827,28.5961666666667
+12,828,27.94
+12,829,24.892
+12,830,26.8816666666667
+12,831,26.5218333333333
+12,832,26.0138333333333
+12,833,31.0303333333333
+12,834,29.2523333333333
+12,835,35.0731666666667
+12,836,28.5961666666667
+12,837,35.433
+12,838,27.8553333333333
+12,839,32.9988333333333
+12,840,29.6756666666667
+12,841,31.8558333333333
+12,842,30.6705
+12,843,29.083
+12,844,24.1723333333333
+12,845,24.5956666666667
+12,846,31.4325
+12,847,33.2316666666667
+12,848,27.6013333333333
+12,849,34.5228333333333
+12,850,25.4
+12,851,24.2993333333333
+12,852,28.2363333333333
+12,853,28.8925
+12,854,25.1671666666667
+12,855,31.8558333333333
+12,856,26.289
+12,857,24.3205
+12,858,28.9983333333333
+12,859,25.4635
+12,860,33.2528333333333
+12,861,29.2735
+12,862,26.1196666666667
+12,863,24.8073333333333
+12,864,28.4903333333333
+12,865,30.099
+12,866,30.3741666666667
+12,867,26.5006666666667
+12,868,26.0773333333333
+12,869,22.1403333333333
+12,870,25.0825
+12,871,27.178
+12,872,26.6488333333333
+12,873,29.9296666666667
+12,874,28.194
+12,875,34.5016666666667
+12,876,26.3736666666667
+12,877,32.2156666666667
+12,878,31.3266666666667
+12,879,22.5848333333333
+12,880,29.6968333333333
+12,881,30.099
+12,882,24.2358333333333
+12,883,24.8496666666667
+12,884,25.9715
+12,885,25.908
+12,886,24.8285
+12,887,26.4371666666667
+12,888,26.5218333333333
+12,889,29.2311666666667
+12,890,26.2466666666667
+12,891,37.2956666666667
+12,892,31.4113333333333
+12,893,25.2518333333333
+12,894,28.6596666666667
+12,895,35.2636666666667
+12,896,26.0138333333333
+12,897,21.844
+12,898,25.9503333333333
+12,899,27.0721666666667
+12,900,27.8341666666667
+12,901,32.639
+12,902,31.1996666666667
+12,903,31.369
+12,904,37.719
+12,905,26.3101666666667
+12,906,33.02
+12,907,24.8073333333333
+12,908,27.7283333333333
+12,909,27.9823333333333
+12,910,27.0721666666667
+12,911,27.3896666666667
+12,912,29.1676666666667
+12,913,30.8186666666667
+12,914,30.0143333333333
+12,915,23.114
+12,916,27.5801666666667
+12,917,26.162
+12,918,28.1516666666667
+12,919,26.8393333333333
+12,920,29.4005
+12,921,24.257
+12,922,27.3473333333333
+12,923,21.7593333333333
+12,924,32.5966666666667
+12,925,34.5651666666667
+12,926,26.4795
+12,927,32.4696666666667
+12,928,29.6121666666667
+12,929,21.844
+12,930,27.0086666666667
+12,931,31.8981666666667
+12,932,30.5011666666667
+12,933,31.7923333333333
+12,934,25.5693333333333
+12,935,27.1991666666667
+12,936,21.9075
+12,937,30.5646666666667
+12,938,30.6281666666667
+12,939,24.2781666666667
+12,940,28.8501666666667
+12,941,32.385
+12,942,32.1098333333333
+12,943,34.0783333333333
+12,944,32.1733333333333
+12,945,27.6436666666667
+12,946,29.3581666666667
+12,947,33.7608333333333
+12,948,30.6916666666667
+12,949,31.3266666666667
+12,950,34.1206666666667
+12,951,36.8723333333333
+12,952,28.448
+12,953,25.6328333333333
+12,954,24.7861666666667
+12,955,29.3158333333333
+12,956,29.5486666666667
+12,957,24.5321666666667
+12,958,27.305
+12,959,26.1196666666667
+12,960,29.6121666666667
+12,961,26.3101666666667
+12,962,36.7453333333333
+12,963,30.1201666666667
+12,964,26.5006666666667
+12,965,25.6751666666667
+12,966,30.7763333333333
+12,967,23.0716666666667
+12,968,22.1191666666667
+12,969,29.2523333333333
+12,970,32.4485
+12,971,30.1413333333333
+12,972,30.8821666666667
+12,973,26.9028333333333
+12,974,31.2843333333333
+12,975,30.8398333333333
+12,976,27.8341666666667
+12,977,25.019
+12,978,28.3421666666667
+12,979,31.9828333333333
+12,980,28.1305
+12,981,22.1191666666667
+12,982,32.0251666666667
+12,983,29.1888333333333
+12,984,33.5068333333333
+12,985,34.5863333333333
+12,986,28.7866666666667
+12,987,26.7335
+12,988,25.5058333333333
+12,989,32.4696666666667
+12,990,24.2146666666667
+12,991,22.987
+12,992,28.1728333333333
+12,993,30.4165
+12,994,26.7546666666667
+12,995,25.9715
+12,996,30.0566666666667
+12,997,28.321
+12,998,27.6225
+12,999,34.3746666666667
+12,1000,31.0515
+13,1,27.9823333333333
+13,2,23.2198333333333
+13,3,26.3736666666667
+13,4,25.3576666666667
+13,5,24.4051666666667
+13,6,27.3473333333333
+13,7,19.0711666666667
+13,8,27.1145
+13,9,27.6013333333333
+13,10,19.939
+13,11,30.2471666666667
+13,12,21.8016666666667
+13,13,28.9348333333333
+13,14,23.1351666666667
+13,15,29.591
+13,16,21.0185
+13,17,19.8331666666667
+13,18,22.8176666666667
+13,19,23.9395
+13,20,26.6065
+13,21,23.2198333333333
+13,22,30.2683333333333
+13,23,26.5218333333333
+13,24,30.861
+13,25,29.4005
+13,26,29.2311666666667
+13,27,31.8558333333333
+13,28,28.9348333333333
+13,29,28.5326666666667
+13,30,26.289
+13,31,30.5435
+13,32,24.6168333333333
+13,33,29.2311666666667
+13,34,19.8755
+13,35,29.0618333333333
+13,36,31.9193333333333
+13,37,26.5641666666667
+13,38,29.4005
+13,39,29.7815
+13,40,25.8656666666667
+13,41,28.6173333333333
+13,42,34.3323333333333
+13,43,31.9193333333333
+13,44,29.7391666666667
+13,45,30.7128333333333
+13,46,29.3581666666667
+13,47,20.9973333333333
+13,48,28.5326666666667
+13,49,22.987
+13,50,27.8976666666667
+13,51,24.6168333333333
+13,52,27.8976666666667
+13,53,28.2363333333333
+13,54,28.6596666666667
+13,55,26.4583333333333
+13,56,24.9978333333333
+13,57,25.273
+13,58,23.8548333333333
+13,59,32.9353333333333
+13,60,25.6963333333333
+13,61,28.0881666666667
+13,62,29.2735
+13,63,28.8501666666667
+13,64,26.0985
+13,65,25.6116666666667
+13,66,23.5373333333333
+13,67,26.5853333333333
+13,68,28.6173333333333
+13,69,28.8501666666667
+13,70,22.7118333333333
+13,71,30.5435
+13,72,27.9188333333333
+13,73,30.4165
+13,74,33.2105
+13,75,21.2513333333333
+13,76,26.6276666666667
+13,77,34.29
+13,78,25.1036666666667
+13,79,20.6586666666667
+13,80,21.0608333333333
+13,81,26.9663333333333
+13,82,27.2415
+13,83,34.0995
+13,84,25.146
+13,85,26.416
+13,86,24.6803333333333
+13,87,26.0773333333333
+13,88,26.4371666666667
+13,89,29.0618333333333
+13,90,28.194
+13,91,31.2631666666667
+13,92,23.9818333333333
+13,93,25.4635
+13,94,22.0556666666667
+13,95,23.0293333333333
+13,96,29.0618333333333
+13,97,31.5595
+13,98,26.6276666666667
+13,99,27.178
+13,100,23.114
+13,101,29.6333333333333
+13,102,24.2358333333333
+13,103,28.575
+13,104,31.9828333333333
+13,105,17.3566666666667
+13,106,29.9296666666667
+13,107,23.2621666666667
+13,108,23.5585
+13,109,23.876
+13,110,24.257
+13,111,25.4846666666667
+13,112,32.3003333333333
+13,113,24.765
+13,114,22.2673333333333
+13,115,26.2043333333333
+13,116,25.0401666666667
+13,117,25.0825
+13,118,26.5006666666667
+13,119,27.9823333333333
+13,120,28.7655
+13,121,28.4268333333333
+13,122,23.8125
+13,123,28.321
+13,124,24.257
+13,125,23.5373333333333
+13,126,31.0303333333333
+13,127,23.2198333333333
+13,128,26.2043333333333
+13,129,27.4955
+13,130,31.0091666666667
+13,131,27.4955
+13,132,29.2735
+13,133,32.2791666666667
+13,134,28.321
+13,135,23.1775
+13,136,26.9028333333333
+13,137,26.4583333333333
+13,138,22.3096666666667
+13,139,24.9343333333333
+13,140,27.051
+13,141,23.6643333333333
+13,142,28.6385
+13,143,31.3478333333333
+13,144,26.5641666666667
+13,145,22.2038333333333
+13,146,25.9291666666667
+13,147,27.4743333333333
+13,148,22.606
+13,149,30.4588333333333
+13,150,27.6225
+13,151,36.2796666666667
+13,152,24.9766666666667
+13,153,28.8713333333333
+13,154,24.7861666666667
+13,155,21.5053333333333
+13,156,29.2523333333333
+13,157,21.1455
+13,158,23.241
+13,159,24.2993333333333
+13,160,30.48
+13,161,29.0406666666667
+13,162,22.3943333333333
+13,163,30.2048333333333
+13,164,32.8506666666667
+13,165,28.2786666666667
+13,166,31.5806666666667
+13,167,30.099
+13,168,21.5476666666667
+13,169,29.5063333333333
+13,170,21.7593333333333
+13,171,23.3045
+13,172,27.1991666666667
+13,173,27.305
+13,174,21.3995
+13,175,26.2466666666667
+13,176,25.2518333333333
+13,177,26.3101666666667
+13,178,25.2306666666667
+13,179,25.8868333333333
+13,180,32.4485
+13,181,21.59
+13,182,25.6116666666667
+13,183,26.3948333333333
+13,184,25.8656666666667
+13,185,25.7386666666667
+13,186,26.0561666666667
+13,187,21.082
+13,188,29.8026666666667
+13,189,24.6591666666667
+13,190,27.7283333333333
+13,191,22.1826666666667
+13,192,24.2358333333333
+13,193,26.2466666666667
+13,194,32.9565
+13,195,20.447
+13,196,27.0933333333333
+13,197,26.8181666666667
+13,198,25.9291666666667
+13,199,26.7758333333333
+13,200,31.242
+13,201,26.1408333333333
+13,202,29.1676666666667
+13,203,23.7913333333333
+13,204,28.7443333333333
+13,205,22.9446666666667
+13,206,25.4635
+13,207,20.828
+13,208,29.9931666666667
+13,209,25.9926666666667
+13,210,27.2203333333333
+13,211,28.448
+13,212,31.9616666666667
+13,213,23.1563333333333
+13,214,22.9023333333333
+13,215,26.0985
+13,216,29.5275
+13,217,23.6855
+13,218,18.5843333333333
+13,219,28.5961666666667
+13,220,31.0938333333333
+13,221,25.4423333333333
+13,222,22.7541666666667
+13,223,23.876
+13,224,29.0195
+13,225,24.765
+13,226,29.0406666666667
+13,227,26.2255
+13,228,25.5481666666667
+13,229,21.7593333333333
+13,230,32.8083333333333
+13,231,28.1305
+13,232,28.3633333333333
+13,233,29.0618333333333
+13,234,22.479
+13,235,25.5693333333333
+13,236,25.9503333333333
+13,237,27.0721666666667
+13,238,27.6013333333333
+13,239,27.6225
+13,240,22.987
+13,241,27.2415
+13,242,26.9451666666667
+13,243,31.1573333333333
+13,244,29.6756666666667
+13,245,28.6385
+13,246,34.5016666666667
+13,247,25.9291666666667
+13,248,25.6963333333333
+13,249,30.7128333333333
+13,250,25.3365
+13,251,24.4475
+13,252,27.7283333333333
+13,253,27.6225
+13,254,26.035
+13,255,26.5853333333333
+13,256,25.6116666666667
+13,257,30.0355
+13,258,19.3463333333333
+13,259,23.4315
+13,260,24.384
+13,261,29.1041666666667
+13,262,25.7386666666667
+13,263,28.2998333333333
+13,264,28.2998333333333
+13,265,17.6106666666667
+13,266,21.2513333333333
+13,267,29.4428333333333
+13,268,26.7123333333333
+13,269,30.48
+13,270,25.9503333333333
+13,271,19.2828333333333
+13,272,25.8868333333333
+13,273,25.9926666666667
+13,274,20.1295
+13,275,28.4903333333333
+13,276,31.2843333333333
+13,277,24.9766666666667
+13,278,27.1356666666667
+13,279,26.5641666666667
+13,280,28.9136666666667
+13,281,26.2678333333333
+13,282,23.5796666666667
+13,283,22.5001666666667
+13,284,28.4268333333333
+13,285,30.6705
+13,286,23.5161666666667
+13,287,25.3788333333333
+13,288,20.7433333333333
+13,289,27.305
+13,290,23.1986666666667
+13,291,21.1243333333333
+13,292,25.5693333333333
+13,293,22.3096666666667
+13,294,32.1945
+13,295,27.8976666666667
+13,296,31.1996666666667
+13,297,25.0401666666667
+13,298,21.7593333333333
+13,299,26.3525
+13,300,24.638
+13,301,28.8501666666667
+13,302,23.3045
+13,303,25.0401666666667
+13,304,27.5166666666667
+13,305,27.3896666666667
+13,306,26.035
+13,307,24.7226666666667
+13,308,29.4216666666667
+13,309,26.6276666666667
+13,310,31.2843333333333
+13,311,26.2678333333333
+13,312,26.6488333333333
+13,313,25.1671666666667
+13,314,24.3628333333333
+13,315,25.4423333333333
+13,316,26.6911666666667
+13,317,28.3421666666667
+13,318,31.5806666666667
+13,319,19.812
+13,320,26.2043333333333
+13,321,30.988
+13,322,23.8336666666667
+13,323,30.5011666666667
+13,324,27.7495
+13,325,30.0355
+13,326,25.527
+13,327,27.5378333333333
+13,328,27.0933333333333
+13,329,31.6018333333333
+13,330,29.1888333333333
+13,331,35.9198333333333
+13,332,27.3896666666667
+13,333,29.4851666666667
+13,334,27.3261666666667
+13,335,26.7335
+13,336,28.3845
+13,337,24.638
+13,338,29.4005
+13,339,27.8553333333333
+13,340,24.7861666666667
+13,341,24.4051666666667
+13,342,26.6911666666667
+13,343,26.2466666666667
+13,344,29.5486666666667
+13,345,21.0608333333333
+13,346,29.5063333333333
+13,347,31.6653333333333
+13,348,28.2151666666667
+13,349,26.7335
+13,350,31.5595
+13,351,26.3948333333333
+13,352,30.7128333333333
+13,353,26.7335
+13,354,32.0675
+13,355,24.257
+13,356,24.2358333333333
+13,357,30.3741666666667
+13,358,27.2415
+13,359,26.5853333333333
+13,360,28.0458333333333
+13,361,29.9296666666667
+13,362,21.8228333333333
+13,363,31.0515
+13,364,24.8073333333333
+13,365,28.956
+13,366,30.5858333333333
+13,367,21.5476666666667
+13,368,29.7603333333333
+13,369,25.6963333333333
+13,370,20.4046666666667
+13,371,26.0561666666667
+13,372,19.685
+13,373,28.3633333333333
+13,374,26.4371666666667
+13,375,29.083
+13,376,22.7753333333333
+13,377,25.9715
+13,378,30.6493333333333
+13,379,27.7706666666667
+13,380,28.8925
+13,381,31.7288333333333
+13,382,26.4795
+13,383,30.6916666666667
+13,384,19.3886666666667
+13,385,27.813
+13,386,25.9715
+13,387,31.8135
+13,388,25.4423333333333
+13,389,24.5956666666667
+13,390,29.4851666666667
+13,391,23.8336666666667
+13,392,26.7335
+13,393,24.0453333333333
+13,394,23.8125
+13,395,27.7706666666667
+13,396,26.7123333333333
+13,397,24.9766666666667
+13,398,23.241
+13,399,22.5636666666667
+13,400,24.2146666666667
+13,401,23.368
+13,402,27.0086666666667
+13,403,28.4056666666667
+13,404,22.2885
+13,405,29.4428333333333
+13,406,25.4211666666667
+13,407,26.6276666666667
+13,408,25.781
+13,409,23.7913333333333
+13,410,26.3101666666667
+13,411,31.4748333333333
+13,412,32.3638333333333
+13,413,26.9451666666667
+13,414,23.8548333333333
+13,415,28.1728333333333
+13,416,21.6111666666667
+13,417,24.1088333333333
+13,418,25.0613333333333
+13,419,27.4955
+13,420,29.1041666666667
+13,421,26.6911666666667
+13,422,33.8455
+13,423,23.4738333333333
+13,424,26.2678333333333
+13,425,31.3055
+13,426,28.6808333333333
+13,427,31.2843333333333
+13,428,23.2621666666667
+13,429,22.9023333333333
+13,430,19.05
+13,431,23.5585
+13,432,22.7118333333333
+13,433,28.7655
+13,434,25.781
+13,435,27.5801666666667
+13,436,32.766
+13,437,34.8615
+13,438,25.3576666666667
+13,439,30.0143333333333
+13,440,24.511
+13,441,26.289
+13,442,32.0463333333333
+13,443,23.1775
+13,444,28.8713333333333
+13,445,26.3736666666667
+13,446,25.5481666666667
+13,447,27.3261666666667
+13,448,29.1676666666667
+13,449,23.3891666666667
+13,450,20.1506666666667
+13,451,19.2405
+13,452,23.5796666666667
+13,453,26.0773333333333
+13,454,30.3953333333333
+13,455,22.7541666666667
+13,456,28.7655
+13,457,32.3215
+13,458,27.3685
+13,459,24.7861666666667
+13,460,30.5223333333333
+13,461,27.2626666666667
+13,462,28.956
+13,463,31.2843333333333
+13,464,28.067
+13,465,23.9818333333333
+13,466,19.177
+13,467,22.5636666666667
+13,468,24.384
+13,469,25.8445
+13,470,26.9663333333333
+13,471,32.0463333333333
+13,472,22.7965
+13,473,27.9823333333333
+13,474,31.7711666666667
+13,475,29.9085
+13,476,24.0876666666667
+13,477,26.797
+13,478,31.8558333333333
+13,479,26.8393333333333
+13,480,27.8553333333333
+13,481,25.9503333333333
+13,482,26.67
+13,483,24.6168333333333
+13,484,25.7175
+13,485,27.7918333333333
+13,486,21.8016666666667
+13,487,21.2513333333333
+13,488,25.146
+13,489,23.9606666666667
+13,490,26.416
+13,491,30.1836666666667
+13,492,27.2203333333333
+13,493,27.8765
+13,494,22.3943333333333
+13,495,29.464
+13,496,29.6756666666667
+13,497,24.8073333333333
+13,498,26.416
+13,499,26.7546666666667
+13,500,20.8491666666667
+13,501,20.7856666666667
+13,502,27.1991666666667
+13,503,27.305
+13,504,21.5688333333333
+13,505,23.4315
+13,506,25.2518333333333
+13,507,27.7918333333333
+13,508,27.305
+13,509,20.7645
+13,510,26.3101666666667
+13,511,26.8816666666667
+13,512,29.2311666666667
+13,513,25.3788333333333
+13,514,29.0618333333333
+13,515,26.5006666666667
+13,516,33.0623333333333
+13,517,25.3365
+13,518,23.5161666666667
+13,519,30.2471666666667
+13,520,29.2946666666667
+13,521,29.4851666666667
+13,522,27.178
+13,523,23.2621666666667
+13,524,26.7335
+13,525,26.6065
+13,526,30.1413333333333
+13,527,25.0825
+13,528,29.6333333333333
+13,529,20.6375
+13,530,29.1888333333333
+13,531,24.3205
+13,532,31.6653333333333
+13,533,30.7763333333333
+13,534,29.7391666666667
+13,535,23.495
+13,536,27.178
+13,537,25.1036666666667
+13,538,20.2776666666667
+13,539,28.6385
+13,540,23.4315
+13,541,30.5646666666667
+13,542,26.7758333333333
+13,543,31.2843333333333
+13,544,29.6545
+13,545,23.876
+13,546,23.622
+13,547,29.7815
+13,548,25.8233333333333
+13,549,28.1516666666667
+13,550,22.7753333333333
+13,551,27.8765
+13,552,23.3256666666667
+13,553,27.1991666666667
+13,554,27.178
+13,555,28.067
+13,556,24.638
+13,557,22.7753333333333
+13,558,23.1986666666667
+13,559,28.2575
+13,560,30.0143333333333
+13,561,28.5961666666667
+13,562,27.432
+13,563,25.6751666666667
+13,564,18.0551666666667
+13,565,32.3003333333333
+13,566,28.7655
+13,567,26.416
+13,568,25.4846666666667
+13,569,32.9776666666667
+13,570,29.9508333333333
+13,571,23.9183333333333
+13,572,27.7918333333333
+13,573,26.9875
+13,574,28.702
+13,575,25.8233333333333
+13,576,23.876
+13,577,22.0133333333333
+13,578,21.5265
+13,579,26.67
+13,580,19.812
+13,581,27.3261666666667
+13,582,22.3943333333333
+13,583,26.5641666666667
+13,584,29.5275
+13,585,36.4278333333333
+13,586,24.638
+13,587,29.1888333333333
+13,588,21.8228333333333
+13,589,28.2998333333333
+13,590,21.971
+13,591,28.1305
+13,592,24.9766666666667
+13,593,22.7541666666667
+13,594,25.527
+13,595,25.1883333333333
+13,596,27.1145
+13,597,27.813
+13,598,30.3106666666667
+13,599,26.3101666666667
+13,600,32.385
+13,601,26.67
+13,602,25.3365
+13,603,29.4851666666667
+13,604,20.1295
+13,605,21.0185
+13,606,26.3313333333333
+13,607,30.4165
+13,608,27.2626666666667
+13,609,24.7226666666667
+13,610,23.9183333333333
+13,611,27.0933333333333
+13,612,31.3266666666667
+13,613,28.0458333333333
+13,614,24.4263333333333
+13,615,31.5383333333333
+13,616,24.8708333333333
+13,617,24.4475
+13,618,27.3896666666667
+13,619,26.1408333333333
+13,620,27.4108333333333
+13,621,29.4428333333333
+13,622,24.6803333333333
+13,623,24.6591666666667
+13,624,26.6276666666667
+13,625,29.5486666666667
+13,626,30.4165
+13,627,21.7593333333333
+13,628,26.2678333333333
+13,629,26.6276666666667
+13,630,24.0241666666667
+13,631,28.5961666666667
+13,632,26.0561666666667
+13,633,26.5006666666667
+13,634,29.0195
+13,635,30.5435
+13,636,24.7861666666667
+13,637,28.2786666666667
+13,638,22.8176666666667
+13,639,26.416
+13,640,28.8078333333333
+13,641,21.1455
+13,642,27.9823333333333
+13,643,26.5853333333333
+13,644,34.5651666666667
+13,645,28.0246666666667
+13,646,27.8553333333333
+13,647,27.3896666666667
+13,648,25.4846666666667
+13,649,25.908
+13,650,27.3473333333333
+13,651,24.6168333333333
+13,652,25.1036666666667
+13,653,29.2735
+13,654,26.1196666666667
+13,655,30.9456666666667
+13,656,32.512
+13,657,28.702
+13,658,29.4851666666667
+13,659,28.575
+13,660,33.5491666666667
+13,661,29.0618333333333
+13,662,32.5966666666667
+13,663,25.3788333333333
+13,664,22.5636666666667
+13,665,22.987
+13,666,26.2255
+13,667,24.4051666666667
+13,668,29.7391666666667
+13,669,21.0608333333333
+13,670,22.5848333333333
+13,671,25.6116666666667
+13,672,25.0825
+13,673,22.0133333333333
+13,674,27.6225
+13,675,25.8233333333333
+13,676,28.9348333333333
+13,677,30.6281666666667
+13,678,21.8228333333333
+13,679,28.2151666666667
+13,680,26.0561666666667
+13,681,23.7278333333333
+13,682,25.8445
+13,683,25.1671666666667
+13,684,24.1935
+13,685,26.6488333333333
+13,686,31.496
+13,687,24.0876666666667
+13,688,21.6535
+13,689,18.034
+13,690,25.908
+13,691,31.623
+13,692,29.8873333333333
+13,693,24.638
+13,694,26.9663333333333
+13,695,28.6808333333333
+13,696,25.7386666666667
+13,697,28.702
+13,698,24.4686666666667
+13,699,30.861
+13,700,25.2518333333333
+13,701,30.9456666666667
+13,702,25.1671666666667
+13,703,31.5383333333333
+13,704,21.1455
+13,705,21.1031666666667
+13,706,31.6441666666667
+13,707,25.3365
+13,708,22.6483333333333
+13,709,29.0195
+13,710,29.0618333333333
+13,711,29.7603333333333
+13,712,23.6643333333333
+13,713,22.8811666666667
+13,714,27.1991666666667
+13,715,29.8238333333333
+13,716,28.1305
+13,717,28.9136666666667
+13,718,21.4841666666667
+13,719,33.7185
+13,720,25.6116666666667
+13,721,27.1356666666667
+13,722,24.3416666666667
+13,723,28.4268333333333
+13,724,27.0721666666667
+13,725,22.2673333333333
+13,726,26.7123333333333
+13,727,18.3303333333333
+13,728,29.6333333333333
+13,729,26.162
+13,730,25.6328333333333
+13,731,24.9978333333333
+13,732,31.75
+13,733,24.892
+13,734,25.527
+13,735,25.0825
+13,736,24.4686666666667
+13,737,23.0928333333333
+13,738,26.2255
+13,739,24.765
+13,740,23.5796666666667
+13,741,28.1728333333333
+13,742,22.098
+13,743,29.8661666666667
+13,744,23.114
+13,745,31.1573333333333
+13,746,24.7861666666667
+13,747,22.3943333333333
+13,748,30.2048333333333
+13,749,26.6276666666667
+13,750,27.8341666666667
+13,751,32.1521666666667
+13,752,26.4583333333333
+13,753,25.4423333333333
+13,754,23.4738333333333
+13,755,27.305
+13,756,31.6653333333333
+13,757,24.0665
+13,758,20.2776666666667
+13,759,27.813
+13,760,30.1836666666667
+13,761,28.2998333333333
+13,762,24.4898333333333
+13,763,20.7433333333333
+13,764,26.8181666666667
+13,765,33.4645
+13,766,24.1511666666667
+13,767,21.6535
+13,768,26.8605
+13,769,21.8863333333333
+13,770,28.3845
+13,771,27.178
+13,772,25.019
+13,773,32.2368333333333
+13,774,28.8078333333333
+13,775,29.1676666666667
+13,776,35.3906666666667
+13,777,23.622
+13,778,27.5801666666667
+13,779,29.972
+13,780,26.7335
+13,781,30.3953333333333
+13,782,26.9875
+13,783,20.7645
+13,784,28.5115
+13,785,21.5476666666667
+13,786,24.13
+13,787,19.8755
+13,788,23.8971666666667
+13,789,19.7273333333333
+13,790,22.479
+13,791,20.447
+13,792,28.6385
+13,793,26.7335
+13,794,29.2311666666667
+13,795,29.6121666666667
+13,796,29.2946666666667
+13,797,29.3158333333333
+13,798,27.8341666666667
+13,799,25.781
+13,800,19.685
+13,801,37.1263333333333
+13,802,22.733
+13,803,27.7495
+13,804,20.5951666666667
+13,805,29.5275
+13,806,23.495
+13,807,26.4583333333333
+13,808,23.6855
+13,809,27.7918333333333
+13,810,26.1831666666667
+13,811,34.3535
+13,812,26.5006666666667
+13,813,25.2095
+13,814,26.6276666666667
+13,815,29.8026666666667
+13,816,28.0458333333333
+13,817,23.7066666666667
+13,818,26.3948333333333
+13,819,28.0035
+13,820,23.6643333333333
+13,821,23.5796666666667
+13,822,25.7386666666667
+13,823,24.2993333333333
+13,824,35.3271666666667
+13,825,30.6916666666667
+13,826,26.3313333333333
+13,827,26.0773333333333
+13,828,21.7805
+13,829,31.7711666666667
+13,830,29.0195
+13,831,22.0768333333333
+13,832,31.1785
+13,833,27.8341666666667
+13,834,22.8811666666667
+13,835,21.9921666666667
+13,836,26.7546666666667
+13,837,29.5486666666667
+13,838,24.384
+13,839,30.226
+13,840,30.1201666666667
+13,841,32.7236666666667
+13,842,25.146
+13,843,30.7128333333333
+13,844,24.892
+13,845,23.9183333333333
+13,846,26.3736666666667
+13,847,27.2415
+13,848,23.2621666666667
+13,849,25.6751666666667
+13,850,21.1666666666667
+13,851,30.099
+13,852,24.4051666666667
+13,853,27.8976666666667
+13,854,29.1888333333333
+13,855,24.6168333333333
+13,856,26.0773333333333
+13,857,22.8811666666667
+13,858,23.749
+13,859,28.5538333333333
+13,860,23.9395
+13,861,27.2415
+13,862,30.4165
+13,863,31.6653333333333
+13,864,28.4903333333333
+13,865,26.3525
+13,866,24.6168333333333
+13,867,32.004
+13,868,27.4531666666667
+13,869,27.9823333333333
+13,870,26.6488333333333
+13,871,28.321
+13,872,24.8285
+13,873,28.7866666666667
+13,874,29.21
+13,875,27.0298333333333
+13,876,25.1883333333333
+13,877,25.654
+13,878,25.908
+13,879,25.0613333333333
+13,880,21.7593333333333
+13,881,22.2673333333333
+13,882,23.0505
+13,883,20.6586666666667
+13,884,30.099
+13,885,22.0768333333333
+13,886,26.4583333333333
+13,887,30.48
+13,888,22.1403333333333
+13,889,27.2203333333333
+13,890,32.1733333333333
+13,891,28.829
+13,892,25.9291666666667
+13,893,24.003
+13,894,30.5223333333333
+13,895,24.3628333333333
+13,896,27.813
+13,897,32.512
+13,898,26.1408333333333
+13,899,20.6586666666667
+13,900,31.6441666666667
+13,901,31.9193333333333
+13,902,27.432
+13,903,31.0515
+13,904,25.9503333333333
+13,905,33.8243333333333
+13,906,22.1191666666667
+13,907,24.13
+13,908,24.0876666666667
+13,909,23.5373333333333
+13,910,22.1615
+13,911,24.1511666666667
+13,912,27.94
+13,913,22.9235
+13,914,22.4155
+13,915,27.1145
+13,916,31.7711666666667
+13,917,28.2363333333333
+13,918,27.1145
+13,919,31.1996666666667
+13,920,30.2471666666667
+13,921,33.5915
+13,922,26.543
+13,923,27.4743333333333
+13,924,29.8661666666667
+13,925,19.1981666666667
+13,926,29.6121666666667
+13,927,23.8336666666667
+13,928,23.5161666666667
+13,929,28.2786666666667
+13,930,28.2998333333333
+13,931,23.0928333333333
+13,932,26.924
+13,933,28.2151666666667
+13,934,27.6225
+13,935,18.4361666666667
+13,936,27.0933333333333
+13,937,30.0566666666667
+13,938,31.6653333333333
+13,939,25.6751666666667
+13,940,26.0985
+13,941,25.1671666666667
+13,942,21.4841666666667
+13,943,22.5213333333333
+13,944,23.1986666666667
+13,945,24.2146666666667
+13,946,23.5796666666667
+13,947,21.463
+13,948,19.7273333333333
+13,949,28.1516666666667
+13,950,29.7815
+13,951,25.146
+13,952,29.464
+13,953,25.1248333333333
+13,954,27.4955
+13,955,23.241
+13,956,23.114
+13,957,24.5956666666667
+13,958,25.1036666666667
+13,959,28.1516666666667
+13,960,22.225
+13,961,27.559
+13,962,28.575
+13,963,27.3261666666667
+13,964,28.5538333333333
+13,965,23.368
+13,966,25.7386666666667
+13,967,24.2781666666667
+13,968,21.5053333333333
+13,969,20.447
+13,970,24.5956666666667
+13,971,31.5595
+13,972,27.686
+13,973,21.1455
+13,974,28.829
+13,975,27.9611666666667
+13,976,22.6483333333333
+13,977,22.2673333333333
+13,978,26.6065
+13,979,28.7443333333333
+13,980,24.7015
+13,981,21.6746666666667
+13,982,23.2833333333333
+13,983,22.5636666666667
+13,984,23.114
+13,985,21.1878333333333
+13,986,29.3793333333333
+13,987,31.2631666666667
+13,988,23.4103333333333
+13,989,29.2735
+13,990,28.6596666666667
+13,991,24.9343333333333
+13,992,23.8336666666667
+13,993,19.3675
+13,994,23.3891666666667
+13,995,24.6803333333333
+13,996,25.2518333333333
+13,997,20.3411666666667
+13,998,21.3571666666667
+13,999,20.7433333333333
+13,1000,24.257
+14,1,26.6615333333333
+14,2,33.5999666666667
+14,3,48.5775
+14,4,39.0779
+14,5,38.0026333333333
+14,6,35.9875666666667
+14,7,37.7867333333333
+14,8,41.2538333333333
+14,9,41.148
+14,10,31.0599666666667
+14,11,33.4687333333333
+14,12,36.0087333333333
+14,13,35.6700666666667
+14,14,36.6649
+14,15,30.8313666666667
+14,16,32.6728666666667
+14,17,43.1038
+14,18,26.7377333333333
+14,19,40.4071666666667
+14,20,38.9932333333333
+14,21,40.132
+14,22,43.1165
+14,23,41.1734
+14,24,33.4645
+14,25,31.5171666666667
+14,26,35.9029
+14,27,38.7561666666667
+14,28,42.8667333333333
+14,29,40.6484666666667
+14,30,44.7463333333333
+14,31,32.1564
+14,32,35.5007333333333
+14,33,48.2854
+14,34,32.6601666666667
+14,35,40.2209
+14,36,39.624
+14,37,36.2500333333333
+14,38,34.4424
+14,39,41.5798
+14,40,40.9998333333333
+14,41,30.5519666666667
+14,42,42.2571333333333
+14,43,37.8671666666667
+14,44,40.8347333333333
+14,45,34.036
+14,46,43.7557333333333
+14,47,41.2538333333333
+14,48,28.0246666666667
+14,49,28.5792333333333
+14,50,37.8290666666667
+14,51,40.4071666666667
+14,52,49.3183333333333
+14,53,39.6875
+14,54,44.7251666666667
+14,55,40.4960666666667
+14,56,45.2374
+14,57,36.5379
+14,58,42.6974
+14,59,40.2632333333333
+14,60,38.9932333333333
+14,61,32.7702333333333
+14,62,41.0040666666667
+14,63,42.3545
+14,64,34.7853
+14,65,34.9334666666667
+14,66,40.4706666666667
+14,67,39.8991666666667
+14,68,38.8831666666667
+14,69,44.2214
+14,70,38.1719666666667
+14,71,45.9994
+14,72,36.6818333333333
+14,73,39.3742333333333
+14,74,44.3484
+14,75,41.4951333333333
+14,76,34.4424
+14,77,40.8982333333333
+14,78,38.862
+14,79,33.0835
+14,80,39.5689666666667
+14,81,37.2745
+14,82,38.7180666666667
+14,83,41.0675666666667
+14,84,43.9250666666667
+14,85,28.2405666666667
+14,86,31.9489666666667
+14,87,32.1775666666667
+14,88,41.1310666666667
+14,89,28.9856333333333
+14,90,43.1842333333333
+14,91,31.4875333333333
+14,92,34.8403333333333
+14,93,33.3671333333333
+14,94,43.9843333333333
+14,95,28.829
+14,96,33.2189666666667
+14,97,33.3417333333333
+14,98,44.3060666666667
+14,99,39.5012333333333
+14,100,30.6578
+14,101,41.2792333333333
+14,102,35.6277333333333
+14,103,46.5031666666667
+14,104,41.9735
+14,105,34.3323333333333
+14,106,30.2514
+14,107,44.4119
+14,108,31.6357
+14,109,30.7805666666667
+14,110,42.3206333333333
+14,111,42.7355
+14,112,33.8497333333333
+14,113,35.2044
+14,114,34.4000666666667
+14,115,40.4071666666667
+14,116,43.1419
+14,117,41.1903333333333
+14,118,42.2486666666667
+14,119,42.4645666666667
+14,120,29.2819666666667
+14,121,42.2740666666667
+14,122,39.5562666666667
+14,123,41.1776333333333
+14,124,40.513
+14,125,35.5176666666667
+14,126,34.3365666666667
+14,127,42.1047333333333
+14,128,36.8511666666667
+14,129,39.3530666666667
+14,130,41.6179
+14,131,47.2016666666667
+14,132,34.7429666666667
+14,133,44.1325
+14,134,34.0614
+14,135,38.0153333333333
+14,136,37.7825
+14,137,34.7768333333333
+14,138,46.99
+14,139,35.8817333333333
+14,140,43.6075666666667
+14,141,37.1898333333333
+14,142,40.4749
+14,143,36.7749666666667
+14,144,32.7236666666667
+14,145,45.212
+14,146,43.688
+14,147,42.8709666666667
+14,148,36.6183333333333
+14,149,36.0722333333333
+14,150,30.4038
+14,151,45.0469
+14,152,35.6108
+14,153,46.4185
+14,154,36.0722333333333
+14,155,46.99
+14,156,43.7811333333333
+14,157,39.8568333333333
+14,158,47.752
+14,159,33.9217
+14,160,45.4871666666667
+14,161,34.2138
+14,162,42.2317333333333
+14,163,40.4114
+14,164,36.0468333333333
+14,165,31.0853666666667
+14,166,36.5802333333333
+14,167,33.0877333333333
+14,168,34.8403333333333
+14,169,41.6771666666667
+14,170,30.3995666666667
+14,171,38.1
+14,172,38.2524
+14,173,49.1701666666667
+14,174,41.0040666666667
+14,175,39.9880666666667
+14,176,36.5590666666667
+14,177,37.4438333333333
+14,178,36.8935
+14,179,38.608
+14,180,35.0562333333333
+14,181,40.3309666666667
+14,182,37.0078
+14,183,35.4584
+14,184,35.7293333333333
+14,185,34.9758
+14,186,40.7966333333333
+14,187,39.6451666666667
+14,188,35.9452333333333
+14,189,40.0515666666667
+14,190,41.7195
+14,191,39.8187333333333
+14,192,42.3587333333333
+14,193,40.0473333333333
+14,194,32.4527333333333
+14,195,29.1465
+14,196,40.3690666666667
+14,197,41.3850666666667
+14,198,36.7665
+14,199,44.4288333333333
+14,200,37.0205
+14,201,42.7820666666667
+14,202,38.6545666666667
+14,203,46.1221666666667
+14,204,35.3314
+14,205,43.307
+14,206,35.3822
+14,207,42.037
+14,208,36.2077
+14,209,31.0345666666667
+14,210,35.9875666666667
+14,211,33.8920666666667
+14,212,39.8187333333333
+14,213,36.4066666666667
+14,214,38.2058333333333
+14,215,36.6437333333333
+14,216,34.163
+14,217,43.0360666666667
+14,218,33.5957333333333
+14,219,36.1992333333333
+14,220,34.5905666666667
+14,221,33.6169
+14,222,36.9612333333333
+14,223,38.3159
+14,224,42.1894
+14,225,34.6752333333333
+14,226,37.2364
+14,227,34.2095666666667
+14,228,28.6385
+14,229,36.0891666666667
+14,230,31.1827333333333
+14,231,43.9716333333333
+14,232,43.3535666666667
+14,233,38.354
+14,234,32.2834
+14,235,35.179
+14,236,30.9287333333333
+14,237,28.6215666666667
+14,238,35.0943333333333
+14,239,31.8262
+14,240,41.1310666666667
+14,241,35.6446666666667
+14,242,42.291
+14,243,39.8399
+14,244,40.8770666666667
+14,245,45.3432333333333
+14,246,27.6394333333333
+14,247,32.1352333333333
+14,248,43.4170666666667
+14,249,41.5925
+14,250,34.0402333333333
+14,251,53.2553333333333
+14,252,29.8111333333333
+14,253,42.0200666666667
+14,254,43.2858333333333
+14,255,38.6715
+14,256,29.3708666666667
+14,257,35.5049666666667
+14,258,44.5558333333333
+14,259,39.4123333333333
+14,260,30.9964666666667
+14,261,37.2194666666667
+14,262,35.5938666666667
+14,263,38.3413
+14,264,36.6818333333333
+14,265,37.2448666666667
+14,266,40.4325666666667
+14,267,35.5176666666667
+14,268,34.5651666666667
+14,269,43.4128333333333
+14,270,32.3299666666667
+14,271,36.9443
+14,272,41.8295666666667
+14,273,33.8836
+14,274,35.6065666666667
+14,275,47.7604666666667
+14,276,42.6931666666667
+14,277,39.7552333333333
+14,278,37.5750666666667
+14,279,36.068
+14,280,37.6597333333333
+14,281,32.6220666666667
+14,282,31.2631666666667
+14,283,44.7082333333333
+14,284,39.8822333333333
+14,285,37.9560666666667
+14,286,30.0439666666667
+14,287,30.9329666666667
+14,288,35.7378
+14,289,38.8704666666667
+14,290,38.5656666666667
+14,291,32.7744666666667
+14,292,36.9400666666667
+14,293,41.7745333333333
+14,294,38.7011333333333
+14,295,38.1042333333333
+14,296,45.4744666666667
+14,297,39.8399
+14,298,39.5393333333333
+14,299,45.2585666666667
+14,300,38.0068666666667
+14,301,39.0609666666667
+14,302,40.5426333333333
+14,303,36.1188
+14,304,41.7195
+14,305,40.1150666666667
+14,306,39.7340666666667
+14,307,41.4274
+14,308,40.5976666666667
+14,309,36.6352666666667
+14,310,40.0473333333333
+14,311,39.3276666666667
+14,312,27.5209
+14,313,36.8173
+14,314,37.1094
+14,315,36.2331
+14,316,28.4734
+14,317,39.2472333333333
+14,318,40.7754666666667
+14,319,30.4419
+14,320,38.3116666666667
+14,321,43.8827333333333
+14,322,44.0478333333333
+14,323,36.2415666666667
+14,324,41.6348333333333
+14,325,30.5900666666667
+14,326,34.0614
+14,327,33.0877333333333
+14,328,46.2915
+14,329,36.8511666666667
+14,330,38.0365
+14,331,34.0021333333333
+14,332,39.4758333333333
+14,333,46.3169
+14,334,37.5115666666667
+14,335,43.6287333333333
+14,336,41.3808333333333
+14,337,37.8248333333333
+14,338,33.2147333333333
+14,339,34.0868
+14,340,37.8883333333333
+14,341,33.6465333333333
+14,342,33.7862333333333
+14,343,39.9245666666667
+14,344,41.4062333333333
+14,345,35.5896333333333
+14,346,44.1198
+14,347,33.9767333333333
+14,348,28.9814
+14,349,32.3045666666667
+14,350,39.7975666666667
+14,351,41.1945666666667
+14,352,31.623
+14,353,34.8064666666667
+14,354,41.6009666666667
+14,355,45.7835
+14,356,47.117
+14,357,42.4645666666667
+14,358,32.9861333333333
+14,359,30.8017333333333
+14,360,36.1145666666667
+14,361,31.9913
+14,362,40.6230666666667
+14,363,32.9141666666667
+14,364,37.2956666666667
+14,365,40.4495
+14,366,34.2688333333333
+14,367,43.2900666666667
+14,368,26.4075333333333
+14,369,34.3450333333333
+14,370,42.7397333333333
+14,371,34.4593333333333
+14,372,46.0883
+14,373,32.6813333333333
+14,374,37.4692333333333
+14,375,37.2787333333333
+14,376,34.2815333333333
+14,377,29.6333333333333
+14,378,33.1893333333333
+14,379,42.1470666666667
+14,380,33.5534
+14,381,41.8253333333333
+14,382,38.354
+14,383,39.4800666666667
+14,384,39.6451666666667
+14,385,37.9306666666667
+14,386,39.9457333333333
+14,387,39.5435666666667
+14,388,35.3822
+14,389,32.5797333333333
+14,390,33.7058
+14,391,25.4084666666667
+14,392,37.5073333333333
+14,393,48.8738333333333
+14,394,35.5642333333333
+14,395,42.3756666666667
+14,396,34.7810666666667
+14,397,32.0294
+14,398,39.9457333333333
+14,399,43.7726666666667
+14,400,33.3459666666667
+14,401,37.2956666666667
+14,402,39.3065
+14,403,32.5247
+14,404,43.2265666666667
+14,405,37.1305666666667
+14,406,39.0186333333333
+14,407,42.7143333333333
+14,408,34.9292333333333
+14,409,48.0314
+14,410,44.6616666666667
+14,411,32.8972333333333
+14,412,34.2519
+14,413,33.7904666666667
+14,414,41.5078333333333
+14,415,37.0628333333333
+14,416,34.0190666666667
+14,417,41.7872333333333
+14,418,47.6038333333333
+14,419,37.8714
+14,420,36.1315
+14,421,40.4156333333333
+14,422,42.2783
+14,423,30.5731333333333
+14,424,29.7730333333333
+14,425,32.7914
+14,426,41.1649333333333
+14,427,34.2773
+14,428,42.7143333333333
+14,429,41.8041666666667
+14,430,37.7444
+14,431,42.8201666666667
+14,432,45.9528333333333
+14,433,49.6485333333333
+14,434,35.8775
+14,435,33.7015666666667
+14,436,37.5073333333333
+14,437,42.2486666666667
+14,438,36.7284
+14,439,43.0191333333333
+14,440,37.5793
+14,441,36.8850333333333
+14,442,37.2956666666667
+14,443,32.9607333333333
+14,444,44.2722
+14,445,49.1109
+14,446,31.0769
+14,447,33.5068333333333
+14,448,36.0722333333333
+14,449,44.45
+14,450,32.3723
+14,451,36.7792
+14,452,38.6334
+14,453,35.56
+14,454,36.2712
+14,455,39.7594666666667
+14,456,35.5219
+14,457,37.7232333333333
+14,458,38.3582333333333
+14,459,34.7810666666667
+14,460,35.4372333333333
+14,461,41.6856333333333
+14,462,30.2768
+14,463,37.0078
+14,464,39.0186333333333
+14,465,40.0600333333333
+14,466,45.3220666666667
+14,467,42.6931666666667
+14,468,41.7195
+14,469,45.1739
+14,470,34.9885
+14,471,33.5745666666667
+14,472,41.8507333333333
+14,473,42.9937333333333
+14,474,37.7867333333333
+14,475,38.9974666666667
+14,476,36.4744
+14,477,29.1888333333333
+14,478,35.0604666666667
+14,479,32.1691
+14,480,40.9448
+14,481,41.8465
+14,482,38.1635
+14,483,32.4061666666667
+14,484,35.9240666666667
+14,485,43.8785
+14,486,38.0153333333333
+14,487,36.1188
+14,488,35.8394
+14,489,39.4843
+14,490,37.6004666666667
+14,491,38.1889
+14,492,31.9701333333333
+14,493,38.3032
+14,494,34.4085333333333
+14,495,46.0629
+14,496,38.3794
+14,497,36.2627333333333
+14,498,33.5957333333333
+14,499,38.6715
+14,500,41.5967333333333
+14,501,43.561
+14,502,31.6695666666667
+14,503,33.0327
+14,504,50.4825
+14,505,28.1559
+14,506,33.5153
+14,507,36.1865333333333
+14,508,41.1183666666667
+14,509,40.6484666666667
+14,510,46.0375
+14,511,30.2768
+14,512,35.9071333333333
+14,513,33.3502
+14,514,41.1522333333333
+14,515,38.989
+14,516,39.7552333333333
+14,517,43.942
+14,518,45.4702333333333
+14,519,31.6653333333333
+14,520,44.9199
+14,521,33.4856666666667
+14,522,41.9819666666667
+14,523,40.3055666666667
+14,524,30.7636333333333
+14,525,30.3868666666667
+14,526,39.9880666666667
+14,527,31.8854666666667
+14,528,35.3991333333333
+14,529,44.1113333333333
+14,530,41.7237333333333
+14,531,33.9979
+14,532,40.1743333333333
+14,533,33.274
+14,534,32.0463333333333
+14,535,43.5059666666667
+14,536,36.5336666666667
+14,537,30.1709666666667
+14,538,38.9255
+14,539,37.2321666666667
+14,540,44.5981666666667
+14,541,28.8501666666667
+14,542,42.9471666666667
+14,543,36.7241666666667
+14,544,39.1414
+14,545,40.767
+14,546,31.4621333333333
+14,547,41.148
+14,548,33.7439
+14,549,29.21
+14,550,40.2420666666667
+14,551,34.3958333333333
+14,552,39.0736666666667
+14,553,34.2180333333333
+14,554,32.6178333333333
+14,555,42.7566666666667
+14,556,34.9546333333333
+14,557,39.116
+14,558,40.4283333333333
+14,559,37.2745
+14,560,39.3911666666667
+14,561,33.7185
+14,562,34.6583
+14,563,45.7454
+14,564,35.6023333333333
+14,565,34.2773
+14,566,42.7143333333333
+14,567,36.4913333333333
+14,568,29.3031333333333
+14,569,39.3530666666667
+14,570,36.3262333333333
+14,571,42.0793333333333
+14,572,35.8394
+14,573,37.8671666666667
+14,574,43.2011666666667
+14,575,41.2961666666667
+14,576,40.9575
+14,577,41.7068
+14,578,38.3582333333333
+14,579,32.9607333333333
+14,580,40.2632333333333
+14,581,38.2312333333333
+14,582,40.259
+14,583,44.4923333333333
+14,584,36.6098666666667
+14,585,45.0977
+14,586,35.9537
+14,587,31.8135
+14,588,46.5031666666667
+14,589,44.323
+14,590,32.1733333333333
+14,591,38.989
+14,592,46.5074
+14,593,35.2679
+14,594,34.4889666666667
+14,595,31.7796333333333
+14,596,38.6757333333333
+14,597,55.7106666666667
+14,598,46.7783333333333
+14,599,41.9523333333333
+14,600,36.9231333333333
+14,601,31.4028666666667
+14,602,36.0087333333333
+14,603,35.179
+14,604,38.4175
+14,605,43.4763333333333
+14,606,32.9353333333333
+14,607,31.2039
+14,608,46.1052333333333
+14,609,36.2415666666667
+14,610,31.8643
+14,611,36.7284
+14,612,34.9038333333333
+14,613,41.4062333333333
+14,614,38.862
+14,615,35.6573666666667
+14,616,43.8615666666667
+14,617,46.0629
+14,618,36.1357333333333
+14,619,38.0873
+14,620,30.8694666666667
+14,621,39.2853333333333
+14,622,30.7170666666667
+14,623,40.4706666666667
+14,624,34.2561333333333
+14,625,38.9509
+14,626,39.2895666666667
+14,627,29.0999333333333
+14,628,34.3365666666667
+14,629,39.3107333333333
+14,630,42.4391666666667
+14,631,32.9395666666667
+14,632,43.5483
+14,633,35.8817333333333
+14,634,39.2853333333333
+14,635,37.9306666666667
+14,636,44.323
+14,637,41.4316333333333
+14,638,33.9979
+14,639,37.4057333333333
+14,640,35.8859666666667
+14,641,32.0082333333333
+14,642,37.0501333333333
+14,643,41.8507333333333
+14,644,42.1894
+14,645,31.5637333333333
+14,646,41.3088666666667
+14,647,30.6747333333333
+14,648,40.9786666666667
+14,649,32.1437
+14,650,38.7985
+14,651,40.8135666666667
+14,652,39.3065
+14,653,47.9890666666667
+14,654,31.0134
+14,655,25.3407333333333
+14,656,40.0685
+14,657,41.9777333333333
+14,658,37.7401666666667
+14,659,34.9588666666667
+14,660,37.9518333333333
+14,661,40.513
+14,662,34.5905666666667
+14,663,40.3225
+14,664,37.8036666666667
+14,665,33.9767333333333
+14,666,41.1522333333333
+14,667,35.4414666666667
+14,668,42.3968333333333
+14,669,44.5177333333333
+14,670,45.2331666666667
+14,671,35.9029
+14,672,35.7589666666667
+14,673,31.4663666666667
+14,674,35.5007333333333
+14,675,44.3865
+14,676,39.624
+14,677,26.8393333333333
+14,678,30.5900666666667
+14,679,30.1117
+14,680,39.9415
+14,681,43.2096333333333
+14,682,40.8516666666667
+14,683,44.6405
+14,684,46.6767333333333
+14,685,35.5049666666667
+14,686,36.3262333333333
+14,687,43.0784
+14,688,40.4114
+14,689,35.0774
+14,690,39.3065
+14,691,31.7838666666667
+14,692,39.0990666666667
+14,693,31.4155666666667
+14,694,41.4951333333333
+14,695,42.0793333333333
+14,696,38.5275666666667
+14,697,42.5534666666667
+14,698,32.3511333333333
+14,699,39.7594666666667
+14,700,33.3375
+14,701,39.2684
+14,702,36.2839
+14,703,44.1536666666667
+14,704,38.4683
+14,705,39.5859
+14,706,32.2368333333333
+14,707,44.6659
+14,708,36.322
+14,709,34.4678
+14,710,46.8037333333333
+14,711,27.4743333333333
+14,712,32.1098333333333
+14,713,37.6597333333333
+14,714,40.3267333333333
+14,715,38.1423333333333
+14,716,39.2895666666667
+14,717,40.8516666666667
+14,718,43.5821666666667
+14,719,41.6390666666667
+14,720,47.5826666666667
+14,721,32.4485
+14,722,33.5915
+14,723,44.2171666666667
+14,724,31.8643
+14,725,28.6935333333333
+14,726,32.2368333333333
+14,727,31.4240333333333
+14,728,37.338
+14,729,43.9250666666667
+14,730,40.7924
+14,731,41.2157333333333
+14,732,38.3370666666667
+14,733,34.0825666666667
+14,734,36.4955666666667
+14,735,49.4961333333333
+14,736,35.5430666666667
+14,737,39.8018
+14,738,46.2110666666667
+14,739,38.0576666666667
+14,740,34.7345
+14,741,32.2961
+14,742,43.4170666666667
+14,743,32.7998666666667
+14,744,48.2176666666667
+14,745,36.4744
+14,746,40.0304
+14,747,39.1625666666667
+14,748,40.5807333333333
+14,749,33.8963
+14,750,39.8187333333333
+14,751,44.2171666666667
+14,752,35.1409
+14,753,39.5859
+14,754,40.2801666666667
+14,755,35.2298
+14,756,33.7608333333333
+14,757,26.0011333333333
+14,758,35.2509666666667
+14,759,30.4207333333333
+14,760,36.6437333333333
+14,761,43.5398333333333
+14,762,38.6757333333333
+14,763,36.7072333333333
+14,764,38.4259666666667
+14,765,46.0586666666667
+14,766,33.8243333333333
+14,767,36.703
+14,768,37.6004666666667
+14,769,41.2326666666667
+14,770,39.4335
+14,771,37.1263333333333
+14,772,46.0586666666667
+14,773,40.5976666666667
+14,774,29.6079333333333
+14,775,35.8563333333333
+14,776,36.4913333333333
+14,777,32.9057
+14,778,29.5952333333333
+14,779,37.9349
+14,780,37.5750666666667
+14,781,39.2938
+14,782,29.1973
+14,783,37.6809
+14,784,47.4810666666667
+14,785,46.5285666666667
+14,786,34.0571666666667
+14,787,26.4414
+14,788,41.6348333333333
+14,789,30.3699333333333
+14,790,41.9565666666667
+14,791,35.9833333333333
+14,792,36.8554
+14,793,43.9039
+14,794,34.6752333333333
+14,795,28.8374666666667
+14,796,41.8295666666667
+14,797,23.2748666666667
+14,798,35.4372333333333
+14,799,33.7650666666667
+14,800,49.911
+14,801,41.9311666666667
+14,802,37.4226666666667
+14,803,40.2420666666667
+14,804,31.8854666666667
+14,805,36.7707333333333
+14,806,43.4128333333333
+14,807,38.1677333333333
+14,808,31.3097333333333
+14,809,44.1748333333333
+14,810,42.8836666666667
+14,811,38.6757333333333
+14,812,40.4960666666667
+14,813,31.0557333333333
+14,814,42.2529
+14,815,28.5623
+14,816,28.702
+14,817,34.163
+14,818,32.6474666666667
+14,819,38.9255
+14,820,32.1140666666667
+14,821,40.5849666666667
+14,822,36.6691333333333
+14,823,38.4894666666667
+14,824,44.9156666666667
+14,825,34.6075
+14,826,36.9485333333333
+14,827,32.1775666666667
+14,828,34.7345
+14,829,34.9123
+14,830,40.0685
+14,831,42.9937333333333
+14,832,39.6663333333333
+14,833,41.2538333333333
+14,834,43.9123666666667
+14,835,36.3855
+14,836,45.339
+14,837,35.8563333333333
+14,838,44.3865
+14,839,40.0727333333333
+14,840,43.9631666666667
+14,841,38.4683
+14,842,38.3751666666667
+14,843,31.4367333333333
+14,844,39.2726333333333
+14,845,41.9989
+14,846,38.3751666666667
+14,847,44.7463333333333
+14,848,38.1127
+14,849,35.1620666666667
+14,850,38.9339666666667
+14,851,35.7716666666667
+14,852,37.5623666666667
+14,853,40.7331333333333
+14,854,41.9946666666667
+14,855,36.8554
+14,856,31.9659
+14,857,51.5027333333333
+14,858,34.5524666666667
+14,859,42.799
+14,860,41.3258
+14,861,36.6818333333333
+14,862,41.4443333333333
+14,863,33.2824666666667
+14,864,40.2209
+14,865,45.6141666666667
+14,866,36.8765666666667
+14,867,35.8605666666667
+14,868,34.6329
+14,869,35.4118333333333
+14,870,31.6484
+14,871,38.9509
+14,872,34.8911333333333
+14,873,32.1352333333333
+14,874,37.8036666666667
+14,875,40.5680333333333
+14,876,36.2712
+14,877,43.4213
+14,878,36.0510666666667
+14,879,41.0845
+14,880,35.3949
+14,881,34.1884
+14,882,34.0868
+14,883,39.7086666666667
+14,884,33.4306333333333
+14,885,36.9443
+14,886,36.7157
+14,887,41.4909
+14,888,40.2039666666667
+14,889,41.4485666666667
+14,890,35.7081666666667
+14,891,37.6639666666667
+14,892,34.0444666666667
+14,893,32.9649666666667
+14,894,38.1635
+14,895,34.3365666666667
+14,896,31.9743666666667
+14,897,39.9245666666667
+14,898,37.4311333333333
+14,899,40.9236333333333
+14,900,38.0915333333333
+14,901,47.1381666666667
+14,902,42.7651333333333
+14,903,36.2796666666667
+14,904,41.6898666666667
+14,905,36.7241666666667
+14,906,37.0882333333333
+14,907,35.4795666666667
+14,908,38.9128
+14,909,35.9029
+14,910,34.8953666666667
+14,911,44.0055
+14,912,29.591
+14,913,29.7815
+14,914,35.6658333333333
+14,915,34.5059
+14,916,29.9339
+14,917,42.4434
+14,918,39.8991666666667
+14,919,37.5369666666667
+14,920,36.8215333333333
+14,921,33.6423
+14,922,44.577
+14,923,37.7401666666667
+14,924,38.8323666666667
+14,925,37.8036666666667
+14,926,39.2260666666667
+14,927,38.2989666666667
+14,928,39.4589
+14,929,36.5548333333333
+14,930,31.0938333333333
+14,931,38.7815666666667
+14,932,38.0873
+14,933,46.9942333333333
+14,934,45.1146333333333
+14,935,41.4697333333333
+14,936,39.0313333333333
+14,937,40.6442333333333
+14,938,36.4363
+14,939,42.9895
+14,940,27.6013333333333
+14,941,35.1663
+14,942,45.1696666666667
+14,943,34.0190666666667
+14,944,35.2679
+14,945,35.3144666666667
+14,946,37.4734666666667
+14,947,44.7505666666667
+14,948,36.7749666666667
+14,949,38.1
+14,950,41.4951333333333
+14,951,44.8945
+14,952,43.18
+14,953,36.2415666666667
+14,954,31.5595
+14,955,36.5590666666667
+14,956,36.8596333333333
+14,957,32.4908333333333
+14,958,34.0571666666667
+14,959,36.1780666666667
+14,960,40.3309666666667
+14,961,35.1366666666667
+14,962,32.7025
+14,963,28.5242
+14,964,40.2420666666667
+14,965,36.2712
+14,966,36.9231333333333
+14,967,45.0426666666667
+14,968,29.8492333333333
+14,969,39.7975666666667
+14,970,37.1263333333333
+14,971,33.9386333333333
+14,972,33.8751333333333
+14,973,28.5834666666667
+14,974,37.6385666666667
+14,975,35.9113666666667
+14,976,33.9301666666667
+14,977,41.3385
+14,978,41.1734
+14,979,41.1099
+14,980,29.0872333333333
+14,981,37.8883333333333
+14,982,29.5529
+14,983,29.7222333333333
+14,984,37.5793
+14,985,40.7712333333333
+14,986,28.9814
+14,987,31.5849
+14,988,37.0035666666667
+14,989,43.1588333333333
+14,990,36.0595333333333
+14,991,38.4894666666667
+14,992,38.0280333333333
+14,993,39.2049
+14,994,31.8685333333333
+14,995,37.9984
+14,996,36.3093
+14,997,31.1615666666667
+14,998,32.1140666666667
+14,999,40.5595666666667
+14,1000,35.9240666666667
+15,1,39.7933333333333
+15,2,26.6488333333333
+15,3,31.369
+15,4,32.3215
+15,5,29.6756666666667
+15,6,35.9198333333333
+15,7,26.8816666666667
+15,8,31.242
+15,9,26.4795
+15,10,28.9136666666667
+15,11,25.5905
+15,12,31.8558333333333
+15,13,30.988
+15,14,31.3478333333333
+15,15,27.686
+15,16,31.3055
+15,17,31.2843333333333
+15,18,33.655
+15,19,27.5166666666667
+15,20,35.4965
+15,21,28.2998333333333
+15,22,29.3158333333333
+15,23,31.2208333333333
+15,24,27.1356666666667
+15,25,27.5166666666667
+15,26,33.7396666666667
+15,27,37.5285
+15,28,27.6648333333333
+15,29,25.6328333333333
+15,30,35.9833333333333
+15,31,35.2001666666667
+15,32,33.9936666666667
+15,33,38.862
+15,34,29.6121666666667
+15,35,27.8765
+15,36,32.0251666666667
+15,37,30.7975
+15,38,28.0246666666667
+15,39,33.7396666666667
+15,40,29.6545
+15,41,32.5966666666667
+15,42,29.7603333333333
+15,43,24.892
+15,44,27.6436666666667
+15,45,27.5378333333333
+15,46,32.2156666666667
+15,47,36.5548333333333
+15,48,33.6126666666667
+15,49,30.9245
+15,50,33.1046666666667
+15,51,31.2208333333333
+15,52,22.6906666666667
+15,53,32.766
+15,54,31.5171666666667
+15,55,29.8661666666667
+15,56,28.448
+15,57,30.8398333333333
+15,58,30.5646666666667
+15,59,23.9606666666667
+15,60,27.305
+15,61,29.4851666666667
+15,62,34.1206666666667
+15,63,24.3205
+15,64,29.1888333333333
+15,65,24.2993333333333
+15,66,24.6168333333333
+15,67,31.3478333333333
+15,68,26.1831666666667
+15,69,29.5063333333333
+15,70,29.083
+15,71,21.844
+15,72,33.655
+15,73,34.5863333333333
+15,74,29.9931666666667
+15,75,26.9451666666667
+15,76,33.7396666666667
+15,77,26.797
+15,78,34.2053333333333
+15,79,32.3426666666667
+15,80,29.591
+15,81,39.0948333333333
+15,82,37.0416666666667
+15,83,25.4
+15,84,27.5378333333333
+15,85,30.734
+15,86,33.6126666666667
+15,87,36.1526666666667
+15,88,24.8496666666667
+15,89,29.4216666666667
+15,90,32.0463333333333
+15,91,31.4325
+15,92,23.2621666666667
+15,93,32.512
+15,94,35.1366666666667
+15,95,36.195
+15,96,30.9245
+15,97,26.7123333333333
+15,98,35.0943333333333
+15,99,28.5326666666667
+15,100,32.385
+15,101,29.4216666666667
+15,102,29.5486666666667
+15,103,30.607
+15,104,31.7288333333333
+15,105,28.702
+15,106,36.5971666666667
+15,107,28.0458333333333
+15,108,35.3483333333333
+15,109,28.575
+15,110,28.448
+15,111,35.4541666666667
+15,112,36.2161666666667
+15,113,26.5218333333333
+15,114,35.8986666666667
+15,115,33.1893333333333
+15,116,27.7283333333333
+15,117,31.8981666666667
+15,118,24.765
+15,119,33.1893333333333
+15,120,26.1196666666667
+15,121,32.0251666666667
+15,122,34.5228333333333
+15,123,35.687
+15,124,42.4391666666667
+15,125,31.3055
+15,126,28.7443333333333
+15,127,31.9405
+15,128,37.0205
+15,129,31.0515
+15,130,26.3736666666667
+15,131,24.5321666666667
+15,132,28.8925
+15,133,35.5176666666667
+15,134,28.702
+15,135,34.7556666666667
+15,136,29.4005
+15,137,29.1465
+15,138,25.1248333333333
+15,139,26.6911666666667
+15,140,37.8036666666667
+15,141,29.6333333333333
+15,142,33.528
+15,143,32.6601666666667
+15,144,28.2998333333333
+15,145,29.5275
+15,146,29.5275
+15,147,26.6276666666667
+15,148,35.3695
+15,149,26.7335
+15,150,26.8393333333333
+15,151,28.2575
+15,152,31.3478333333333
+15,153,28.1305
+15,154,32.2156666666667
+15,155,33.655
+15,156,33.528
+15,157,24.3416666666667
+15,158,26.8181666666667
+15,159,31.3478333333333
+15,160,31.3901666666667
+15,161,30.3741666666667
+15,162,33.1046666666667
+15,163,32.5755
+15,164,30.4165
+15,165,26.5641666666667
+15,166,29.464
+15,167,33.8878333333333
+15,168,29.3158333333333
+15,169,24.6803333333333
+15,170,27.6648333333333
+15,171,31.6441666666667
+15,172,30.7128333333333
+15,173,28.8925
+15,174,26.3736666666667
+15,175,28.2363333333333
+15,176,36.1103333333333
+15,177,29.4428333333333
+15,178,25.019
+15,179,35.1155
+15,180,29.845
+15,181,31.3055
+15,182,29.972
+15,183,30.5858333333333
+15,184,26.9451666666667
+15,185,31.5171666666667
+15,186,28.2998333333333
+15,187,26.3525
+15,188,26.5218333333333
+15,189,33.528
+15,190,35.0308333333333
+15,191,32.8083333333333
+15,192,28.8501666666667
+15,193,35.2848333333333
+15,194,30.3953333333333
+15,195,25.4
+15,196,28.8925
+15,197,31.9616666666667
+15,198,26.8605
+15,199,29.464
+15,200,28.2998333333333
+15,201,29.7815
+15,202,32.3003333333333
+15,203,28.3845
+15,204,30.099
+15,205,32.004
+15,206,25.9503333333333
+15,207,30.0778333333333
+15,208,43.1376666666667
+15,209,29.7391666666667
+15,210,27.94
+15,211,36.0891666666667
+15,212,34.0571666666667
+15,213,34.0148333333333
+15,214,37.7401666666667
+15,215,35.8563333333333
+15,216,41.3385
+15,217,31.0091666666667
+15,218,27.2838333333333
+15,219,29.0618333333333
+15,220,32.3003333333333
+15,221,30.0566666666667
+15,222,34.9038333333333
+15,223,29.6756666666667
+15,224,36.3643333333333
+15,225,31.6653333333333
+15,226,28.8713333333333
+15,227,33.4645
+15,228,27.6013333333333
+15,229,25.2306666666667
+15,230,27.8765
+15,231,24.8496666666667
+15,232,26.2043333333333
+15,233,35.7505
+15,234,28.1305
+15,235,26.2043333333333
+15,236,38.4386666666667
+15,237,30.4588333333333
+15,238,41.4866666666667
+15,239,27.1568333333333
+15,240,30.2471666666667
+15,241,33.9513333333333
+15,242,35.56
+15,243,27.3896666666667
+15,244,21.8016666666667
+15,245,34.417
+15,246,30.4165
+15,247,27.1568333333333
+15,248,33.02
+15,249,28.321
+15,250,30.2683333333333
+15,251,28.194
+15,252,30.8821666666667
+15,253,30.1413333333333
+15,254,27.1991666666667
+15,255,34.6075
+15,256,31.8135
+15,257,30.2048333333333
+15,258,30.5435
+15,259,30.4588333333333
+15,260,30.734
+15,261,32.9353333333333
+15,262,25.2518333333333
+15,263,36.1526666666667
+15,264,26.2466666666667
+15,265,26.7123333333333
+15,266,31.8135
+15,267,29.6756666666667
+15,268,29.1676666666667
+15,269,30.1413333333333
+15,270,32.893
+15,271,27.6436666666667
+15,272,33.782
+15,273,34.544
+15,274,26.7546666666667
+15,275,27.6648333333333
+15,276,33.782
+15,277,31.623
+15,278,32.766
+15,279,39.5181666666667
+15,280,28.1728333333333
+15,281,35.7716666666667
+15,282,37.719
+15,283,29.4005
+15,284,33.6126666666667
+15,285,31.2631666666667
+15,286,30.3106666666667
+15,287,28.8713333333333
+15,288,29.5486666666667
+15,289,27.305
+15,290,28.5538333333333
+15,291,31.6653333333333
+15,292,39.6663333333333
+15,293,29.9508333333333
+15,294,28.8713333333333
+15,295,29.591
+15,296,33.782
+15,297,29.4005
+15,298,28.3633333333333
+15,299,32.4908333333333
+15,300,29.1253333333333
+15,301,22.2038333333333
+15,302,33.5703333333333
+15,303,29.1253333333333
+15,304,35.8563333333333
+15,305,40.7458333333333
+15,306,27.559
+15,307,30.099
+15,308,31.4536666666667
+15,309,30.5011666666667
+15,310,33.4856666666667
+15,311,32.9141666666667
+15,312,33.5915
+15,313,36.0045
+15,314,29.8238333333333
+15,315,30.5858333333333
+15,316,25.2518333333333
+15,317,35.2848333333333
+15,318,34.0148333333333
+15,319,32.1521666666667
+15,320,33.7608333333333
+15,321,27.6648333333333
+15,322,30.2895
+15,323,35.6023333333333
+15,324,29.0195
+15,325,29.7391666666667
+15,326,33.3798333333333
+15,327,36.1315
+15,328,26.1408333333333
+15,329,32.258
+15,330,36.576
+15,331,30.7128333333333
+15,332,30.8821666666667
+15,333,23.6643333333333
+15,334,21.3783333333333
+15,335,34.2053333333333
+15,336,35.0096666666667
+15,337,31.242
+15,338,23.9818333333333
+15,339,29.5698333333333
+15,340,32.1945
+15,341,27.0933333333333
+15,342,28.7655
+15,343,25.1248333333333
+15,344,27.4743333333333
+15,345,34.3746666666667
+15,346,23.7913333333333
+15,347,28.4268333333333
+15,348,26.3313333333333
+15,349,37.0628333333333
+15,350,29.083
+15,351,26.6276666666667
+15,352,26.4371666666667
+15,353,31.9193333333333
+15,354,33.0623333333333
+15,355,31.0938333333333
+15,356,28.194
+15,357,37.6978333333333
+15,358,32.1945
+15,359,28.067
+15,360,24.892
+15,361,33.6973333333333
+15,362,31.7923333333333
+15,363,29.6545
+15,364,32.2156666666667
+15,365,28.4691666666667
+15,366,32.9141666666667
+15,367,27.1991666666667
+15,368,25.9926666666667
+15,369,26.4795
+15,370,31.4536666666667
+15,371,28.1305
+15,372,25.2095
+15,373,31.7288333333333
+15,374,29.8873333333333
+15,375,31.7288333333333
+15,376,28.4691666666667
+15,377,24.1723333333333
+15,378,32.258
+15,379,36.7453333333333
+15,380,32.4061666666667
+15,381,27.5378333333333
+15,382,25.3576666666667
+15,383,23.5796666666667
+15,384,33.5491666666667
+15,385,30.4376666666667
+15,386,23.0081666666667
+15,387,34.417
+15,388,28.1305
+15,389,31.7288333333333
+15,390,23.8548333333333
+15,391,24.5533333333333
+15,392,26.3736666666667
+15,393,25.654
+15,394,26.4371666666667
+15,395,32.4696666666667
+15,396,32.385
+15,397,31.4748333333333
+15,398,25.4211666666667
+15,399,31.2631666666667
+15,400,28.702
+15,401,24.8496666666667
+15,402,29.9296666666667
+15,403,27.8765
+15,404,31.623
+15,405,24.4263333333333
+15,406,27.7071666666667
+15,407,26.5853333333333
+15,408,32.3215
+15,409,29.6968333333333
+15,410,29.9085
+15,411,36.3431666666667
+15,412,29.2311666666667
+15,413,28.575
+15,414,37.0416666666667
+15,415,34.4381666666667
+15,416,24.4686666666667
+15,417,31.8981666666667
+15,418,34.3323333333333
+15,419,29.1465
+15,420,28.6385
+15,421,25.3576666666667
+15,422,24.8285
+15,423,32.2791666666667
+15,424,22.3943333333333
+15,425,23.4103333333333
+15,426,21.9075
+15,427,32.0886666666667
+15,428,38.5021666666667
+15,429,28.2575
+15,430,38.5868333333333
+15,431,35.1155
+15,432,25.1883333333333
+15,433,32.6813333333333
+15,434,35.2001666666667
+15,435,32.7448333333333
+15,436,31.3901666666667
+15,437,27.6648333333333
+15,438,29.6333333333333
+15,439,27.4108333333333
+15,440,30.4376666666667
+15,441,31.3901666666667
+15,442,33.6973333333333
+15,443,27.6648333333333
+15,444,31.8981666666667
+15,445,31.6441666666667
+15,446,29.6756666666667
+15,447,30.1836666666667
+15,448,31.3478333333333
+15,449,26.0561666666667
+15,450,28.702
+15,451,34.7133333333333
+15,452,30.7551666666667
+15,453,31.623
+15,454,25.908
+15,455,27.1356666666667
+15,456,27.5378333333333
+15,457,30.3953333333333
+15,458,27.7918333333333
+15,459,30.6281666666667
+15,460,34.6921666666667
+15,461,37.1898333333333
+15,462,34.3958333333333
+15,463,33.0411666666667
+15,464,36.703
+15,465,37.6343333333333
+15,466,27.3261666666667
+15,467,23.7278333333333
+15,468,30.4376666666667
+15,469,30.1625
+15,470,26.8181666666667
+15,471,31.0303333333333
+15,472,37.7825
+15,473,24.8073333333333
+15,474,26.416
+15,475,31.6865
+15,476,29.3793333333333
+15,477,26.7758333333333
+15,478,34.5016666666667
+15,479,27.4531666666667
+15,480,28.6808333333333
+15,481,24.6168333333333
+15,482,32.2368333333333
+15,483,31.0726666666667
+15,484,31.1573333333333
+15,485,38.1211666666667
+15,486,30.4376666666667
+15,487,25.6328333333333
+15,488,27.6225
+15,489,30.988
+15,490,29.3793333333333
+15,491,25.9715
+15,492,35.3695
+15,493,25.2518333333333
+15,494,38.4386666666667
+15,495,24.003
+15,496,27.5801666666667
+15,497,29.4428333333333
+15,498,38.1211666666667
+15,499,29.8873333333333
+15,500,31.4536666666667
+15,501,34.3535
+15,502,30.861
+15,503,30.353
+15,504,28.9983333333333
+15,505,23.9606666666667
+15,506,34.6921666666667
+15,507,24.1935
+15,508,32.1945
+15,509,31.7923333333333
+15,510,24.511
+15,511,27.8765
+15,512,32.7871666666667
+15,513,39.6663333333333
+15,514,23.8971666666667
+15,515,33.7185
+15,516,34.0995
+15,517,29.0195
+15,518,32.7871666666667
+15,519,29.0406666666667
+15,520,26.2255
+15,521,37.8248333333333
+15,522,29.1041666666667
+15,523,28.1728333333333
+15,524,31.369
+15,525,27.2203333333333
+15,526,32.512
+15,527,27.5378333333333
+15,528,23.8548333333333
+15,529,34.2053333333333
+15,530,32.1521666666667
+15,531,32.004
+15,532,35.1155
+15,533,41.9523333333333
+15,534,24.0241666666667
+15,535,32.0675
+15,536,27.1145
+15,537,29.6968333333333
+15,538,25.146
+15,539,21.1031666666667
+15,540,37.6343333333333
+15,541,30.1836666666667
+15,542,33.4856666666667
+15,543,22.9446666666667
+15,544,33.909
+15,545,24.4898333333333
+15,546,30.3741666666667
+15,547,29.9508333333333
+15,548,24.4475
+15,549,32.9776666666667
+15,550,32.512
+15,551,27.4108333333333
+15,552,31.2631666666667
+15,553,34.6075
+15,554,29.0195
+15,555,27.178
+15,556,31.75
+15,557,31.3266666666667
+15,558,38.2481666666667
+15,559,26.1408333333333
+15,560,25.7386666666667
+15,561,28.4903333333333
+15,562,36.8935
+15,563,29.5698333333333
+15,564,26.543
+15,565,26.5006666666667
+15,566,29.1888333333333
+15,567,34.3746666666667
+15,568,29.1676666666667
+15,569,33.7396666666667
+15,570,26.289
+15,571,24.4898333333333
+15,572,29.1676666666667
+15,573,27.0298333333333
+15,574,28.7231666666667
+15,575,29.8238333333333
+15,576,29.2311666666667
+15,577,32.131
+15,578,27.686
+15,579,32.1098333333333
+15,580,31.2631666666667
+15,581,27.1145
+15,582,27.7918333333333
+15,583,28.1728333333333
+15,584,32.0251666666667
+15,585,26.9875
+15,586,22.4578333333333
+15,587,33.0411666666667
+15,588,37.6343333333333
+15,589,33.1893333333333
+15,590,31.369
+15,591,28.2151666666667
+15,592,24.8708333333333
+15,593,28.6808333333333
+15,594,23.495
+15,595,26.6488333333333
+15,596,26.7123333333333
+15,597,29.9085
+15,598,38.8196666666667
+15,599,31.9616666666667
+15,600,32.5966666666667
+15,601,21.5688333333333
+15,602,22.606
+15,603,30.5646666666667
+15,604,23.495
+15,605,32.9565
+15,606,37.4015
+15,607,35.3483333333333
+15,608,37.6555
+15,609,28.9136666666667
+15,610,33.5915
+15,611,29.7391666666667
+15,612,35.7293333333333
+15,613,31.0515
+15,614,29.1041666666667
+15,615,26.6911666666667
+15,616,35.8986666666667
+15,617,24.0241666666667
+15,618,34.4381666666667
+15,619,23.3045
+15,620,24.2781666666667
+15,621,36.3008333333333
+15,622,28.448
+15,623,28.702
+15,624,24.2781666666667
+15,625,33.9936666666667
+15,626,33.7185
+15,627,34.671
+15,628,32.6813333333333
+15,629,30.6705
+15,630,31.7288333333333
+15,631,26.5218333333333
+15,632,34.7768333333333
+15,633,27.178
+15,634,30.5646666666667
+15,635,30.607
+15,636,28.0881666666667
+15,637,30.099
+15,638,29.6333333333333
+15,639,36.1526666666667
+15,640,30.8821666666667
+15,641,23.6008333333333
+15,642,30.5223333333333
+15,643,37.1898333333333
+15,644,30.7551666666667
+15,645,26.9875
+15,646,31.5171666666667
+15,647,29.5063333333333
+15,648,31.623
+15,649,23.8548333333333
+15,650,26.7123333333333
+15,651,29.3581666666667
+15,652,31.2631666666667
+15,653,36.8935
+15,654,32.4908333333333
+15,655,30.9033333333333
+15,656,26.3948333333333
+15,657,35.941
+15,658,34.5016666666667
+15,659,32.1945
+15,660,29.9931666666667
+15,661,31.8346666666667
+15,662,27.1568333333333
+15,663,29.1041666666667
+15,664,27.686
+15,665,30.0355
+15,666,34.5651666666667
+15,667,24.257
+15,668,24.9978333333333
+15,669,35.1366666666667
+15,670,20.7433333333333
+15,671,30.5646666666667
+15,672,29.1888333333333
+15,673,26.8393333333333
+15,674,33.8031666666667
+15,675,25.3576666666667
+15,676,29.7815
+15,677,30.9668333333333
+15,678,30.2683333333333
+15,679,29.8026666666667
+15,680,29.8661666666667
+15,681,27.432
+15,682,29.6756666666667
+15,683,29.337
+15,684,31.7076666666667
+15,685,30.0355
+15,686,36.2796666666667
+15,687,31.2843333333333
+15,688,25.0613333333333
+15,689,33.0623333333333
+15,690,30.099
+15,691,31.115
+15,692,25.7386666666667
+15,693,31.1573333333333
+15,694,26.3948333333333
+15,695,29.083
+15,696,30.9668333333333
+15,697,33.9301666666667
+15,698,29.6333333333333
+15,699,34.2265
+15,700,27.1145
+15,701,35.3483333333333
+15,702,37.3591666666667
+15,703,28.9348333333333
+15,704,30.0566666666667
+15,705,27.4108333333333
+15,706,27.178
+15,707,25.5058333333333
+15,708,37.084
+15,709,32.2791666666667
+15,710,23.4315
+15,711,27.0933333333333
+15,712,28.829
+15,713,33.6126666666667
+15,714,28.7231666666667
+15,715,30.607
+15,716,36.8088333333333
+15,717,25.9291666666667
+15,718,32.004
+15,719,31.8981666666667
+15,720,38.7773333333333
+15,721,37.6131666666667
+15,722,29.464
+15,723,30.099
+15,724,30.4376666666667
+15,725,36.7241666666667
+15,726,27.9611666666667
+15,727,30.5858333333333
+15,728,29.6756666666667
+15,729,26.6276666666667
+15,730,31.3266666666667
+15,731,33.5915
+15,732,22.9658333333333
+15,733,31.1573333333333
+15,734,34.671
+15,735,29.972
+15,736,29.6333333333333
+15,737,28.8925
+15,738,24.9131666666667
+15,739,28.5326666666667
+15,740,26.797
+15,741,32.5755
+15,742,32.8295
+15,743,26.3313333333333
+15,744,26.3736666666667
+15,745,26.9028333333333
+15,746,30.988
+15,747,28.6385
+15,748,35.5388333333333
+15,749,26.0773333333333
+15,750,28.4691666666667
+15,751,36.195
+15,752,34.0571666666667
+15,753,34.7556666666667
+15,754,34.544
+15,755,24.8708333333333
+15,756,25.5058333333333
+15,757,33.3163333333333
+15,758,30.48
+15,759,29.1253333333333
+15,760,26.3948333333333
+15,761,34.9038333333333
+15,762,26.5641666666667
+15,763,28.5961666666667
+15,764,31.115
+15,765,29.5275
+15,766,29.5486666666667
+15,767,24.4263333333333
+15,768,33.2951666666667
+15,769,27.7071666666667
+15,770,36.0468333333333
+15,771,25.8233333333333
+15,772,30.6493333333333
+15,773,29.3158333333333
+15,774,32.3638333333333
+15,775,36.3008333333333
+15,776,22.4366666666667
+15,777,24.4475
+15,778,29.7815
+15,779,28.6808333333333
+15,780,30.4588333333333
+15,781,32.1521666666667
+15,782,25.5905
+15,783,29.0406666666667
+15,784,36.449
+15,785,32.893
+15,786,35.6658333333333
+15,787,34.7133333333333
+15,788,31.9405
+15,789,29.591
+15,790,27.2203333333333
+15,791,25.8233333333333
+15,792,24.7861666666667
+15,793,32.9776666666667
+15,794,32.1098333333333
+15,795,34.6075
+15,796,36.7876666666667
+15,797,27.6013333333333
+15,798,36.0045
+15,799,29.845
+15,800,26.5006666666667
+15,801,31.3478333333333
+15,802,33.274
+15,803,29.1041666666667
+15,804,29.4428333333333
+15,805,33.7396666666667
+15,806,36.576
+15,807,34.8615
+15,808,29.4851666666667
+15,809,36.1315
+15,810,36.2161666666667
+15,811,28.8925
+15,812,30.7128333333333
+15,813,27.3473333333333
+15,814,25.8233333333333
+15,815,32.258
+15,816,31.1573333333333
+15,817,28.829
+15,818,32.8083333333333
+15,819,26.0773333333333
+15,820,29.8238333333333
+15,821,35.7081666666667
+15,822,30.3953333333333
+15,823,29.6756666666667
+15,824,20.9973333333333
+15,825,30.0143333333333
+15,826,21.7381666666667
+15,827,35.1155
+15,828,27.6436666666667
+15,829,25.1036666666667
+15,830,35.687
+15,831,34.6286666666667
+15,832,26.9028333333333
+15,833,34.7768333333333
+15,834,38.5656666666667
+15,835,26.3948333333333
+15,836,29.3793333333333
+15,837,31.242
+15,838,30.7763333333333
+15,839,26.035
+15,840,31.0938333333333
+15,841,29.4216666666667
+15,842,22.0556666666667
+15,843,28.6173333333333
+15,844,27.4108333333333
+15,845,25.3365
+15,846,28.575
+15,847,21.1455
+15,848,30.6493333333333
+15,849,31.7076666666667
+15,850,30.8821666666667
+15,851,31.369
+15,852,30.734
+15,853,31.7076666666667
+15,854,27.0298333333333
+15,855,29.3581666666667
+15,856,24.8708333333333
+15,857,31.2208333333333
+15,858,35.0308333333333
+15,859,30.9033333333333
+15,860,30.988
+15,861,36.068
+15,862,32.2368333333333
+15,863,32.5543333333333
+15,864,31.8981666666667
+15,865,28.2151666666667
+15,866,28.7443333333333
+15,867,30.099
+15,868,34.5228333333333
+15,869,35.4965
+15,870,29.8238333333333
+15,871,29.3158333333333
+15,872,28.5326666666667
+15,873,31.7711666666667
+15,874,37.0628333333333
+15,875,29.8873333333333
+15,876,28.9983333333333
+15,877,36.7453333333333
+15,878,29.591
+15,879,28.8925
+15,880,33.5491666666667
+15,881,23.114
+15,882,31.7288333333333
+15,883,33.655
+15,884,34.544
+15,885,35.179
+15,886,36.195
+15,887,28.0035
+15,888,29.4005
+15,889,32.0886666666667
+15,890,25.2518333333333
+15,891,33.1893333333333
+15,892,32.3638333333333
+15,893,36.703
+15,894,30.1836666666667
+15,895,42.0793333333333
+15,896,31.3901666666667
+15,897,30.099
+15,898,32.5755
+15,899,30.0566666666667
+15,900,26.0985
+15,901,29.1253333333333
+15,902,29.7391666666667
+15,903,35.1366666666667
+15,904,31.0938333333333
+15,905,31.1573333333333
+15,906,30.0566666666667
+15,907,29.2946666666667
+15,908,22.9023333333333
+15,909,26.8605
+15,910,32.6813333333333
+15,911,33.401
+15,912,32.5755
+15,913,30.1201666666667
+15,914,37.5708333333333
+15,915,31.0515
+15,916,33.1681666666667
+15,917,32.8718333333333
+15,918,34.798
+15,919,31.3478333333333
+15,920,27.5801666666667
+15,921,25.5481666666667
+15,922,28.3421666666667
+15,923,35.6446666666667
+15,924,26.8181666666667
+15,925,31.0303333333333
+15,926,34.925
+15,927,30.734
+15,928,32.9776666666667
+15,929,28.7866666666667
+15,930,22.6271666666667
+15,931,37.1263333333333
+15,932,34.4805
+15,933,27.2415
+15,934,31.7711666666667
+15,935,26.5218333333333
+15,936,34.0571666666667
+15,937,33.8031666666667
+15,938,27.6648333333333
+15,939,28.1516666666667
+15,940,28.7655
+15,941,38.5445
+15,942,30.3741666666667
+15,943,28.5538333333333
+15,944,23.7278333333333
+15,945,25.1883333333333
+15,946,39.2006666666667
+15,947,32.0886666666667
+15,948,34.8615
+15,949,34.3746666666667
+15,950,35.5388333333333
+15,951,28.2786666666667
+15,952,23.2621666666667
+15,953,24.7438333333333
+15,954,35.1578333333333
+15,955,31.0515
+15,956,24.9555
+15,957,29.845
+15,958,27.305
+15,959,29.1041666666667
+15,960,34.5016666666667
+15,961,29.5275
+15,962,27.4955
+15,963,35.1366666666667
+15,964,30.3953333333333
+15,965,37.2533333333333
+15,966,36.5336666666667
+15,967,36.1103333333333
+15,968,30.7975
+15,969,27.9188333333333
+15,970,25.1036666666667
+15,971,32.6601666666667
+15,972,33.0623333333333
+15,973,36.3643333333333
+15,974,29.0195
+15,975,32.6601666666667
+15,976,39.7086666666667
+15,977,32.004
+15,978,32.385
+15,979,24.9131666666667
+15,980,32.7025
+15,981,25.2306666666667
+15,982,34.7556666666667
+15,983,43.1588333333333
+15,984,34.7133333333333
+15,985,35.179
+15,986,30.9033333333333
+15,987,25.654
+15,988,29.1888333333333
+15,989,27.6225
+15,990,30.7975
+15,991,34.3746666666667
+15,992,25.6116666666667
+15,993,27.8553333333333
+15,994,22.987
+15,995,37.8883333333333
+15,996,33.4645
+15,997,34.3111666666667
+15,998,29.4005
+15,999,26.9663333333333
+15,1000,29.21
+16,1,40.9998333333333
+16,2,29.2735
+16,3,48.133
+16,4,39.6663333333333
+16,5,32.5331666666667
+16,6,41.3596666666667
+16,7,32.385
+16,8,37.338
+16,9,34.2265
+16,10,35.6023333333333
+16,11,43.9843333333333
+16,12,36.6606666666667
+16,13,30.6281666666667
+16,14,44.7463333333333
+16,15,31.2631666666667
+16,16,36.3855
+16,17,35.6446666666667
+16,18,32.0886666666667
+16,19,34.7768333333333
+16,20,34.0148333333333
+16,21,42.8836666666667
+16,22,30.734
+16,23,32.3638333333333
+16,24,42.1216666666667
+16,25,40.513
+16,26,32.639
+16,27,37.6131666666667
+16,28,35.8775
+16,29,34.0148333333333
+16,30,36.3431666666667
+16,31,39.878
+16,32,40.894
+16,33,39.3276666666667
+16,34,42.037
+16,35,35.9198333333333
+16,36,34.3535
+16,37,40.9786666666667
+16,38,26.162
+16,39,37.9518333333333
+16,40,42.8413333333333
+16,41,33.4221666666667
+16,42,34.6075
+16,43,34.6075
+16,44,38.2693333333333
+16,45,36.3431666666667
+16,46,42.1216666666667
+16,47,43.0953333333333
+16,48,36.2161666666667
+16,49,40.005
+16,50,36.2161666666667
+16,51,33.147
+16,52,37.4861666666667
+16,53,31.0726666666667
+16,54,42.164
+16,55,39.3065
+16,56,33.4433333333333
+16,57,37.2533333333333
+16,58,38.5021666666667
+16,59,30.988
+16,60,39.1795
+16,61,35.3695
+16,62,44.9368333333333
+16,63,32.3003333333333
+16,64,40.9998333333333
+16,65,41.4866666666667
+16,66,35.7928333333333
+16,67,35.2636666666667
+16,68,35.687
+16,69,35.433
+16,70,35.052
+16,71,33.5491666666667
+16,72,35.4541666666667
+16,73,37.1051666666667
+16,74,35.052
+16,75,40.5976666666667
+16,76,34.8615
+16,77,48.4293333333333
+16,78,35.941
+16,79,37.1686666666667
+16,80,44.1748333333333
+16,81,35.306
+16,82,41.0845
+16,83,30.3953333333333
+16,84,35.2213333333333
+16,85,26.3313333333333
+16,86,35.8563333333333
+16,87,28.6385
+16,88,29.6545
+16,89,35.8986666666667
+16,90,33.0623333333333
+16,91,31.8558333333333
+16,92,28.2786666666667
+16,93,33.8455
+16,94,39.8145
+16,95,39.8356666666667
+16,96,33.655
+16,97,36.5548333333333
+16,98,36.2161666666667
+16,99,33.4856666666667
+16,100,34.9885
+16,101,28.5961666666667
+16,102,35.433
+16,103,31.9828333333333
+16,104,34.417
+16,105,31.3266666666667
+16,106,40.132
+16,107,29.8026666666667
+16,108,42.5026666666667
+16,109,40.1955
+16,110,33.4856666666667
+16,111,31.3901666666667
+16,112,37.5073333333333
+16,113,36.0468333333333
+16,114,35.687
+16,115,28.3845
+16,116,38.9255
+16,117,34.417
+16,118,39.116
+16,119,38.5656666666667
+16,120,40.4706666666667
+16,121,35.9833333333333
+16,122,32.8295
+16,123,36.5971666666667
+16,124,40.4706666666667
+16,125,32.3215
+16,126,37.2533333333333
+16,127,35.052
+16,128,39.0948333333333
+16,129,38.7138333333333
+16,130,38.227
+16,131,34.4805
+16,132,34.3746666666667
+16,133,39.9838333333333
+16,134,40.132
+16,135,38.5656666666667
+16,136,33.7185
+16,137,31.6018333333333
+16,138,38.3963333333333
+16,139,43.3281666666667
+16,140,30.1201666666667
+16,141,35.0096666666667
+16,142,32.4908333333333
+16,143,33.1893333333333
+16,144,37.0628333333333
+16,145,29.6756666666667
+16,146,35.4965
+16,147,33.6973333333333
+16,148,34.5228333333333
+16,149,38.862
+16,150,35.2213333333333
+16,151,37.084
+16,152,32.004
+16,153,32.9353333333333
+16,154,35.3483333333333
+16,155,39.5605
+16,156,43.1588333333333
+16,157,31.5806666666667
+16,158,35.179
+16,159,40.8516666666667
+16,160,34.2688333333333
+16,161,34.417
+16,162,31.4536666666667
+16,163,31.4536666666667
+16,164,35.1155
+16,165,33.274
+16,166,41.8465
+16,167,34.7556666666667
+16,168,32.639
+16,169,41.275
+16,170,37.7825
+16,171,43.0318333333333
+16,172,30.0143333333333
+16,173,33.0835
+16,174,34.3746666666667
+16,175,33.6973333333333
+16,176,39.1371666666667
+16,177,32.6178333333333
+16,178,44.069
+16,179,44.2595
+16,180,30.861
+16,181,37.9941666666667
+16,182,42.9471666666667
+16,183,35.3483333333333
+16,184,40.64
+16,185,31.0091666666667
+16,186,32.004
+16,187,35.2425
+16,188,36.3643333333333
+16,189,29.083
+16,190,39.243
+16,191,36.068
+16,192,37.465
+16,193,28.4056666666667
+16,194,41.5078333333333
+16,195,39.7933333333333
+16,196,27.4108333333333
+16,197,29.6968333333333
+16,198,40.7246666666667
+16,199,30.7975
+16,200,39.7086666666667
+16,201,38.5445
+16,202,34.5651666666667
+16,203,44.4076666666667
+16,204,32.004
+16,205,36.449
+16,206,35.8986666666667
+16,207,32.2156666666667
+16,208,28.6596666666667
+16,209,38.7138333333333
+16,210,40.2378333333333
+16,211,46.6513333333333
+16,212,36.8935
+16,213,34.4381666666667
+16,214,38.6926666666667
+16,215,46.1221666666667
+16,216,35.4965
+16,217,37.1051666666667
+16,218,32.639
+16,219,36.576
+16,220,35.2213333333333
+16,221,36.83
+16,222,40.1108333333333
+16,223,41.3808333333333
+16,224,37.2745
+16,225,37.5285
+16,226,35.2425
+16,227,44.958
+16,228,39.4758333333333
+16,229,39.243
+16,230,43.1376666666667
+16,231,37.9941666666667
+16,232,32.0886666666667
+16,233,33.0623333333333
+16,234,40.3013333333333
+16,235,33.0623333333333
+16,236,27.7706666666667
+16,237,43.1376666666667
+16,238,30.9456666666667
+16,239,36.9781666666667
+16,240,30.1413333333333
+16,241,32.3426666666667
+16,242,35.8351666666667
+16,243,27.6648333333333
+16,244,38.7773333333333
+16,245,36.3855
+16,246,32.0886666666667
+16,247,32.5755
+16,248,28.575
+16,249,34.0571666666667
+16,250,40.2166666666667
+16,251,37.7613333333333
+16,252,25.9926666666667
+16,253,38.0153333333333
+16,254,41.1056666666667
+16,255,35.7928333333333
+16,256,35.7716666666667
+16,257,39.8356666666667
+16,258,37.0416666666667
+16,259,26.924
+16,260,37.592
+16,261,44.2806666666667
+16,262,42.418
+16,263,33.5068333333333
+16,264,33.782
+16,265,37.9306666666667
+16,266,39.3065
+16,267,39.6663333333333
+16,268,33.3798333333333
+16,269,41.7618333333333
+16,270,37.719
+16,271,35.9621666666667
+16,272,34.2476666666667
+16,273,40.2378333333333
+16,274,32.0886666666667
+16,275,30.1413333333333
+16,276,40.9575
+16,277,35.8563333333333
+16,278,32.4696666666667
+16,279,36.957
+16,280,30.1201666666667
+16,281,29.7391666666667
+16,282,40.4283333333333
+16,283,26.9028333333333
+16,284,46.4396666666667
+16,285,31.7923333333333
+16,286,33.147
+16,287,38.989
+16,288,38.3751666666667
+16,289,31.9616666666667
+16,290,34.798
+16,291,29.1041666666667
+16,292,45.5718333333333
+16,293,29.7603333333333
+16,294,30.7551666666667
+16,295,34.4805
+16,296,34.9885
+16,297,49.1701666666667
+16,298,37.2533333333333
+16,299,28.5326666666667
+16,300,40.386
+16,301,38.3116666666667
+16,302,36.5548333333333
+16,303,38.3116666666667
+16,304,28.3421666666667
+16,305,41.1903333333333
+16,306,41.402
+16,307,42.4815
+16,308,41.1903333333333
+16,309,44.704
+16,310,31.369
+16,311,38.9255
+16,312,34.4381666666667
+16,313,34.3746666666667
+16,314,44.5346666666667
+16,315,35.052
+16,316,36.3431666666667
+16,317,40.5976666666667
+16,318,33.528
+16,319,33.0411666666667
+16,320,38.9466666666667
+16,321,35.0943333333333
+16,322,31.4113333333333
+16,323,32.2368333333333
+16,324,39.116
+16,325,33.1681666666667
+16,326,41.5713333333333
+16,327,32.0886666666667
+16,328,36.5548333333333
+16,329,42.2063333333333
+16,330,37.3591666666667
+16,331,31.623
+16,332,34.7345
+16,333,41.2961666666667
+16,334,38.7561666666667
+16,335,38.1423333333333
+16,336,36.7665
+16,337,37.8036666666667
+16,338,36.7876666666667
+16,339,35.3695
+16,340,36.576
+16,341,41.0633333333333
+16,342,38.8408333333333
+16,343,40.0896666666667
+16,344,38.735
+16,345,34.9461666666667
+16,346,36.3643333333333
+16,347,36.5548333333333
+16,348,32.2791666666667
+16,349,36.4913333333333
+16,350,35.4753333333333
+16,351,40.4918333333333
+16,352,37.2321666666667
+16,353,31.0726666666667
+16,354,32.3426666666667
+16,355,30.9668333333333
+16,356,30.7975
+16,357,40.6611666666667
+16,358,38.5656666666667
+16,359,37.6978333333333
+16,360,36.703
+16,361,28.2151666666667
+16,362,31.7923333333333
+16,363,36.068
+16,364,33.0835
+16,365,33.3798333333333
+16,366,38.7985
+16,367,35.5811666666667
+16,368,36.7665
+16,369,32.4061666666667
+16,370,33.4433333333333
+16,371,48.1118333333333
+16,372,41.656
+16,373,37.211
+16,374,34.8826666666667
+16,375,38.5021666666667
+16,376,35.4541666666667
+16,377,33.4433333333333
+16,378,36.4701666666667
+16,379,29.2735
+16,380,33.8455
+16,381,34.7768333333333
+16,382,38.227
+16,383,35.1578333333333
+16,384,39.0313333333333
+16,385,35.0096666666667
+16,386,37.084
+16,387,41.1056666666667
+16,388,36.6818333333333
+16,389,32.1945
+16,390,36.2161666666667
+16,391,37.084
+16,392,34.7133333333333
+16,393,37.1263333333333
+16,394,30.0143333333333
+16,395,35.4541666666667
+16,396,39.9626666666667
+16,397,41.4866666666667
+16,398,44.0266666666667
+16,399,37.3591666666667
+16,400,38.2058333333333
+16,401,31.9405
+16,402,31.2843333333333
+16,403,32.1098333333333
+16,404,46.3973333333333
+16,405,33.7396666666667
+16,406,42.5026666666667
+16,407,31.0726666666667
+16,408,31.4325
+16,409,36.1103333333333
+16,410,31.4325
+16,411,39.3065
+16,412,36.576
+16,413,40.9998333333333
+16,414,40.7881666666667
+16,415,38.3963333333333
+16,416,37.846
+16,417,26.8816666666667
+16,418,37.465
+16,419,33.5491666666667
+16,420,38.1211666666667
+16,421,44.1113333333333
+16,422,34.163
+16,423,40.8093333333333
+16,424,35.0943333333333
+16,425,34.4805
+16,426,32.2156666666667
+16,427,39.3488333333333
+16,428,44.8521666666667
+16,429,35.2213333333333
+16,430,32.5331666666667
+16,431,40.3648333333333
+16,432,37.211
+16,433,38.5021666666667
+16,434,37.0416666666667
+16,435,36.5548333333333
+16,436,36.9781666666667
+16,437,35.2213333333333
+16,438,32.4696666666667
+16,439,44.3018333333333
+16,440,29.337
+16,441,38.3751666666667
+16,442,37.4226666666667
+16,443,42.5661666666667
+16,444,34.5016666666667
+16,445,31.5595
+16,446,34.3111666666667
+16,447,42.2698333333333
+16,448,34.544
+16,449,37.0205
+16,450,42.672
+16,451,34.7345
+16,452,36.2373333333333
+16,453,37.8883333333333
+16,454,40.9786666666667
+16,455,37.2533333333333
+16,456,33.8243333333333
+16,457,30.099
+16,458,38.5445
+16,459,42.2063333333333
+16,460,35.7081666666667
+16,461,24.8708333333333
+16,462,36.322
+16,463,40.9998333333333
+16,464,34.671
+16,465,29.21
+16,466,42.8201666666667
+16,467,35.0308333333333
+16,468,33.1893333333333
+16,469,33.8878333333333
+16,470,37.9941666666667
+16,471,32.512
+16,472,35.9198333333333
+16,473,28.7866666666667
+16,474,38.1846666666667
+16,475,36.7453333333333
+16,476,36.9781666666667
+16,477,31.1785
+16,478,36.576
+16,479,32.9141666666667
+16,480,32.8718333333333
+16,481,32.6813333333333
+16,482,38.735
+16,483,31.3901666666667
+16,484,38.5656666666667
+16,485,38.6926666666667
+16,486,43.7303333333333
+16,487,38.0153333333333
+16,488,34.2265
+16,489,32.7871666666667
+16,490,36.7453333333333
+16,491,34.8191666666667
+16,492,33.274
+16,493,32.8718333333333
+16,494,33.5068333333333
+16,495,42.3756666666667
+16,496,40.2166666666667
+16,497,32.766
+16,498,37.3591666666667
+16,499,35.1155
+16,500,45.2331666666667
+16,501,35.814
+16,502,42.2275
+16,503,32.8506666666667
+16,504,33.909
+16,505,28.4056666666667
+16,506,27.9823333333333
+16,507,32.004
+16,508,38.6926666666667
+16,509,43.7726666666667
+16,510,40.259
+16,511,37.9518333333333
+16,512,34.1841666666667
+16,513,36.2161666666667
+16,514,41.5078333333333
+16,515,33.9301666666667
+16,516,37.8036666666667
+16,517,29.6968333333333
+16,518,33.0411666666667
+16,519,42.6508333333333
+16,520,33.3798333333333
+16,521,31.9405
+16,522,32.258
+16,523,33.7608333333333
+16,524,29.8238333333333
+16,525,42.8625
+16,526,34.6286666666667
+16,527,42.4391666666667
+16,528,34.6075
+16,529,24.0241666666667
+16,530,37.8671666666667
+16,531,42.6296666666667
+16,532,40.3648333333333
+16,533,46.228
+16,534,35.4118333333333
+16,535,36.5125
+16,536,35.7505
+16,537,29.5698333333333
+16,538,40.64
+16,539,31.0091666666667
+16,540,32.131
+16,541,31.0303333333333
+16,542,45.593
+16,543,35.1366666666667
+16,544,37.2956666666667
+16,545,42.8413333333333
+16,546,31.115
+16,547,43.053
+16,548,33.9301666666667
+16,549,36.957
+16,550,42.6931666666667
+16,551,35.687
+16,552,38.6291666666667
+16,553,40.5765
+16,554,29.464
+16,555,37.846
+16,556,28.321
+16,557,46.482
+16,558,36.2161666666667
+16,559,37.4861666666667
+16,560,33.9725
+16,561,35.5176666666667
+16,562,36.6183333333333
+16,563,32.9353333333333
+16,564,40.8516666666667
+16,565,29.0618333333333
+16,566,31.2631666666667
+16,567,39.9838333333333
+16,568,38.989
+16,569,36.0468333333333
+16,570,28.9348333333333
+16,571,36.1738333333333
+16,572,39.243
+16,573,35.56
+16,574,29.5063333333333
+16,575,32.8295
+16,576,37.1475
+16,577,36.1315
+16,578,39.9626666666667
+16,579,35.941
+16,580,34.163
+16,581,35.3271666666667
+16,582,32.0463333333333
+16,583,35.7293333333333
+16,584,38.9043333333333
+16,585,35.9833333333333
+16,586,29.21
+16,587,38.0153333333333
+16,588,27.7706666666667
+16,589,37.5285
+16,590,42.3333333333333
+16,591,33.9936666666667
+16,592,39.6875
+16,593,34.7133333333333
+16,594,37.5708333333333
+16,595,41.275
+16,596,41.783
+16,597,37.211
+16,598,49.1278333333333
+16,599,37.084
+16,600,35.3483333333333
+16,601,43.0741666666667
+16,602,36.8088333333333
+16,603,36.9781666666667
+16,604,37.973
+16,605,36.2796666666667
+16,606,30.0355
+16,607,40.6188333333333
+16,608,36.9358333333333
+16,609,31.5171666666667
+16,610,30.6281666666667
+16,611,25.7386666666667
+16,612,33.3163333333333
+16,613,39.6875
+16,614,35.8775
+16,615,40.767
+16,616,33.8878333333333
+16,617,31.6653333333333
+16,618,40.0473333333333
+16,619,41.529
+16,620,39.37
+16,621,33.1893333333333
+16,622,41.9735
+16,623,35.2636666666667
+16,624,39.2006666666667
+16,625,37.3591666666667
+16,626,38.608
+16,627,34.7768333333333
+16,628,31.2208333333333
+16,629,37.973
+16,630,34.0571666666667
+16,631,34.417
+16,632,36.8088333333333
+16,633,39.7721666666667
+16,634,33.6338333333333
+16,635,32.5755
+16,636,39.1795
+16,637,37.2956666666667
+16,638,28.6173333333333
+16,639,39.1583333333333
+16,640,32.1733333333333
+16,641,38.7985
+16,642,32.5331666666667
+16,643,32.4273333333333
+16,644,37.6131666666667
+16,645,28.8713333333333
+16,646,31.7711666666667
+16,647,39.878
+16,648,34.544
+16,649,38.0365
+16,650,35.687
+16,651,40.0685
+16,652,34.5016666666667
+16,653,38.4175
+16,654,34.0783333333333
+16,655,32.4696666666667
+16,656,37.8036666666667
+16,657,36.1738333333333
+16,658,35.4753333333333
+16,659,34.9673333333333
+16,660,33.1046666666667
+16,661,34.6075
+16,662,42.672
+16,663,30.353
+16,664,28.5115
+16,665,35.9621666666667
+16,666,36.2796666666667
+16,667,29.8026666666667
+16,668,35.941
+16,669,36.322
+16,670,41.3385
+16,671,33.9513333333333
+16,672,34.9461666666667
+16,673,28.7443333333333
+16,674,33.147
+16,675,36.2373333333333
+16,676,37.1051666666667
+16,677,33.8666666666667
+16,678,29.4428333333333
+16,679,34.7768333333333
+16,680,31.0091666666667
+16,681,43.1165
+16,682,42.8836666666667
+16,683,38.3751666666667
+16,684,34.925
+16,685,32.4908333333333
+16,686,32.7871666666667
+16,687,29.0406666666667
+16,688,33.7396666666667
+16,689,34.0571666666667
+16,690,36.1103333333333
+16,691,37.6978333333333
+16,692,36.4066666666667
+16,693,40.2166666666667
+16,694,39.8991666666667
+16,695,33.3375
+16,696,30.6916666666667
+16,697,32.131
+16,698,41.2326666666667
+16,699,35.5811666666667
+16,700,31.0726666666667
+16,701,30.988
+16,702,32.4485
+16,703,36.0891666666667
+16,704,28.2575
+16,705,36.2796666666667
+16,706,38.1635
+16,707,45.6141666666667
+16,708,37.5285
+16,709,28.9771666666667
+16,710,35.306
+16,711,35.7293333333333
+16,712,40.0685
+16,713,38.0576666666667
+16,714,36.6606666666667
+16,715,37.6978333333333
+16,716,39.3276666666667
+16,717,48.3023333333333
+16,718,37.5285
+16,719,32.3426666666667
+16,720,35.3271666666667
+16,721,33.274
+16,722,35.6235
+16,723,35.7293333333333
+16,724,37.2321666666667
+16,725,32.3638333333333
+16,726,39.6028333333333
+16,727,32.8083333333333
+16,728,41.9523333333333
+16,729,31.115
+16,730,50.4613333333333
+16,731,35.052
+16,732,34.3323333333333
+16,733,33.909
+16,734,38.1846666666667
+16,735,29.4216666666667
+16,736,42.0793333333333
+16,737,33.0835
+16,738,36.3643333333333
+16,739,31.75
+16,740,40.8093333333333
+16,741,28.2363333333333
+16,742,44.7251666666667
+16,743,33.782
+16,744,28.7655
+16,745,40.5765
+16,746,32.4061666666667
+16,747,42.7143333333333
+16,748,31.115
+16,749,34.544
+16,750,31.877
+16,751,37.465
+16,752,35.7716666666667
+16,753,29.4005
+16,754,33.782
+16,755,27.1568333333333
+16,756,35.7505
+16,757,44.2383333333333
+16,758,27.3685
+16,759,43.5821666666667
+16,760,34.9461666666667
+16,761,32.8083333333333
+16,762,32.4908333333333
+16,763,30.099
+16,764,31.5383333333333
+16,765,32.7448333333333
+16,766,31.5171666666667
+16,767,42.6508333333333
+16,768,29.8026666666667
+16,769,26.9663333333333
+16,770,32.1733333333333
+16,771,36.1315
+16,772,35.3483333333333
+16,773,36.7876666666667
+16,774,42.8625
+16,775,39.7933333333333
+16,776,31.3478333333333
+16,777,32.8506666666667
+16,778,31.6653333333333
+16,779,39.2006666666667
+16,780,40.1108333333333
+16,781,35.0943333333333
+16,782,32.512
+16,783,36.0256666666667
+16,784,38.0365
+16,785,31.6441666666667
+16,786,29.5275
+16,787,38.7985
+16,788,30.5858333333333
+16,789,38.9255
+16,790,32.8506666666667
+16,791,25.8656666666667
+16,792,36.5548333333333
+16,793,37.9306666666667
+16,794,40.8305
+16,795,37.7401666666667
+16,796,37.8671666666667
+16,797,37.1051666666667
+16,798,32.1521666666667
+16,799,32.004
+16,800,29.8026666666667
+16,801,36.4066666666667
+16,802,41.5078333333333
+16,803,35.7505
+16,804,35.5388333333333
+16,805,32.4696666666667
+16,806,32.8083333333333
+16,807,34.29
+16,808,38.1635
+16,809,37.4226666666667
+16,810,28.702
+16,811,35.6023333333333
+16,812,31.6653333333333
+16,813,37.6555
+16,814,37.7613333333333
+16,815,30.1413333333333
+16,816,39.116
+16,817,33.8243333333333
+16,818,34.798
+16,819,37.2321666666667
+16,820,29.083
+16,821,39.0525
+16,822,40.8516666666667
+16,823,44.196
+16,824,35.814
+16,825,39.3276666666667
+16,826,33.7608333333333
+16,827,38.9255
+16,828,37.084
+16,829,41.9946666666667
+16,830,36.8511666666667
+16,831,36.8088333333333
+16,832,37.6978333333333
+16,833,39.5181666666667
+16,834,34.29
+16,835,34.29
+16,836,35.2636666666667
+16,837,25.6328333333333
+16,838,47.1593333333333
+16,839,29.9296666666667
+16,840,30.6493333333333
+16,841,36.1526666666667
+16,842,38.608
+16,843,38.481
+16,844,34.0571666666667
+16,845,31.7076666666667
+16,846,35.5176666666667
+16,847,35.8563333333333
+16,848,37.1051666666667
+16,849,40.4283333333333
+16,850,34.9885
+16,851,41.7406666666667
+16,852,40.3436666666667
+16,853,31.3055
+16,854,35.7928333333333
+16,855,35.6023333333333
+16,856,41.8465
+16,857,34.1206666666667
+16,858,38.3328333333333
+16,859,39.0525
+16,860,35.4965
+16,861,37.6766666666667
+16,862,32.3638333333333
+16,863,33.147
+16,864,32.1945
+16,865,36.2796666666667
+16,866,30.8398333333333
+16,867,29.8873333333333
+16,868,42.5238333333333
+16,869,31.9616666666667
+16,870,32.7236666666667
+16,871,40.8093333333333
+16,872,36.3008333333333
+16,873,34.417
+16,874,37.0628333333333
+16,875,40.3225
+16,876,33.0623333333333
+16,877,39.7721666666667
+16,878,34.4805
+16,879,35.3483333333333
+16,880,31.0726666666667
+16,881,25.8868333333333
+16,882,39.5181666666667
+16,883,36.2585
+16,884,35.3695
+16,885,37.2533333333333
+16,886,30.7551666666667
+16,887,40.4283333333333
+16,888,44.9156666666667
+16,889,33.7608333333333
+16,890,41.6348333333333
+16,891,39.8568333333333
+16,892,41.3808333333333
+16,893,35.7293333333333
+16,894,31.1361666666667
+16,895,38.5656666666667
+16,896,35.7081666666667
+16,897,29.972
+16,898,42.418
+16,899,40.7881666666667
+16,900,30.8821666666667
+16,901,34.9673333333333
+16,902,30.9668333333333
+16,903,33.4856666666667
+16,904,36.4278333333333
+16,905,36.3431666666667
+16,906,34.0995
+16,907,47.4345
+16,908,39.0101666666667
+16,909,32.9565
+16,910,33.909
+16,911,33.5491666666667
+16,912,31.6865
+16,913,30.6705
+16,914,34.671
+16,915,34.3535
+16,916,38.5233333333333
+16,917,34.3323333333333
+16,918,33.782
+16,919,33.2951666666667
+16,920,39.37
+16,921,34.5651666666667
+16,922,25.4211666666667
+16,923,37.0416666666667
+16,924,27.305
+16,925,31.496
+16,926,33.1893333333333
+16,927,35.4965
+16,928,26.543
+16,929,38.9255
+16,930,39.0736666666667
+16,931,38.1635
+16,932,31.4748333333333
+16,933,43.434
+16,934,31.1785
+16,935,30.226
+16,936,27.1991666666667
+16,937,47.6461666666667
+16,938,31.0726666666667
+16,939,34.163
+16,940,33.274
+16,941,31.8346666666667
+16,942,42.672
+16,943,36.3855
+16,944,33.1258333333333
+16,945,43.7726666666667
+16,946,42.6296666666667
+16,947,38.4175
+16,948,30.5011666666667
+16,949,29.3581666666667
+16,950,40.5553333333333
+16,951,37.1263333333333
+16,952,43.0106666666667
+16,953,40.5553333333333
+16,954,36.2373333333333
+16,955,32.0886666666667
+16,956,34.7345
+16,957,33.4645
+16,958,31.0303333333333
+16,959,28.8078333333333
+16,960,30.5646666666667
+16,961,32.2791666666667
+16,962,31.1996666666667
+16,963,34.036
+16,964,34.2476666666667
+16,965,42.2063333333333
+16,966,30.9668333333333
+16,967,46.3338333333333
+16,968,35.9833333333333
+16,969,30.8398333333333
+16,970,38.1
+16,971,28.6596666666667
+16,972,32.8295
+16,973,32.0886666666667
+16,974,38.1423333333333
+16,975,39.3488333333333
+16,976,33.02
+16,977,41.4866666666667
+16,978,26.5641666666667
+16,979,34.163
+16,980,39.1795
+16,981,35.9621666666667
+16,982,39.243
+16,983,33.9725
+16,984,37.9095
+16,985,39.751
+16,986,24.8708333333333
+16,987,34.7556666666667
+16,988,36.83
+16,989,33.909
+16,990,28.2151666666667
+16,991,38.735
+16,992,37.7825
+16,993,31.242
+16,994,42.3121666666667
+16,995,33.1046666666667
+16,996,31.7711666666667
+16,997,32.9776666666667
+16,998,37.592
+16,999,35.9198333333333
+16,1000,37.338
+17,1,31.0091666666667
+17,2,22.9446666666667
+17,3,25.7175
+17,4,24.2146666666667
+17,5,28.7655
+17,6,34.3323333333333
+17,7,25.6328333333333
+17,8,27.1145
+17,9,30.7551666666667
+17,10,32.893
+17,11,26.0773333333333
+17,12,28.9348333333333
+17,13,27.8976666666667
+17,14,32.639
+17,15,25.4635
+17,16,25.2941666666667
+17,17,27.0721666666667
+17,18,27.0086666666667
+17,19,30.3318333333333
+17,20,37.2956666666667
+17,21,24.4263333333333
+17,22,28.5538333333333
+17,23,30.9245
+17,24,34.3535
+17,25,30.3741666666667
+17,26,26.8181666666667
+17,27,21.4418333333333
+17,28,29.9508333333333
+17,29,19.6638333333333
+17,30,31.9193333333333
+17,31,35.4541666666667
+17,32,28.7866666666667
+17,33,27.9611666666667
+17,34,30.226
+17,35,29.4851666666667
+17,36,29.5063333333333
+17,37,31.242
+17,38,22.5425
+17,39,34.29
+17,40,21.6111666666667
+17,41,23.4103333333333
+17,42,34.544
+17,43,26.67
+17,44,27.1356666666667
+17,45,22.1403333333333
+17,46,24.1723333333333
+17,47,30.607
+17,48,24.9343333333333
+17,49,26.035
+17,50,22.7965
+17,51,31.0938333333333
+17,52,26.3948333333333
+17,53,20.5528333333333
+17,54,29.8026666666667
+17,55,25.3365
+17,56,28.8078333333333
+17,57,26.2255
+17,58,22.3096666666667
+17,59,26.416
+17,60,26.4583333333333
+17,61,36.6395
+17,62,20.4893333333333
+17,63,27.8553333333333
+17,64,31.5806666666667
+17,65,31.6441666666667
+17,66,25.7386666666667
+17,67,26.4371666666667
+17,68,24.5321666666667
+17,69,25.5905
+17,70,24.257
+17,71,29.3158333333333
+17,72,25.5693333333333
+17,73,31.0303333333333
+17,74,25.2941666666667
+17,75,22.8176666666667
+17,76,22.9235
+17,77,26.8393333333333
+17,78,24.5745
+17,79,31.1996666666667
+17,80,26.4371666666667
+17,81,23.7701666666667
+17,82,30.9456666666667
+17,83,26.7546666666667
+17,84,26.9028333333333
+17,85,24.892
+17,86,27.7071666666667
+17,87,33.4221666666667
+17,88,26.0985
+17,89,30.2048333333333
+17,90,29.7391666666667
+17,91,35.306
+17,92,26.6488333333333
+17,93,25.2941666666667
+17,94,25.5905
+17,95,23.114
+17,96,29.2523333333333
+17,97,25.3576666666667
+17,98,23.7701666666667
+17,99,25.2941666666667
+17,100,29.21
+17,101,31.75
+17,102,25.654
+17,103,19.6215
+17,104,28.7866666666667
+17,105,28.5961666666667
+17,106,25.2095
+17,107,21.4206666666667
+17,108,26.2043333333333
+17,109,24.0876666666667
+17,110,30.353
+17,111,30.6916666666667
+17,112,29.5698333333333
+17,113,20.8068333333333
+17,114,30.7551666666667
+17,115,20.5528333333333
+17,116,25.3365
+17,117,25.1671666666667
+17,118,20.828
+17,119,28.5538333333333
+17,120,24.892
+17,121,30.2683333333333
+17,122,30.1836666666667
+17,123,29.2735
+17,124,34.9461666666667
+17,125,26.289
+17,126,29.8661666666667
+17,127,24.3416666666667
+17,128,36.2373333333333
+17,129,27.7495
+17,130,26.9451666666667
+17,131,30.4165
+17,132,21.8016666666667
+17,133,24.003
+17,134,32.0886666666667
+17,135,35.9833333333333
+17,136,26.2466666666667
+17,137,24.4051666666667
+17,138,32.6601666666667
+17,139,35.179
+17,140,27.686
+17,141,32.8506666666667
+17,142,23.749
+17,143,24.8708333333333
+17,144,37.3591666666667
+17,145,28.7231666666667
+17,146,24.7015
+17,147,19.3675
+17,148,20.2141666666667
+17,149,32.4485
+17,150,31.0091666666667
+17,151,36.0891666666667
+17,152,29.2946666666667
+17,153,28.5115
+17,154,29.6333333333333
+17,155,24.13
+17,156,35.3695
+17,157,26.5641666666667
+17,158,26.6276666666667
+17,159,18.5208333333333
+17,160,25.9291666666667
+17,161,33.4645
+17,162,24.2781666666667
+17,163,25.3153333333333
+17,164,26.7546666666667
+17,165,30.2895
+17,166,23.4738333333333
+17,167,26.4371666666667
+17,168,26.6488333333333
+17,169,30.861
+17,170,27.559
+17,171,25.8021666666667
+17,172,20.3835
+17,173,32.0886666666667
+17,174,27.8553333333333
+17,175,25.654
+17,176,24.0665
+17,177,19.7061666666667
+17,178,26.2043333333333
+17,179,26.5641666666667
+17,180,19.939
+17,181,35.2848333333333
+17,182,35.6235
+17,183,27.813
+17,184,38.9255
+17,185,28.8713333333333
+17,186,30.3106666666667
+17,187,33.6126666666667
+17,188,27.7283333333333
+17,189,23.0928333333333
+17,190,26.1408333333333
+17,191,31.8558333333333
+17,192,30.988
+17,193,30.0143333333333
+17,194,36.1738333333333
+17,195,33.1258333333333
+17,196,34.7345
+17,197,20.2988333333333
+17,198,25.6751666666667
+17,199,26.797
+17,200,25.527
+17,201,26.1408333333333
+17,202,27.7706666666667
+17,203,30.0778333333333
+17,204,37.338
+17,205,23.4103333333333
+17,206,26.3313333333333
+17,207,21.209
+17,208,20.5316666666667
+17,209,31.0091666666667
+17,210,29.972
+17,211,24.0453333333333
+17,212,25.8868333333333
+17,213,28.3421666666667
+17,214,31.3901666666667
+17,215,31.0938333333333
+17,216,35.9621666666667
+17,217,29.972
+17,218,28.0881666666667
+17,219,25.9926666666667
+17,220,25.5693333333333
+17,221,24.9978333333333
+17,222,27.5166666666667
+17,223,27.94
+17,224,24.7015
+17,225,29.718
+17,226,27.6225
+17,227,24.0665
+17,228,28.6596666666667
+17,229,29.4428333333333
+17,230,23.0293333333333
+17,231,27.5378333333333
+17,232,23.2621666666667
+17,233,28.2998333333333
+17,234,33.3375
+17,235,29.7815
+17,236,23.2198333333333
+17,237,26.0773333333333
+17,238,21.0185
+17,239,21.7593333333333
+17,240,26.5641666666667
+17,241,27.0298333333333
+17,242,27.0298333333333
+17,243,27.9823333333333
+17,244,24.3628333333333
+17,245,29.083
+17,246,29.3793333333333
+17,247,29.1465
+17,248,34.5016666666667
+17,249,23.4526666666667
+17,250,26.3313333333333
+17,251,28.2575
+17,252,27.5378333333333
+17,253,17.8858333333333
+17,254,31.3901666666667
+17,255,25.4635
+17,256,36.0045
+17,257,30.48
+17,258,30.9456666666667
+17,259,22.4155
+17,260,22.225
+17,261,30.5646666666667
+17,262,32.0251666666667
+17,263,23.2621666666667
+17,264,30.5223333333333
+17,265,25.654
+17,266,31.3055
+17,267,31.5595
+17,268,26.7546666666667
+17,269,21.8228333333333
+17,270,23.7701666666667
+17,271,28.4691666666667
+17,272,28.3421666666667
+17,273,27.7918333333333
+17,274,30.1625
+17,275,32.9565
+17,276,23.3045
+17,277,32.2791666666667
+17,278,19.8331666666667
+17,279,28.956
+17,280,34.5863333333333
+17,281,29.4851666666667
+17,282,29.0406666666667
+17,283,21.9498333333333
+17,284,24.4051666666667
+17,285,36.4913333333333
+17,286,20.32
+17,287,23.1986666666667
+17,288,30.9456666666667
+17,289,25.8021666666667
+17,290,26.6911666666667
+17,291,24.13
+17,292,32.512
+17,293,24.9555
+17,294,35.8563333333333
+17,295,28.2575
+17,296,26.3948333333333
+17,297,24.1723333333333
+17,298,34.3111666666667
+17,299,27.7495
+17,300,26.6911666666667
+17,301,30.5435
+17,302,26.8816666666667
+17,303,31.623
+17,304,27.3473333333333
+17,305,38.0365
+17,306,36.2161666666667
+17,307,36.6818333333333
+17,308,23.0505
+17,309,32.131
+17,310,26.9451666666667
+17,311,31.496
+17,312,32.1733333333333
+17,313,27.4531666666667
+17,314,30.6705
+17,315,28.2151666666667
+17,316,31.1996666666667
+17,317,26.8181666666667
+17,318,34.036
+17,319,33.4433333333333
+17,320,27.051
+17,321,23.6643333333333
+17,322,28.1728333333333
+17,323,27.7283333333333
+17,324,28.6173333333333
+17,325,29.2735
+17,326,26.797
+17,327,38.9678333333333
+17,328,33.274
+17,329,29.4851666666667
+17,330,28.3421666666667
+17,331,26.0138333333333
+17,332,39.1583333333333
+17,333,29.972
+17,334,25.7386666666667
+17,335,28.5115
+17,336,33.4433333333333
+17,337,28.448
+17,338,28.448
+17,339,29.2311666666667
+17,340,26.543
+17,341,30.2048333333333
+17,342,29.8238333333333
+17,343,27.4531666666667
+17,344,29.845
+17,345,27.7283333333333
+17,346,23.5585
+17,347,28.194
+17,348,26.2255
+17,349,31.9616666666667
+17,350,25.6963333333333
+17,351,26.4371666666667
+17,352,28.9983333333333
+17,353,39.0948333333333
+17,354,31.5171666666667
+17,355,31.623
+17,356,24.4686666666667
+17,357,28.2575
+17,358,25.4423333333333
+17,359,26.6488333333333
+17,360,32.512
+17,361,19.0923333333333
+17,362,26.3101666666667
+17,363,28.7443333333333
+17,364,33.782
+17,365,33.6761666666667
+17,366,30.6281666666667
+17,367,27.0933333333333
+17,368,21.9075
+17,369,27.7071666666667
+17,370,26.9028333333333
+17,371,27.9823333333333
+17,372,33.4221666666667
+17,373,23.0928333333333
+17,374,35.8563333333333
+17,375,26.162
+17,376,31.4748333333333
+17,377,39.243
+17,378,23.2833333333333
+17,379,29.21
+17,380,30.1413333333333
+17,381,32.6178333333333
+17,382,26.5641666666667
+17,383,31.5383333333333
+17,384,26.0138333333333
+17,385,30.3953333333333
+17,386,24.7015
+17,387,27.4531666666667
+17,388,26.8181666666667
+17,389,23.5585
+17,390,31.0303333333333
+17,391,32.4273333333333
+17,392,25.8021666666667
+17,393,23.749
+17,394,18.5208333333333
+17,395,35.3483333333333
+17,396,31.6018333333333
+17,397,22.3308333333333
+17,398,34.8615
+17,399,35.9198333333333
+17,400,23.4315
+17,401,30.5858333333333
+17,402,28.1516666666667
+17,403,27.5801666666667
+17,404,21.3571666666667
+17,405,33.7396666666667
+17,406,29.718
+17,407,25.6963333333333
+17,408,27.6225
+17,409,25.5481666666667
+17,410,31.6653333333333
+17,411,29.9931666666667
+17,412,28.5326666666667
+17,413,32.6601666666667
+17,414,25.781
+17,415,32.8718333333333
+17,416,26.1408333333333
+17,417,33.8878333333333
+17,418,31.8558333333333
+17,419,24.0665
+17,420,30.8821666666667
+17,421,39.1371666666667
+17,422,21.9921666666667
+17,423,29.337
+17,424,27.559
+17,425,22.0345
+17,426,35.6658333333333
+17,427,35.6658333333333
+17,428,26.543
+17,429,33.7396666666667
+17,430,31.3266666666667
+17,431,29.7391666666667
+17,432,26.5218333333333
+17,433,36.0891666666667
+17,434,18.8595
+17,435,31.4748333333333
+17,436,24.4475
+17,437,32.9988333333333
+17,438,28.1305
+17,439,23.1986666666667
+17,440,33.9513333333333
+17,441,24.4263333333333
+17,442,21.4418333333333
+17,443,22.5636666666667
+17,444,28.702
+17,445,16.5523333333333
+17,446,27.5378333333333
+17,447,34.0783333333333
+17,448,28.8501666666667
+17,449,25.3576666666667
+17,450,31.4113333333333
+17,451,24.511
+17,452,28.6173333333333
+17,453,31.1573333333333
+17,454,35.3271666666667
+17,455,24.5956666666667
+17,456,25.2095
+17,457,29.5063333333333
+17,458,29.2311666666667
+17,459,26.7335
+17,460,23.7913333333333
+17,461,25.5905
+17,462,27.3896666666667
+17,463,23.368
+17,464,22.3096666666667
+17,465,30.8821666666667
+17,466,25.8445
+17,467,41.2538333333333
+17,468,25.6751666666667
+17,469,34.7345
+17,470,27.3473333333333
+17,471,22.4366666666667
+17,472,21.8016666666667
+17,473,26.8393333333333
+17,474,26.0985
+17,475,30.1201666666667
+17,476,30.1836666666667
+17,477,30.9033333333333
+17,478,25.2518333333333
+17,479,21.7593333333333
+17,480,36.3431666666667
+17,481,34.9038333333333
+17,482,27.0086666666667
+17,483,22.3731666666667
+17,484,27.813
+17,485,20.6375
+17,486,26.6488333333333
+17,487,25.2941666666667
+17,488,29.4005
+17,489,27.9188333333333
+17,490,28.6385
+17,491,33.8878333333333
+17,492,26.9028333333333
+17,493,26.5218333333333
+17,494,26.289
+17,495,27.3473333333333
+17,496,13.9911666666667
+17,497,22.7541666666667
+17,498,23.8336666666667
+17,499,32.3003333333333
+17,500,31.2631666666667
+17,501,35.2636666666667
+17,502,19.304
+17,503,27.2203333333333
+17,504,30.1625
+17,505,27.6648333333333
+17,506,27.7918333333333
+17,507,24.5956666666667
+17,508,31.3478333333333
+17,509,24.9555
+17,510,28.2786666666667
+17,511,32.8083333333333
+17,512,29.6121666666667
+17,513,21.1243333333333
+17,514,25.8021666666667
+17,515,26.5853333333333
+17,516,22.3731666666667
+17,517,29.2311666666667
+17,518,28.0458333333333
+17,519,24.3205
+17,520,25.4
+17,521,27.4955
+17,522,22.6906666666667
+17,523,36.4066666666667
+17,524,28.2151666666667
+17,525,28.2151666666667
+17,526,30.4376666666667
+17,527,28.3421666666667
+17,528,22.2673333333333
+17,529,26.4795
+17,530,35.0096666666667
+17,531,29.4216666666667
+17,532,22.098
+17,533,25.273
+17,534,29.1888333333333
+17,535,25.7175
+17,536,34.4805
+17,537,35.4753333333333
+17,538,27.6225
+17,539,21.7593333333333
+17,540,32.0886666666667
+17,541,31.496
+17,542,33.147
+17,543,31.7076666666667
+17,544,24.8496666666667
+17,545,28.067
+17,546,25.527
+17,547,32.9565
+17,548,29.8238333333333
+17,549,28.7231666666667
+17,550,32.4696666666667
+17,551,33.1258333333333
+17,552,31.6018333333333
+17,553,25.7386666666667
+17,554,24.4898333333333
+17,555,23.876
+17,556,26.0138333333333
+17,557,25.1036666666667
+17,558,26.3736666666667
+17,559,27.813
+17,560,28.5115
+17,561,26.8816666666667
+17,562,25.6328333333333
+17,563,39.3488333333333
+17,564,29.9296666666667
+17,565,30.9033333333333
+17,566,28.8078333333333
+17,567,32.5966666666667
+17,568,31.4325
+17,569,25.8656666666667
+17,570,28.2786666666667
+17,571,25.9715
+17,572,26.9451666666667
+17,573,32.512
+17,574,25.7175
+17,575,31.7711666666667
+17,576,25.527
+17,577,31.3478333333333
+17,578,23.368
+17,579,23.4738333333333
+17,580,38.2481666666667
+17,581,36.6183333333333
+17,582,27.2626666666667
+17,583,23.114
+17,584,29.21
+17,585,32.8295
+17,586,29.1253333333333
+17,587,27.5801666666667
+17,588,25.4635
+17,589,21.082
+17,590,30.4376666666667
+17,591,29.464
+17,592,26.2255
+17,593,31.6865
+17,594,25.4
+17,595,40.894
+17,596,26.3736666666667
+17,597,26.2043333333333
+17,598,34.7133333333333
+17,599,24.8708333333333
+17,600,21.7381666666667
+17,601,31.9193333333333
+17,602,22.3096666666667
+17,603,29.6968333333333
+17,604,24.0241666666667
+17,605,26.2043333333333
+17,606,30.6281666666667
+17,607,26.8181666666667
+17,608,27.1991666666667
+17,609,25.6328333333333
+17,610,22.733
+17,611,25.8233333333333
+17,612,32.893
+17,613,30.0355
+17,614,27.5378333333333
+17,615,24.5956666666667
+17,616,33.147
+17,617,29.6756666666667
+17,618,28.9771666666667
+17,619,28.2998333333333
+17,620,26.8181666666667
+17,621,23.9395
+17,622,22.9446666666667
+17,623,28.7655
+17,624,25.654
+17,625,25.781
+17,626,27.1991666666667
+17,627,24.257
+17,628,27.2415
+17,629,41.3808333333333
+17,630,22.5425
+17,631,25.1883333333333
+17,632,30.5011666666667
+17,633,27.3261666666667
+17,634,25.019
+17,635,26.9451666666667
+17,636,19.8543333333333
+17,637,26.6488333333333
+17,638,34.2053333333333
+17,639,24.3205
+17,640,31.496
+17,641,26.3948333333333
+17,642,25.2095
+17,643,29.4005
+17,644,22.9235
+17,645,33.3798333333333
+17,646,28.5538333333333
+17,647,38.1423333333333
+17,648,37.084
+17,649,30.353
+17,650,30.7128333333333
+17,651,24.4051666666667
+17,652,37.2321666666667
+17,653,30.5011666666667
+17,654,24.9343333333333
+17,655,30.2048333333333
+17,656,20.5105
+17,657,28.8925
+17,658,33.2528333333333
+17,659,29.5063333333333
+17,660,27.6225
+17,661,26.3736666666667
+17,662,35.0096666666667
+17,663,24.3628333333333
+17,664,23.4738333333333
+17,665,27.6225
+17,666,36.4701666666667
+17,667,25.1036666666667
+17,668,35.4753333333333
+17,669,27.178
+17,670,34.2688333333333
+17,671,29.4216666666667
+17,672,26.416
+17,673,32.385
+17,674,29.2735
+17,675,24.3205
+17,676,26.8816666666667
+17,677,35.1366666666667
+17,678,32.766
+17,679,33.3375
+17,680,26.7335
+17,681,27.1356666666667
+17,682,29.6121666666667
+17,683,25.0825
+17,684,29.9931666666667
+17,685,29.5275
+17,686,36.1103333333333
+17,687,23.368
+17,688,28.956
+17,689,31.1573333333333
+17,690,28.956
+17,691,29.9296666666667
+17,692,33.4221666666667
+17,693,31.75
+17,694,23.5585
+17,695,22.5636666666667
+17,696,37.4226666666667
+17,697,26.0773333333333
+17,698,29.1253333333333
+17,699,31.7288333333333
+17,700,27.559
+17,701,24.257
+17,702,31.3478333333333
+17,703,28.829
+17,704,30.9668333333333
+17,705,29.7391666666667
+17,706,22.352
+17,707,30.2048333333333
+17,708,32.9353333333333
+17,709,33.528
+17,710,26.924
+17,711,34.6921666666667
+17,712,26.5006666666667
+17,713,32.7871666666667
+17,714,23.5373333333333
+17,715,32.2156666666667
+17,716,29.3581666666667
+17,717,31.4748333333333
+17,718,32.4908333333333
+17,719,38.2481666666667
+17,720,27.051
+17,721,35.8986666666667
+17,722,27.559
+17,723,20.9973333333333
+17,724,28.1093333333333
+17,725,23.622
+17,726,21.4841666666667
+17,727,31.1361666666667
+17,728,26.2678333333333
+17,729,25.0613333333333
+17,730,33.5915
+17,731,24.511
+17,732,26.9028333333333
+17,733,30.0355
+17,734,32.7871666666667
+17,735,36.1526666666667
+17,736,23.9183333333333
+17,737,26.2255
+17,738,17.4836666666667
+17,739,26.0138333333333
+17,740,34.0148333333333
+17,741,23.8548333333333
+17,742,35.56
+17,743,38.0788333333333
+17,744,36.5336666666667
+17,745,28.3633333333333
+17,746,22.8176666666667
+17,747,30.861
+17,748,28.6173333333333
+17,749,29.7815
+17,750,23.8548333333333
+17,751,30.0143333333333
+17,752,27.051
+17,753,22.352
+17,754,37.0205
+17,755,19.0076666666667
+17,756,26.162
+17,757,34.1206666666667
+17,758,29.591
+17,759,33.8243333333333
+17,760,26.4795
+17,761,30.5858333333333
+17,762,25.0401666666667
+17,763,26.3948333333333
+17,764,23.3256666666667
+17,765,26.543
+17,766,21.971
+17,767,27.9188333333333
+17,768,29.9931666666667
+17,769,26.543
+17,770,31.7923333333333
+17,771,20.4681666666667
+17,772,27.9823333333333
+17,773,23.1775
+17,774,24.384
+17,775,27.4531666666667
+17,776,27.813
+17,777,27.686
+17,778,27.2838333333333
+17,779,24.2781666666667
+17,780,30.226
+17,781,33.1681666666667
+17,782,31.5383333333333
+17,783,32.9141666666667
+17,784,35.4753333333333
+17,785,28.8713333333333
+17,786,30.4376666666667
+17,787,24.7226666666667
+17,788,27.2838333333333
+17,789,26.7123333333333
+17,790,26.9663333333333
+17,791,24.1723333333333
+17,792,28.3845
+17,793,32.9776666666667
+17,794,23.1775
+17,795,25.9503333333333
+17,796,21.7593333333333
+17,797,19.9601666666667
+17,798,33.909
+17,799,26.3101666666667
+17,800,30.1201666666667
+17,801,36.7876666666667
+17,802,24.8285
+17,803,30.1625
+17,804,20.2565
+17,805,26.797
+17,806,31.1361666666667
+17,807,33.4221666666667
+17,808,27.1356666666667
+17,809,29.6333333333333
+17,810,22.987
+17,811,28.067
+17,812,31.496
+17,813,23.3891666666667
+17,814,39.878
+17,815,27.2415
+17,816,28.9348333333333
+17,817,31.5806666666667
+17,818,37.211
+17,819,24.3628333333333
+17,820,28.8713333333333
+17,821,26.6276666666667
+17,822,24.511
+17,823,25.019
+17,824,27.305
+17,825,28.7866666666667
+17,826,20.1295
+17,827,24.5745
+17,828,29.6968333333333
+17,829,31.242
+17,830,28.4056666666667
+17,831,29.3158333333333
+17,832,28.2786666666667
+17,833,32.1733333333333
+17,834,35.7293333333333
+17,835,21.463
+17,836,29.7391666666667
+17,837,26.67
+17,838,32.8718333333333
+17,839,29.845
+17,840,21.0185
+17,841,32.9776666666667
+17,842,26.1408333333333
+17,843,23.4315
+17,844,29.5063333333333
+17,845,26.289
+17,846,28.2151666666667
+17,847,29.0406666666667
+17,848,28.067
+17,849,34.8403333333333
+17,850,24.511
+17,851,28.2151666666667
+17,852,26.8181666666667
+17,853,26.9875
+17,854,32.0675
+17,855,26.5641666666667
+17,856,30.099
+17,857,33.3163333333333
+17,858,28.2151666666667
+17,859,28.3845
+17,860,21.1455
+17,861,29.591
+17,862,30.2471666666667
+17,863,27.6648333333333
+17,864,31.5595
+17,865,29.0195
+17,866,22.6906666666667
+17,867,27.6648333333333
+17,868,28.702
+17,869,26.67
+17,870,26.2466666666667
+17,871,31.0938333333333
+17,872,25.3153333333333
+17,873,31.1996666666667
+17,874,25.0401666666667
+17,875,32.5543333333333
+17,876,33.9301666666667
+17,877,24.0665
+17,878,26.1831666666667
+17,879,21.4841666666667
+17,880,19.5368333333333
+17,881,30.3106666666667
+17,882,33.8666666666667
+17,883,36.8935
+17,884,34.9038333333333
+17,885,21.7805
+17,886,25.9715
+17,887,26.3736666666667
+17,888,32.7448333333333
+17,889,33.782
+17,890,20.5105
+17,891,32.4908333333333
+17,892,27.4531666666667
+17,893,27.4108333333333
+17,894,29.2735
+17,895,33.1046666666667
+17,896,27.9188333333333
+17,897,21.1666666666667
+17,898,31.2843333333333
+17,899,29.9296666666667
+17,900,25.2518333333333
+17,901,21.6958333333333
+17,902,32.7236666666667
+17,903,25.9926666666667
+17,904,28.2363333333333
+17,905,27.813
+17,906,26.6276666666667
+17,907,27.5166666666667
+17,908,29.6756666666667
+17,909,23.495
+17,910,42.6931666666667
+17,911,24.765
+17,912,33.02
+17,913,22.733
+17,914,31.4536666666667
+17,915,31.5383333333333
+17,916,31.7288333333333
+17,917,24.6591666666667
+17,918,22.6695
+17,919,25.1248333333333
+17,920,34.4381666666667
+17,921,22.7753333333333
+17,922,23.1775
+17,923,31.2208333333333
+17,924,27.3685
+17,925,31.8558333333333
+17,926,33.4433333333333
+17,927,27.0086666666667
+17,928,20.1718333333333
+17,929,27.9611666666667
+17,930,34.0571666666667
+17,931,27.0086666666667
+17,932,23.9183333333333
+17,933,28.194
+17,934,30.1625
+17,935,27.6013333333333
+17,936,31.0938333333333
+17,937,29.1676666666667
+17,938,36.4701666666667
+17,939,24.1935
+17,940,18.6478333333333
+17,941,28.6385
+17,942,22.3943333333333
+17,943,30.4588333333333
+17,944,28.4056666666667
+17,945,29.2946666666667
+17,946,25.4211666666667
+17,947,31.0515
+17,948,25.908
+17,949,22.9235
+17,950,31.4113333333333
+17,951,26.9663333333333
+17,952,29.8238333333333
+17,953,24.6168333333333
+17,954,26.1831666666667
+17,955,26.3736666666667
+17,956,31.9616666666667
+17,957,30.6281666666667
+17,958,28.9983333333333
+17,959,23.7066666666667
+17,960,38.5868333333333
+17,961,31.7923333333333
+17,962,34.0148333333333
+17,963,30.1836666666667
+17,964,29.4851666666667
+17,965,27.3896666666667
+17,966,23.4738333333333
+17,967,33.8455
+17,968,28.8713333333333
+17,969,40.7035
+17,970,26.543
+17,971,30.2895
+17,972,32.3638333333333
+17,973,26.5006666666667
+17,974,26.4795
+17,975,24.892
+17,976,33.3375
+17,977,34.6075
+17,978,32.1733333333333
+17,979,30.0566666666667
+17,980,35.6235
+17,981,24.9131666666667
+17,982,32.131
+17,983,24.6803333333333
+17,984,34.8615
+17,985,24.8708333333333
+17,986,24.6168333333333
+17,987,25.019
+17,988,24.9978333333333
+17,989,26.1196666666667
+17,990,26.8816666666667
+17,991,30.1836666666667
+17,992,27.432
+17,993,30.4588333333333
+17,994,26.4583333333333
+17,995,34.4593333333333
+17,996,24.1088333333333
+17,997,26.6065
+17,998,26.2043333333333
+17,999,26.2043333333333
+17,1000,24.5321666666667
+18,1,26.3313333333333
+18,2,24.384
+18,3,29.4851666666667
+18,4,28.8925
+18,5,23.9606666666667
+18,6,31.2631666666667
+18,7,36.3643333333333
+18,8,35.7293333333333
+18,9,31.2631666666667
+18,10,35.8775
+18,11,35.6446666666667
+18,12,26.6488333333333
+18,13,39.6663333333333
+18,14,36.957
+18,15,27.3261666666667
+18,16,28.6596666666667
+18,17,32.1521666666667
+18,18,25.0825
+18,19,25.146
+18,20,31.3901666666667
+18,21,28.8925
+18,22,34.8191666666667
+18,23,24.9555
+18,24,28.448
+18,25,30.1625
+18,26,32.1733333333333
+18,27,26.9875
+18,28,26.7758333333333
+18,29,20.7221666666667
+18,30,28.7655
+18,31,38.0365
+18,32,34.4593333333333
+18,33,33.2105
+18,34,30.7763333333333
+18,35,22.7753333333333
+18,36,25.4211666666667
+18,37,27.4955
+18,38,29.1253333333333
+18,39,25.273
+18,40,26.7546666666667
+18,41,40.9998333333333
+18,42,29.2735
+18,43,27.178
+18,44,34.417
+18,45,28.5326666666667
+18,46,40.7246666666667
+18,47,25.9291666666667
+18,48,26.9028333333333
+18,49,31.6441666666667
+18,50,31.1361666666667
+18,51,26.6911666666667
+18,52,23.8971666666667
+18,53,27.8553333333333
+18,54,24.511
+18,55,27.178
+18,56,28.2786666666667
+18,57,32.9353333333333
+18,58,34.4381666666667
+18,59,34.4593333333333
+18,60,38.5233333333333
+18,61,29.4005
+18,62,29.6756666666667
+18,63,34.4805
+18,64,27.1991666666667
+18,65,28.4056666666667
+18,66,28.8078333333333
+18,67,29.0618333333333
+18,68,37.6343333333333
+18,69,26.416
+18,70,25.908
+18,71,36.1103333333333
+18,72,30.861
+18,73,21.5688333333333
+18,74,28.1093333333333
+18,75,26.1831666666667
+18,76,28.321
+18,77,32.4696666666667
+18,78,35.6658333333333
+18,79,25.3365
+18,80,21.1031666666667
+18,81,27.7706666666667
+18,82,24.2146666666667
+18,83,37.3803333333333
+18,84,31.369
+18,85,27.9611666666667
+18,86,29.7815
+18,87,32.766
+18,88,40.9151666666667
+18,89,25.3576666666667
+18,90,24.8073333333333
+18,91,36.9146666666667
+18,92,28.5115
+18,93,27.686
+18,94,38.6291666666667
+18,95,31.1785
+18,96,27.7283333333333
+18,97,31.877
+18,98,26.035
+18,99,22.5001666666667
+18,100,25.1248333333333
+18,101,38.6715
+18,102,25.4635
+18,103,28.8078333333333
+18,104,31.6653333333333
+18,105,28.1728333333333
+18,106,27.2203333333333
+18,107,28.6173333333333
+18,108,37.9095
+18,109,37.6343333333333
+18,110,29.591
+18,111,26.5006666666667
+18,112,31.5806666666667
+18,113,32.258
+18,114,25.2518333333333
+18,115,31.8346666666667
+18,116,23.622
+18,117,28.2151666666667
+18,118,22.1826666666667
+18,119,30.8821666666667
+18,120,29.7815
+18,121,28.8713333333333
+18,122,30.861
+18,123,27.1356666666667
+18,124,29.7603333333333
+18,125,28.7443333333333
+18,126,32.5755
+18,127,30.3741666666667
+18,128,31.9616666666667
+18,129,30.3953333333333
+18,130,30.5011666666667
+18,131,32.2791666666667
+18,132,34.1418333333333
+18,133,26.289
+18,134,28.5115
+18,135,29.2946666666667
+18,136,34.8615
+18,137,33.274
+18,138,34.3958333333333
+18,139,31.5383333333333
+18,140,31.3055
+18,141,36.1103333333333
+18,142,25.3153333333333
+18,143,25.1248333333333
+18,144,28.2998333333333
+18,145,32.8506666666667
+18,146,29.6968333333333
+18,147,30.3318333333333
+18,148,37.6978333333333
+18,149,30.8186666666667
+18,150,35.3271666666667
+18,151,39.4123333333333
+18,152,32.131
+18,153,33.8243333333333
+18,154,25.3576666666667
+18,155,33.147
+18,156,30.4588333333333
+18,157,28.5326666666667
+18,158,27.813
+18,159,27.9611666666667
+18,160,29.2523333333333
+18,161,30.9245
+18,162,25.5481666666667
+18,163,22.3731666666667
+18,164,25.3365
+18,165,30.0355
+18,166,25.3365
+18,167,25.8021666666667
+18,168,26.9875
+18,169,39.6875
+18,170,25.4846666666667
+18,171,28.2575
+18,172,35.941
+18,173,26.1831666666667
+18,174,30.2895
+18,175,32.385
+18,176,29.5275
+18,177,23.7278333333333
+18,178,28.8501666666667
+18,179,37.5285
+18,180,30.6705
+18,181,29.464
+18,182,22.2885
+18,183,28.0246666666667
+18,184,28.829
+18,185,26.8393333333333
+18,186,29.3158333333333
+18,187,32.3638333333333
+18,188,35.687
+18,189,32.766
+18,190,31.0726666666667
+18,191,34.1841666666667
+18,192,30.7128333333333
+18,193,30.9033333333333
+18,194,32.9353333333333
+18,195,27.0721666666667
+18,196,31.7288333333333
+18,197,27.8976666666667
+18,198,32.6601666666667
+18,199,20.8491666666667
+18,200,29.464
+18,201,31.8135
+18,202,29.4216666666667
+18,203,31.6865
+18,204,24.13
+18,205,30.7975
+18,206,28.7655
+18,207,22.5213333333333
+18,208,38.0365
+18,209,26.2043333333333
+18,210,24.511
+18,211,36.8935
+18,212,29.8873333333333
+18,213,32.4908333333333
+18,214,26.8181666666667
+18,215,38.3116666666667
+18,216,39.1583333333333
+18,217,27.6436666666667
+18,218,29.7603333333333
+18,219,28.9348333333333
+18,220,30.6705
+18,221,23.7066666666667
+18,222,28.8713333333333
+18,223,23.0505
+18,224,27.178
+18,225,36.1526666666667
+18,226,24.8708333333333
+18,227,29.464
+18,228,28.5115
+18,229,32.6178333333333
+18,230,35.179
+18,231,29.3158333333333
+18,232,27.686
+18,233,30.48
+18,234,30.9033333333333
+18,235,25.6751666666667
+18,236,25.2095
+18,237,35.2848333333333
+18,238,29.337
+18,239,29.0618333333333
+18,240,27.7918333333333
+18,241,26.9663333333333
+18,242,26.035
+18,243,32.0463333333333
+18,244,30.0355
+18,245,27.1145
+18,246,25.019
+18,247,29.4005
+18,248,37.2956666666667
+18,249,30.8186666666667
+18,250,35.5388333333333
+18,251,29.5698333333333
+18,252,26.924
+18,253,29.6968333333333
+18,254,39.751
+18,255,30.0143333333333
+18,256,28.5115
+18,257,31.1361666666667
+18,258,27.2203333333333
+18,259,25.6116666666667
+18,260,27.3685
+18,261,33.6973333333333
+18,262,31.242
+18,263,28.1728333333333
+18,264,28.9983333333333
+18,265,29.1253333333333
+18,266,32.5966666666667
+18,267,28.1516666666667
+18,268,29.9931666666667
+18,269,29.0195
+18,270,33.274
+18,271,24.6168333333333
+18,272,38.3751666666667
+18,273,28.2575
+18,274,19.7485
+18,275,28.9348333333333
+18,276,26.7335
+18,277,27.6436666666667
+18,278,33.9725
+18,279,35.1578333333333
+18,280,32.4908333333333
+18,281,27.94
+18,282,28.5115
+18,283,30.9456666666667
+18,284,31.9828333333333
+18,285,28.6173333333333
+18,286,32.004
+18,287,40.9575
+18,288,30.7975
+18,289,24.4051666666667
+18,290,20.6586666666667
+18,291,28.8501666666667
+18,292,27.2626666666667
+18,293,32.8718333333333
+18,294,30.6281666666667
+18,295,35.9833333333333
+18,296,29.5063333333333
+18,297,24.4263333333333
+18,298,27.3473333333333
+18,299,30.7128333333333
+18,300,29.8873333333333
+18,301,34.29
+18,302,26.67
+18,303,39.2853333333333
+18,304,27.6648333333333
+18,305,28.4903333333333
+18,306,26.924
+18,307,29.4851666666667
+18,308,28.9983333333333
+18,309,31.6018333333333
+18,310,23.0928333333333
+18,311,38.6926666666667
+18,312,23.4315
+18,313,27.0298333333333
+18,314,32.5331666666667
+18,315,27.2838333333333
+18,316,30.607
+18,317,33.4645
+18,318,32.1521666666667
+18,319,30.2471666666667
+18,320,29.9508333333333
+18,321,27.0721666666667
+18,322,34.7556666666667
+18,323,34.1418333333333
+18,324,34.4381666666667
+18,325,33.7185
+18,326,29.4005
+18,327,31.3266666666667
+18,328,27.2626666666667
+18,329,29.4216666666667
+18,330,32.9776666666667
+18,331,36.0891666666667
+18,332,26.6065
+18,333,34.163
+18,334,22.4366666666667
+18,335,35.56
+18,336,34.0783333333333
+18,337,28.1093333333333
+18,338,22.3943333333333
+18,339,29.7815
+18,340,29.3793333333333
+18,341,35.0096666666667
+18,342,31.1785
+18,343,30.3741666666667
+18,344,28.5961666666667
+18,345,26.9663333333333
+18,346,31.0938333333333
+18,347,28.8078333333333
+18,348,41.8041666666667
+18,349,26.67
+18,350,30.2683333333333
+18,351,28.6173333333333
+18,352,31.9828333333333
+18,353,31.9616666666667
+18,354,33.8455
+18,355,22.9023333333333
+18,356,19.05
+18,357,23.4103333333333
+18,358,41.6136666666667
+18,359,26.7758333333333
+18,360,27.813
+18,361,33.5068333333333
+18,362,25.7175
+18,363,31.6018333333333
+18,364,37.9095
+18,365,33.7396666666667
+18,366,32.8295
+18,367,31.5383333333333
+18,368,32.0463333333333
+18,369,31.8346666666667
+18,370,27.0721666666667
+18,371,28.9771666666667
+18,372,29.0195
+18,373,22.2038333333333
+18,374,32.4696666666667
+18,375,25.2941666666667
+18,376,26.4583333333333
+18,377,27.9611666666667
+18,378,23.4738333333333
+18,379,32.9353333333333
+18,380,32.9988333333333
+18,381,26.162
+18,382,23.8548333333333
+18,383,33.4221666666667
+18,384,29.2523333333333
+18,385,33.1258333333333
+18,386,30.607
+18,387,32.7236666666667
+18,388,32.4696666666667
+18,389,31.0726666666667
+18,390,25.4635
+18,391,32.004
+18,392,25.8021666666667
+18,393,25.527
+18,394,30.607
+18,395,30.9245
+18,396,27.7495
+18,397,32.2368333333333
+18,398,40.6823333333333
+18,399,31.115
+18,400,32.766
+18,401,27.3261666666667
+18,402,31.5171666666667
+18,403,35.3695
+18,404,30.5223333333333
+18,405,37.846
+18,406,29.1041666666667
+18,407,25.9503333333333
+18,408,31.3266666666667
+18,409,28.575
+18,410,24.8073333333333
+18,411,38.1211666666667
+18,412,24.3205
+18,413,27.2415
+18,414,29.7603333333333
+18,415,31.1785
+18,416,35.0308333333333
+18,417,23.114
+18,418,33.5491666666667
+18,419,32.0886666666667
+18,420,27.559
+18,421,39.751
+18,422,25.5058333333333
+18,423,33.3163333333333
+18,424,36.4913333333333
+18,425,24.9978333333333
+18,426,30.5011666666667
+18,427,35.8563333333333
+18,428,32.9988333333333
+18,429,29.5698333333333
+18,430,25.0825
+18,431,20.4046666666667
+18,432,29.1465
+18,433,30.0566666666667
+18,434,27.1145
+18,435,30.6493333333333
+18,436,28.8713333333333
+18,437,20.2565
+18,438,33.401
+18,439,27.2203333333333
+18,440,18.6055
+18,441,28.067
+18,442,30.3953333333333
+18,443,31.877
+18,444,24.3205
+18,445,26.797
+18,446,26.924
+18,447,34.1418333333333
+18,448,26.7758333333333
+18,449,27.3896666666667
+18,450,33.4856666666667
+18,451,34.5651666666667
+18,452,34.9038333333333
+18,453,23.9183333333333
+18,454,34.5863333333333
+18,455,27.2838333333333
+18,456,29.3581666666667
+18,457,24.0241666666667
+18,458,29.8661666666667
+18,459,33.8878333333333
+18,460,25.2306666666667
+18,461,20.8703333333333
+18,462,22.9446666666667
+18,463,33.6126666666667
+18,464,36.83
+18,465,31.0515
+18,466,31.7288333333333
+18,467,31.4748333333333
+18,468,35.6446666666667
+18,469,34.3535
+18,470,23.0293333333333
+18,471,25.4211666666667
+18,472,33.7608333333333
+18,473,28.8925
+18,474,36.1738333333333
+18,475,30.7975
+18,476,30.9456666666667
+18,477,34.036
+18,478,34.0783333333333
+18,479,31.1996666666667
+18,480,30.7128333333333
+18,481,28.829
+18,482,38.0576666666667
+18,483,34.3746666666667
+18,484,23.4315
+18,485,28.2575
+18,486,28.4691666666667
+18,487,36.2585
+18,488,35.9198333333333
+18,489,31.8135
+18,490,28.4903333333333
+18,491,24.2781666666667
+18,492,34.2265
+18,493,34.2688333333333
+18,494,30.4376666666667
+18,495,24.4686666666667
+18,496,32.004
+18,497,34.4805
+18,498,26.0138333333333
+18,499,28.1093333333333
+18,500,23.8548333333333
+18,501,35.5811666666667
+18,502,26.3525
+18,503,27.4531666666667
+18,504,28.067
+18,505,36.3431666666667
+18,506,26.9875
+18,507,33.3375
+18,508,28.3845
+18,509,29.1465
+18,510,28.5961666666667
+18,511,24.9978333333333
+18,512,26.0561666666667
+18,513,31.242
+18,514,27.6436666666667
+18,515,33.1893333333333
+18,516,29.845
+18,517,30.988
+18,518,30.1201666666667
+18,519,30.4376666666667
+18,520,30.1836666666667
+18,521,31.8981666666667
+18,522,31.0938333333333
+18,523,31.1361666666667
+18,524,39.3065
+18,525,32.6813333333333
+18,526,40.4918333333333
+18,527,26.3101666666667
+18,528,35.8986666666667
+18,529,28.4903333333333
+18,530,32.3638333333333
+18,531,32.5966666666667
+18,532,36.6183333333333
+18,533,30.607
+18,534,25.2095
+18,535,26.3525
+18,536,30.8821666666667
+18,537,31.3055
+18,538,26.289
+18,539,32.7025
+18,540,34.0571666666667
+18,541,26.035
+18,542,22.0345
+18,543,29.7391666666667
+18,544,26.0138333333333
+18,545,31.0726666666667
+18,546,25.019
+18,547,31.7076666666667
+18,548,20.1718333333333
+18,549,35.8775
+18,550,26.4371666666667
+18,551,37.8036666666667
+18,552,27.559
+18,553,34.0571666666667
+18,554,28.0881666666667
+18,555,37.6978333333333
+18,556,27.2415
+18,557,25.9715
+18,558,30.0566666666667
+18,559,20.2565
+18,560,33.0835
+18,561,25.5058333333333
+18,562,28.829
+18,563,29.337
+18,564,33.4433333333333
+18,565,28.448
+18,566,26.9875
+18,567,35.1155
+18,568,24.4686666666667
+18,569,31.0303333333333
+18,570,23.6431666666667
+18,571,29.0406666666667
+18,572,28.5961666666667
+18,573,23.8336666666667
+18,574,38.4598333333333
+18,575,26.035
+18,576,27.7071666666667
+18,577,27.6436666666667
+18,578,36.9993333333333
+18,579,27.1356666666667
+18,580,37.6343333333333
+18,581,25.8021666666667
+18,582,27.0086666666667
+18,583,28.8925
+18,584,31.115
+18,585,27.9823333333333
+18,586,30.607
+18,587,25.2941666666667
+18,588,30.2895
+18,589,31.496
+18,590,26.8181666666667
+18,591,24.384
+18,592,19.7485
+18,593,32.766
+18,594,29.5275
+18,595,22.987
+18,596,28.7443333333333
+18,597,26.8816666666667
+18,598,23.4103333333333
+18,599,39.0948333333333
+18,600,31.4325
+18,601,33.9725
+18,602,30.8398333333333
+18,603,23.9395
+18,604,29.9085
+18,605,29.1041666666667
+18,606,30.0566666666667
+18,607,22.5636666666667
+18,608,29.2311666666667
+18,609,35.433
+18,610,28.9348333333333
+18,611,27.9823333333333
+18,612,25.6751666666667
+18,613,32.2156666666667
+18,614,19.1981666666667
+18,615,32.893
+18,616,27.2203333333333
+18,617,30.8186666666667
+18,618,30.3106666666667
+18,619,30.2683333333333
+18,620,35.8775
+18,621,30.2895
+18,622,22.6906666666667
+18,623,19.5156666666667
+18,624,21.844
+18,625,30.5011666666667
+18,626,29.591
+18,627,25.0401666666667
+18,628,32.5331666666667
+18,629,27.1145
+18,630,33.8243333333333
+18,631,34.5651666666667
+18,632,32.3426666666667
+18,633,34.4805
+18,634,24.511
+18,635,27.4108333333333
+18,636,26.8605
+18,637,25.8021666666667
+18,638,34.1206666666667
+18,639,30.6705
+18,640,33.1681666666667
+18,641,24.2358333333333
+18,642,29.4216666666667
+18,643,33.6126666666667
+18,644,28.6596666666667
+18,645,24.3416666666667
+18,646,30.099
+18,647,37.5708333333333
+18,648,37.5708333333333
+18,649,26.9028333333333
+18,650,29.7391666666667
+18,651,28.7443333333333
+18,652,27.7918333333333
+18,653,34.9461666666667
+18,654,31.5595
+18,655,30.5435
+18,656,26.1196666666667
+18,657,31.5383333333333
+18,658,25.5693333333333
+18,659,30.3106666666667
+18,660,30.6493333333333
+18,661,33.147
+18,662,32.8506666666667
+18,663,27.305
+18,664,24.2146666666667
+18,665,30.6916666666667
+18,666,27.9823333333333
+18,667,29.9085
+18,668,29.8026666666667
+18,669,28.321
+18,670,24.2358333333333
+18,671,23.2833333333333
+18,672,21.2725
+18,673,27.5801666666667
+18,674,32.2156666666667
+18,675,29.4851666666667
+18,676,31.2208333333333
+18,677,28.6385
+18,678,42.0793333333333
+18,679,31.7711666666667
+18,680,24.2146666666667
+18,681,30.7551666666667
+18,682,28.0881666666667
+18,683,32.5543333333333
+18,684,23.4526666666667
+18,685,37.2745
+18,686,25.3576666666667
+18,687,37.7825
+18,688,28.9136666666667
+18,689,29.7815
+18,690,34.3958333333333
+18,691,21.1666666666667
+18,692,27.0721666666667
+18,693,34.6075
+18,694,29.0618333333333
+18,695,28.956
+18,696,33.1258333333333
+18,697,27.1568333333333
+18,698,28.3421666666667
+18,699,28.5961666666667
+18,700,27.8553333333333
+18,701,23.5796666666667
+18,702,23.9395
+18,703,32.3426666666667
+18,704,26.3525
+18,705,30.2895
+18,706,33.782
+18,707,27.6225
+18,708,28.2363333333333
+18,709,36.8723333333333
+18,710,31.0303333333333
+18,711,30.48
+18,712,36.5971666666667
+18,713,32.7448333333333
+18,714,28.8925
+18,715,28.6808333333333
+18,716,32.8083333333333
+18,717,31.5383333333333
+18,718,28.5538333333333
+18,719,28.6596666666667
+18,720,26.7758333333333
+18,721,29.7815
+18,722,35.1366666666667
+18,723,38.1211666666667
+18,724,27.3473333333333
+18,725,23.0293333333333
+18,726,27.5378333333333
+18,727,26.924
+18,728,38.481
+18,729,25.5905
+18,730,27.2415
+18,731,32.5331666666667
+18,732,24.5321666666667
+18,733,28.9983333333333
+18,734,32.5543333333333
+18,735,32.004
+18,736,33.274
+18,737,34.7345
+18,738,30.9245
+18,739,31.4113333333333
+18,740,28.829
+18,741,40.1743333333333
+18,742,28.321
+18,743,33.528
+18,744,24.2358333333333
+18,745,34.1841666666667
+18,746,27.4108333333333
+18,747,24.7015
+18,748,24.5745
+18,749,24.6591666666667
+18,750,25.6751666666667
+18,751,29.2735
+18,752,30.8821666666667
+18,753,29.718
+18,754,30.7128333333333
+18,755,31.0938333333333
+18,756,30.2895
+18,757,25.1248333333333
+18,758,37.9095
+18,759,29.0618333333333
+18,760,21.2301666666667
+18,761,37.6978333333333
+18,762,28.067
+18,763,21.463
+18,764,23.6008333333333
+18,765,22.7118333333333
+18,766,28.829
+18,767,33.909
+18,768,30.4588333333333
+18,769,19.3251666666667
+18,770,29.5063333333333
+18,771,32.9565
+18,772,33.5068333333333
+18,773,26.2678333333333
+18,774,34.5863333333333
+18,775,23.7278333333333
+18,776,29.4428333333333
+18,777,32.4696666666667
+18,778,28.829
+18,779,33.4221666666667
+18,780,35.0731666666667
+18,781,27.1568333333333
+18,782,32.8295
+18,783,31.5383333333333
+18,784,28.194
+18,785,33.655
+18,786,32.9353333333333
+18,787,28.6596666666667
+18,788,40.2378333333333
+18,789,35.0731666666667
+18,790,26.8393333333333
+18,791,37.0205
+18,792,22.2038333333333
+18,793,23.3891666666667
+18,794,29.8026666666667
+18,795,37.592
+18,796,32.3426666666667
+18,797,24.4263333333333
+18,798,34.2265
+18,799,24.892
+18,800,28.9348333333333
+18,801,29.845
+18,802,30.8398333333333
+18,803,35.5176666666667
+18,804,32.1945
+18,805,23.4315
+18,806,26.4795
+18,807,22.4155
+18,808,29.083
+18,809,29.464
+18,810,30.9668333333333
+18,811,24.1723333333333
+18,812,31.8981666666667
+18,813,32.258
+18,814,30.6705
+18,815,26.1196666666667
+18,816,25.654
+18,817,28.1093333333333
+18,818,27.559
+18,819,31.3478333333333
+18,820,29.1041666666667
+18,821,32.6813333333333
+18,822,29.337
+18,823,25.0613333333333
+18,824,28.7231666666667
+18,825,37.1263333333333
+18,826,30.1201666666667
+18,827,24.3205
+18,828,30.5858333333333
+18,829,41.9523333333333
+18,830,37.1263333333333
+18,831,32.0251666666667
+18,832,28.067
+18,833,36.1526666666667
+18,834,28.8925
+18,835,28.9136666666667
+18,836,32.9565
+18,837,34.8191666666667
+18,838,26.1196666666667
+18,839,30.2683333333333
+18,840,38.2058333333333
+18,841,32.6813333333333
+18,842,26.67
+18,843,29.083
+18,844,29.2946666666667
+18,845,40.005
+18,846,20.2141666666667
+18,847,28.8713333333333
+18,848,30.1413333333333
+18,849,32.0251666666667
+18,850,25.4
+18,851,25.3576666666667
+18,852,27.1568333333333
+18,853,27.2415
+18,854,33.274
+18,855,34.0571666666667
+18,856,29.5275
+18,857,31.0515
+18,858,35.5811666666667
+18,859,26.2678333333333
+18,860,27.6648333333333
+18,861,28.7443333333333
+18,862,30.988
+18,863,31.0726666666667
+18,864,31.242
+18,865,27.7283333333333
+18,866,32.7236666666667
+18,867,26.6488333333333
+18,868,24.8496666666667
+18,869,35.7293333333333
+18,870,31.242
+18,871,25.3153333333333
+18,872,24.892
+18,873,29.1676666666667
+18,874,32.258
+18,875,24.8496666666667
+18,876,30.3741666666667
+18,877,27.7495
+18,878,31.2843333333333
+18,879,26.2678333333333
+18,880,31.5383333333333
+18,881,30.9456666666667
+18,882,30.0143333333333
+18,883,25.2941666666667
+18,884,27.0721666666667
+18,885,35.8351666666667
+18,886,29.2735
+18,887,30.8186666666667
+18,888,27.7706666666667
+18,889,31.4748333333333
+18,890,25.0401666666667
+18,891,32.4061666666667
+18,892,31.496
+18,893,32.3215
+18,894,27.4108333333333
+18,895,32.004
+18,896,33.8243333333333
+18,897,28.8925
+18,898,28.4691666666667
+18,899,31.4113333333333
+18,900,34.7345
+18,901,34.7345
+18,902,31.877
+18,903,25.273
+18,904,23.8125
+18,905,23.5161666666667
+18,906,28.829
+18,907,26.3313333333333
+18,908,32.6601666666667
+18,909,38.227
+18,910,26.8181666666667
+18,911,32.7871666666667
+18,912,27.3473333333333
+18,913,25.019
+18,914,29.4851666666667
+18,915,38.1635
+18,916,29.1253333333333
+18,917,26.8181666666667
+18,918,29.2523333333333
+18,919,27.6436666666667
+18,920,24.7438333333333
+18,921,26.7335
+18,922,28.4903333333333
+18,923,27.5801666666667
+18,924,30.5011666666667
+18,925,25.4423333333333
+18,926,39.497
+18,927,27.2415
+18,928,31.6441666666667
+18,929,28.3845
+18,930,30.1836666666667
+18,931,30.1836666666667
+18,932,38.354
+18,933,25.781
+18,934,30.9245
+18,935,31.3055
+18,936,32.8083333333333
+18,937,34.3746666666667
+18,938,25.9715
+18,939,33.5491666666667
+18,940,38.9043333333333
+18,941,31.2208333333333
+18,942,26.8816666666667
+18,943,34.1418333333333
+18,944,32.7871666666667
+18,945,30.1625
+18,946,20.6586666666667
+18,947,32.0675
+18,948,28.8501666666667
+18,949,32.0251666666667
+18,950,32.4696666666667
+18,951,35.5388333333333
+18,952,25.0613333333333
+18,953,38.3328333333333
+18,954,32.9565
+18,955,19.558
+18,956,30.1413333333333
+18,957,25.908
+18,958,28.702
+18,959,26.0773333333333
+18,960,30.6493333333333
+18,961,29.4216666666667
+18,962,20.2776666666667
+18,963,23.495
+18,964,28.8713333333333
+18,965,23.7278333333333
+18,966,29.3158333333333
+18,967,26.9028333333333
+18,968,29.2311666666667
+18,969,25.273
+18,970,33.8031666666667
+18,971,37.7613333333333
+18,972,28.8713333333333
+18,973,34.0571666666667
+18,974,35.5388333333333
+18,975,25.4211666666667
+18,976,29.7815
+18,977,35.7716666666667
+18,978,23.1986666666667
+18,979,29.1888333333333
+18,980,36.7241666666667
+18,981,24.7226666666667
+18,982,36.3643333333333
+18,983,30.5646666666667
+18,984,31.496
+18,985,31.0938333333333
+18,986,21.9286666666667
+18,987,35.7928333333333
+18,988,33.1046666666667
+18,989,29.4216666666667
+18,990,32.9776666666667
+18,991,44.6405
+18,992,25.781
+18,993,28.1093333333333
+18,994,32.4908333333333
+18,995,27.7495
+18,996,31.7288333333333
+18,997,26.5853333333333
+18,998,29.9085
+18,999,26.9875
+18,1000,27.3261666666667
+19,1,30.1413333333333
+19,2,26.5006666666667
+19,3,21.971
+19,4,28.6173333333333
+19,5,29.6968333333333
+19,6,21.7381666666667
+19,7,34.6498333333333
+19,8,24.3416666666667
+19,9,29.3793333333333
+19,10,30.734
+19,11,23.4315
+19,12,23.4103333333333
+19,13,32.0251666666667
+19,14,26.3101666666667
+19,15,27.0933333333333
+19,16,20.2565
+19,17,30.3106666666667
+19,18,26.4371666666667
+19,19,31.1785
+19,20,25.019
+19,21,28.8925
+19,22,40.7035
+19,23,23.9818333333333
+19,24,20.6375
+19,25,25.2306666666667
+19,26,31.4325
+19,27,14.6685
+19,28,30.4165
+19,29,23.1775
+19,30,27.2203333333333
+19,31,24.9978333333333
+19,32,30.099
+19,33,31.1361666666667
+19,34,29.1888333333333
+19,35,27.686
+19,36,28.7443333333333
+19,37,19.5791666666667
+19,38,31.3478333333333
+19,39,28.7231666666667
+19,40,30.7975
+19,41,32.6178333333333
+19,42,32.4696666666667
+19,43,24.8285
+19,44,27.0721666666667
+19,45,31.1361666666667
+19,46,41.0633333333333
+19,47,31.3266666666667
+19,48,32.5966666666667
+19,49,22.7753333333333
+19,50,26.1408333333333
+19,51,25.146
+19,52,21.2725
+19,53,30.2683333333333
+19,54,18.1186666666667
+19,55,37.9518333333333
+19,56,33.8666666666667
+19,57,28.3421666666667
+19,58,28.3845
+19,59,31.5595
+19,60,29.083
+19,61,27.5801666666667
+19,62,21.5265
+19,63,26.67
+19,64,33.6338333333333
+19,65,29.1253333333333
+19,66,21.7805
+19,67,35.4118333333333
+19,68,19.8543333333333
+19,69,19.4098333333333
+19,70,27.2415
+19,71,19.812
+19,72,24.003
+19,73,25.5481666666667
+19,74,26.5853333333333
+19,75,24.8285
+19,76,22.6695
+19,77,25.4846666666667
+19,78,22.2673333333333
+19,79,21.8016666666667
+19,80,19.7696666666667
+19,81,23.5585
+19,82,25.3576666666667
+19,83,22.479
+19,84,28.2786666666667
+19,85,21.9075
+19,86,21.0608333333333
+19,87,25.654
+19,88,22.9235
+19,89,23.1986666666667
+19,90,23.6855
+19,91,24.6168333333333
+19,92,37.9095
+19,93,22.7753333333333
+19,94,24.892
+19,95,17.3566666666667
+19,96,25.9926666666667
+19,97,24.765
+19,98,23.5585
+19,99,19.4521666666667
+19,100,35.4753333333333
+19,101,26.7123333333333
+19,102,22.6271666666667
+19,103,25.8656666666667
+19,104,21.6746666666667
+19,105,30.6281666666667
+19,106,38.481
+19,107,25.3788333333333
+19,108,26.7758333333333
+19,109,16.4253333333333
+19,110,28.6385
+19,111,27.4743333333333
+19,112,22.3731666666667
+19,113,26.5218333333333
+19,114,25.8656666666667
+19,115,20.5528333333333
+19,116,27.5378333333333
+19,117,18.3726666666667
+19,118,30.2048333333333
+19,119,26.6276666666667
+19,120,25.5905
+19,121,28.0881666666667
+19,122,21.717
+19,123,26.289
+19,124,27.4743333333333
+19,125,29.1676666666667
+19,126,23.9183333333333
+19,127,19.3463333333333
+19,128,29.1253333333333
+19,129,28.4056666666667
+19,130,19.1981666666667
+19,131,31.9616666666667
+19,132,18.9653333333333
+19,133,23.114
+19,134,24.6168333333333
+19,135,29.0195
+19,136,39.0313333333333
+19,137,23.876
+19,138,20.8703333333333
+19,139,29.5275
+19,140,30.3741666666667
+19,141,26.9875
+19,142,20.4893333333333
+19,143,29.9931666666667
+19,144,29.1041666666667
+19,145,25.146
+19,146,26.9451666666667
+19,147,22.1826666666667
+19,148,21.336
+19,149,26.4795
+19,150,27.051
+19,151,16.9968333333333
+19,152,19.6426666666667
+19,153,21.0185
+19,154,21.971
+19,155,30.6493333333333
+19,156,22.987
+19,157,30.734
+19,158,18.161
+19,159,24.3205
+19,160,25.0401666666667
+19,161,28.575
+19,162,25.8021666666667
+19,163,22.6271666666667
+19,164,30.5011666666667
+19,165,22.5848333333333
+19,166,24.3205
+19,167,27.178
+19,168,26.8393333333333
+19,169,23.749
+19,170,34.3958333333333
+19,171,26.1408333333333
+19,172,29.718
+19,173,24.638
+19,174,27.2838333333333
+19,175,28.829
+19,176,23.622
+19,177,31.3901666666667
+19,178,26.7123333333333
+19,179,29.6968333333333
+19,180,25.2306666666667
+19,181,28.067
+19,182,32.9776666666667
+19,183,29.2946666666667
+19,184,23.9183333333333
+19,185,20.8915
+19,186,22.606
+19,187,27.8765
+19,188,22.352
+19,189,23.0716666666667
+19,190,29.718
+19,191,21.209
+19,192,27.305
+19,193,16.637
+19,194,39.3911666666667
+19,195,26.543
+19,196,24.6591666666667
+19,197,25.3576666666667
+19,198,30.4376666666667
+19,199,30.2683333333333
+19,200,19.8331666666667
+19,201,29.9931666666667
+19,202,27.8976666666667
+19,203,25.6328333333333
+19,204,22.5636666666667
+19,205,27.5166666666667
+19,206,26.7123333333333
+19,207,32.0675
+19,208,22.5636666666667
+19,209,19.812
+19,210,20.2565
+19,211,23.9183333333333
+19,212,22.6695
+19,213,21.9075
+19,214,28.702
+19,215,27.4743333333333
+19,216,25.1248333333333
+19,217,21.7805
+19,218,22.352
+19,219,28.7655
+19,220,24.9766666666667
+19,221,25.3788333333333
+19,222,32.0886666666667
+19,223,28.2363333333333
+19,224,26.2043333333333
+19,225,32.258
+19,226,32.4485
+19,227,25.8656666666667
+19,228,31.3901666666667
+19,229,23.1563333333333
+19,230,23.3045
+19,231,28.4691666666667
+19,232,21.6746666666667
+19,233,23.8125
+19,234,33.7396666666667
+19,235,32.0675
+19,236,26.5853333333333
+19,237,26.8816666666667
+19,238,25.4
+19,239,17.5048333333333
+19,240,26.3313333333333
+19,241,26.543
+19,242,25.7598333333333
+19,243,17.272
+19,244,24.4686666666667
+19,245,17.145
+19,246,18.9018333333333
+19,247,28.829
+19,248,27.6225
+19,249,26.1831666666667
+19,250,35.8986666666667
+19,251,27.6436666666667
+19,252,28.8501666666667
+19,253,26.6065
+19,254,24.6803333333333
+19,255,22.5425
+19,256,29.8238333333333
+19,257,24.1088333333333
+19,258,27.7918333333333
+19,259,29.464
+19,260,26.0985
+19,261,23.876
+19,262,22.7965
+19,263,28.6385
+19,264,21.7805
+19,265,32.9988333333333
+19,266,20.8915
+19,267,26.2466666666667
+19,268,28.1305
+19,269,17.907
+19,270,25.3153333333333
+19,271,20.574
+19,272,26.3313333333333
+19,273,24.257
+19,274,21.2936666666667
+19,275,24.4898333333333
+19,276,36.576
+19,277,25.4846666666667
+19,278,27.6436666666667
+19,279,17.5683333333333
+19,280,23.5796666666667
+19,281,31.4325
+19,282,20.8491666666667
+19,283,29.718
+19,284,26.0561666666667
+19,285,33.2951666666667
+19,286,27.5166666666667
+19,287,33.8243333333333
+19,288,22.0133333333333
+19,289,22.8811666666667
+19,290,23.7701666666667
+19,291,25.8233333333333
+19,292,25.146
+19,293,28.2151666666667
+19,294,25.1671666666667
+19,295,22.7753333333333
+19,296,18.5208333333333
+19,297,28.321
+19,298,25.8445
+19,299,32.1098333333333
+19,300,21.7805
+19,301,24.003
+19,302,18.9441666666667
+19,303,25.908
+19,304,17.526
+19,305,26.7758333333333
+19,306,27.0933333333333
+19,307,33.02
+19,308,20.7856666666667
+19,309,25.6328333333333
+19,310,31.3055
+19,311,17.9493333333333
+19,312,31.7076666666667
+19,313,25.273
+19,314,36.9993333333333
+19,315,31.1361666666667
+19,316,34.9038333333333
+19,317,29.7815
+19,318,24.6591666666667
+19,319,17.4201666666667
+19,320,20.0448333333333
+19,321,25.0401666666667
+19,322,26.8605
+19,323,16.0866666666667
+19,324,32.3426666666667
+19,325,21.8651666666667
+19,326,28.2151666666667
+19,327,20.9761666666667
+19,328,23.9395
+19,329,24.2358333333333
+19,330,25.3576666666667
+19,331,21.5053333333333
+19,332,30.3953333333333
+19,333,30.7975
+19,334,20.0236666666667
+19,335,20.9126666666667
+19,336,31.2208333333333
+19,337,31.115
+19,338,26.3313333333333
+19,339,30.8398333333333
+19,340,29.2946666666667
+19,341,31.115
+19,342,26.2043333333333
+19,343,23.7278333333333
+19,344,28.1305
+19,345,23.2198333333333
+19,346,20.7433333333333
+19,347,23.3891666666667
+19,348,28.4903333333333
+19,349,18.0763333333333
+19,350,24.6168333333333
+19,351,19.1558333333333
+19,352,30.0143333333333
+19,353,25.2518333333333
+19,354,24.13
+19,355,27.0933333333333
+19,356,31.242
+19,357,29.5063333333333
+19,358,23.5161666666667
+19,359,17.2931666666667
+19,360,19.3463333333333
+19,361,34.7345
+19,362,17.5683333333333
+19,363,28.829
+19,364,28.8925
+19,365,23.3256666666667
+19,366,23.8336666666667
+19,367,20.7433333333333
+19,368,31.496
+19,369,25.3576666666667
+19,370,32.5543333333333
+19,371,24.9766666666667
+19,372,24.6168333333333
+19,373,25.3576666666667
+19,374,21.9075
+19,375,24.6591666666667
+19,376,39.0736666666667
+19,377,27.7071666666667
+19,378,25.1248333333333
+19,379,20.3411666666667
+19,380,26.924
+19,381,24.13
+19,382,20.5316666666667
+19,383,26.3948333333333
+19,384,23.8336666666667
+19,385,25.7386666666667
+19,386,25.9715
+19,387,28.702
+19,388,25.1248333333333
+19,389,27.3896666666667
+19,390,30.4588333333333
+19,391,18.4785
+19,392,19.5791666666667
+19,393,28.0881666666667
+19,394,25.7386666666667
+19,395,22.1826666666667
+19,396,19.7061666666667
+19,397,29.0618333333333
+19,398,20.6798333333333
+19,399,30.607
+19,400,24.4051666666667
+19,401,24.9555
+19,402,23.7066666666667
+19,403,21.1878333333333
+19,404,22.1403333333333
+19,405,32.639
+19,406,25.3365
+19,407,19.8755
+19,408,31.4113333333333
+19,409,24.5745
+19,410,33.782
+19,411,27.3473333333333
+19,412,26.0773333333333
+19,413,33.9301666666667
+19,414,26.162
+19,415,25.654
+19,416,30.9668333333333
+19,417,31.242
+19,418,28.0458333333333
+19,419,22.9658333333333
+19,420,25.9291666666667
+19,421,23.1986666666667
+19,422,27.4743333333333
+19,423,23.622
+19,424,22.3943333333333
+19,425,28.8925
+19,426,24.5956666666667
+19,427,28.5538333333333
+19,428,33.6761666666667
+19,429,17.526
+19,430,25.6116666666667
+19,431,29.6968333333333
+19,432,19.7696666666667
+19,433,24.0241666666667
+19,434,20.3411666666667
+19,435,26.0138333333333
+19,436,24.3205
+19,437,34.544
+19,438,18.415
+19,439,20.8491666666667
+19,440,27.0298333333333
+19,441,31.2631666666667
+19,442,19.1558333333333
+19,443,26.7758333333333
+19,444,30.4588333333333
+19,445,17.145
+19,446,23.495
+19,447,31.242
+19,448,28.575
+19,449,24.4898333333333
+19,450,26.2466666666667
+19,451,31.8981666666667
+19,452,27.5166666666667
+19,453,22.5848333333333
+19,454,25.7175
+19,455,23.1351666666667
+19,456,21.7381666666667
+19,457,31.9616666666667
+19,458,24.8073333333333
+19,459,19.0076666666667
+19,460,16.8698333333333
+19,461,29.6968333333333
+19,462,27.5378333333333
+19,463,24.0241666666667
+19,464,22.0345
+19,465,15.3035
+19,466,26.162
+19,467,31.496
+19,468,23.495
+19,469,33.6973333333333
+19,470,22.1615
+19,471,21.971
+19,472,32.7236666666667
+19,473,23.8336666666667
+19,474,29.083
+19,475,26.8181666666667
+19,476,24.6591666666667
+19,477,22.5636666666667
+19,478,30.7551666666667
+19,479,35.5811666666667
+19,480,31.8558333333333
+19,481,34.8403333333333
+19,482,24.5745
+19,483,25.5481666666667
+19,484,25.7386666666667
+19,485,24.7226666666667
+19,486,24.003
+19,487,18.1186666666667
+19,488,23.7913333333333
+19,489,24.7861666666667
+19,490,31.4325
+19,491,25.4846666666667
+19,492,21.7381666666667
+19,493,25.6116666666667
+19,494,20.4258333333333
+19,495,27.5166666666667
+19,496,22.4155
+19,497,30.6281666666667
+19,498,31.0303333333333
+19,499,30.861
+19,500,23.7913333333333
+19,501,26.67
+19,502,24.5956666666667
+19,503,27.6225
+19,504,27.7706666666667
+19,505,27.051
+19,506,28.6173333333333
+19,507,29.0406666666667
+19,508,27.8976666666667
+19,509,29.6968333333333
+19,510,22.225
+19,511,22.7118333333333
+19,512,27.9823333333333
+19,513,23.4526666666667
+19,514,20.1295
+19,515,24.4263333333333
+19,516,29.9296666666667
+19,517,22.5001666666667
+19,518,32.131
+19,519,26.3313333333333
+19,520,24.1088333333333
+19,521,23.3256666666667
+19,522,24.6591666666667
+19,523,25.9291666666667
+19,524,26.0138333333333
+19,525,17.6106666666667
+19,526,21.082
+19,527,17.9493333333333
+19,528,25.4211666666667
+19,529,29.718
+19,530,26.0773333333333
+19,531,22.3943333333333
+19,532,29.8873333333333
+19,533,18.7748333333333
+19,534,24.9555
+19,535,26.1831666666667
+19,536,32.9776666666667
+19,537,22.479
+19,538,32.3426666666667
+19,539,18.7325
+19,540,24.3628333333333
+19,541,20.1718333333333
+19,542,25.9503333333333
+19,543,29.1041666666667
+19,544,25.6328333333333
+19,545,32.7871666666667
+19,546,25.8021666666667
+19,547,27.2626666666667
+19,548,30.5858333333333
+19,549,25.3153333333333
+19,550,36.5125
+19,551,28.8501666666667
+19,552,24.4051666666667
+19,553,29.083
+19,554,30.0355
+19,555,22.2885
+19,556,29.6968333333333
+19,557,26.5006666666667
+19,558,24.5321666666667
+19,559,23.0505
+19,560,20.9338333333333
+19,561,30.4588333333333
+19,562,24.13
+19,563,29.337
+19,564,24.257
+19,565,32.9565
+19,566,23.622
+19,567,26.4583333333333
+19,568,35.0096666666667
+19,569,28.4903333333333
+19,570,23.7066666666667
+19,571,21.9075
+19,572,23.876
+19,573,21.59
+19,574,26.8181666666667
+19,575,27.305
+19,576,32.9776666666667
+19,577,25.1248333333333
+19,578,26.0561666666667
+19,579,24.2993333333333
+19,580,28.1093333333333
+19,581,22.098
+19,582,22.8388333333333
+19,583,21.2301666666667
+19,584,23.2833333333333
+19,585,23.0928333333333
+19,586,25.1883333333333
+19,587,27.6225
+19,588,29.5698333333333
+19,589,29.845
+19,590,25.9291666666667
+19,591,21.463
+19,592,25.6328333333333
+19,593,33.528
+19,594,26.1196666666667
+19,595,21.6323333333333
+19,596,31.4536666666667
+19,597,34.1418333333333
+19,598,25.0613333333333
+19,599,24.5745
+19,600,17.5471666666667
+19,601,32.2791666666667
+19,602,21.717
+19,603,18.9653333333333
+19,604,22.9446666666667
+19,605,27.0086666666667
+19,606,28.8925
+19,607,29.1253333333333
+19,608,25.908
+19,609,29.0618333333333
+19,610,21.4841666666667
+19,611,26.8605
+19,612,22.6695
+19,613,24.2993333333333
+19,614,23.9818333333333
+19,615,29.4851666666667
+19,616,27.9188333333333
+19,617,23.2621666666667
+19,618,21.8863333333333
+19,619,27.1145
+19,620,28.1728333333333
+19,621,30.6705
+19,622,20.7433333333333
+19,623,31.369
+19,624,25.9503333333333
+19,625,26.7546666666667
+19,626,25.2518333333333
+19,627,23.6431666666667
+19,628,26.1831666666667
+19,629,27.9611666666667
+19,630,22.5425
+19,631,30.4376666666667
+19,632,21.3995
+19,633,26.0561666666667
+19,634,21.3148333333333
+19,635,25.7598333333333
+19,636,25.8233333333333
+19,637,31.6865
+19,638,17.5048333333333
+19,639,28.194
+19,640,23.876
+19,641,31.4113333333333
+19,642,20.9761666666667
+19,643,18.0763333333333
+19,644,21.844
+19,645,24.4051666666667
+19,646,30.6916666666667
+19,647,20.4258333333333
+19,648,26.3313333333333
+19,649,23.5585
+19,650,19.7273333333333
+19,651,34.3535
+19,652,16.7005
+19,653,27.4531666666667
+19,654,21.4206666666667
+19,655,20.9761666666667
+19,656,27.2838333333333
+19,657,23.1351666666667
+19,658,20.2988333333333
+19,659,24.6591666666667
+19,660,24.2993333333333
+19,661,26.1831666666667
+19,662,24.2146666666667
+19,663,22.2461666666667
+19,664,27.6648333333333
+19,665,19.6003333333333
+19,666,22.6271666666667
+19,667,28.575
+19,668,21.844
+19,669,17.8858333333333
+19,670,24.2146666666667
+19,671,27.1145
+19,672,27.1145
+19,673,27.0721666666667
+19,674,31.0726666666667
+19,675,24.4051666666667
+19,676,26.035
+19,677,29.5063333333333
+19,678,29.0406666666667
+19,679,28.0035
+19,680,18.3091666666667
+19,681,23.4103333333333
+19,682,23.2833333333333
+19,683,29.3793333333333
+19,684,23.9183333333333
+19,685,25.527
+19,686,27.94
+19,687,26.7335
+19,688,25.0825
+19,689,17.5048333333333
+19,690,25.8868333333333
+19,691,24.4263333333333
+19,692,25.527
+19,693,30.5858333333333
+19,694,19.6215
+19,695,22.5425
+19,696,23.7278333333333
+19,697,21.9498333333333
+19,698,20.9126666666667
+19,699,28.2151666666667
+19,700,27.6013333333333
+19,701,23.9183333333333
+19,702,32.385
+19,703,34.3958333333333
+19,704,26.5006666666667
+19,705,23.6855
+19,706,24.8073333333333
+19,707,26.9028333333333
+19,708,26.8393333333333
+19,709,30.2471666666667
+19,710,27.559
+19,711,23.1351666666667
+19,712,22.1403333333333
+19,713,27.6225
+19,714,30.5435
+19,715,31.8135
+19,716,29.5063333333333
+19,717,25.6116666666667
+19,718,28.7866666666667
+19,719,27.9188333333333
+19,720,26.1408333333333
+19,721,29.9296666666667
+19,722,22.352
+19,723,21.0396666666667
+19,724,22.4578333333333
+19,725,18.415
+19,726,19.05
+19,727,29.7603333333333
+19,728,25.1671666666667
+19,729,30.1625
+19,730,19.4945
+19,731,21.6958333333333
+19,732,19.7696666666667
+19,733,25.654
+19,734,26.8816666666667
+19,735,18.5208333333333
+19,736,28.4268333333333
+19,737,29.0195
+19,738,23.4738333333333
+19,739,25.019
+19,740,23.241
+19,741,31.5806666666667
+19,742,27.559
+19,743,27.6013333333333
+19,744,21.1243333333333
+19,745,24.8073333333333
+19,746,20.9338333333333
+19,747,26.2043333333333
+19,748,24.0453333333333
+19,749,25.8868333333333
+19,750,33.8455
+19,751,27.051
+19,752,26.9663333333333
+19,753,22.3731666666667
+19,754,33.9936666666667
+19,755,21.6958333333333
+19,756,19.1135
+19,757,25.781
+19,758,22.9235
+19,759,28.9983333333333
+19,760,25.0401666666667
+19,761,19.6638333333333
+19,762,24.1723333333333
+19,763,25.7175
+19,764,27.0721666666667
+19,765,19.2828333333333
+19,766,27.2415
+19,767,21.336
+19,768,28.4691666666667
+19,769,22.4578333333333
+19,770,38.2481666666667
+19,771,35.5176666666667
+19,772,33.8243333333333
+19,773,31.6441666666667
+19,774,27.1991666666667
+19,775,23.8125
+19,776,22.4155
+19,777,25.8233333333333
+19,778,23.2833333333333
+19,779,27.6648333333333
+19,780,20.701
+19,781,21.2725
+19,782,38.6503333333333
+19,783,34.3746666666667
+19,784,23.6008333333333
+19,785,20.6798333333333
+19,786,28.3421666666667
+19,787,24.511
+19,788,18.669
+19,789,25.1248333333333
+19,790,26.6065
+19,791,39.0736666666667
+19,792,26.9451666666667
+19,793,25.0401666666667
+19,794,28.7443333333333
+19,795,37.1051666666667
+19,796,24.9766666666667
+19,797,28.6173333333333
+19,798,24.0665
+19,799,21.082
+19,800,26.2678333333333
+19,801,24.4686666666667
+19,802,24.1088333333333
+19,803,20.9338333333333
+19,804,25.273
+19,805,19.5156666666667
+19,806,26.924
+19,807,23.0293333333333
+19,808,18.2668333333333
+19,809,24.5321666666667
+19,810,27.2626666666667
+19,811,23.5796666666667
+19,812,29.5486666666667
+19,813,29.7391666666667
+19,814,28.7655
+19,815,33.4856666666667
+19,816,26.035
+19,817,30.8398333333333
+19,818,16.3618333333333
+19,819,19.8331666666667
+19,820,25.1883333333333
+19,821,19.9601666666667
+19,822,29.4851666666667
+19,823,29.4851666666667
+19,824,26.3525
+19,825,18.923
+19,826,22.9023333333333
+19,827,33.401
+19,828,25.654
+19,829,30.3953333333333
+19,830,27.7706666666667
+19,831,23.6643333333333
+19,832,27.813
+19,833,19.1981666666667
+19,834,22.7541666666667
+19,835,20.3835
+19,836,31.3266666666667
+19,837,22.8811666666667
+19,838,20.9126666666667
+19,839,27.6436666666667
+19,840,24.9978333333333
+19,841,16.8275
+19,842,23.368
+19,843,26.0773333333333
+19,844,25.3576666666667
+19,845,22.2038333333333
+19,846,25.7175
+19,847,24.6803333333333
+19,848,18.796
+19,849,19.7485
+19,850,29.2523333333333
+19,851,25.0613333333333
+19,852,25.5905
+19,853,28.8501666666667
+19,854,25.3576666666667
+19,855,25.527
+19,856,35.7505
+19,857,24.384
+19,858,24.4051666666667
+19,859,28.7443333333333
+19,860,28.1728333333333
+19,861,30.2471666666667
+19,862,24.7226666666667
+19,863,18.3938333333333
+19,864,23.9606666666667
+19,865,22.3731666666667
+19,866,26.5006666666667
+19,867,25.8445
+19,868,31.4113333333333
+19,869,28.7443333333333
+19,870,26.416
+19,871,27.6013333333333
+19,872,29.9508333333333
+19,873,18.3091666666667
+19,874,22.9235
+19,875,23.8125
+19,876,21.717
+19,877,26.924
+19,878,23.2833333333333
+19,879,24.7226666666667
+19,880,24.4686666666667
+19,881,33.2528333333333
+19,882,22.1615
+19,883,19.6215
+19,884,37.3591666666667
+19,885,26.8816666666667
+19,886,30.0355
+19,887,24.6168333333333
+19,888,23.5161666666667
+19,889,25.6751666666667
+19,890,22.987
+19,891,30.2895
+19,892,27.2203333333333
+19,893,21.336
+19,894,33.5703333333333
+19,895,28.2151666666667
+19,896,22.5636666666667
+19,897,28.6385
+19,898,28.5538333333333
+19,899,34.163
+19,900,32.9776666666667
+19,901,33.8031666666667
+19,902,29.6545
+19,903,27.3685
+19,904,24.2146666666667
+19,905,26.0561666666667
+19,906,29.0618333333333
+19,907,31.3478333333333
+19,908,20.0236666666667
+19,909,21.5053333333333
+19,910,28.1728333333333
+19,911,21.6746666666667
+19,912,28.321
+19,913,24.257
+19,914,21.7593333333333
+19,915,45.4871666666667
+19,916,25.4635
+19,917,34.9673333333333
+19,918,24.8073333333333
+19,919,27.8765
+19,920,20.0448333333333
+19,921,36.195
+19,922,24.9766666666667
+19,923,25.2518333333333
+19,924,28.2575
+19,925,20.2565
+19,926,38.4598333333333
+19,927,26.416
+19,928,22.9658333333333
+19,929,25.1883333333333
+19,930,31.0938333333333
+19,931,33.8031666666667
+19,932,28.0246666666667
+19,933,27.178
+19,934,19.4945
+19,935,18.8806666666667
+19,936,17.653
+19,937,27.8765
+19,938,22.4578333333333
+19,939,25.5481666666667
+19,940,30.6493333333333
+19,941,22.1826666666667
+19,942,29.718
+19,943,33.8878333333333
+19,944,31.8558333333333
+19,945,25.8656666666667
+19,946,31.3055
+19,947,19.7485
+19,948,27.94
+19,949,20.8703333333333
+19,950,26.0773333333333
+19,951,26.5853333333333
+19,952,21.7381666666667
+19,953,26.9663333333333
+19,954,29.4851666666667
+19,955,18.4996666666667
+19,956,22.2673333333333
+19,957,19.3675
+19,958,21.717
+19,959,26.4583333333333
+19,960,19.4733333333333
+19,961,20.6798333333333
+19,962,25.527
+19,963,24.4051666666667
+19,964,31.0938333333333
+19,965,27.5378333333333
+19,966,21.4841666666667
+19,967,28.1093333333333
+19,968,29.9296666666667
+19,969,21.8863333333333
+19,970,27.6225
+19,971,22.4366666666667
+19,972,28.5326666666667
+19,973,26.2043333333333
+19,974,28.956
+19,975,24.4686666666667
+19,976,27.3685
+19,977,27.3685
+19,978,28.6385
+19,979,14.351
+19,980,22.5848333333333
+19,981,23.3891666666667
+19,982,27.1568333333333
+19,983,33.0623333333333
+19,984,20.4893333333333
+19,985,25.6963333333333
+19,986,23.749
+19,987,24.6803333333333
+19,988,32.131
+19,989,20.1506666666667
+19,990,22.987
+19,991,23.4103333333333
+19,992,29.6121666666667
+19,993,23.5796666666667
+19,994,26.6488333333333
+19,995,24.9978333333333
+19,996,23.2833333333333
+19,997,27.3685
+19,998,28.0881666666667
+19,999,27.5166666666667
+19,1000,19.431
+20,1,36.83
+20,2,23.9818333333333
+20,3,26.6488333333333
+20,4,29.4005
+20,5,19.8966666666667
+20,6,24.8496666666667
+20,7,26.5641666666667
+20,8,22.1615
+20,9,24.7438333333333
+20,10,27.559
+20,11,31.8981666666667
+20,12,25.4635
+20,13,33.7185
+20,14,30.3106666666667
+20,15,25.8656666666667
+20,16,27.1145
+20,17,21.59
+20,18,22.8811666666667
+20,19,24.003
+20,20,23.9818333333333
+20,21,36.1315
+20,22,22.7753333333333
+20,23,29.9508333333333
+20,24,30.3318333333333
+20,25,30.7128333333333
+20,26,26.5006666666667
+20,27,14.5626666666667
+20,28,24.0876666666667
+20,29,29.591
+20,30,29.9931666666667
+20,31,19.6215
+20,32,27.2203333333333
+20,33,35.7293333333333
+20,34,30.1836666666667
+20,35,28.8078333333333
+20,36,29.0406666666667
+20,37,41.4231666666667
+20,38,24.0665
+20,39,23.6431666666667
+20,40,28.5326666666667
+20,41,26.6488333333333
+20,42,29.9296666666667
+20,43,28.1728333333333
+20,44,22.8176666666667
+20,45,25.2518333333333
+20,46,30.1413333333333
+20,47,29.8026666666667
+20,48,21.971
+20,49,24.511
+20,50,27.94
+20,51,26.2466666666667
+20,52,24.7438333333333
+20,53,34.0148333333333
+20,54,29.1465
+20,55,19.0288333333333
+20,56,28.1093333333333
+20,57,25.4
+20,58,26.9028333333333
+20,59,27.8976666666667
+20,60,30.099
+20,61,28.4056666666667
+20,62,25.5481666666667
+20,63,27.2415
+20,64,26.0985
+20,65,28.8713333333333
+20,66,26.1196666666667
+20,67,31.2843333333333
+20,68,24.2146666666667
+20,69,23.6643333333333
+20,70,23.8548333333333
+20,71,26.9028333333333
+20,72,28.0881666666667
+20,73,29.083
+20,74,29.1465
+20,75,24.765
+20,76,21.463
+20,77,25.8233333333333
+20,78,22.8176666666667
+20,79,30.4376666666667
+20,80,23.4103333333333
+20,81,27.0086666666667
+20,82,30.8821666666667
+20,83,29.2311666666667
+20,84,25.0825
+20,85,27.7918333333333
+20,86,25.8021666666667
+20,87,27.5166666666667
+20,88,25.9926666666667
+20,89,25.4846666666667
+20,90,28.5115
+20,91,23.2833333333333
+20,92,20.2141666666667
+20,93,23.4526666666667
+20,94,25.146
+20,95,29.1888333333333
+20,96,33.8031666666667
+20,97,18.0975
+20,98,27.6013333333333
+20,99,19.5791666666667
+20,100,32.9776666666667
+20,101,27.0721666666667
+20,102,32.7448333333333
+20,103,26.9663333333333
+20,104,36.7665
+20,105,23.2198333333333
+20,106,25.4846666666667
+20,107,24.511
+20,108,22.7753333333333
+20,109,26.0561666666667
+20,110,28.3421666666667
+20,111,24.3205
+20,112,31.5595
+20,113,29.845
+20,114,26.0773333333333
+20,115,27.7283333333333
+20,116,24.7015
+20,117,30.3318333333333
+20,118,28.448
+20,119,24.9978333333333
+20,120,22.987
+20,121,30.5435
+20,122,32.9988333333333
+20,123,27.6648333333333
+20,124,25.019
+20,125,31.9193333333333
+20,126,22.4155
+20,127,29.2946666666667
+20,128,27.2838333333333
+20,129,23.2198333333333
+20,130,31.9405
+20,131,25.3788333333333
+20,132,29.845
+20,133,23.749
+20,134,27.4955
+20,135,30.48
+20,136,31.3055
+20,137,24.4051666666667
+20,138,25.1671666666667
+20,139,26.5218333333333
+20,140,28.0246666666667
+20,141,16.9756666666667
+20,142,28.4903333333333
+20,143,25.8445
+20,144,29.718
+20,145,28.1093333333333
+20,146,26.6065
+20,147,29.8238333333333
+20,148,30.4588333333333
+20,149,25.8021666666667
+20,150,28.9771666666667
+20,151,23.368
+20,152,30.6281666666667
+20,153,35.4118333333333
+20,154,25.2306666666667
+20,155,24.9978333333333
+20,156,29.4428333333333
+20,157,24.9131666666667
+20,158,27.0933333333333
+20,159,20.9126666666667
+20,160,32.1521666666667
+20,161,31.2843333333333
+20,162,30.0778333333333
+20,163,34.6921666666667
+20,164,27.7495
+20,165,32.4696666666667
+20,166,25.0613333333333
+20,167,27.1356666666667
+20,168,26.4795
+20,169,26.0138333333333
+20,170,23.7701666666667
+20,171,31.2208333333333
+20,172,25.1883333333333
+20,173,29.1253333333333
+20,174,24.4051666666667
+20,175,21.7381666666667
+20,176,25.6328333333333
+20,177,22.098
+20,178,21.9921666666667
+20,179,29.464
+20,180,30.5435
+20,181,21.463
+20,182,28.8925
+20,183,26.3313333333333
+20,184,23.6431666666667
+20,185,29.7603333333333
+20,186,29.7603333333333
+20,187,28.2998333333333
+20,188,32.1945
+20,189,27.2626666666667
+20,190,34.0571666666667
+20,191,26.7758333333333
+20,192,22.5001666666667
+20,193,26.3948333333333
+20,194,24.4051666666667
+20,195,32.1945
+20,196,26.416
+20,197,22.987
+20,198,24.8073333333333
+20,199,30.861
+20,200,28.2998333333333
+20,201,23.8336666666667
+20,202,22.5213333333333
+20,203,27.4108333333333
+20,204,24.4686666666667
+20,205,27.0086666666667
+20,206,29.3793333333333
+20,207,30.099
+20,208,27.0933333333333
+20,209,21.7593333333333
+20,210,26.3313333333333
+20,211,25.6751666666667
+20,212,21.0608333333333
+20,213,28.321
+20,214,24.0453333333333
+20,215,30.3106666666667
+20,216,28.5326666666667
+20,217,23.8548333333333
+20,218,28.3633333333333
+20,219,23.622
+20,220,30.3106666666667
+20,221,33.6338333333333
+20,222,25.4846666666667
+20,223,16.5946666666667
+20,224,25.8021666666667
+20,225,27.7495
+20,226,31.3478333333333
+20,227,27.686
+20,228,23.749
+20,229,32.9141666666667
+20,230,28.956
+20,231,24.0665
+20,232,22.5425
+20,233,24.638
+20,234,22.9446666666667
+20,235,26.6065
+20,236,26.4371666666667
+20,237,23.8125
+20,238,27.6436666666667
+20,239,30.4376666666667
+20,240,22.5425
+20,241,22.4578333333333
+20,242,28.194
+20,243,27.051
+20,244,22.86
+20,245,27.4531666666667
+20,246,28.9136666666667
+20,247,25.527
+20,248,25.9291666666667
+20,249,27.1356666666667
+20,250,23.114
+20,251,25.1248333333333
+20,252,25.8868333333333
+20,253,31.6865
+20,254,22.2461666666667
+20,255,31.3055
+20,256,30.9033333333333
+20,257,23.9183333333333
+20,258,33.02
+20,259,30.4588333333333
+20,260,28.8078333333333
+20,261,28.575
+20,262,28.0881666666667
+20,263,27.3261666666667
+20,264,32.639
+20,265,27.5378333333333
+20,266,19.685
+20,267,31.0515
+20,268,27.9611666666667
+20,269,27.0933333333333
+20,270,22.1191666666667
+20,271,27.7918333333333
+20,272,33.147
+20,273,26.4583333333333
+20,274,35.4541666666667
+20,275,22.3731666666667
+20,276,28.8713333333333
+20,277,22.0768333333333
+20,278,21.1243333333333
+20,279,23.8336666666667
+20,280,25.4635
+20,281,24.1935
+20,282,25.4211666666667
+20,283,26.5006666666667
+20,284,25.0825
+20,285,31.115
+20,286,26.1196666666667
+20,287,25.146
+20,288,27.1356666666667
+20,289,30.6916666666667
+20,290,28.4056666666667
+20,291,20.0236666666667
+20,292,28.6808333333333
+20,293,32.8506666666667
+20,294,22.225
+20,295,28.6173333333333
+20,296,25.654
+20,297,28.1305
+20,298,20.8915
+20,299,31.369
+20,300,28.6385
+20,301,27.1568333333333
+20,302,24.4263333333333
+20,303,28.5326666666667
+20,304,25.4635
+20,305,30.5646666666667
+20,306,25.3576666666667
+20,307,20.9973333333333
+20,308,31.0938333333333
+20,309,23.3891666666667
+20,310,28.2151666666667
+20,311,23.0505
+20,312,27.7918333333333
+20,313,27.9188333333333
+20,314,28.7231666666667
+20,315,26.0985
+20,316,25.1248333333333
+20,317,25.654
+20,318,23.4526666666667
+20,319,28.3421666666667
+20,320,24.0241666666667
+20,321,22.6906666666667
+20,322,24.6591666666667
+20,323,26.035
+20,324,27.0298333333333
+20,325,30.2895
+20,326,30.7975
+20,327,21.6323333333333
+20,328,26.67
+20,329,23.495
+20,330,30.0355
+20,331,25.654
+20,332,26.0138333333333
+20,333,19.0711666666667
+20,334,21.6323333333333
+20,335,22.3308333333333
+20,336,24.5745
+20,337,32.0886666666667
+20,338,21.1878333333333
+20,339,22.733
+20,340,31.242
+20,341,24.1723333333333
+20,342,26.4371666666667
+20,343,21.8651666666667
+20,344,26.924
+20,345,31.0091666666667
+20,346,22.9235
+20,347,33.2316666666667
+20,348,22.6271666666667
+20,349,30.0355
+20,350,32.3426666666667
+20,351,31.5595
+20,352,27.4743333333333
+20,353,28.1516666666667
+20,354,25.273
+20,355,22.2885
+20,356,27.1991666666667
+20,357,28.448
+20,358,25.3788333333333
+20,359,26.0561666666667
+20,360,25.8445
+20,361,25.0825
+20,362,28.5115
+20,363,29.1465
+20,364,23.7066666666667
+20,365,27.2415
+20,366,26.3948333333333
+20,367,34.8826666666667
+20,368,26.3313333333333
+20,369,29.9931666666667
+20,370,28.3633333333333
+20,371,19.4521666666667
+20,372,32.2156666666667
+20,373,21.5053333333333
+20,374,21.1455
+20,375,32.8083333333333
+20,376,23.0293333333333
+20,377,29.9508333333333
+20,378,29.2311666666667
+20,379,25.6963333333333
+20,380,28.7866666666667
+20,381,19.8543333333333
+20,382,29.5275
+20,383,23.2198333333333
+20,384,26.3525
+20,385,37.2956666666667
+20,386,29.1888333333333
+20,387,29.2946666666667
+20,388,28.1516666666667
+20,389,22.0768333333333
+20,390,17.907
+20,391,28.829
+20,392,26.7758333333333
+20,393,28.6808333333333
+20,394,24.384
+20,395,27.8553333333333
+20,396,31.7923333333333
+20,397,24.7015
+20,398,29.0195
+20,399,26.2255
+20,400,25.527
+20,401,26.3313333333333
+20,402,23.4738333333333
+20,403,25.3576666666667
+20,404,31.4536666666667
+20,405,24.5745
+20,406,28.4268333333333
+20,407,25.6116666666667
+20,408,23.0293333333333
+20,409,26.416
+20,410,26.9451666666667
+20,411,28.2363333333333
+20,412,30.988
+20,413,22.8176666666667
+20,414,24.892
+20,415,28.5326666666667
+20,416,24.7015
+20,417,30.3318333333333
+20,418,27.7071666666667
+20,419,25.6963333333333
+20,420,27.1568333333333
+20,421,30.1201666666667
+20,422,25.5905
+20,423,29.1465
+20,424,27.8976666666667
+20,425,24.0876666666667
+20,426,23.2833333333333
+20,427,26.2043333333333
+20,428,29.3793333333333
+20,429,33.8243333333333
+20,430,24.8285
+20,431,30.6916666666667
+20,432,23.622
+20,433,22.4578333333333
+20,434,21.7593333333333
+20,435,31.0303333333333
+20,436,32.9988333333333
+20,437,28.7655
+20,438,29.7815
+20,439,19.9813333333333
+20,440,25.9926666666667
+20,441,27.305
+20,442,27.4108333333333
+20,443,23.9606666666667
+20,444,30.607
+20,445,26.1408333333333
+20,446,28.0035
+20,447,26.797
+20,448,28.2575
+20,449,25.8868333333333
+20,450,25.0613333333333
+20,451,28.8501666666667
+20,452,26.9028333333333
+20,453,23.3045
+20,454,28.067
+20,455,32.766
+20,456,30.353
+20,457,30.2471666666667
+20,458,26.5853333333333
+20,459,27.178
+20,460,27.1145
+20,461,31.6653333333333
+20,462,22.7118333333333
+20,463,26.924
+20,464,23.2198333333333
+20,465,25.019
+20,466,29.9508333333333
+20,467,28.7231666666667
+20,468,27.3896666666667
+20,469,26.8181666666667
+20,470,28.1305
+20,471,31.6441666666667
+20,472,30.9456666666667
+20,473,22.7965
+20,474,27.5166666666667
+20,475,23.114
+20,476,22.9658333333333
+20,477,33.6973333333333
+20,478,19.4098333333333
+20,479,33.782
+20,480,24.6803333333333
+20,481,34.6286666666667
+20,482,25.2518333333333
+20,483,27.6013333333333
+20,484,27.051
+20,485,29.5063333333333
+20,486,27.1145
+20,487,29.591
+20,488,31.8558333333333
+20,489,28.5326666666667
+20,490,24.6591666666667
+20,491,23.7066666666667
+20,492,29.083
+20,493,31.242
+20,494,27.4743333333333
+20,495,23.6643333333333
+20,496,21.9921666666667
+20,497,26.7335
+20,498,28.448
+20,499,20.193
+20,500,17.8646666666667
+20,501,23.3891666666667
+20,502,30.734
+20,503,28.5326666666667
+20,504,27.9611666666667
+20,505,29.1465
+20,506,19.8755
+20,507,25.273
+20,508,26.416
+20,509,26.0773333333333
+20,510,25.908
+20,511,25.6328333333333
+20,512,34.2265
+20,513,25.3788333333333
+20,514,27.2626666666667
+20,515,32.1733333333333
+20,516,23.1563333333333
+20,517,25.2518333333333
+20,518,30.607
+20,519,26.3736666666667
+20,520,27.6225
+20,521,23.749
+20,522,24.9978333333333
+20,523,23.7278333333333
+20,524,25.0401666666667
+20,525,31.6018333333333
+20,526,30.734
+20,527,34.0783333333333
+20,528,35.3483333333333
+20,529,25.8233333333333
+20,530,28.5115
+20,531,27.178
+20,532,19.7273333333333
+20,533,31.1573333333333
+20,534,21.2936666666667
+20,535,28.321
+20,536,27.9823333333333
+20,537,28.8925
+20,538,27.8341666666667
+20,539,31.7288333333333
+20,540,23.0928333333333
+20,541,29.6121666666667
+20,542,32.3003333333333
+20,543,19.1558333333333
+20,544,27.559
+20,545,26.797
+20,546,29.3158333333333
+20,547,26.8816666666667
+20,548,26.2043333333333
+20,549,31.0515
+20,550,25.5905
+20,551,31.3055
+20,552,28.8713333333333
+20,553,32.9565
+20,554,30.3741666666667
+20,555,25.8233333333333
+20,556,27.9823333333333
+20,557,26.7335
+20,558,27.6225
+20,559,25.8656666666667
+20,560,29.2946666666667
+20,561,26.3948333333333
+20,562,26.8393333333333
+20,563,24.7226666666667
+20,564,29.591
+20,565,27.1356666666667
+20,566,26.6911666666667
+20,567,28.6173333333333
+20,568,29.6121666666667
+20,569,30.099
+20,570,23.6643333333333
+20,571,29.083
+20,572,25.4846666666667
+20,573,23.1986666666667
+20,574,28.3845
+20,575,25.8445
+20,576,33.2951666666667
+20,577,29.083
+20,578,30.5646666666667
+20,579,28.0035
+20,580,23.9183333333333
+20,581,23.5161666666667
+20,582,28.194
+20,583,28.575
+20,584,25.9291666666667
+20,585,25.7386666666667
+20,586,27.178
+20,587,21.9286666666667
+20,588,30.2683333333333
+20,589,31.3478333333333
+20,590,22.2461666666667
+20,591,27.813
+20,592,25.8021666666667
+20,593,24.7015
+20,594,25.8233333333333
+20,595,24.7015
+20,596,25.2941666666667
+20,597,25.8021666666667
+20,598,28.5326666666667
+20,599,34.2053333333333
+20,600,26.6488333333333
+20,601,25.0825
+20,602,28.0246666666667
+20,603,27.2838333333333
+20,604,21.463
+20,605,37.5073333333333
+20,606,24.8285
+20,607,29.9296666666667
+20,608,26.4795
+20,609,30.2683333333333
+20,610,28.6596666666667
+20,611,23.3891666666667
+20,612,26.162
+20,613,22.3308333333333
+20,614,28.5961666666667
+20,615,23.0716666666667
+20,616,23.3468333333333
+20,617,23.9818333333333
+20,618,23.9183333333333
+20,619,34.163
+20,620,30.3953333333333
+20,621,19.9178333333333
+20,622,30.6493333333333
+20,623,24.2781666666667
+20,624,25.2518333333333
+20,625,26.9875
+20,626,28.8501666666667
+20,627,30.9245
+20,628,19.3251666666667
+20,629,26.416
+20,630,25.7175
+20,631,26.7758333333333
+20,632,22.4578333333333
+20,633,26.5006666666667
+20,634,25.7386666666667
+20,635,28.956
+20,636,24.13
+20,637,28.321
+20,638,25.6963333333333
+20,639,23.7278333333333
+20,640,21.5265
+20,641,22.4578333333333
+20,642,25.6116666666667
+20,643,31.3901666666667
+20,644,29.718
+20,645,32.2156666666667
+20,646,22.9446666666667
+20,647,23.5161666666667
+20,648,29.0618333333333
+20,649,22.5848333333333
+20,650,24.9766666666667
+20,651,30.2683333333333
+20,652,23.0716666666667
+20,653,19.2405
+20,654,22.8811666666667
+20,655,21.8228333333333
+20,656,28.5961666666667
+20,657,24.2993333333333
+20,658,25.781
+20,659,29.7391666666667
+20,660,29.337
+20,661,25.4635
+20,662,29.8873333333333
+20,663,26.6488333333333
+20,664,25.4846666666667
+20,665,22.7965
+20,666,27.1356666666667
+20,667,27.5166666666667
+20,668,35.3271666666667
+20,669,26.2678333333333
+20,670,27.305
+20,671,20.6586666666667
+20,672,26.1408333333333
+20,673,20.8915
+20,674,27.7918333333333
+20,675,33.1893333333333
+20,676,29.9508333333333
+20,677,37.4438333333333
+20,678,25.8656666666667
+20,679,31.7923333333333
+20,680,26.4371666666667
+20,681,28.6385
+20,682,33.3163333333333
+20,683,29.5486666666667
+20,684,29.083
+20,685,27.4955
+20,686,25.4
+20,687,26.9451666666667
+20,688,27.8765
+20,689,31.4748333333333
+20,690,28.9348333333333
+20,691,25.2095
+20,692,19.2405
+20,693,23.2621666666667
+20,694,26.5641666666667
+20,695,26.7123333333333
+20,696,29.2523333333333
+20,697,33.401
+20,698,25.4635
+20,699,27.559
+20,700,27.178
+20,701,25.654
+20,702,24.1935
+20,703,32.3638333333333
+20,704,27.3473333333333
+20,705,23.749
+20,706,26.162
+20,707,21.9075
+20,708,32.3426666666667
+20,709,24.5956666666667
+20,710,20.7856666666667
+20,711,28.4056666666667
+20,712,26.4371666666667
+20,713,28.6385
+20,714,27.7283333333333
+20,715,32.0463333333333
+20,716,24.6591666666667
+20,717,24.1723333333333
+20,718,28.4056666666667
+20,719,26.9875
+20,720,32.5331666666667
+20,721,28.4903333333333
+20,722,21.59
+20,723,25.0613333333333
+20,724,35.1578333333333
+20,725,19.939
+20,726,27.1991666666667
+20,727,23.0293333333333
+20,728,23.368
+20,729,29.464
+20,730,31.496
+20,731,20.3623333333333
+20,732,31.4748333333333
+20,733,27.4531666666667
+20,734,30.5223333333333
+20,735,29.718
+20,736,23.3891666666667
+20,737,24.384
+20,738,25.9291666666667
+20,739,27.559
+20,740,23.5161666666667
+20,741,22.7753333333333
+20,742,26.6065
+20,743,29.2735
+20,744,23.7913333333333
+20,745,28.4691666666667
+20,746,24.1088333333333
+20,747,27.9188333333333
+20,748,27.3473333333333
+20,749,24.4263333333333
+20,750,24.2781666666667
+20,751,26.8605
+20,752,27.7283333333333
+20,753,27.432
+20,754,21.844
+20,755,25.3365
+20,756,33.2528333333333
+20,757,26.8393333333333
+20,758,30.5223333333333
+20,759,26.543
+20,760,25.4211666666667
+20,761,24.6168333333333
+20,762,27.051
+20,763,24.9131666666667
+20,764,26.2678333333333
+20,765,29.5698333333333
+20,766,26.0773333333333
+20,767,26.2043333333333
+20,768,24.3416666666667
+20,769,27.6436666666667
+20,770,26.7123333333333
+20,771,26.5853333333333
+20,772,30.0143333333333
+20,773,22.6271666666667
+20,774,24.5533333333333
+20,775,24.9978333333333
+20,776,25.2095
+20,777,22.1191666666667
+20,778,31.6865
+20,779,22.1615
+20,780,23.7701666666667
+20,781,27.2838333333333
+20,782,27.6225
+20,783,30.7128333333333
+20,784,25.6328333333333
+20,785,24.7861666666667
+20,786,29.9931666666667
+20,787,26.5006666666667
+20,788,30.353
+20,789,32.7236666666667
+20,790,27.813
+20,791,26.67
+20,792,23.3045
+20,793,27.432
+20,794,26.7546666666667
+20,795,22.098
+20,796,29.3158333333333
+20,797,27.1991666666667
+20,798,28.9983333333333
+20,799,25.6751666666667
+20,800,23.9395
+20,801,28.575
+20,802,23.5161666666667
+20,803,25.4846666666667
+20,804,28.7231666666667
+20,805,27.7071666666667
+20,806,28.6808333333333
+20,807,22.0133333333333
+20,808,27.6225
+20,809,26.5006666666667
+20,810,27.3473333333333
+20,811,25.2095
+20,812,30.3741666666667
+20,813,20.8068333333333
+20,814,31.7288333333333
+20,815,23.8548333333333
+20,816,27.2203333333333
+20,817,26.2466666666667
+20,818,23.9818333333333
+20,819,24.3628333333333
+20,820,19.2828333333333
+20,821,27.2415
+20,822,26.8181666666667
+20,823,24.3628333333333
+20,824,32.9988333333333
+20,825,31.7923333333333
+20,826,22.9023333333333
+20,827,23.3256666666667
+20,828,29.3158333333333
+20,829,22.8388333333333
+20,830,26.4795
+20,831,29.083
+20,832,22.098
+20,833,28.5961666666667
+20,834,31.369
+20,835,27.4108333333333
+20,836,29.9085
+20,837,26.7758333333333
+20,838,23.0716666666667
+20,839,21.9075
+20,840,21.082
+20,841,22.3731666666667
+20,842,27.2415
+20,843,32.4061666666667
+20,844,26.3948333333333
+20,845,26.2255
+20,846,26.543
+20,847,30.4376666666667
+20,848,32.512
+20,849,30.9033333333333
+20,850,21.8228333333333
+20,851,30.8398333333333
+20,852,20.5528333333333
+20,853,25.8233333333333
+20,854,22.3096666666667
+20,855,28.8501666666667
+20,856,21.9498333333333
+20,857,28.067
+20,858,29.9931666666667
+20,859,21.2301666666667
+20,860,25.1671666666667
+20,861,33.8455
+20,862,26.8816666666667
+20,863,23.3045
+20,864,28.3633333333333
+20,865,25.9715
+20,866,24.1935
+20,867,23.3468333333333
+20,868,31.496
+20,869,23.1563333333333
+20,870,31.7711666666667
+20,871,21.0608333333333
+20,872,34.2688333333333
+20,873,23.3256666666667
+20,874,29.7391666666667
+20,875,29.1676666666667
+20,876,29.1888333333333
+20,877,23.2621666666667
+20,878,22.3943333333333
+20,879,25.9926666666667
+20,880,24.1088333333333
+20,881,29.464
+20,882,26.3313333333333
+20,883,28.2151666666667
+20,884,19.7273333333333
+20,885,19.558
+20,886,23.0505
+20,887,19.8331666666667
+20,888,26.5006666666667
+20,889,29.5698333333333
+20,890,31.1785
+20,891,28.0458333333333
+20,892,25.527
+20,893,27.5801666666667
+20,894,29.0195
+20,895,28.8925
+20,896,21.0608333333333
+20,897,28.575
+20,898,23.3468333333333
+20,899,27.1356666666667
+20,900,29.9931666666667
+20,901,27.6436666666667
+20,902,29.6756666666667
+20,903,27.2626666666667
+20,904,25.4
+20,905,26.8393333333333
+20,906,33.274
+20,907,27.3473333333333
+20,908,26.3101666666667
+20,909,25.527
+20,910,27.7495
+20,911,24.6168333333333
+20,912,26.2466666666667
+20,913,27.1568333333333
+20,914,33.1258333333333
+20,915,27.3896666666667
+20,916,28.3845
+20,917,21.8863333333333
+20,918,31.4113333333333
+20,919,29.8238333333333
+20,920,24.1723333333333
+20,921,28.7443333333333
+20,922,24.638
+20,923,25.7598333333333
+20,924,25.2518333333333
+20,925,22.2461666666667
+20,926,23.6855
+20,927,22.2673333333333
+20,928,28.194
+20,929,32.385
+20,930,26.289
+20,931,27.0721666666667
+20,932,24.511
+20,933,28.5538333333333
+20,934,29.972
+20,935,20.5951666666667
+20,936,32.8295
+20,937,31.0091666666667
+20,938,29.6121666666667
+20,939,26.2043333333333
+20,940,30.0566666666667
+20,941,24.7861666666667
+20,942,24.4898333333333
+20,943,31.9828333333333
+20,944,19.3251666666667
+20,945,28.2575
+20,946,27.4531666666667
+20,947,29.9508333333333
+20,948,27.0721666666667
+20,949,29.6968333333333
+20,950,27.6436666666667
+20,951,24.765
+20,952,26.67
+20,953,24.2146666666667
+20,954,30.9245
+20,955,22.8811666666667
+20,956,27.8976666666667
+20,957,25.6963333333333
+20,958,33.6761666666667
+20,959,23.0293333333333
+20,960,26.2255
+20,961,28.0881666666667
+20,962,28.1728333333333
+20,963,26.3101666666667
+20,964,31.0303333333333
+20,965,27.178
+20,966,24.5956666666667
+20,967,23.876
+20,968,20.6798333333333
+20,969,26.2043333333333
+20,970,22.6695
+20,971,31.5171666666667
+20,972,29.591
+20,973,24.9131666666667
+20,974,29.8661666666667
+20,975,27.051
+20,976,26.1196666666667
+20,977,35.4541666666667
+20,978,23.876
+20,979,28.3633333333333
+20,980,32.0675
+20,981,25.0613333333333
+20,982,30.607
+20,983,27.94
+20,984,25.6751666666667
+20,985,29.8873333333333
+20,986,25.3788333333333
+20,987,20.447
+20,988,28.4056666666667
+20,989,28.0035
+20,990,24.638
+20,991,25.8233333333333
+20,992,26.3948333333333
+20,993,31.1785
+20,994,25.8233333333333
+20,995,24.2993333333333
+20,996,26.0985
+20,997,29.8026666666667
+20,998,25.5905
+20,999,30.1625
+20,1000,25.4
+21,1,30.353
+21,2,31.496
+21,3,31.9193333333333
+21,4,34.0783333333333
+21,5,35.687
+21,6,19.6003333333333
+21,7,25.1036666666667
+21,8,24.003
+21,9,26.035
+21,10,29.845
+21,11,28.7443333333333
+21,12,31.4536666666667
+21,13,37.2956666666667
+21,14,28.448
+21,15,25.146
+21,16,21.2513333333333
+21,17,34.2053333333333
+21,18,31.877
+21,19,26.6276666666667
+21,20,33.528
+21,21,32.9353333333333
+21,22,30.6916666666667
+21,23,25.8233333333333
+21,24,34.29
+21,25,26.162
+21,26,31.0303333333333
+21,27,25.0613333333333
+21,28,30.226
+21,29,31.1573333333333
+21,30,26.8816666666667
+21,31,29.8026666666667
+21,32,35.306
+21,33,30.0143333333333
+21,34,29.337
+21,35,34.5016666666667
+21,36,26.035
+21,37,28.194
+21,38,21.8863333333333
+21,39,29.845
+21,40,27.3473333333333
+21,41,28.2786666666667
+21,42,31.1996666666667
+21,43,30.226
+21,44,33.3586666666667
+21,45,30.6916666666667
+21,46,29.591
+21,47,29.21
+21,48,29.7603333333333
+21,49,29.21
+21,50,22.2673333333333
+21,51,23.749
+21,52,30.4376666666667
+21,53,24.13
+21,54,31.3266666666667
+21,55,31.5806666666667
+21,56,30.3953333333333
+21,57,30.607
+21,58,25.9926666666667
+21,59,30.3106666666667
+21,60,25.654
+21,61,26.7546666666667
+21,62,22.987
+21,63,27.1356666666667
+21,64,28.9136666666667
+21,65,32.512
+21,66,33.6126666666667
+21,67,28.7866666666667
+21,68,24.9343333333333
+21,69,35.4753333333333
+21,70,25.5693333333333
+21,71,34.2053333333333
+21,72,32.4273333333333
+21,73,27.3896666666667
+21,74,24.5533333333333
+21,75,30.48
+21,76,31.5806666666667
+21,77,29.1676666666667
+21,78,28.575
+21,79,31.496
+21,80,31.115
+21,81,26.6276666666667
+21,82,30.0143333333333
+21,83,35.687
+21,84,25.4
+21,85,32.004
+21,86,23.4103333333333
+21,87,31.2843333333333
+21,88,40.132
+21,89,36.2373333333333
+21,90,40.5976666666667
+21,91,30.607
+21,92,31.5383333333333
+21,93,28.2786666666667
+21,94,29.4216666666667
+21,95,28.2786666666667
+21,96,28.4903333333333
+21,97,31.3266666666667
+21,98,29.7603333333333
+21,99,27.0086666666667
+21,100,31.5806666666667
+21,101,31.75
+21,102,24.4263333333333
+21,103,28.7443333333333
+21,104,24.2146666666667
+21,105,31.1996666666667
+21,106,26.8393333333333
+21,107,30.353
+21,108,29.591
+21,109,30.0566666666667
+21,110,26.2043333333333
+21,111,27.178
+21,112,30.6493333333333
+21,113,29.21
+21,114,34.8403333333333
+21,115,32.5966666666667
+21,116,31.2843333333333
+21,117,30.9456666666667
+21,118,26.924
+21,119,30.5646666666667
+21,120,26.9663333333333
+21,121,29.7603333333333
+21,122,25.781
+21,123,28.194
+21,124,26.7546666666667
+21,125,31.1996666666667
+21,126,33.528
+21,127,35.2636666666667
+21,128,23.622
+21,129,28.9983333333333
+21,130,34.7133333333333
+21,131,27.432
+21,132,32.0463333333333
+21,133,25.654
+21,134,30.0566666666667
+21,135,25.6116666666667
+21,136,30.3106666666667
+21,137,31.877
+21,138,29.464
+21,139,33.782
+21,140,29.591
+21,141,30.1413333333333
+21,142,27.432
+21,143,23.5373333333333
+21,144,33.6973333333333
+21,145,28.7866666666667
+21,146,26.8393333333333
+21,147,33.7396666666667
+21,148,30.353
+21,149,33.655
+21,150,28.194
+21,151,36.1526666666667
+21,152,36.6183333333333
+21,153,28.321
+21,154,30.0143333333333
+21,155,22.987
+21,156,31.3266666666667
+21,157,28.321
+21,158,25.146
+21,159,24.2146666666667
+21,160,23.7066666666667
+21,161,28.1516666666667
+21,162,31.5383333333333
+21,163,31.1996666666667
+21,164,26.5853333333333
+21,165,29.3793333333333
+21,166,27.686
+21,167,30.9456666666667
+21,168,32.639
+21,169,28.9136666666667
+21,170,35.687
+21,171,34.8403333333333
+21,172,24.4686666666667
+21,173,28.4056666666667
+21,174,26.797
+21,175,31.5806666666667
+21,176,30.9456666666667
+21,177,30.6493333333333
+21,178,27.178
+21,179,27.178
+21,180,26.1196666666667
+21,181,27.2203333333333
+21,182,29.1253333333333
+21,183,33.9936666666667
+21,184,22.479
+21,185,31.2843333333333
+21,186,37.0416666666667
+21,187,32.385
+21,188,29.21
+21,189,24.5533333333333
+21,190,29.6333333333333
+21,191,32.7236666666667
+21,192,25.908
+21,193,29.337
+21,194,27.0086666666667
+21,195,31.877
+21,196,33.9936666666667
+21,197,24.1723333333333
+21,198,36.1526666666667
+21,199,35.814
+21,200,28.956
+21,201,35.2213333333333
+21,202,30.4376666666667
+21,203,23.876
+21,204,29.845
+21,205,20.6586666666667
+21,206,17.9916666666667
+21,207,25.9926666666667
+21,208,29.8026666666667
+21,209,29.21
+21,210,29.972
+21,211,27.178
+21,212,27.94
+21,213,33.6973333333333
+21,214,26.416
+21,215,28.4903333333333
+21,216,28.321
+21,217,26.289
+21,218,28.5326666666667
+21,219,38.6926666666667
+21,220,36.7453333333333
+21,221,32.5966666666667
+21,222,26.7123333333333
+21,223,32.385
+21,224,32.3426666666667
+21,225,27.7706666666667
+21,226,28.5326666666667
+21,227,25.654
+21,228,27.686
+21,229,30.1836666666667
+21,230,36.7876666666667
+21,231,30.607
+21,232,32.9776666666667
+21,233,24.511
+21,234,32.385
+21,235,31.0726666666667
+21,236,28.7866666666667
+21,237,29.083
+21,238,26.0773333333333
+21,239,32.5543333333333
+21,240,29.7603333333333
+21,241,27.178
+21,242,35.1366666666667
+21,243,32.1733333333333
+21,244,26.416
+21,245,28.956
+21,246,25.3153333333333
+21,247,36.4066666666667
+21,248,33.4433333333333
+21,249,32.9776666666667
+21,250,30.607
+21,251,28.5326666666667
+21,252,32.258
+21,253,35.941
+21,254,36.4913333333333
+21,255,25.1883333333333
+21,256,32.3426666666667
+21,257,24.8073333333333
+21,258,23.9606666666667
+21,259,34.544
+21,260,33.0623333333333
+21,261,28.7866666666667
+21,262,28.321
+21,263,34.798
+21,264,22.479
+21,265,25.146
+21,266,29.7603333333333
+21,267,31.623
+21,268,27.305
+21,269,33.6973333333333
+21,270,29.9296666666667
+21,271,30.353
+21,272,31.877
+21,273,22.7753333333333
+21,274,30.4376666666667
+21,275,34.5863333333333
+21,276,22.6906666666667
+21,277,25.9926666666667
+21,278,35.1366666666667
+21,279,28.8713333333333
+21,280,30.988
+21,281,21.6746666666667
+21,282,27.5166666666667
+21,283,29.718
+21,284,31.6653333333333
+21,285,25.2306666666667
+21,286,27.0086666666667
+21,287,30.988
+21,288,34.0783333333333
+21,289,30.1413333333333
+21,290,21.463
+21,291,24.6803333333333
+21,292,29.5063333333333
+21,293,24.638
+21,294,27.051
+21,295,29.3793333333333
+21,296,30.226
+21,297,35.4753333333333
+21,298,30.7763333333333
+21,299,27.559
+21,300,25.4
+21,301,30.3106666666667
+21,302,30.1413333333333
+21,303,31.5806666666667
+21,304,27.7706666666667
+21,305,24.765
+21,306,38.3963333333333
+21,307,27.813
+21,308,34.544
+21,309,33.4433333333333
+21,310,31.7076666666667
+21,311,29.5486666666667
+21,312,29.5063333333333
+21,313,31.623
+21,314,27.686
+21,315,31.242
+21,316,31.115
+21,317,30.2683333333333
+21,318,32.131
+21,319,28.3633333333333
+21,320,28.829
+21,321,33.4856666666667
+21,322,29.5486666666667
+21,323,30.0566666666667
+21,324,28.575
+21,325,28.956
+21,326,22.6906666666667
+21,327,31.1573333333333
+21,328,29.0406666666667
+21,329,23.876
+21,330,33.8666666666667
+21,331,27.559
+21,332,27.5166666666667
+21,333,25.781
+21,334,30.2683333333333
+21,335,26.8816666666667
+21,336,32.0463333333333
+21,337,31.242
+21,338,32.004
+21,339,31.6653333333333
+21,340,26.162
+21,341,30.353
+21,342,26.416
+21,343,24.5533333333333
+21,344,25.5693333333333
+21,345,28.0246666666667
+21,346,33.02
+21,347,26.67
+21,348,28.4903333333333
+21,349,32.1733333333333
+21,350,32.512
+21,351,31.0303333333333
+21,352,31.242
+21,353,32.9353333333333
+21,354,30.353
+21,355,32.0463333333333
+21,356,34.5863333333333
+21,357,27.8553333333333
+21,358,26.289
+21,359,27.2203333333333
+21,360,32.3003333333333
+21,361,30.1413333333333
+21,362,30.9033333333333
+21,363,24.1723333333333
+21,364,35.687
+21,365,28.6173333333333
+21,366,27.0086666666667
+21,367,27.2203333333333
+21,368,26.3736666666667
+21,369,29.8026666666667
+21,370,26.2466666666667
+21,371,23.1563333333333
+21,372,27.305
+21,373,27.1356666666667
+21,374,31.0726666666667
+21,375,31.1573333333333
+21,376,35.2636666666667
+21,377,36.4066666666667
+21,378,29.972
+21,379,27.432
+21,380,29.1676666666667
+21,381,29.8873333333333
+21,382,33.02
+21,383,34.9673333333333
+21,384,34.671
+21,385,29.337
+21,386,25.6963333333333
+21,387,25.3153333333333
+21,388,29.9296666666667
+21,389,30.9033333333333
+21,390,28.3633333333333
+21,391,26.3736666666667
+21,392,21.59
+21,393,33.9936666666667
+21,394,33.3163333333333
+21,395,28.067
+21,396,26.3313333333333
+21,397,28.7443333333333
+21,398,29.6333333333333
+21,399,26.8816666666667
+21,400,28.067
+21,401,24.892
+21,402,31.242
+21,403,29.2946666666667
+21,404,36.703
+21,405,30.1836666666667
+21,406,29.7603333333333
+21,407,30.6916666666667
+21,408,28.2363333333333
+21,409,28.9983333333333
+21,410,28.0246666666667
+21,411,30.861
+21,412,27.0933333333333
+21,413,22.225
+21,414,31.4536666666667
+21,415,38.608
+21,416,33.0623333333333
+21,417,37.3803333333333
+21,418,30.353
+21,419,26.3736666666667
+21,420,27.305
+21,421,26.5006666666667
+21,422,33.02
+21,423,32.3426666666667
+21,424,37.211
+21,425,26.4583333333333
+21,426,29.6333333333333
+21,427,23.876
+21,428,35.0096666666667
+21,429,29.3793333333333
+21,430,24.892
+21,431,36.1526666666667
+21,432,30.9033333333333
+21,433,28.4056666666667
+21,434,27.94
+21,435,34.417
+21,436,33.02
+21,437,28.6596666666667
+21,438,32.512
+21,439,30.48
+21,440,26.9663333333333
+21,441,33.2316666666667
+21,442,30.2683333333333
+21,443,34.7133333333333
+21,444,29.083
+21,445,25.5693333333333
+21,446,28.702
+21,447,30.7763333333333
+21,448,32.2156666666667
+21,449,30.607
+21,450,27.7706666666667
+21,451,36.576
+21,452,28.5326666666667
+21,453,24.511
+21,454,27.4743333333333
+21,455,33.5703333333333
+21,456,24.384
+21,457,37.211
+21,458,28.9983333333333
+21,459,31.1996666666667
+21,460,27.94
+21,461,28.575
+21,462,25.2306666666667
+21,463,23.0716666666667
+21,464,29.2946666666667
+21,465,34.5016666666667
+21,466,31.0726666666667
+21,467,28.702
+21,468,29.718
+21,469,27.8976666666667
+21,470,28.6173333333333
+21,471,23.241
+21,472,27.6013333333333
+21,473,29.0406666666667
+21,474,27.0933333333333
+21,475,30.607
+21,476,36.576
+21,477,33.9513333333333
+21,478,28.1516666666667
+21,479,31.496
+21,480,21.8016666666667
+21,481,29.1253333333333
+21,482,28.9983333333333
+21,483,37.211
+21,484,26.67
+21,485,30.099
+21,486,24.9766666666667
+21,487,38.1
+21,488,32.512
+21,489,36.068
+21,490,28.7443333333333
+21,491,25.273
+21,492,34.417
+21,493,30.8186666666667
+21,494,32.1733333333333
+21,495,25.9926666666667
+21,496,32.004
+21,497,27.559
+21,498,28.448
+21,499,34.6286666666667
+21,500,38.9466666666667
+21,501,29.7603333333333
+21,502,23.368
+21,503,30.353
+21,504,34.036
+21,505,29.718
+21,506,26.797
+21,507,35.7293333333333
+21,508,34.9673333333333
+21,509,26.5853333333333
+21,510,35.0096666666667
+21,511,29.083
+21,512,28.702
+21,513,35.306
+21,514,30.353
+21,515,26.9663333333333
+21,516,27.0086666666667
+21,517,30.607
+21,518,28.7866666666667
+21,519,32.8083333333333
+21,520,31.4536666666667
+21,521,30.0566666666667
+21,522,31.8346666666667
+21,523,23.241
+21,524,32.893
+21,525,29.9296666666667
+21,526,34.7133333333333
+21,527,31.6653333333333
+21,528,29.9296666666667
+21,529,31.242
+21,530,28.7443333333333
+21,531,24.384
+21,532,33.1893333333333
+21,533,33.1046666666667
+21,534,31.9616666666667
+21,535,29.4216666666667
+21,536,35.7293333333333
+21,537,33.4856666666667
+21,538,30.353
+21,539,28.702
+21,540,27.178
+21,541,38.4386666666667
+21,542,27.686
+21,543,31.9193333333333
+21,544,31.115
+21,545,36.6606666666667
+21,546,30.5223333333333
+21,547,30.6916666666667
+21,548,31.75
+21,549,25.8656666666667
+21,550,23.4526666666667
+21,551,30.5646666666667
+21,552,29.083
+21,553,29.591
+21,554,32.766
+21,555,28.194
+21,556,23.749
+21,557,22.4366666666667
+21,558,29.845
+21,559,32.8083333333333
+21,560,25.273
+21,561,25.7386666666667
+21,562,29.591
+21,563,28.321
+21,564,30.9033333333333
+21,565,27.178
+21,566,29.2523333333333
+21,567,26.67
+21,568,35.2636666666667
+21,569,25.3576666666667
+21,570,26.67
+21,571,37.846
+21,572,30.2683333333333
+21,573,30.3953333333333
+21,574,30.1836666666667
+21,575,30.0566666666667
+21,576,34.163
+21,577,27.5166666666667
+21,578,22.3943333333333
+21,579,29.464
+21,580,30.5646666666667
+21,581,30.48
+21,582,34.925
+21,583,29.718
+21,584,29.8026666666667
+21,585,28.9983333333333
+21,586,33.1893333333333
+21,587,24.4263333333333
+21,588,26.7123333333333
+21,589,23.622
+21,590,30.9456666666667
+21,591,35.3906666666667
+21,592,30.1836666666667
+21,593,24.9343333333333
+21,594,25.654
+21,595,33.8243333333333
+21,596,33.1893333333333
+21,597,26.2043333333333
+21,598,30.6916666666667
+21,599,27.178
+21,600,28.702
+21,601,23.368
+21,602,30.7763333333333
+21,603,25.273
+21,604,33.274
+21,605,32.1733333333333
+21,606,26.924
+21,607,28.194
+21,608,23.114
+21,609,28.7866666666667
+21,610,28.7443333333333
+21,611,22.5213333333333
+21,612,28.0246666666667
+21,613,33.401
+21,614,25.019
+21,615,28.7866666666667
+21,616,29.1676666666667
+21,617,26.2043333333333
+21,618,32.893
+21,619,31.496
+21,620,29.5063333333333
+21,621,35.433
+21,622,38.481
+21,623,26.035
+21,624,28.4056666666667
+21,625,27.686
+21,626,31.369
+21,627,31.1573333333333
+21,628,23.7913333333333
+21,629,30.226
+21,630,31.877
+21,631,31.8346666666667
+21,632,28.067
+21,633,31.7923333333333
+21,634,31.7923333333333
+21,635,27.9823333333333
+21,636,23.4103333333333
+21,637,33.6126666666667
+21,638,27.1356666666667
+21,639,31.6653333333333
+21,640,23.5796666666667
+21,641,29.2523333333333
+21,642,25.781
+21,643,29.464
+21,644,30.1413333333333
+21,645,35.7716666666667
+21,646,28.3633333333333
+21,647,36.576
+21,648,34.417
+21,649,30.4376666666667
+21,650,32.131
+21,651,34.0783333333333
+21,652,32.5543333333333
+21,653,31.242
+21,654,29.3793333333333
+21,655,31.2843333333333
+21,656,25.3576666666667
+21,657,36.83
+21,658,28.7866666666667
+21,659,32.8083333333333
+21,660,28.6173333333333
+21,661,25.1036666666667
+21,662,32.2156666666667
+21,663,31.7923333333333
+21,664,33.782
+21,665,33.655
+21,666,21.2513333333333
+21,667,31.1996666666667
+21,668,26.924
+21,669,29.464
+21,670,27.3473333333333
+21,671,33.655
+21,672,24.6803333333333
+21,673,34.7556666666667
+21,674,26.416
+21,675,26.1196666666667
+21,676,27.686
+21,677,26.416
+21,678,35.052
+21,679,30.5646666666667
+21,680,25.9926666666667
+21,681,31.369
+21,682,26.543
+21,683,30.6493333333333
+21,684,34.798
+21,685,33.0623333333333
+21,686,30.7763333333333
+21,687,34.4593333333333
+21,688,32.6813333333333
+21,689,29.6333333333333
+21,690,32.0886666666667
+21,691,32.131
+21,692,30.734
+21,693,38.6926666666667
+21,694,25.9926666666667
+21,695,26.2466666666667
+21,696,26.416
+21,697,25.781
+21,698,28.194
+21,699,31.4536666666667
+21,700,31.8346666666667
+21,701,35.9833333333333
+21,702,27.178
+21,703,29.464
+21,704,25.1036666666667
+21,705,30.988
+21,706,31.496
+21,707,28.956
+21,708,28.8713333333333
+21,709,25.9926666666667
+21,710,28.956
+21,711,40.0473333333333
+21,712,25.527
+21,713,28.7443333333333
+21,714,34.9673333333333
+21,715,29.0406666666667
+21,716,26.416
+21,717,30.861
+21,718,29.9296666666667
+21,719,33.1893333333333
+21,720,33.655
+21,721,23.0716666666667
+21,722,29.0406666666667
+21,723,25.4
+21,724,32.639
+21,725,30.1836666666667
+21,726,25.019
+21,727,32.0886666666667
+21,728,30.0143333333333
+21,729,27.0933333333333
+21,730,30.8186666666667
+21,731,28.194
+21,732,33.0623333333333
+21,733,30.607
+21,734,30.1413333333333
+21,735,31.9193333333333
+21,736,35.6023333333333
+21,737,29.8873333333333
+21,738,28.6173333333333
+21,739,26.2466666666667
+21,740,27.559
+21,741,30.3953333333333
+21,742,31.115
+21,743,26.8816666666667
+21,744,32.3426666666667
+21,745,28.2786666666667
+21,746,35.5176666666667
+21,747,30.6916666666667
+21,748,30.861
+21,749,31.7076666666667
+21,750,25.9926666666667
+21,751,29.464
+21,752,26.2466666666667
+21,753,32.9353333333333
+21,754,25.6116666666667
+21,755,31.877
+21,756,32.258
+21,757,26.0773333333333
+21,758,28.7866666666667
+21,759,29.2946666666667
+21,760,25.8233333333333
+21,761,41.8253333333333
+21,762,30.6493333333333
+21,763,37.6343333333333
+21,764,28.702
+21,765,36.3643333333333
+21,766,27.686
+21,767,23.749
+21,768,33.1893333333333
+21,769,26.3736666666667
+21,770,31.75
+21,771,33.6126666666667
+21,772,34.036
+21,773,37.1686666666667
+21,774,31.7076666666667
+21,775,29.6333333333333
+21,776,28.4056666666667
+21,777,32.0886666666667
+21,778,34.1206666666667
+21,779,31.115
+21,780,28.8713333333333
+21,781,22.606
+21,782,32.4273333333333
+21,783,29.337
+21,784,25.2306666666667
+21,785,27.686
+21,786,27.8976666666667
+21,787,37.973
+21,788,34.6286666666667
+21,789,32.2156666666667
+21,790,35.2636666666667
+21,791,27.813
+21,792,32.4696666666667
+21,793,29.2523333333333
+21,794,32.4273333333333
+21,795,28.7443333333333
+21,796,25.019
+21,797,33.909
+21,798,28.194
+21,799,27.8976666666667
+21,800,33.528
+21,801,24.5533333333333
+21,802,30.4376666666667
+21,803,35.9833333333333
+21,804,28.9983333333333
+21,805,26.416
+21,806,33.6973333333333
+21,807,27.0086666666667
+21,808,39.7086666666667
+21,809,23.5796666666667
+21,810,28.448
+21,811,30.861
+21,812,26.5006666666667
+21,813,25.8656666666667
+21,814,30.861
+21,815,25.019
+21,816,31.2843333333333
+21,817,31.4536666666667
+21,818,30.0143333333333
+21,819,34.29
+21,820,22.6483333333333
+21,821,29.3793333333333
+21,822,29.2523333333333
+21,823,23.0716666666667
+21,824,35.56
+21,825,31.1573333333333
+21,826,35.2636666666667
+21,827,29.8026666666667
+21,828,23.8336666666667
+21,829,31.9616666666667
+21,830,28.1093333333333
+21,831,30.1413333333333
+21,832,34.8403333333333
+21,833,33.909
+21,834,30.861
+21,835,32.4273333333333
+21,836,29.4216666666667
+21,837,24.1723333333333
+21,838,33.6126666666667
+21,839,27.94
+21,840,31.9193333333333
+21,841,33.401
+21,842,26.0773333333333
+21,843,33.782
+21,844,28.0246666666667
+21,845,24.892
+21,846,23.6643333333333
+21,847,25.6963333333333
+21,848,26.67
+21,849,29.972
+21,850,39.3276666666667
+21,851,32.385
+21,852,27.0933333333333
+21,853,26.543
+21,854,22.479
+21,855,32.8083333333333
+21,856,27.3473333333333
+21,857,27.4743333333333
+21,858,31.0726666666667
+21,859,26.797
+21,860,25.908
+21,861,32.131
+21,862,33.1046666666667
+21,863,26.5853333333333
+21,864,25.527
+21,865,31.9616666666667
+21,866,29.4216666666667
+21,867,32.1733333333333
+21,868,32.385
+21,869,28.067
+21,870,33.782
+21,871,28.702
+21,872,32.0463333333333
+21,873,31.4536666666667
+21,874,31.9193333333333
+21,875,31.1573333333333
+21,876,23.9183333333333
+21,877,28.6173333333333
+21,878,31.115
+21,879,24.2146666666667
+21,880,28.9136666666667
+21,881,27.6013333333333
+21,882,33.0623333333333
+21,883,31.9616666666667
+21,884,36.4913333333333
+21,885,31.3266666666667
+21,886,27.813
+21,887,33.8666666666667
+21,888,33.9513333333333
+21,889,34.4593333333333
+21,890,28.956
+21,891,31.877
+21,892,25.6963333333333
+21,893,28.8713333333333
+21,894,28.702
+21,895,28.575
+21,896,29.3793333333333
+21,897,25.6116666666667
+21,898,34.0783333333333
+21,899,30.988
+21,900,27.432
+21,901,25.6116666666667
+21,902,26.67
+21,903,29.464
+21,904,26.1196666666667
+21,905,30.099
+21,906,30.48
+21,907,26.3313333333333
+21,908,29.6333333333333
+21,909,25.781
+21,910,27.2203333333333
+21,911,29.2523333333333
+21,912,30.7763333333333
+21,913,28.067
+21,914,33.655
+21,915,37.4226666666667
+21,916,28.067
+21,917,24.3416666666667
+21,918,31.115
+21,919,23.9606666666667
+21,920,25.654
+21,921,23.3256666666667
+21,922,30.226
+21,923,30.9033333333333
+21,924,35.2636666666667
+21,925,24.7226666666667
+21,926,34.2053333333333
+21,927,29.8026666666667
+21,928,30.353
+21,929,34.8826666666667
+21,930,27.686
+21,931,32.2156666666667
+21,932,27.7283333333333
+21,933,30.1413333333333
+21,934,31.623
+21,935,27.178
+21,936,23.241
+21,937,32.131
+21,938,29.6333333333333
+21,939,28.702
+21,940,26.8816666666667
+21,941,34.544
+21,942,32.131
+21,943,28.321
+21,944,29.1253333333333
+21,945,33.6973333333333
+21,946,31.4113333333333
+21,947,23.5796666666667
+21,948,30.861
+21,949,22.4366666666667
+21,950,28.194
+21,951,30.734
+21,952,25.9503333333333
+21,953,24.2146666666667
+21,954,23.5373333333333
+21,955,30.607
+21,956,22.987
+21,957,26.035
+21,958,28.6173333333333
+21,959,23.9606666666667
+21,960,27.7283333333333
+21,961,28.194
+21,962,30.0566666666667
+21,963,28.829
+21,964,28.6596666666667
+21,965,27.6436666666667
+21,966,33.7396666666667
+21,967,35.941
+21,968,25.4846666666667
+21,969,20.4046666666667
+21,970,36.322
+21,971,31.1996666666667
+21,972,34.2053333333333
+21,973,26.797
+21,974,26.6276666666667
+21,975,31.0726666666667
+21,976,32.639
+21,977,32.5966666666667
+21,978,34.798
+21,979,26.035
+21,980,26.8393333333333
+21,981,26.7123333333333
+21,982,22.225
+21,983,31.5383333333333
+21,984,29.5486666666667
+21,985,32.9353333333333
+21,986,28.1093333333333
+21,987,33.9513333333333
+21,988,29.5063333333333
+21,989,36.7876666666667
+21,990,29.0406666666667
+21,991,28.321
+21,992,35.3483333333333
+21,993,32.385
+21,994,29.083
+21,995,32.004
+21,996,30.353
+21,997,30.099
+21,998,30.353
+21,999,20.066
+21,1000,31.7076666666667
+22,1,28.8713333333333
+22,2,23.7066666666667
+22,3,24.8073333333333
+22,4,31.496
+22,5,26.289
+22,6,24.0453333333333
+22,7,19.431
+22,8,25.1883333333333
+22,9,18.8383333333333
+22,10,23.0293333333333
+22,11,27.305
+22,12,25.019
+22,13,24.511
+22,14,26.7546666666667
+22,15,26.289
+22,16,24.7226666666667
+22,17,28.575
+22,18,23.1563333333333
+22,19,24.2993333333333
+22,20,32.4696666666667
+22,21,26.7123333333333
+22,22,29.083
+22,23,22.8176666666667
+22,24,28.4903333333333
+22,25,24.384
+22,26,23.114
+22,27,30.1413333333333
+22,28,27.0086666666667
+22,29,25.527
+22,30,29.0406666666667
+22,31,23.368
+22,32,23.7913333333333
+22,33,27.178
+22,34,18.796
+22,35,27.3473333333333
+22,36,23.4103333333333
+22,37,29.2946666666667
+22,38,16.0866666666667
+22,39,25.7386666666667
+22,40,25.8656666666667
+22,41,25.9503333333333
+22,42,24.7226666666667
+22,43,24.638
+22,44,24.765
+22,45,24.8496666666667
+22,46,20.7433333333333
+22,47,18.3726666666667
+22,48,18.4573333333333
+22,49,21.5053333333333
+22,50,27.6436666666667
+22,51,20.574
+22,52,20.3623333333333
+22,53,20.0236666666667
+22,54,28.8713333333333
+22,55,19.8966666666667
+22,56,28.2363333333333
+22,57,27.051
+22,58,21.971
+22,59,18.7536666666667
+22,60,22.2673333333333
+22,61,23.5373333333333
+22,62,23.4526666666667
+22,63,22.5213333333333
+22,64,24.257
+22,65,23.876
+22,66,21.4206666666667
+22,67,28.1516666666667
+22,68,22.606
+22,69,19.3886666666667
+22,70,25.0613333333333
+22,71,20.574
+22,72,24.5533333333333
+22,73,24.7226666666667
+22,74,22.9023333333333
+22,75,18.2033333333333
+22,76,28.956
+22,77,32.004
+22,78,21.1666666666667
+22,79,22.352
+22,80,28.194
+22,81,22.479
+22,82,19.4733333333333
+22,83,22.098
+22,84,25.1883333333333
+22,85,26.7123333333333
+22,86,26.162
+22,87,26.035
+22,88,22.098
+22,89,31.4113333333333
+22,90,21.5053333333333
+22,91,26.67
+22,92,21.082
+22,93,27.6013333333333
+22,94,28.194
+22,95,24.003
+22,96,21.6323333333333
+22,97,30.988
+22,98,23.876
+22,99,25.908
+22,100,22.1826666666667
+22,101,25.2306666666667
+22,102,24.3416666666667
+22,103,16.764
+22,104,23.749
+22,105,23.0293333333333
+22,106,20.6163333333333
+22,107,23.1563333333333
+22,108,23.5373333333333
+22,109,24.765
+22,110,22.3943333333333
+22,111,22.0133333333333
+22,112,22.987
+22,113,21.209
+22,114,23.4526666666667
+22,115,22.5213333333333
+22,116,21.5476666666667
+22,117,24.003
+22,118,27.1356666666667
+22,119,24.8073333333333
+22,120,25.4
+22,121,23.0716666666667
+22,122,21.336
+22,123,21.0396666666667
+22,124,20.447
+22,125,24.003
+22,126,22.3096666666667
+22,127,23.495
+22,128,24.6803333333333
+22,129,25.527
+22,130,22.0133333333333
+22,131,21.6323333333333
+22,132,24.8496666666667
+22,133,24.9343333333333
+22,134,22.6906666666667
+22,135,26.7546666666667
+22,136,23.7913333333333
+22,137,21.1243333333333
+22,138,28.067
+22,139,16.383
+22,140,25.6116666666667
+22,141,24.257
+22,142,19.3886666666667
+22,143,24.003
+22,144,19.9813333333333
+22,145,24.5956666666667
+22,146,18.0763333333333
+22,147,25.7386666666667
+22,148,23.4103333333333
+22,149,22.5213333333333
+22,150,25.0613333333333
+22,151,25.527
+22,152,25.4423333333333
+22,153,24.5956666666667
+22,154,26.797
+22,155,25.9503333333333
+22,156,21.3783333333333
+22,157,21.5053333333333
+22,158,21.8863333333333
+22,159,18.542
+22,160,25.146
+22,161,21.463
+22,162,20.7433333333333
+22,163,21.082
+22,164,17.018
+22,165,24.1723333333333
+22,166,24.4686666666667
+22,167,22.8176666666667
+22,168,29.7603333333333
+22,169,22.0133333333333
+22,170,22.733
+22,171,24.0876666666667
+22,172,25.908
+22,173,20.828
+22,174,20.9973333333333
+22,175,24.7226666666667
+22,176,28.829
+22,177,19.2193333333333
+22,178,25.3153333333333
+22,179,17.399
+22,180,26.5853333333333
+22,181,26.2466666666667
+22,182,30.9033333333333
+22,183,20.701
+22,184,22.225
+22,185,23.114
+22,186,25.4
+22,187,18.8383333333333
+22,188,20.193
+22,189,27.813
+22,190,18.8383333333333
+22,191,20.701
+22,192,24.6803333333333
+22,193,27.6436666666667
+22,194,23.0293333333333
+22,195,21.5053333333333
+22,196,23.9183333333333
+22,197,23.4103333333333
+22,198,24.003
+22,199,22.733
+22,200,24.765
+22,201,27.2203333333333
+22,202,29.1676666666667
+22,203,24.13
+22,204,21.844
+22,205,19.05
+22,206,19.1346666666667
+22,207,22.7753333333333
+22,208,23.0293333333333
+22,209,21.1666666666667
+22,210,24.4263333333333
+22,211,20.6586666666667
+22,212,20.3623333333333
+22,213,24.8496666666667
+22,214,22.5636666666667
+22,215,25.019
+22,216,22.733
+22,217,18.7113333333333
+22,218,27.3896666666667
+22,219,25.527
+22,220,24.0453333333333
+22,221,25.654
+22,222,28.1516666666667
+22,223,19.0923333333333
+22,224,20.1506666666667
+22,225,22.4366666666667
+22,226,24.9766666666667
+22,227,26.2043333333333
+22,228,26.0773333333333
+22,229,19.5156666666667
+22,230,28.829
+22,231,24.5956666666667
+22,232,25.781
+22,233,25.273
+22,234,25.6116666666667
+22,235,21.7593333333333
+22,236,26.4583333333333
+22,237,28.6173333333333
+22,238,28.8713333333333
+22,239,27.3473333333333
+22,240,25.146
+22,241,22.987
+22,242,29.8873333333333
+22,243,19.7696666666667
+22,244,24.257
+22,245,23.4103333333333
+22,246,22.2673333333333
+22,247,27.3896666666667
+22,248,23.0293333333333
+22,249,18.4573333333333
+22,250,27.0086666666667
+22,251,22.987
+22,252,24.9343333333333
+22,253,23.1986666666667
+22,254,27.3896666666667
+22,255,21.082
+22,256,22.4366666666667
+22,257,27.432
+22,258,24.4686666666667
+22,259,23.2833333333333
+22,260,25.2306666666667
+22,261,29.718
+22,262,29.21
+22,263,21.3783333333333
+22,264,20.6586666666667
+22,265,28.3633333333333
+22,266,21.463
+22,267,18.7536666666667
+22,268,25.6116666666667
+22,269,27.0933333333333
+22,270,19.0076666666667
+22,271,20.4893333333333
+22,272,23.368
+22,273,23.1563333333333
+22,274,27.178
+22,275,22.4366666666667
+22,276,23.876
+22,277,22.6483333333333
+22,278,22.3943333333333
+22,279,24.1723333333333
+22,280,22.352
+22,281,30.5646666666667
+22,282,28.9136666666667
+22,283,20.9126666666667
+22,284,26.543
+22,285,21.2936666666667
+22,286,19.9813333333333
+22,287,21.8863333333333
+22,288,25.6963333333333
+22,289,26.416
+22,290,23.241
+22,291,18.161
+22,292,25.6963333333333
+22,293,20.1506666666667
+22,294,28.321
+22,295,21.463
+22,296,23.0716666666667
+22,297,22.733
+22,298,23.5373333333333
+22,299,21.5476666666667
+22,300,22.2673333333333
+22,301,21.336
+22,302,24.892
+22,303,18.7113333333333
+22,304,26.3736666666667
+22,305,26.289
+22,306,21.2936666666667
+22,307,22.3096666666667
+22,308,27.559
+22,309,25.5693333333333
+22,310,20.7433333333333
+22,311,27.7706666666667
+22,312,18.796
+22,313,23.495
+22,314,23.9606666666667
+22,315,23.1563333333333
+22,316,20.6586666666667
+22,317,21.463
+22,318,31.623
+22,319,22.479
+22,320,23.1986666666667
+22,321,22.1826666666667
+22,322,24.2146666666667
+22,323,26.7546666666667
+22,324,23.8336666666667
+22,325,21.59
+22,326,24.1723333333333
+22,327,27.6436666666667
+22,328,29.845
+22,329,24.7226666666667
+22,330,28.448
+22,331,22.0556666666667
+22,332,23.9183333333333
+22,333,24.892
+22,334,19.939
+22,335,20.8703333333333
+22,336,19.2616666666667
+22,337,22.5213333333333
+22,338,28.5326666666667
+22,339,21.717
+22,340,20.066
+22,341,25.5693333333333
+22,342,23.749
+22,343,28.575
+22,344,20.9973333333333
+22,345,25.0613333333333
+22,346,16.4253333333333
+22,347,23.1986666666667
+22,348,23.7913333333333
+22,349,19.05
+22,350,27.2203333333333
+22,351,27.94
+22,352,22.7753333333333
+22,353,23.9183333333333
+22,354,31.0303333333333
+22,355,28.0246666666667
+22,356,24.13
+22,357,29.718
+22,358,24.892
+22,359,22.987
+22,360,25.1883333333333
+22,361,25.654
+22,362,23.7066666666667
+22,363,23.2833333333333
+22,364,25.6116666666667
+22,365,20.066
+22,366,26.289
+22,367,29.1676666666667
+22,368,25.1036666666667
+22,369,20.447
+22,370,22.0133333333333
+22,371,22.5636666666667
+22,372,20.2776666666667
+22,373,23.622
+22,374,19.7273333333333
+22,375,26.2466666666667
+22,376,23.0716666666667
+22,377,20.9126666666667
+22,378,19.8966666666667
+22,379,28.4903333333333
+22,380,28.575
+22,381,20.9126666666667
+22,382,22.7753333333333
+22,383,23.495
+22,384,25.8233333333333
+22,385,29.845
+22,386,28.448
+22,387,26.3313333333333
+22,388,24.2993333333333
+22,389,20.3623333333333
+22,390,23.3256666666667
+22,391,24.4263333333333
+22,392,26.2466666666667
+22,393,18.923
+22,394,25.019
+22,395,20.955
+22,396,25.1036666666667
+22,397,26.924
+22,398,22.225
+22,399,29.4216666666667
+22,400,25.3153333333333
+22,401,20.8703333333333
+22,402,27.813
+22,403,26.3313333333333
+22,404,27.0086666666667
+22,405,20.447
+22,406,28.0246666666667
+22,407,21.844
+22,408,21.8016666666667
+22,409,28.2363333333333
+22,410,27.3473333333333
+22,411,22.0133333333333
+22,412,23.3256666666667
+22,413,23.8336666666667
+22,414,21.2513333333333
+22,415,23.0716666666667
+22,416,23.4103333333333
+22,417,18.669
+22,418,28.448
+22,419,28.067
+22,420,24.5533333333333
+22,421,22.2673333333333
+22,422,20.7433333333333
+22,423,24.9766666666667
+22,424,23.622
+22,425,30.1413333333333
+22,426,26.0773333333333
+22,427,20.447
+22,428,25.527
+22,429,19.177
+22,430,26.8393333333333
+22,431,22.3943333333333
+22,432,26.6276666666667
+22,433,26.416
+22,434,24.765
+22,435,20.574
+22,436,27.686
+22,437,19.05
+22,438,24.3416666666667
+22,439,21.59
+22,440,20.447
+22,441,24.511
+22,442,23.8336666666667
+22,443,26.3313333333333
+22,444,25.6963333333333
+22,445,18.4573333333333
+22,446,24.4686666666667
+22,447,22.0556666666667
+22,448,19.7273333333333
+22,449,24.9766666666667
+22,450,29.8026666666667
+22,451,27.7283333333333
+22,452,24.765
+22,453,25.4423333333333
+22,454,18.1186666666667
+22,455,23.4526666666667
+22,456,21.4206666666667
+22,457,25.1883333333333
+22,458,27.0933333333333
+22,459,21.2513333333333
+22,460,26.162
+22,461,22.352
+22,462,22.0133333333333
+22,463,18.415
+22,464,33.274
+22,465,22.606
+22,466,24.0453333333333
+22,467,23.8336666666667
+22,468,27.3896666666667
+22,469,22.8176666666667
+22,470,22.7753333333333
+22,471,21.971
+22,472,24.9343333333333
+22,473,29.1253333333333
+22,474,22.8176666666667
+22,475,21.3783333333333
+22,476,20.9973333333333
+22,477,24.892
+22,478,21.1666666666667
+22,479,24.1723333333333
+22,480,22.1826666666667
+22,481,27.2626666666667
+22,482,24.892
+22,483,26.2466666666667
+22,484,23.7066666666667
+22,485,25.4423333333333
+22,486,23.6643333333333
+22,487,25.9503333333333
+22,488,20.3623333333333
+22,489,24.892
+22,490,27.3473333333333
+22,491,19.939
+22,492,25.654
+22,493,21.1666666666667
+22,494,24.638
+22,495,19.3886666666667
+22,496,27.178
+22,497,18.796
+22,498,20.193
+22,499,16.9756666666667
+22,500,24.7226666666667
+22,501,25.9926666666667
+22,502,23.7066666666667
+22,503,25.9926666666667
+22,504,25.8656666666667
+22,505,28.194
+22,506,26.3736666666667
+22,507,27.0086666666667
+22,508,21.2513333333333
+22,509,20.9126666666667
+22,510,27.7706666666667
+22,511,27.0933333333333
+22,512,24.9343333333333
+22,513,22.733
+22,514,30.734
+22,515,27.3473333333333
+22,516,20.066
+22,517,19.939
+22,518,17.9493333333333
+22,519,23.1563333333333
+22,520,27.305
+22,521,26.7123333333333
+22,522,23.5373333333333
+22,523,21.463
+22,524,23.4526666666667
+22,525,24.5533333333333
+22,526,22.0133333333333
+22,527,29.972
+22,528,28.2363333333333
+22,529,25.3153333333333
+22,530,22.1403333333333
+22,531,27.559
+22,532,24.9766666666667
+22,533,23.114
+22,534,29.3793333333333
+22,535,20.574
+22,536,22.5213333333333
+22,537,25.273
+22,538,26.8393333333333
+22,539,22.479
+22,540,19.05
+22,541,25.781
+22,542,24.2993333333333
+22,543,24.3416666666667
+22,544,23.7066666666667
+22,545,24.4686666666667
+22,546,22.2673333333333
+22,547,26.2466666666667
+22,548,17.3566666666667
+22,549,24.0453333333333
+22,550,25.908
+22,551,22.733
+22,552,17.3143333333333
+22,553,22.606
+22,554,20.574
+22,555,26.67
+22,556,23.6643333333333
+22,557,20.9973333333333
+22,558,22.098
+22,559,25.4423333333333
+22,560,20.447
+22,561,24.6803333333333
+22,562,19.6426666666667
+22,563,23.241
+22,564,21.5476666666667
+22,565,24.1723333333333
+22,566,27.7283333333333
+22,567,23.7913333333333
+22,568,23.749
+22,569,26.4583333333333
+22,570,21.717
+22,571,25.7386666666667
+22,572,23.622
+22,573,24.892
+22,574,21.7593333333333
+22,575,24.2993333333333
+22,576,25.273
+22,577,22.7753333333333
+22,578,19.685
+22,579,26.9663333333333
+22,580,28.9983333333333
+22,581,23.1986666666667
+22,582,20.7856666666667
+22,583,20.2776666666667
+22,584,27.0086666666667
+22,585,20.1506666666667
+22,586,22.098
+22,587,24.4263333333333
+22,588,20.4893333333333
+22,589,20.5316666666667
+22,590,22.5636666666667
+22,591,21.3783333333333
+22,592,21.2513333333333
+22,593,24.257
+22,594,24.2146666666667
+22,595,23.9183333333333
+22,596,27.813
+22,597,24.8073333333333
+22,598,24.9343333333333
+22,599,23.6643333333333
+22,600,22.9023333333333
+22,601,22.1403333333333
+22,602,27.051
+22,603,17.526
+22,604,22.0556666666667
+22,605,20.7433333333333
+22,606,23.4526666666667
+22,607,30.1836666666667
+22,608,26.8816666666667
+22,609,26.1196666666667
+22,610,21.2513333333333
+22,611,21.463
+22,612,26.924
+22,613,20.7856666666667
+22,614,22.5636666666667
+22,615,29.337
+22,616,18.3303333333333
+22,617,24.8496666666667
+22,618,21.8863333333333
+22,619,24.0453333333333
+22,620,22.7753333333333
+22,621,28.2363333333333
+22,622,23.241
+22,623,23.3256666666667
+22,624,25.4423333333333
+22,625,24.638
+22,626,26.2466666666667
+22,627,23.0716666666667
+22,628,21.971
+22,629,28.448
+22,630,19.685
+22,631,24.638
+22,632,24.6803333333333
+22,633,22.8176666666667
+22,634,26.9663333333333
+22,635,25.4
+22,636,25.4
+22,637,20.4046666666667
+22,638,18.9653333333333
+22,639,22.86
+22,640,21.844
+22,641,28.194
+22,642,18.923
+22,643,25.9926666666667
+22,644,24.003
+22,645,22.2673333333333
+22,646,23.6643333333333
+22,647,25.0613333333333
+22,648,25.6963333333333
+22,649,28.2786666666667
+22,650,22.6483333333333
+22,651,22.7753333333333
+22,652,22.2673333333333
+22,653,26.797
+22,654,27.6436666666667
+22,655,22.606
+22,656,25.9503333333333
+22,657,22.606
+22,658,20.0236666666667
+22,659,26.1196666666667
+22,660,27.178
+22,661,30.099
+22,662,29.464
+22,663,21.844
+22,664,22.3096666666667
+22,665,23.495
+22,666,23.495
+22,667,23.622
+22,668,26.8393333333333
+22,669,24.8073333333333
+22,670,23.749
+22,671,27.5166666666667
+22,672,17.3566666666667
+22,673,22.86
+22,674,26.924
+22,675,20.066
+22,676,25.7386666666667
+22,677,23.749
+22,678,24.892
+22,679,30.1413333333333
+22,680,22.098
+22,681,21.844
+22,682,17.526
+22,683,30.48
+22,684,28.1093333333333
+22,685,24.13
+22,686,22.987
+22,687,23.0716666666667
+22,688,18.2456666666667
+22,689,21.6323333333333
+22,690,27.7283333333333
+22,691,25.146
+22,692,21.1243333333333
+22,693,22.2673333333333
+22,694,24.638
+22,695,28.5326666666667
+22,696,22.3943333333333
+22,697,25.781
+22,698,28.9136666666667
+22,699,28.067
+22,700,25.0613333333333
+22,701,22.9023333333333
+22,702,23.0293333333333
+22,703,23.8336666666667
+22,704,28.956
+22,705,26.289
+22,706,21.971
+22,707,20.5316666666667
+22,708,24.892
+22,709,21.2513333333333
+22,710,21.463
+22,711,23.622
+22,712,25.146
+22,713,30.4376666666667
+22,714,25.527
+22,715,21.6746666666667
+22,716,22.1826666666667
+22,717,27.1356666666667
+22,718,19.3886666666667
+22,719,25.8656666666667
+22,720,23.9606666666667
+22,721,25.146
+22,722,25.273
+22,723,25.9503333333333
+22,724,20.6586666666667
+22,725,26.924
+22,726,25.3576666666667
+22,727,25.0613333333333
+22,728,20.5316666666667
+22,729,20.1506666666667
+22,730,27.051
+22,731,27.178
+22,732,21.5476666666667
+22,733,22.225
+22,734,23.7913333333333
+22,735,25.4
+22,736,26.162
+22,737,22.3096666666667
+22,738,28.9983333333333
+22,739,20.7856666666667
+22,740,18.796
+22,741,21.2513333333333
+22,742,28.6596666666667
+22,743,27.7706666666667
+22,744,23.4526666666667
+22,745,24.4686666666667
+22,746,21.717
+22,747,23.368
+22,748,21.1243333333333
+22,749,22.6483333333333
+22,750,23.5796666666667
+22,751,27.8553333333333
+22,752,23.6643333333333
+22,753,21.0396666666667
+22,754,26.035
+22,755,24.5533333333333
+22,756,16.4253333333333
+22,757,25.019
+22,758,19.812
+22,759,26.924
+22,760,23.4526666666667
+22,761,23.876
+22,762,25.1883333333333
+22,763,22.352
+22,764,21.971
+22,765,22.2673333333333
+22,766,22.3943333333333
+22,767,21.9286666666667
+22,768,26.797
+22,769,22.0556666666667
+22,770,20.0236666666667
+22,771,27.5166666666667
+22,772,21.3783333333333
+22,773,25.9503333333333
+22,774,22.6906666666667
+22,775,18.542
+22,776,27.4743333333333
+22,777,25.654
+22,778,24.0453333333333
+22,779,21.8016666666667
+22,780,29.3793333333333
+22,781,25.527
+22,782,27.305
+22,783,20.32
+22,784,19.3463333333333
+22,785,29.6333333333333
+22,786,21.3783333333333
+22,787,24.6803333333333
+22,788,24.5956666666667
+22,789,27.8553333333333
+22,790,21.8016666666667
+22,791,23.0716666666667
+22,792,23.5373333333333
+22,793,23.1986666666667
+22,794,22.2673333333333
+22,795,27.4743333333333
+22,796,24.638
+22,797,25.4
+22,798,25.4423333333333
+22,799,29.591
+22,800,19.7273333333333
+22,801,25.273
+22,802,23.4526666666667
+22,803,27.8553333333333
+22,804,25.908
+22,805,21.844
+22,806,19.7273333333333
+22,807,23.114
+22,808,23.4526666666667
+22,809,25.6963333333333
+22,810,23.9606666666667
+22,811,25.6963333333333
+22,812,24.384
+22,813,23.1986666666667
+22,814,20.574
+22,815,24.8073333333333
+22,816,20.701
+22,817,24.638
+22,818,21.2513333333333
+22,819,20.0236666666667
+22,820,23.6643333333333
+22,821,27.432
+22,822,21.8016666666667
+22,823,20.574
+22,824,25.8656666666667
+22,825,20.447
+22,826,23.6643333333333
+22,827,27.6436666666667
+22,828,27.3896666666667
+22,829,20.8703333333333
+22,830,23.4526666666667
+22,831,20.828
+22,832,29.083
+22,833,17.018
+22,834,23.3256666666667
+22,835,25.9503333333333
+22,836,23.4526666666667
+22,837,20.955
+22,838,24.0876666666667
+22,839,23.7913333333333
+22,840,22.86
+22,841,25.654
+22,842,24.765
+22,843,22.7753333333333
+22,844,23.368
+22,845,23.7066666666667
+22,846,31.7923333333333
+22,847,24.8073333333333
+22,848,24.2993333333333
+22,849,24.0876666666667
+22,850,24.5533333333333
+22,851,21.209
+22,852,20.9973333333333
+22,853,18.669
+22,854,21.2513333333333
+22,855,21.3783333333333
+22,856,28.956
+22,857,25.3576666666667
+22,858,28.8713333333333
+22,859,26.162
+22,860,24.638
+22,861,23.3256666666667
+22,862,22.225
+22,863,22.352
+22,864,23.2833333333333
+22,865,22.5636666666667
+22,866,24.13
+22,867,25.0613333333333
+22,868,24.2146666666667
+22,869,26.289
+22,870,20.9126666666667
+22,871,24.4686666666667
+22,872,22.5636666666667
+22,873,22.0133333333333
+22,874,27.051
+22,875,25.7386666666667
+22,876,27.305
+22,877,23.0293333333333
+22,878,30.4376666666667
+22,879,25.146
+22,880,27.0933333333333
+22,881,20.4046666666667
+22,882,27.1356666666667
+22,883,21.971
+22,884,24.7226666666667
+22,885,27.178
+22,886,23.9606666666667
+22,887,19.685
+22,888,24.384
+22,889,28.9136666666667
+22,890,24.9766666666667
+22,891,23.7066666666667
+22,892,20.193
+22,893,25.1036666666667
+22,894,25.4
+22,895,30.0143333333333
+22,896,29.21
+22,897,24.2993333333333
+22,898,24.8073333333333
+22,899,24.003
+22,900,17.8223333333333
+22,901,23.114
+22,902,28.4056666666667
+22,903,22.1403333333333
+22,904,16.2983333333333
+22,905,26.9663333333333
+22,906,19.431
+22,907,33.909
+22,908,24.892
+22,909,24.4686666666667
+22,910,22.9446666666667
+22,911,20.955
+22,912,22.479
+22,913,27.5166666666667
+22,914,24.6803333333333
+22,915,22.9446666666667
+22,916,22.1403333333333
+22,917,20.4046666666667
+22,918,20.574
+22,919,20.4893333333333
+22,920,27.9823333333333
+22,921,23.4103333333333
+22,922,25.654
+22,923,24.003
+22,924,28.2786666666667
+22,925,22.6906666666667
+22,926,28.829
+22,927,25.6963333333333
+22,928,25.908
+22,929,20.5316666666667
+22,930,20.955
+22,931,21.0396666666667
+22,932,16.9756666666667
+22,933,25.4846666666667
+22,934,23.7066666666667
+22,935,28.829
+22,936,20.955
+22,937,25.4846666666667
+22,938,21.9286666666667
+22,939,21.5476666666667
+22,940,21.971
+22,941,24.003
+22,942,19.8543333333333
+22,943,25.1883333333333
+22,944,24.892
+22,945,24.003
+22,946,24.384
+22,947,25.781
+22,948,26.797
+22,949,18.288
+22,950,22.1403333333333
+22,951,21.971
+22,952,21.2936666666667
+22,953,24.2146666666667
+22,954,24.2146666666667
+22,955,26.8816666666667
+22,956,26.1196666666667
+22,957,29.7603333333333
+22,958,22.1403333333333
+22,959,22.3096666666667
+22,960,26.543
+22,961,28.448
+22,962,27.432
+22,963,24.511
+22,964,26.4583333333333
+22,965,23.2833333333333
+22,966,28.7443333333333
+22,967,18.4573333333333
+22,968,24.4686666666667
+22,969,19.939
+22,970,24.3416666666667
+22,971,25.6116666666667
+22,972,27.6436666666667
+22,973,20.8703333333333
+22,974,24.0876666666667
+22,975,25.3576666666667
+22,976,24.003
+22,977,19.0923333333333
+22,978,22.987
+22,979,25.9503333333333
+22,980,23.241
+22,981,21.5053333333333
+22,982,20.066
+22,983,25.6963333333333
+22,984,21.971
+22,985,24.7226666666667
+22,986,26.1196666666667
+22,987,21.463
+22,988,22.9023333333333
+22,989,23.495
+22,990,22.4366666666667
+22,991,22.86
+22,992,27.2203333333333
+22,993,27.94
+22,994,20.955
+22,995,21.2513333333333
+22,996,20.3623333333333
+22,997,23.0716666666667
+22,998,18.669
+22,999,25.6116666666667
+22,1000,27.686
+23,1,19.3463333333333
+23,2,22.5636666666667
+23,3,32.5331666666667
+23,4,29.718
+23,5,18.4996666666667
+23,6,26.3525
+23,7,34.0571666666667
+23,8,34.036
+23,9,32.8506666666667
+23,10,27.7071666666667
+23,11,26.3525
+23,12,33.8666666666667
+23,13,29.5698333333333
+23,14,26.6488333333333
+23,15,26.0773333333333
+23,16,26.6065
+23,17,34.7133333333333
+23,18,30.861
+23,19,36.83
+23,20,30.9033333333333
+23,21,22.0345
+23,22,32.5755
+23,23,31.8135
+23,24,24.6168333333333
+23,25,32.385
+23,26,38.0788333333333
+23,27,29.5063333333333
+23,28,30.4376666666667
+23,29,28.2998333333333
+23,30,30.3953333333333
+23,31,33.6973333333333
+23,32,27.3896666666667
+23,33,30.5223333333333
+23,34,23.3045
+23,35,38.481
+23,36,26.3948333333333
+23,37,25.0401666666667
+23,38,29.1888333333333
+23,39,25.273
+23,40,23.7278333333333
+23,41,24.638
+23,42,32.004
+23,43,31.3055
+23,44,27.3685
+23,45,27.178
+23,46,20.9761666666667
+23,47,26.7335
+23,48,27.8765
+23,49,32.1098333333333
+23,50,22.86
+23,51,31.6865
+23,52,37.9095
+23,53,36.5125
+23,54,25.0825
+23,55,28.575
+23,56,30.2471666666667
+23,57,23.9395
+23,58,33.1046666666667
+23,59,25.8233333333333
+23,60,30.2048333333333
+23,61,31.0515
+23,62,27.432
+23,63,32.9776666666667
+23,64,37.0205
+23,65,28.829
+23,66,32.131
+23,67,28.2151666666667
+23,68,24.5745
+23,69,34.7556666666667
+23,70,24.8708333333333
+23,71,31.6865
+23,72,38.862
+23,73,39.4546666666667
+23,74,28.8713333333333
+23,75,35.941
+23,76,33.8243333333333
+23,77,28.9983333333333
+23,78,31.8346666666667
+23,79,32.4908333333333
+23,80,33.401
+23,81,33.5068333333333
+23,82,26.3948333333333
+23,83,34.3111666666667
+23,84,27.6013333333333
+23,85,32.6601666666667
+23,86,22.6483333333333
+23,87,28.8925
+23,88,31.3266666666667
+23,89,35.56
+23,90,31.623
+23,91,30.8186666666667
+23,92,30.6281666666667
+23,93,25.6963333333333
+23,94,26.0138333333333
+23,95,28.5326666666667
+23,96,30.4165
+23,97,34.671
+23,98,31.3478333333333
+23,99,27.7918333333333
+23,100,25.7386666666667
+23,101,34.29
+23,102,28.1516666666667
+23,103,29.0195
+23,104,26.289
+23,105,28.8925
+23,106,29.6756666666667
+23,107,31.5595
+23,108,33.02
+23,109,36.322
+23,110,29.4216666666667
+23,111,33.1681666666667
+23,112,31.0938333333333
+23,113,29.6121666666667
+23,114,35.052
+23,115,33.1681666666667
+23,116,29.8238333333333
+23,117,32.9565
+23,118,33.401
+23,119,24.638
+23,120,25.4423333333333
+23,121,31.2208333333333
+23,122,35.941
+23,123,28.3633333333333
+23,124,31.0938333333333
+23,125,29.1253333333333
+23,126,39.751
+23,127,28.9348333333333
+23,128,33.0623333333333
+23,129,30.2048333333333
+23,130,29.083
+23,131,35.9621666666667
+23,132,27.9823333333333
+23,133,35.0308333333333
+23,134,25.1036666666667
+23,135,30.7763333333333
+23,136,26.8816666666667
+23,137,30.6916666666667
+23,138,32.1521666666667
+23,139,27.7495
+23,140,30.2471666666667
+23,141,28.067
+23,142,32.131
+23,143,23.2621666666667
+23,144,32.9565
+23,145,27.6225
+23,146,35.4541666666667
+23,147,26.6276666666667
+23,148,27.5801666666667
+23,149,28.3421666666667
+23,150,28.7443333333333
+23,151,34.925
+23,152,33.1046666666667
+23,153,26.1196666666667
+23,154,40.7246666666667
+23,155,33.2105
+23,156,33.4645
+23,157,41.2326666666667
+23,158,30.4588333333333
+23,159,30.6281666666667
+23,160,26.035
+23,161,28.0458333333333
+23,162,27.686
+23,163,32.9353333333333
+23,164,33.2105
+23,165,32.5966666666667
+23,166,38.7985
+23,167,26.2255
+23,168,38.0576666666667
+23,169,32.3638333333333
+23,170,21.0185
+23,171,29.0406666666667
+23,172,30.9245
+23,173,31.242
+23,174,29.5698333333333
+23,175,31.4748333333333
+23,176,28.7231666666667
+23,177,35.179
+23,178,31.6653333333333
+23,179,32.1945
+23,180,27.2415
+23,181,36.3008333333333
+23,182,32.5755
+23,183,30.1625
+23,184,28.6173333333333
+23,185,38.5868333333333
+23,186,26.67
+23,187,26.9663333333333
+23,188,28.8713333333333
+23,189,29.9931666666667
+23,190,28.702
+23,191,29.4428333333333
+23,192,35.0096666666667
+23,193,19.4521666666667
+23,194,27.4108333333333
+23,195,32.9141666666667
+23,196,33.6338333333333
+23,197,28.6808333333333
+23,198,32.9565
+23,199,27.051
+23,200,22.4578333333333
+23,201,33.0411666666667
+23,202,37.7401666666667
+23,203,38.3116666666667
+23,204,30.9668333333333
+23,205,35.3271666666667
+23,206,25.8868333333333
+23,207,32.5543333333333
+23,208,31.4113333333333
+23,209,34.5651666666667
+23,210,34.5228333333333
+23,211,32.0463333333333
+23,212,34.1206666666667
+23,213,23.6643333333333
+23,214,25.0401666666667
+23,215,32.0251666666667
+23,216,28.2998333333333
+23,217,29.9085
+23,218,28.6808333333333
+23,219,32.9776666666667
+23,220,24.384
+23,221,26.9451666666667
+23,222,28.2575
+23,223,31.3901666666667
+23,224,27.9823333333333
+23,225,22.5425
+23,226,27.7706666666667
+23,227,25.146
+23,228,30.2471666666667
+23,229,31.5595
+23,230,23.4315
+23,231,32.7025
+23,232,24.9343333333333
+23,233,31.6865
+23,234,25.4423333333333
+23,235,28.5326666666667
+23,236,37.6766666666667
+23,237,31.3901666666667
+23,238,28.1093333333333
+23,239,29.5063333333333
+23,240,35.4118333333333
+23,241,23.7066666666667
+23,242,25.1248333333333
+23,243,29.0618333333333
+23,244,31.3901666666667
+23,245,34.8191666666667
+23,246,28.9348333333333
+23,247,26.67
+23,248,26.5006666666667
+23,249,24.8073333333333
+23,250,34.5651666666667
+23,251,30.6916666666667
+23,252,34.0571666666667
+23,253,27.432
+23,254,27.1145
+23,255,27.6225
+23,256,34.8403333333333
+23,257,32.7025
+23,258,33.0623333333333
+23,259,30.9245
+23,260,37.3168333333333
+23,261,37.1686666666667
+23,262,29.2523333333333
+23,263,27.0298333333333
+23,264,24.1723333333333
+23,265,25.527
+23,266,29.1041666666667
+23,267,23.0716666666667
+23,268,35.8563333333333
+23,269,36.2585
+23,270,28.5115
+23,271,25.2518333333333
+23,272,27.0721666666667
+23,273,27.5378333333333
+23,274,35.687
+23,275,20.0448333333333
+23,276,34.3535
+23,277,22.8811666666667
+23,278,31.1573333333333
+23,279,29.6756666666667
+23,280,28.4903333333333
+23,281,36.322
+23,282,29.9085
+23,283,24.2358333333333
+23,284,28.2998333333333
+23,285,30.8398333333333
+23,286,24.4051666666667
+23,287,27.3685
+23,288,40.9151666666667
+23,289,29.6121666666667
+23,290,36.576
+23,291,32.2368333333333
+23,292,28.829
+23,293,22.2885
+23,294,28.067
+23,295,25.5905
+23,296,31.9405
+23,297,23.8336666666667
+23,298,27.1568333333333
+23,299,29.3581666666667
+23,300,26.797
+23,301,24.4475
+23,302,30.5435
+23,303,31.7923333333333
+23,304,32.3426666666667
+23,305,31.6865
+23,306,27.6648333333333
+23,307,30.226
+23,308,28.2786666666667
+23,309,24.9343333333333
+23,310,32.8295
+23,311,31.877
+23,312,29.6545
+23,313,28.6596666666667
+23,314,31.4325
+23,315,31.1996666666667
+23,316,27.2415
+23,317,28.194
+23,318,29.6121666666667
+23,319,39.624
+23,320,33.3375
+23,321,26.0138333333333
+23,322,23.3045
+23,323,26.1831666666667
+23,324,36.5971666666667
+23,325,27.0298333333333
+23,326,30.0778333333333
+23,327,31.7711666666667
+23,328,24.511
+23,329,32.131
+23,330,25.2095
+23,331,28.321
+23,332,28.067
+23,333,31.2208333333333
+23,334,26.6911666666667
+23,335,30.1413333333333
+23,336,33.2528333333333
+23,337,30.6281666666667
+23,338,28.0035
+23,339,30.7763333333333
+23,340,38.8196666666667
+23,341,26.1196666666667
+23,342,24.511
+23,343,34.4805
+23,344,25.908
+23,345,29.8238333333333
+23,346,24.003
+23,347,22.9235
+23,348,35.6658333333333
+23,349,30.9456666666667
+23,350,36.5548333333333
+23,351,26.289
+23,352,34.2476666666667
+23,353,23.1775
+23,354,35.1366666666667
+23,355,28.4056666666667
+23,356,28.8713333333333
+23,357,37.7825
+23,358,30.734
+23,359,25.019
+23,360,24.9766666666667
+23,361,30.9245
+23,362,25.2306666666667
+23,363,28.7866666666667
+23,364,31.4536666666667
+23,365,25.4
+23,366,27.6225
+23,367,23.5161666666667
+23,368,25.4
+23,369,28.6173333333333
+23,370,26.6065
+23,371,33.0411666666667
+23,372,31.5595
+23,373,30.9033333333333
+23,374,25.9926666666667
+23,375,26.1831666666667
+23,376,37.7613333333333
+23,377,34.4381666666667
+23,378,23.6643333333333
+23,379,30.6493333333333
+23,380,23.1775
+23,381,29.718
+23,382,34.6921666666667
+23,383,32.9141666666667
+23,384,39.7298333333333
+23,385,32.2368333333333
+23,386,28.829
+23,387,38.1423333333333
+23,388,32.1521666666667
+23,389,31.0303333333333
+23,390,32.5331666666667
+23,391,35.9198333333333
+23,392,37.1686666666667
+23,393,21.1455
+23,394,32.3426666666667
+23,395,38.4386666666667
+23,396,24.1088333333333
+23,397,32.3638333333333
+23,398,29.718
+23,399,41.656
+23,400,22.3096666666667
+23,401,36.3855
+23,402,30.5011666666667
+23,403,32.4485
+23,404,29.6333333333333
+23,405,28.5961666666667
+23,406,26.8181666666667
+23,407,34.163
+23,408,30.734
+23,409,29.5698333333333
+23,410,20.574
+23,411,29.5275
+23,412,23.5585
+23,413,28.7655
+23,414,26.7546666666667
+23,415,25.4635
+23,416,25.8656666666667
+23,417,28.9983333333333
+23,418,26.7123333333333
+23,419,22.3096666666667
+23,420,31.1361666666667
+23,421,27.5801666666667
+23,422,36.9993333333333
+23,423,25.5905
+23,424,26.2043333333333
+23,425,31.623
+23,426,26.797
+23,427,24.2146666666667
+23,428,27.0721666666667
+23,429,30.0355
+23,430,28.9771666666667
+23,431,28.5961666666667
+23,432,30.226
+23,433,37.846
+23,434,30.7551666666667
+23,435,35.6235
+23,436,29.0195
+23,437,32.3003333333333
+23,438,36.7665
+23,439,32.512
+23,440,27.94
+23,441,33.2105
+23,442,28.2786666666667
+23,443,32.6813333333333
+23,444,32.131
+23,445,33.5915
+23,446,33.528
+23,447,24.384
+23,448,29.4005
+23,449,28.9348333333333
+23,450,28.5326666666667
+23,451,32.385
+23,452,23.2833333333333
+23,453,30.5858333333333
+23,454,33.274
+23,455,20.6375
+23,456,26.3313333333333
+23,457,30.9456666666667
+23,458,36.6606666666667
+23,459,29.8238333333333
+23,460,32.1521666666667
+23,461,38.0365
+23,462,26.1408333333333
+23,463,28.8925
+23,464,26.7335
+23,465,30.7551666666667
+23,466,24.0453333333333
+23,467,38.5021666666667
+23,468,28.7443333333333
+23,469,27.0933333333333
+23,470,31.1573333333333
+23,471,31.5806666666667
+23,472,28.8713333333333
+23,473,30.3318333333333
+23,474,27.7918333333333
+23,475,40.0685
+23,476,34.6498333333333
+23,477,34.671
+23,478,36.9146666666667
+23,479,29.4005
+23,480,25.9291666666667
+23,481,27.2838333333333
+23,482,35.8563333333333
+23,483,32.0675
+23,484,31.1996666666667
+23,485,33.6126666666667
+23,486,31.496
+23,487,28.3421666666667
+23,488,32.1098333333333
+23,489,32.8718333333333
+23,490,26.797
+23,491,24.384
+23,492,35.433
+23,493,25.2306666666667
+23,494,27.5801666666667
+23,495,26.035
+23,496,32.9776666666667
+23,497,30.5435
+23,498,31.2843333333333
+23,499,25.7598333333333
+23,500,33.2105
+23,501,32.3215
+23,502,36.6818333333333
+23,503,27.3473333333333
+23,504,36.3855
+23,505,25.4211666666667
+23,506,32.4908333333333
+23,507,29.8026666666667
+23,508,31.4536666666667
+23,509,31.2843333333333
+23,510,30.5646666666667
+23,511,28.6385
+23,512,36.0891666666667
+23,513,32.3638333333333
+23,514,35.6658333333333
+23,515,35.0731666666667
+23,516,27.2203333333333
+23,517,41.3596666666667
+23,518,28.4268333333333
+23,519,31.3055
+23,520,32.3003333333333
+23,521,25.6328333333333
+23,522,30.1201666666667
+23,523,29.6545
+23,524,35.3271666666667
+23,525,23.0928333333333
+23,526,25.1036666666667
+23,527,39.0101666666667
+23,528,34.5016666666667
+23,529,33.401
+23,530,26.1408333333333
+23,531,26.3101666666667
+23,532,22.225
+23,533,28.2363333333333
+23,534,31.6441666666667
+23,535,33.8455
+23,536,38.3116666666667
+23,537,28.0035
+23,538,31.2631666666667
+23,539,24.0665
+23,540,24.0665
+23,541,36.6818333333333
+23,542,30.2471666666667
+23,543,22.6483333333333
+23,544,34.6498333333333
+23,545,30.607
+23,546,29.845
+23,547,23.7913333333333
+23,548,22.7541666666667
+23,549,32.2156666666667
+23,550,25.4423333333333
+23,551,26.9875
+23,552,29.0195
+23,553,24.9978333333333
+23,554,34.4593333333333
+23,555,25.0613333333333
+23,556,33.9725
+23,557,18.4996666666667
+23,558,30.3741666666667
+23,559,30.607
+23,560,26.6276666666667
+23,561,30.1201666666667
+23,562,31.5806666666667
+23,563,36.8088333333333
+23,564,30.3741666666667
+23,565,27.8341666666667
+23,566,29.8026666666667
+23,567,22.3308333333333
+23,568,27.8553333333333
+23,569,31.3901666666667
+23,570,33.0623333333333
+23,571,38.2481666666667
+23,572,28.5961666666667
+23,573,34.671
+23,574,21.082
+23,575,27.9823333333333
+23,576,22.352
+23,577,20.2353333333333
+23,578,23.4103333333333
+23,579,30.6705
+23,580,29.2523333333333
+23,581,34.8191666666667
+23,582,27.6648333333333
+23,583,26.1831666666667
+23,584,37.719
+23,585,39.1371666666667
+23,586,33.6338333333333
+23,587,27.559
+23,588,32.0675
+23,589,25.3788333333333
+23,590,26.6065
+23,591,31.5383333333333
+23,592,33.1046666666667
+23,593,28.8713333333333
+23,594,28.1093333333333
+23,595,31.0091666666667
+23,596,34.3958333333333
+23,597,26.5006666666667
+23,598,27.0298333333333
+23,599,28.575
+23,600,31.3901666666667
+23,601,35.8775
+23,602,34.3958333333333
+23,603,30.1413333333333
+23,604,35.2001666666667
+23,605,29.5063333333333
+23,606,26.7546666666667
+23,607,31.369
+23,608,31.0091666666667
+23,609,23.876
+23,610,27.2415
+23,611,26.4795
+23,612,23.6855
+23,613,31.75
+23,614,30.0355
+23,615,24.7861666666667
+23,616,28.3421666666667
+23,617,26.162
+23,618,36.195
+23,619,25.7386666666667
+23,620,31.2208333333333
+23,621,25.6328333333333
+23,622,30.0566666666667
+23,623,32.5966666666667
+23,624,28.2575
+23,625,34.8615
+23,626,29.7603333333333
+23,627,32.6601666666667
+23,628,32.8083333333333
+23,629,28.2998333333333
+23,630,26.3313333333333
+23,631,36.3431666666667
+23,632,29.21
+23,633,25.9503333333333
+23,634,25.8868333333333
+23,635,32.2368333333333
+23,636,27.94
+23,637,30.0566666666667
+23,638,22.5425
+23,639,26.9451666666667
+23,640,33.2105
+23,641,33.9936666666667
+23,642,32.3003333333333
+23,643,29.1041666666667
+23,644,27.686
+23,645,27.4531666666667
+23,646,24.2781666666667
+23,647,23.1986666666667
+23,648,26.289
+23,649,32.766
+23,650,24.765
+23,651,25.5905
+23,652,25.9926666666667
+23,653,34.8191666666667
+23,654,23.5796666666667
+23,655,28.6808333333333
+23,656,27.6225
+23,657,28.8078333333333
+23,658,34.0148333333333
+23,659,30.099
+23,660,30.8398333333333
+23,661,32.131
+23,662,27.686
+23,663,22.5001666666667
+23,664,28.2575
+23,665,33.4856666666667
+23,666,32.2791666666667
+23,667,32.1521666666667
+23,668,29.9296666666667
+23,669,35.7505
+23,670,23.9183333333333
+23,671,27.9611666666667
+23,672,30.8821666666667
+23,673,31.8135
+23,674,36.703
+23,675,32.385
+23,676,35.8563333333333
+23,677,26.4583333333333
+23,678,33.2951666666667
+23,679,31.1573333333333
+23,680,34.6286666666667
+23,681,26.8393333333333
+23,682,30.099
+23,683,27.5801666666667
+23,684,29.9508333333333
+23,685,27.559
+23,686,30.5011666666667
+23,687,34.163
+23,688,33.1681666666667
+23,689,32.5755
+23,690,30.2471666666667
+23,691,34.9885
+23,692,32.4061666666667
+23,693,32.4485
+23,694,24.8073333333333
+23,695,25.2095
+23,696,28.0881666666667
+23,697,35.8351666666667
+23,698,34.4381666666667
+23,699,33.6973333333333
+23,700,30.0355
+23,701,26.8816666666667
+23,702,33.2105
+23,703,32.766
+23,704,30.6281666666667
+23,705,31.5806666666667
+23,706,37.8036666666667
+23,707,28.4056666666667
+23,708,30.9668333333333
+23,709,23.8971666666667
+23,710,30.2471666666667
+23,711,31.8558333333333
+23,712,28.2998333333333
+23,713,38.6291666666667
+23,714,35.2213333333333
+23,715,29.2735
+23,716,23.5161666666667
+23,717,29.6545
+23,718,27.7071666666667
+23,719,25.3153333333333
+23,720,26.9875
+23,721,38.1
+23,722,32.4061666666667
+23,723,22.9235
+23,724,27.4108333333333
+23,725,22.225
+23,726,34.3958333333333
+23,727,28.829
+23,728,32.3638333333333
+23,729,36.576
+23,730,32.4273333333333
+23,731,29.5486666666667
+23,732,27.5166666666667
+23,733,33.6126666666667
+23,734,29.8238333333333
+23,735,23.6855
+23,736,28.1305
+23,737,27.4743333333333
+23,738,36.9358333333333
+23,739,32.1945
+23,740,28.4691666666667
+23,741,29.9296666666667
+23,742,37.846
+23,743,29.8026666666667
+23,744,23.8125
+23,745,23.8125
+23,746,25.8445
+23,747,33.8455
+23,748,27.9823333333333
+23,749,39.4758333333333
+23,750,32.1733333333333
+23,751,35.3483333333333
+23,752,27.4108333333333
+23,753,24.4898333333333
+23,754,35.3271666666667
+23,755,25.4635
+23,756,28.7231666666667
+23,757,28.1516666666667
+23,758,29.4428333333333
+23,759,38.9678333333333
+23,760,28.7231666666667
+23,761,31.1785
+23,762,32.3426666666667
+23,763,35.179
+23,764,28.321
+23,765,34.29
+23,766,34.6286666666667
+23,767,34.9461666666667
+23,768,31.0303333333333
+23,769,27.4955
+23,770,29.845
+23,771,21.6111666666667
+23,772,28.7866666666667
+23,773,23.1775
+23,774,27.7071666666667
+23,775,34.0571666666667
+23,776,31.75
+23,777,34.7768333333333
+23,778,29.5486666666667
+23,779,29.21
+23,780,28.6385
+23,781,30.7975
+23,782,29.1888333333333
+23,783,34.1206666666667
+23,784,46.7783333333333
+23,785,33.7608333333333
+23,786,26.0773333333333
+23,787,26.9663333333333
+23,788,32.0463333333333
+23,789,29.718
+23,790,25.5693333333333
+23,791,31.3478333333333
+23,792,33.782
+23,793,22.0133333333333
+23,794,31.3478333333333
+23,795,24.8073333333333
+23,796,28.2151666666667
+23,797,28.4268333333333
+23,798,30.1836666666667
+23,799,32.639
+23,800,33.4433333333333
+23,801,22.6695
+23,802,32.8506666666667
+23,803,27.4955
+23,804,22.2038333333333
+23,805,33.5703333333333
+23,806,24.2781666666667
+23,807,24.1088333333333
+23,808,30.0143333333333
+23,809,33.8031666666667
+23,810,30.2471666666667
+23,811,31.623
+23,812,30.4376666666667
+23,813,28.6596666666667
+23,814,37.2745
+23,815,28.7443333333333
+23,816,33.3163333333333
+23,817,21.336
+23,818,27.3685
+23,819,27.432
+23,820,37.0628333333333
+23,821,22.8388333333333
+23,822,35.8563333333333
+23,823,27.8976666666667
+23,824,35.179
+23,825,35.3271666666667
+23,826,34.0571666666667
+23,827,26.7123333333333
+23,828,25.2941666666667
+23,829,33.6338333333333
+23,830,27.5166666666667
+23,831,37.2956666666667
+23,832,32.6178333333333
+23,833,33.782
+23,834,35.1366666666667
+23,835,24.8708333333333
+23,836,36.2373333333333
+23,837,25.6751666666667
+23,838,26.0138333333333
+23,839,32.8718333333333
+23,840,28.3845
+23,841,26.4795
+23,842,18.5631666666667
+23,843,25.9715
+23,844,26.035
+23,845,29.5486666666667
+23,846,28.321
+23,847,32.1733333333333
+23,848,29.9931666666667
+23,849,32.3638333333333
+23,850,29.5063333333333
+23,851,30.5011666666667
+23,852,30.4588333333333
+23,853,26.8181666666667
+23,854,23.2833333333333
+23,855,31.9193333333333
+23,856,36.3008333333333
+23,857,37.8883333333333
+23,858,27.9188333333333
+23,859,35.7293333333333
+23,860,38.0153333333333
+23,861,31.7076666666667
+23,862,22.733
+23,863,29.6121666666667
+23,864,30.0566666666667
+23,865,36.7876666666667
+23,866,33.2316666666667
+23,867,33.6973333333333
+23,868,29.6756666666667
+23,869,25.0401666666667
+23,870,29.845
+23,871,22.8388333333333
+23,872,36.068
+23,873,28.2575
+23,874,30.7763333333333
+23,875,31.8558333333333
+23,876,25.908
+23,877,29.5698333333333
+23,878,32.4485
+23,879,28.956
+23,880,25.3365
+23,881,27.0721666666667
+23,882,27.5378333333333
+23,883,31.7923333333333
+23,884,31.1785
+23,885,25.4635
+23,886,30.2683333333333
+23,887,30.0778333333333
+23,888,27.1145
+23,889,29.6545
+23,890,31.3901666666667
+23,891,39.4758333333333
+23,892,21.3148333333333
+23,893,22.225
+23,894,36.1103333333333
+23,895,41.5925
+23,896,32.4696666666667
+23,897,29.5486666666667
+23,898,29.7603333333333
+23,899,31.8135
+23,900,25.6963333333333
+23,901,31.3901666666667
+23,902,29.6545
+23,903,32.2791666666667
+23,904,29.8238333333333
+23,905,29.718
+23,906,27.2415
+23,907,36.3643333333333
+23,908,26.3736666666667
+23,909,31.5171666666667
+23,910,25.1036666666667
+23,911,28.4903333333333
+23,912,33.0623333333333
+23,913,28.0458333333333
+23,914,28.2151666666667
+23,915,28.067
+23,916,29.1888333333333
+23,917,32.7025
+23,918,30.607
+23,919,29.3158333333333
+23,920,25.019
+23,921,25.9291666666667
+23,922,29.9085
+23,923,26.543
+23,924,24.0665
+23,925,35.56
+23,926,33.1258333333333
+23,927,34.7345
+23,928,35.3483333333333
+23,929,34.163
+23,930,29.3581666666667
+23,931,37.211
+23,932,29.0618333333333
+23,933,36.8511666666667
+23,934,33.8455
+23,935,38.8408333333333
+23,936,19.4521666666667
+23,937,28.0458333333333
+23,938,32.131
+23,939,32.7448333333333
+23,940,34.3535
+23,941,25.5481666666667
+23,942,36.1738333333333
+23,943,32.1945
+23,944,32.4908333333333
+23,945,36.2161666666667
+23,946,27.7918333333333
+23,947,22.8176666666667
+23,948,25.4635
+23,949,39.0101666666667
+23,950,31.3478333333333
+23,951,30.6705
+23,952,28.2151666666667
+23,953,36.0045
+23,954,30.4588333333333
+23,955,24.6803333333333
+23,956,29.972
+23,957,32.7236666666667
+23,958,29.0618333333333
+23,959,31.3901666666667
+23,960,24.2781666666667
+23,961,30.1836666666667
+23,962,27.94
+23,963,30.607
+23,964,32.7448333333333
+23,965,31.5806666666667
+23,966,32.9988333333333
+23,967,28.1305
+23,968,28.575
+23,969,27.0933333333333
+23,970,35.433
+23,971,30.7128333333333
+23,972,23.8336666666667
+23,973,30.0778333333333
+23,974,34.7556666666667
+23,975,35.6658333333333
+23,976,32.8506666666667
+23,977,29.4005
+23,978,20.9761666666667
+23,979,26.1831666666667
+23,980,29.8873333333333
+23,981,27.1356666666667
+23,982,27.6225
+23,983,26.5641666666667
+23,984,30.2895
+23,985,29.3158333333333
+23,986,24.0665
+23,987,24.8285
+23,988,32.5331666666667
+23,989,25.1883333333333
+23,990,22.4578333333333
+23,991,31.4748333333333
+23,992,38.7985
+23,993,26.67
+23,994,24.2781666666667
+23,995,33.9936666666667
+23,996,30.4165
+23,997,29.8026666666667
+23,998,36.9993333333333
+23,999,29.0618333333333
+23,1000,22.2673333333333
+24,1,16.4253333333333
+24,2,19.939
+24,3,12.573
+24,4,17.526
+24,5,21.4206666666667
+24,6,21.1666666666667
+24,7,16.1713333333333
+24,8,22.225
+24,9,26.5006666666667
+24,10,20.1083333333333
+24,11,18.669
+24,12,23.241
+24,13,18.0763333333333
+24,14,21.5476666666667
+24,15,17.653
+24,16,18.9653333333333
+24,17,18.796
+24,18,21.336
+24,19,18.669
+24,20,21.3783333333333
+24,21,17.399
+24,22,20.8703333333333
+24,23,26.2043333333333
+24,24,25.654
+24,25,17.7376666666667
+24,26,25.1883333333333
+24,27,25.9926666666667
+24,28,25.1883333333333
+24,29,21.717
+24,30,21.3783333333333
+24,31,25.1883333333333
+24,32,24.8496666666667
+24,33,13.4196666666667
+24,34,21.844
+24,35,17.8223333333333
+24,36,24.8073333333333
+24,37,27.9823333333333
+24,38,15.7903333333333
+24,39,16.764
+24,40,21.463
+24,41,22.5213333333333
+24,42,20.447
+24,43,15.8326666666667
+24,44,21.717
+24,45,18.7536666666667
+24,46,19.1346666666667
+24,47,16.129
+24,48,24.0453333333333
+24,49,18.8383333333333
+24,50,24.1723333333333
+24,51,21.6323333333333
+24,52,17.653
+24,53,24.892
+24,54,21.1666666666667
+24,55,19.9813333333333
+24,56,13.9276666666667
+24,57,19.0923333333333
+24,58,19.177
+24,59,20.9973333333333
+24,60,22.1826666666667
+24,61,19.3886666666667
+24,62,18.034
+24,63,24.257
+24,64,23.2833333333333
+24,65,21.844
+24,66,19.304
+24,67,28.2363333333333
+24,68,20.7856666666667
+24,69,20.8703333333333
+24,70,21.2513333333333
+24,71,17.9916666666667
+24,72,17.78
+24,73,23.368
+24,74,22.9023333333333
+24,75,22.479
+24,76,19.177
+24,77,15.5786666666667
+24,78,19.939
+24,79,15.494
+24,80,21.59
+24,81,20.828
+24,82,17.1026666666667
+24,83,25.654
+24,84,16.891
+24,85,23.9183333333333
+24,86,24.765
+24,87,19.685
+24,88,24.5956666666667
+24,89,20.6586666666667
+24,90,22.0133333333333
+24,91,15.113
+24,92,18.288
+24,93,16.6793333333333
+24,94,19.3463333333333
+24,95,21.8863333333333
+24,96,29.591
+24,97,20.1506666666667
+24,98,26.9663333333333
+24,99,19.4733333333333
+24,100,21.0396666666667
+24,101,24.2993333333333
+24,102,26.8816666666667
+24,103,22.5636666666667
+24,104,16.764
+24,105,13.589
+24,106,15.4093333333333
+24,107,18.4573333333333
+24,108,23.9183333333333
+24,109,22.606
+24,110,18.3726666666667
+24,111,16.7216666666667
+24,112,21.1666666666667
+24,113,23.368
+24,114,22.606
+24,115,20.8703333333333
+24,116,21.463
+24,117,14.986
+24,118,20.828
+24,119,23.3256666666667
+24,120,20.7433333333333
+24,121,20.701
+24,122,18.7113333333333
+24,123,20.6163333333333
+24,124,16.6793333333333
+24,125,24.0453333333333
+24,126,19.6426666666667
+24,127,24.003
+24,128,16.8063333333333
+24,129,17.6953333333333
+24,130,22.6906666666667
+24,131,21.1666666666667
+24,132,16.8486666666667
+24,133,17.5683333333333
+24,134,15.1553333333333
+24,135,19.685
+24,136,17.3566666666667
+24,137,17.3566666666667
+24,138,16.0443333333333
+24,139,22.4366666666667
+24,140,23.3256666666667
+24,141,19.0076666666667
+24,142,17.8646666666667
+24,143,21.844
+24,144,26.924
+24,145,14.097
+24,146,15.113
+24,147,25.527
+24,148,14.351
+24,149,29.083
+24,150,12.192
+24,151,20.828
+24,152,16.2136666666667
+24,153,19.3463333333333
+24,154,15.113
+24,155,19.0923333333333
+24,156,22.7753333333333
+24,157,17.4413333333333
+24,158,16.4253333333333
+24,159,17.6106666666667
+24,160,16.51
+24,161,15.4093333333333
+24,162,16.2136666666667
+24,163,24.1723333333333
+24,164,16.129
+24,165,14.4356666666667
+24,166,22.5213333333333
+24,167,23.495
+24,168,21.6323333333333
+24,169,15.621
+24,170,23.4526666666667
+24,171,21.717
+24,172,13.8853333333333
+24,173,17.145
+24,174,21.2513333333333
+24,175,25.3576666666667
+24,176,19.1346666666667
+24,177,19.3886666666667
+24,178,19.5156666666667
+24,179,23.1986666666667
+24,180,21.082
+24,181,17.4413333333333
+24,182,17.9916666666667
+24,183,21.9286666666667
+24,184,16.2983333333333
+24,185,22.8176666666667
+24,186,19.7696666666667
+24,187,17.3143333333333
+24,188,21.2513333333333
+24,189,23.0716666666667
+24,190,28.448
+24,191,17.272
+24,192,18.6266666666667
+24,193,19.7273333333333
+24,194,22.0556666666667
+24,195,21.082
+24,196,20.4046666666667
+24,197,18.796
+24,198,19.2193333333333
+24,199,18.8806666666667
+24,200,21.8863333333333
+24,201,12.6576666666667
+24,202,21.5476666666667
+24,203,18.034
+24,204,18.6266666666667
+24,205,17.3143333333333
+24,206,13.97
+24,207,18.542
+24,208,20.2353333333333
+24,209,24.4263333333333
+24,210,17.4413333333333
+24,211,28.0246666666667
+24,212,25.5693333333333
+24,213,22.9446666666667
+24,214,20.6163333333333
+24,215,25.019
+24,216,18.5843333333333
+24,217,16.764
+24,218,21.3783333333333
+24,219,17.399
+24,220,21.1666666666667
+24,221,24.5956666666667
+24,222,20.447
+24,223,22.2673333333333
+24,224,25.8656666666667
+24,225,21.336
+24,226,21.5053333333333
+24,227,23.1986666666667
+24,228,14.605
+24,229,20.1083333333333
+24,230,18.8806666666667
+24,231,29.2523333333333
+24,232,19.7273333333333
+24,233,17.0603333333333
+24,234,23.9606666666667
+24,235,16.8063333333333
+24,236,18.3303333333333
+24,237,22.0133333333333
+24,238,24.384
+24,239,15.113
+24,240,17.272
+24,241,16.4253333333333
+24,242,23.4526666666667
+24,243,17.018
+24,244,20.6163333333333
+24,245,24.7226666666667
+24,246,18.9653333333333
+24,247,19.304
+24,248,19.0076666666667
+24,249,22.3943333333333
+24,250,18.288
+24,251,19.6426666666667
+24,252,18.923
+24,253,15.1976666666667
+24,254,17.145
+24,255,23.495
+24,256,21.8863333333333
+24,257,20.447
+24,258,18.9653333333333
+24,259,22.5213333333333
+24,260,18.7536666666667
+24,261,17.3143333333333
+24,262,20.066
+24,263,17.6953333333333
+24,264,18.4996666666667
+24,265,24.0453333333333
+24,266,20.5316666666667
+24,267,29.2523333333333
+24,268,27.6436666666667
+24,269,29.845
+24,270,14.7743333333333
+24,271,28.1093333333333
+24,272,19.7696666666667
+24,273,18.0763333333333
+24,274,17.9493333333333
+24,275,25.3576666666667
+24,276,19.5156666666667
+24,277,22.098
+24,278,19.2193333333333
+24,279,19.4733333333333
+24,280,18.542
+24,281,18.796
+24,282,14.859
+24,283,22.098
+24,284,25.3576666666667
+24,285,18.669
+24,286,20.5316666666667
+24,287,23.8336666666667
+24,288,22.0556666666667
+24,289,16.2983333333333
+24,290,19.685
+24,291,10.7103333333333
+24,292,22.0133333333333
+24,293,27.2203333333333
+24,294,16.8486666666667
+24,295,20.3623333333333
+24,296,19.812
+24,297,20.1083333333333
+24,298,14.478
+24,299,17.1026666666667
+24,300,17.4836666666667
+24,301,24.003
+24,302,23.7913333333333
+24,303,22.5636666666667
+24,304,19.1346666666667
+24,305,25.273
+24,306,16.0866666666667
+24,307,24.511
+24,308,22.5213333333333
+24,309,22.352
+24,310,20.7856666666667
+24,311,17.272
+24,312,18.542
+24,313,18.4996666666667
+24,314,24.384
+24,315,25.6963333333333
+24,316,17.272
+24,317,27.8553333333333
+24,318,20.955
+24,319,18.1186666666667
+24,320,15.6633333333333
+24,321,23.8336666666667
+24,322,15.1553333333333
+24,323,22.5636666666667
+24,324,24.8073333333333
+24,325,24.003
+24,326,19.8966666666667
+24,327,20.2776666666667
+24,328,21.9286666666667
+24,329,20.066
+24,330,20.8703333333333
+24,331,19.0076666666667
+24,332,20.828
+24,333,22.86
+24,334,17.4413333333333
+24,335,16.891
+24,336,19.8966666666667
+24,337,17.018
+24,338,17.145
+24,339,21.5053333333333
+24,340,19.5156666666667
+24,341,20.9126666666667
+24,342,20.955
+24,343,12.8693333333333
+24,344,18.8383333333333
+24,345,17.526
+24,346,27.0933333333333
+24,347,19.8543333333333
+24,348,20.447
+24,349,21.7593333333333
+24,350,18.034
+24,351,17.1873333333333
+24,352,25.654
+24,353,26.2466666666667
+24,354,19.5156666666667
+24,355,25.527
+24,356,20.9126666666667
+24,357,19.0923333333333
+24,358,15.2823333333333
+24,359,23.622
+24,360,19.3463333333333
+24,361,25.146
+24,362,19.7273333333333
+24,363,16.6793333333333
+24,364,23.114
+24,365,20.955
+24,366,32.3003333333333
+24,367,21.2513333333333
+24,368,17.2296666666667
+24,369,22.5213333333333
+24,370,17.145
+24,371,23.9606666666667
+24,372,23.9606666666667
+24,373,21.8016666666667
+24,374,20.9973333333333
+24,375,27.813
+24,376,16.7216666666667
+24,377,25.3576666666667
+24,378,26.0773333333333
+24,379,23.9183333333333
+24,380,21.5476666666667
+24,381,18.669
+24,382,16.002
+24,383,19.05
+24,384,18.3726666666667
+24,385,18.1186666666667
+24,386,18.415
+24,387,19.2193333333333
+24,388,15.7056666666667
+24,389,19.7273333333333
+24,390,16.383
+24,391,22.3943333333333
+24,392,21.9286666666667
+24,393,21.7593333333333
+24,394,26.797
+24,395,17.78
+24,396,18.0763333333333
+24,397,24.8496666666667
+24,398,17.653
+24,399,15.494
+24,400,25.3153333333333
+24,401,18.923
+24,402,17.907
+24,403,24.7226666666667
+24,404,18.4573333333333
+24,405,36.068
+24,406,23.9606666666667
+24,407,19.8543333333333
+24,408,24.0453333333333
+24,409,16.0443333333333
+24,410,19.431
+24,411,17.907
+24,412,17.907
+24,413,19.939
+24,414,15.113
+24,415,22.225
+24,416,22.352
+24,417,25.9503333333333
+24,418,24.4686666666667
+24,419,20.828
+24,420,16.5946666666667
+24,421,23.3256666666667
+24,422,21.1243333333333
+24,423,23.495
+24,424,25.0613333333333
+24,425,22.8176666666667
+24,426,17.78
+24,427,20.2353333333333
+24,428,23.9183333333333
+24,429,21.9286666666667
+24,430,15.494
+24,431,14.859
+24,432,21.0396666666667
+24,433,17.3143333333333
+24,434,20.32
+24,435,13.843
+24,436,20.6163333333333
+24,437,20.4046666666667
+24,438,18.2456666666667
+24,439,20.9126666666667
+24,440,23.2833333333333
+24,441,22.9446666666667
+24,442,25.8233333333333
+24,443,23.0716666666667
+24,444,18.288
+24,445,22.6906666666667
+24,446,19.177
+24,447,12.9963333333333
+24,448,17.272
+24,449,21.082
+24,450,18.9653333333333
+24,451,23.2833333333333
+24,452,15.7056666666667
+24,453,22.987
+24,454,17.653
+24,455,21.209
+24,456,16.7216666666667
+24,457,21.59
+24,458,20.4046666666667
+24,459,19.0076666666667
+24,460,22.0556666666667
+24,461,19.812
+24,462,29.2523333333333
+24,463,22.1826666666667
+24,464,18.923
+24,465,21.336
+24,466,27.3473333333333
+24,467,19.3463333333333
+24,468,21.082
+24,469,16.6793333333333
+24,470,20.1083333333333
+24,471,14.2663333333333
+24,472,17.1873333333333
+24,473,20.4046666666667
+24,474,16.5523333333333
+24,475,21.6323333333333
+24,476,17.6953333333333
+24,477,30.5223333333333
+24,478,18.7536666666667
+24,479,20.574
+24,480,24.9766666666667
+24,481,16.256
+24,482,14.5626666666667
+24,483,23.1563333333333
+24,484,24.638
+24,485,18.6266666666667
+24,486,17.7376666666667
+24,487,19.3886666666667
+24,488,14.605
+24,489,19.5156666666667
+24,490,16.9756666666667
+24,491,16.383
+24,492,20.447
+24,493,21.0396666666667
+24,494,24.638
+24,495,18.7113333333333
+24,496,22.4366666666667
+24,497,17.7376666666667
+24,498,24.4686666666667
+24,499,20.8703333333333
+24,500,21.717
+24,501,19.2193333333333
+24,502,23.2833333333333
+24,503,18.4573333333333
+24,504,18.3303333333333
+24,505,19.2616666666667
+24,506,14.6896666666667
+24,507,15.621
+24,508,18.3726666666667
+24,509,24.0453333333333
+24,510,23.4526666666667
+24,511,21.463
+24,512,16.002
+24,513,12.9116666666667
+24,514,18.3726666666667
+24,515,16.129
+24,516,18.2456666666667
+24,517,23.7913333333333
+24,518,17.0603333333333
+24,519,15.2823333333333
+24,520,16.3406666666667
+24,521,20.3623333333333
+24,522,22.0133333333333
+24,523,21.8863333333333
+24,524,21.082
+24,525,20.447
+24,526,24.1723333333333
+24,527,25.527
+24,528,12.6576666666667
+24,529,19.5156666666667
+24,530,22.479
+24,531,24.7226666666667
+24,532,19.0076666666667
+24,533,20.2776666666667
+24,534,18.796
+24,535,18.4573333333333
+24,536,14.7743333333333
+24,537,17.4836666666667
+24,538,19.8966666666667
+24,539,20.9973333333333
+24,540,19.7273333333333
+24,541,21.2936666666667
+24,542,22.987
+24,543,22.098
+24,544,21.2513333333333
+24,545,22.098
+24,546,23.8336666666667
+24,547,22.352
+24,548,17.78
+24,549,19.558
+24,550,15.748
+24,551,17.4836666666667
+24,552,22.733
+24,553,19.7696666666667
+24,554,17.526
+24,555,26.9663333333333
+24,556,20.7856666666667
+24,557,16.764
+24,558,17.907
+24,559,19.2616666666667
+24,560,32.3003333333333
+24,561,20.2776666666667
+24,562,13.2926666666667
+24,563,17.8646666666667
+24,564,26.8393333333333
+24,565,20.8703333333333
+24,566,22.86
+24,567,19.812
+24,568,14.986
+24,569,19.0923333333333
+24,570,15.748
+24,571,16.129
+24,572,25.4
+24,573,18.161
+24,574,23.0716666666667
+24,575,19.558
+24,576,14.9013333333333
+24,577,15.7056666666667
+24,578,17.3566666666667
+24,579,21.463
+24,580,21.1243333333333
+24,581,19.7696666666667
+24,582,19.8966666666667
+24,583,16.4676666666667
+24,584,17.907
+24,585,19.431
+24,586,18.6266666666667
+24,587,18.1186666666667
+24,588,29.464
+24,589,20.5316666666667
+24,590,15.9596666666667
+24,591,20.0236666666667
+24,592,21.8016666666667
+24,593,19.2193333333333
+24,594,17.7376666666667
+24,595,22.5636666666667
+24,596,22.0556666666667
+24,597,19.4733333333333
+24,598,15.875
+24,599,19.2616666666667
+24,600,17.1026666666667
+24,601,20.828
+24,602,21.2513333333333
+24,603,23.9606666666667
+24,604,20.828
+24,605,24.9343333333333
+24,606,28.9983333333333
+24,607,16.764
+24,608,20.828
+24,609,20.1083333333333
+24,610,23.9606666666667
+24,611,21.1243333333333
+24,612,19.8543333333333
+24,613,19.6003333333333
+24,614,15.748
+24,615,24.0453333333333
+24,616,17.6953333333333
+24,617,21.9286666666667
+24,618,21.082
+24,619,13.843
+24,620,19.558
+24,621,20.2776666666667
+24,622,21.4206666666667
+24,623,26.1196666666667
+24,624,26.4583333333333
+24,625,16.8063333333333
+24,626,23.1986666666667
+24,627,22.6906666666667
+24,628,18.3303333333333
+24,629,17.526
+24,630,21.7593333333333
+24,631,16.9333333333333
+24,632,15.8326666666667
+24,633,17.9493333333333
+24,634,22.987
+24,635,19.7696666666667
+24,636,26.2043333333333
+24,637,18.8806666666667
+24,638,20.9126666666667
+24,639,23.114
+24,640,21.971
+24,641,19.2193333333333
+24,642,18.3303333333333
+24,643,22.1403333333333
+24,644,19.558
+24,645,16.8486666666667
+24,646,23.495
+24,647,18.9653333333333
+24,648,20.4893333333333
+24,649,19.8543333333333
+24,650,15.1976666666667
+24,651,16.383
+24,652,17.0603333333333
+24,653,23.4526666666667
+24,654,15.621
+24,655,18.542
+24,656,22.7753333333333
+24,657,24.257
+24,658,15.875
+24,659,23.8336666666667
+24,660,23.749
+24,661,22.9023333333333
+24,662,16.8063333333333
+24,663,15.3246666666667
+24,664,25.1036666666667
+24,665,13.462
+24,666,18.4996666666667
+24,667,26.2043333333333
+24,668,18.5843333333333
+24,669,23.368
+24,670,20.955
+24,671,24.13
+24,672,15.4516666666667
+24,673,26.2466666666667
+24,674,16.9333333333333
+24,675,26.3736666666667
+24,676,14.7743333333333
+24,677,14.5203333333333
+24,678,12.1496666666667
+24,679,19.431
+24,680,19.558
+24,681,18.9653333333333
+24,682,23.1563333333333
+24,683,20.0236666666667
+24,684,16.129
+24,685,15.7056666666667
+24,686,21.5053333333333
+24,687,21.3783333333333
+24,688,20.8703333333333
+24,689,22.0556666666667
+24,690,20.6586666666667
+24,691,19.3463333333333
+24,692,18.8806666666667
+24,693,21.4206666666667
+24,694,20.6586666666667
+24,695,27.813
+24,696,20.955
+24,697,17.1873333333333
+24,698,24.6803333333333
+24,699,24.003
+24,700,18.2456666666667
+24,701,24.2146666666667
+24,702,24.638
+24,703,23.7913333333333
+24,704,15.9173333333333
+24,705,17.5683333333333
+24,706,20.3623333333333
+24,707,17.7376666666667
+24,708,15.6633333333333
+24,709,20.8703333333333
+24,710,23.0293333333333
+24,711,21.5476666666667
+24,712,20.9973333333333
+24,713,22.4366666666667
+24,714,21.209
+24,715,23.4526666666667
+24,716,25.4846666666667
+24,717,19.6003333333333
+24,718,18.796
+24,719,16.764
+24,720,19.4733333333333
+24,721,21.0396666666667
+24,722,22.6483333333333
+24,723,21.717
+24,724,19.8543333333333
+24,725,18.796
+24,726,22.5636666666667
+24,727,23.1563333333333
+24,728,23.4526666666667
+24,729,19.558
+24,730,13.5466666666667
+24,731,22.6906666666667
+24,732,17.9916666666667
+24,733,18.542
+24,734,21.59
+24,735,19.4733333333333
+24,736,19.4733333333333
+24,737,25.9503333333333
+24,738,22.2673333333333
+24,739,21.0396666666667
+24,740,16.51
+24,741,21.5476666666667
+24,742,23.5373333333333
+24,743,21.2936666666667
+24,744,15.494
+24,745,24.384
+24,746,20.193
+24,747,15.5786666666667
+24,748,19.6003333333333
+24,749,22.9446666666667
+24,750,21.0396666666667
+24,751,21.971
+24,752,17.0603333333333
+24,753,19.3463333333333
+24,754,24.8073333333333
+24,755,18.0763333333333
+24,756,19.177
+24,757,20.7433333333333
+24,758,21.2936666666667
+24,759,19.812
+24,760,27.2203333333333
+24,761,25.4423333333333
+24,762,24.9766666666667
+24,763,19.812
+24,764,20.7856666666667
+24,765,19.4733333333333
+24,766,14.3086666666667
+24,767,21.336
+24,768,16.8063333333333
+24,769,25.4846666666667
+24,770,20.193
+24,771,18.8383333333333
+24,772,16.8486666666667
+24,773,20.1083333333333
+24,774,21.2513333333333
+24,775,21.5476666666667
+24,776,20.9126666666667
+24,777,24.8073333333333
+24,778,25.8233333333333
+24,779,26.2043333333333
+24,780,15.2823333333333
+24,781,18.8806666666667
+24,782,19.3886666666667
+24,783,17.8223333333333
+24,784,15.7903333333333
+24,785,18.542
+24,786,21.6323333333333
+24,787,17.1026666666667
+24,788,21.3783333333333
+24,789,14.478
+24,790,20.9973333333333
+24,791,26.67
+24,792,34.6286666666667
+24,793,16.0866666666667
+24,794,15.24
+24,795,22.1403333333333
+24,796,14.1393333333333
+24,797,18.1186666666667
+24,798,17.4836666666667
+24,799,19.0076666666667
+24,800,15.875
+24,801,19.177
+24,802,27.305
+24,803,19.177
+24,804,18.796
+24,805,23.9606666666667
+24,806,17.526
+24,807,16.8063333333333
+24,808,18.2033333333333
+24,809,20.7433333333333
+24,810,19.2616666666667
+24,811,24.257
+24,812,17.0603333333333
+24,813,22.5213333333333
+24,814,14.6473333333333
+24,815,18.669
+24,816,18.2456666666667
+24,817,15.875
+24,818,20.193
+24,819,21.59
+24,820,19.8543333333333
+24,821,17.145
+24,822,23.114
+24,823,20.193
+24,824,17.3566666666667
+24,825,16.8486666666667
+24,826,18.6266666666667
+24,827,19.1346666666667
+24,828,16.5946666666667
+24,829,19.2193333333333
+24,830,17.907
+24,831,29.5486666666667
+24,832,17.0603333333333
+24,833,16.891
+24,834,20.8703333333333
+24,835,19.431
+24,836,17.9493333333333
+24,837,18.923
+24,838,26.416
+24,839,18.4996666666667
+24,840,20.193
+24,841,19.2616666666667
+24,842,19.1346666666667
+24,843,25.5693333333333
+24,844,21.59
+24,845,22.86
+24,846,16.5946666666667
+24,847,15.0706666666667
+24,848,24.8073333333333
+24,849,24.6803333333333
+24,850,21.5476666666667
+24,851,20.4046666666667
+24,852,17.3143333333333
+24,853,21.1243333333333
+24,854,17.653
+24,855,22.0556666666667
+24,856,24.257
+24,857,29.2946666666667
+24,858,20.5316666666667
+24,859,26.3736666666667
+24,860,26.9663333333333
+24,861,20.4893333333333
+24,862,17.1873333333333
+24,863,26.416
+24,864,20.574
+24,865,26.8816666666667
+24,866,21.0396666666667
+24,867,16.8063333333333
+24,868,13.3773333333333
+24,869,31.242
+24,870,22.6483333333333
+24,871,19.6426666666667
+24,872,16.129
+24,873,16.1713333333333
+24,874,23.1563333333333
+24,875,17.653
+24,876,22.86
+24,877,18.8806666666667
+24,878,22.7753333333333
+24,879,26.289
+24,880,18.5843333333333
+24,881,20.193
+24,882,17.272
+24,883,23.749
+24,884,19.6426666666667
+24,885,19.7696666666667
+24,886,19.6426666666667
+24,887,25.3576666666667
+24,888,21.6746666666667
+24,889,29.2523333333333
+24,890,25.019
+24,891,22.3096666666667
+24,892,29.6756666666667
+24,893,17.1873333333333
+24,894,17.6106666666667
+24,895,18.0763333333333
+24,896,20.6163333333333
+24,897,23.9183333333333
+24,898,18.415
+24,899,17.8223333333333
+24,900,15.8326666666667
+24,901,13.1233333333333
+24,902,25.4423333333333
+24,903,19.3886666666667
+24,904,21.6746666666667
+24,905,23.0716666666667
+24,906,13.2503333333333
+24,907,17.399
+24,908,18.2456666666667
+24,909,22.1826666666667
+24,910,19.2193333333333
+24,911,20.2776666666667
+24,912,21.082
+24,913,18.161
+24,914,19.685
+24,915,18.288
+24,916,17.272
+24,917,17.272
+24,918,28.3633333333333
+24,919,21.717
+24,920,23.1563333333333
+24,921,15.6633333333333
+24,922,19.8966666666667
+24,923,24.511
+24,924,25.7386666666667
+24,925,19.6003333333333
+24,926,27.3473333333333
+24,927,23.876
+24,928,18.9653333333333
+24,929,20.9973333333333
+24,930,16.2983333333333
+24,931,28.9136666666667
+24,932,16.891
+24,933,17.018
+24,934,13.6736666666667
+24,935,18.8806666666667
+24,936,18.669
+24,937,18.8383333333333
+24,938,25.3576666666667
+24,939,20.9126666666667
+24,940,20.955
+24,941,20.9126666666667
+24,942,17.1873333333333
+24,943,18.3303333333333
+24,944,18.796
+24,945,25.527
+24,946,19.3463333333333
+24,947,18.2033333333333
+24,948,20.6586666666667
+24,949,24.13
+24,950,19.6426666666667
+24,951,16.1713333333333
+24,952,17.8223333333333
+24,953,23.5373333333333
+24,954,18.8383333333333
+24,955,21.6746666666667
+24,956,21.2513333333333
+24,957,18.1186666666667
+24,958,19.304
+24,959,20.066
+24,960,21.2513333333333
+24,961,16.6793333333333
+24,962,20.3623333333333
+24,963,20.4893333333333
+24,964,19.4733333333333
+24,965,19.8543333333333
+24,966,17.9493333333333
+24,967,27.305
+24,968,16.256
+24,969,27.813
+24,970,12.1496666666667
+24,971,24.5956666666667
+24,972,14.9436666666667
+24,973,20.701
+24,974,20.701
+24,975,16.4676666666667
+24,976,21.5476666666667
+24,977,26.67
+24,978,18.3303333333333
+24,979,17.907
+24,980,19.1346666666667
+24,981,14.9436666666667
+24,982,22.6483333333333
+24,983,16.5946666666667
+24,984,24.0876666666667
+24,985,16.764
+24,986,17.9916666666667
+24,987,30.3953333333333
+24,988,21.9286666666667
+24,989,17.145
+24,990,25.0613333333333
+24,991,27.5166666666667
+24,992,20.5316666666667
+24,993,28.1516666666667
+24,994,17.7376666666667
+24,995,20.9973333333333
+24,996,17.3143333333333
+24,997,25.781
+24,998,29.4216666666667
+24,999,20.1506666666667
+24,1000,24.257
+25,1,26.2466666666667
+25,2,24.13
+25,3,27.2203333333333
+25,4,20.3623333333333
+25,5,27.0086666666667
+25,6,32.9776666666667
+25,7,27.432
+25,8,28.0246666666667
+25,9,24.511
+25,10,28.3633333333333
+25,11,17.653
+25,12,24.5533333333333
+25,13,28.575
+25,14,22.987
+25,15,23.4103333333333
+25,16,35.179
+25,17,23.7913333333333
+25,18,28.956
+25,19,22.3096666666667
+25,20,20.4893333333333
+25,21,28.194
+25,22,22.098
+25,23,26.289
+25,24,32.131
+25,25,24.257
+25,26,28.8713333333333
+25,27,26.7123333333333
+25,28,27.432
+25,29,21.336
+25,30,29.083
+25,31,24.8073333333333
+25,32,31.1996666666667
+25,33,28.321
+25,34,28.448
+25,35,26.67
+25,36,28.702
+25,37,25.908
+25,38,27.7706666666667
+25,39,25.8233333333333
+25,40,22.3943333333333
+25,41,27.178
+25,42,31.9616666666667
+25,43,22.3943333333333
+25,44,28.575
+25,45,31.4536666666667
+25,46,29.2946666666667
+25,47,28.6173333333333
+25,48,26.6276666666667
+25,49,28.448
+25,50,27.7283333333333
+25,51,26.924
+25,52,24.5956666666667
+25,53,31.369
+25,54,30.48
+25,55,28.956
+25,56,25.781
+25,57,33.0623333333333
+25,58,30.9033333333333
+25,59,27.8553333333333
+25,60,28.7443333333333
+25,61,26.797
+25,62,24.765
+25,63,22.6483333333333
+25,64,26.8816666666667
+25,65,29.9296666666667
+25,66,25.9926666666667
+25,67,30.1413333333333
+25,68,25.6963333333333
+25,69,22.7753333333333
+25,70,26.035
+25,71,29.5063333333333
+25,72,28.6596666666667
+25,73,22.733
+25,74,25.8656666666667
+25,75,25.2306666666667
+25,76,26.3313333333333
+25,77,28.7443333333333
+25,78,31.496
+25,79,26.0773333333333
+25,80,33.3163333333333
+25,81,22.4366666666667
+25,82,23.5373333333333
+25,83,29.591
+25,84,26.1196666666667
+25,85,25.5693333333333
+25,86,28.448
+25,87,31.0726666666667
+25,88,24.9766666666667
+25,89,25.908
+25,90,25.3153333333333
+25,91,29.1676666666667
+25,92,25.019
+25,93,22.479
+25,94,27.6436666666667
+25,95,30.5646666666667
+25,96,31.496
+25,97,30.8186666666667
+25,98,25.527
+25,99,29.337
+25,100,25.6116666666667
+25,101,18.4996666666667
+25,102,22.2673333333333
+25,103,19.3463333333333
+25,104,24.13
+25,105,30.9456666666667
+25,106,22.1403333333333
+25,107,28.9136666666667
+25,108,28.5326666666667
+25,109,29.083
+25,110,25.4423333333333
+25,111,24.384
+25,112,24.0453333333333
+25,113,31.0726666666667
+25,114,26.3736666666667
+25,115,22.1826666666667
+25,116,26.8393333333333
+25,117,23.5373333333333
+25,118,23.9183333333333
+25,119,25.6963333333333
+25,120,30.4376666666667
+25,121,33.1046666666667
+25,122,27.2203333333333
+25,123,21.59
+25,124,26.035
+25,125,25.908
+25,126,28.1516666666667
+25,127,20.7856666666667
+25,128,22.4366666666667
+25,129,32.258
+25,130,27.813
+25,131,25.908
+25,132,29.972
+25,133,20.6163333333333
+25,134,26.7546666666667
+25,135,27.2626666666667
+25,136,23.7066666666667
+25,137,23.749
+25,138,30.3953333333333
+25,139,26.797
+25,140,23.622
+25,141,23.1986666666667
+25,142,24.384
+25,143,24.892
+25,144,28.575
+25,145,26.1196666666667
+25,146,24.765
+25,147,30.353
+25,148,24.9766666666667
+25,149,28.3633333333333
+25,150,23.2833333333333
+25,151,32.3426666666667
+25,152,30.353
+25,153,27.051
+25,154,27.051
+25,155,31.0303333333333
+25,156,20.955
+25,157,22.987
+25,158,26.0773333333333
+25,159,27.7706666666667
+25,160,27.1356666666667
+25,161,34.3746666666667
+25,162,26.5006666666667
+25,163,30.4376666666667
+25,164,29.3793333333333
+25,165,32.131
+25,166,27.2626666666667
+25,167,25.0613333333333
+25,168,23.0293333333333
+25,169,27.559
+25,170,24.3416666666667
+25,171,25.7386666666667
+25,172,22.733
+25,173,27.8553333333333
+25,174,25.6116666666667
+25,175,32.385
+25,176,28.0246666666667
+25,177,33.3586666666667
+25,178,21.9286666666667
+25,179,22.6483333333333
+25,180,25.7386666666667
+25,181,22.9446666666667
+25,182,26.5006666666667
+25,183,29.9296666666667
+25,184,28.067
+25,185,27.7706666666667
+25,186,25.8656666666667
+25,187,24.6803333333333
+25,188,23.5373333333333
+25,189,28.702
+25,190,28.2363333333333
+25,191,18.9653333333333
+25,192,25.146
+25,193,30.3953333333333
+25,194,22.2673333333333
+25,195,25.1036666666667
+25,196,26.1196666666667
+25,197,23.3256666666667
+25,198,24.5533333333333
+25,199,30.7763333333333
+25,200,23.368
+25,201,31.9616666666667
+25,202,21.4206666666667
+25,203,30.861
+25,204,29.972
+25,205,22.8176666666667
+25,206,27.0086666666667
+25,207,24.1723333333333
+25,208,29.7603333333333
+25,209,26.2043333333333
+25,210,28.0246666666667
+25,211,25.8233333333333
+25,212,26.035
+25,213,25.4846666666667
+25,214,25.1036666666667
+25,215,30.0566666666667
+25,216,29.9296666666667
+25,217,28.575
+25,218,31.7076666666667
+25,219,25.3576666666667
+25,220,22.0133333333333
+25,221,27.3473333333333
+25,222,28.6596666666667
+25,223,28.8713333333333
+25,224,21.717
+25,225,21.6323333333333
+25,226,24.8496666666667
+25,227,23.8336666666667
+25,228,23.749
+25,229,23.9606666666667
+25,230,21.5053333333333
+25,231,27.2203333333333
+25,232,27.0933333333333
+25,233,26.924
+25,234,26.035
+25,235,26.4583333333333
+25,236,18.9653333333333
+25,237,20.2776666666667
+25,238,22.352
+25,239,26.8816666666667
+25,240,25.273
+25,241,24.4263333333333
+25,242,30.9456666666667
+25,243,23.0293333333333
+25,244,25.1036666666667
+25,245,26.6276666666667
+25,246,24.9766666666667
+25,247,24.638
+25,248,23.495
+25,249,35.8986666666667
+25,250,32.9353333333333
+25,251,31.877
+25,252,21.1666666666667
+25,253,19.0923333333333
+25,254,25.019
+25,255,31.369
+25,256,27.813
+25,257,25.1036666666667
+25,258,29.464
+25,259,29.8026666666667
+25,260,24.8073333333333
+25,261,28.8713333333333
+25,262,29.2946666666667
+25,263,25.4846666666667
+25,264,25.0613333333333
+25,265,25.9926666666667
+25,266,26.797
+25,267,28.575
+25,268,24.638
+25,269,28.3633333333333
+25,270,25.527
+25,271,25.7386666666667
+25,272,25.1883333333333
+25,273,27.8976666666667
+25,274,38.4386666666667
+25,275,21.209
+25,276,26.4583333333333
+25,277,26.5006666666667
+25,278,31.0726666666667
+25,279,24.5956666666667
+25,280,29.8873333333333
+25,281,28.9136666666667
+25,282,23.5373333333333
+25,283,24.2993333333333
+25,284,21.2936666666667
+25,285,22.352
+25,286,27.6436666666667
+25,287,18.8383333333333
+25,288,28.067
+25,289,28.8713333333333
+25,290,25.908
+25,291,18.9653333333333
+25,292,26.797
+25,293,23.876
+25,294,27.3896666666667
+25,295,33.9936666666667
+25,296,25.8233333333333
+25,297,26.289
+25,298,23.9183333333333
+25,299,25.8233333333333
+25,300,29.0406666666667
+25,301,22.3943333333333
+25,302,29.845
+25,303,32.512
+25,304,23.5796666666667
+25,305,24.257
+25,306,28.0246666666667
+25,307,28.9136666666667
+25,308,21.9286666666667
+25,309,27.2626666666667
+25,310,23.495
+25,311,26.2466666666667
+25,312,31.75
+25,313,28.067
+25,314,22.9446666666667
+25,315,25.3576666666667
+25,316,27.4743333333333
+25,317,33.4433333333333
+25,318,25.7386666666667
+25,319,27.3473333333333
+25,320,24.4263333333333
+25,321,30.5646666666667
+25,322,26.8816666666667
+25,323,22.5213333333333
+25,324,28.067
+25,325,30.3106666666667
+25,326,33.2316666666667
+25,327,27.0086666666667
+25,328,29.5486666666667
+25,329,24.0453333333333
+25,330,33.6973333333333
+25,331,26.0773333333333
+25,332,28.4903333333333
+25,333,25.4
+25,334,27.5166666666667
+25,335,32.004
+25,336,23.4526666666667
+25,337,23.241
+25,338,23.7913333333333
+25,339,24.638
+25,340,24.6803333333333
+25,341,27.4743333333333
+25,342,22.3096666666667
+25,343,27.0933333333333
+25,344,35.814
+25,345,24.5956666666667
+25,346,29.2523333333333
+25,347,22.098
+25,348,28.8713333333333
+25,349,26.035
+25,350,30.099
+25,351,30.734
+25,352,31.7923333333333
+25,353,24.765
+25,354,26.8393333333333
+25,355,26.8393333333333
+25,356,31.623
+25,357,22.987
+25,358,21.717
+25,359,31.4113333333333
+25,360,27.2203333333333
+25,361,27.0086666666667
+25,362,29.4216666666667
+25,363,25.3576666666667
+25,364,35.052
+25,365,28.2786666666667
+25,366,20.066
+25,367,22.1826666666667
+25,368,31.3266666666667
+25,369,30.099
+25,370,24.384
+25,371,23.7066666666667
+25,372,25.1883333333333
+25,373,28.4056666666667
+25,374,24.638
+25,375,23.6643333333333
+25,376,26.162
+25,377,32.6813333333333
+25,378,26.289
+25,379,30.3106666666667
+25,380,26.5853333333333
+25,381,24.0453333333333
+25,382,25.3576666666667
+25,383,20.447
+25,384,27.2626666666667
+25,385,28.4903333333333
+25,386,28.575
+25,387,22.0556666666667
+25,388,30.0566666666667
+25,389,24.765
+25,390,20.193
+25,391,24.8073333333333
+25,392,28.2363333333333
+25,393,28.575
+25,394,27.178
+25,395,26.67
+25,396,25.1883333333333
+25,397,28.6173333333333
+25,398,27.8976666666667
+25,399,30.099
+25,400,28.9983333333333
+25,401,23.749
+25,402,22.479
+25,403,24.384
+25,404,29.464
+25,405,27.051
+25,406,28.702
+25,407,22.0556666666667
+25,408,28.2363333333333
+25,409,27.3473333333333
+25,410,25.9926666666667
+25,411,23.4103333333333
+25,412,25.019
+25,413,31.1573333333333
+25,414,23.3256666666667
+25,415,30.0143333333333
+25,416,24.5956666666667
+25,417,32.3003333333333
+25,418,24.0453333333333
+25,419,33.3586666666667
+25,420,24.4263333333333
+25,421,29.7603333333333
+25,422,26.035
+25,423,27.8976666666667
+25,424,24.003
+25,425,26.8816666666667
+25,426,21.3783333333333
+25,427,23.7066666666667
+25,428,24.5533333333333
+25,429,26.924
+25,430,31.75
+25,431,24.9766666666667
+25,432,24.8496666666667
+25,433,25.4423333333333
+25,434,33.401
+25,435,23.114
+25,436,23.241
+25,437,29.4216666666667
+25,438,19.3886666666667
+25,439,24.765
+25,440,24.2993333333333
+25,441,29.5486666666667
+25,442,23.749
+25,443,20.574
+25,444,20.9126666666667
+25,445,27.432
+25,446,28.9136666666667
+25,447,27.4743333333333
+25,448,29.7603333333333
+25,449,24.5956666666667
+25,450,24.003
+25,451,22.606
+25,452,30.5223333333333
+25,453,25.8656666666667
+25,454,31.0303333333333
+25,455,24.6803333333333
+25,456,24.2146666666667
+25,457,24.003
+25,458,28.9136666666667
+25,459,22.2673333333333
+25,460,26.5853333333333
+25,461,19.685
+25,462,31.2843333333333
+25,463,24.638
+25,464,22.225
+25,465,28.7443333333333
+25,466,28.4056666666667
+25,467,25.4423333333333
+25,468,25.9503333333333
+25,469,20.5316666666667
+25,470,28.0246666666667
+25,471,23.368
+25,472,30.5223333333333
+25,473,28.956
+25,474,27.051
+25,475,22.3943333333333
+25,476,27.813
+25,477,21.844
+25,478,32.6813333333333
+25,479,24.384
+25,480,21.209
+25,481,30.1836666666667
+25,482,24.511
+25,483,24.511
+25,484,29.845
+25,485,30.9033333333333
+25,486,32.3426666666667
+25,487,27.3473333333333
+25,488,25.781
+25,489,28.8713333333333
+25,490,29.3793333333333
+25,491,22.7753333333333
+25,492,32.8506666666667
+25,493,28.4056666666667
+25,494,26.67
+25,495,33.3163333333333
+25,496,27.5166666666667
+25,497,24.8073333333333
+25,498,25.4
+25,499,25.4
+25,500,28.0246666666667
+25,501,19.2193333333333
+25,502,31.0726666666667
+25,503,26.4583333333333
+25,504,25.019
+25,505,21.336
+25,506,25.146
+25,507,27.7706666666667
+25,508,28.4056666666667
+25,509,24.13
+25,510,25.8233333333333
+25,511,25.9503333333333
+25,512,28.4903333333333
+25,513,27.9823333333333
+25,514,29.4216666666667
+25,515,30.0566666666667
+25,516,33.3586666666667
+25,517,22.225
+25,518,28.2786666666667
+25,519,24.892
+25,520,20.828
+25,521,30.0143333333333
+25,522,21.7593333333333
+25,523,24.8073333333333
+25,524,32.5966666666667
+25,525,26.4583333333333
+25,526,31.1573333333333
+25,527,24.1723333333333
+25,528,22.86
+25,529,23.6643333333333
+25,530,22.1826666666667
+25,531,24.9766666666667
+25,532,34.9673333333333
+25,533,26.289
+25,534,28.702
+25,535,24.892
+25,536,27.178
+25,537,24.8073333333333
+25,538,27.686
+25,539,26.2043333333333
+25,540,28.194
+25,541,26.8393333333333
+25,542,24.765
+25,543,24.8073333333333
+25,544,29.6333333333333
+25,545,27.813
+25,546,23.9183333333333
+25,547,22.1826666666667
+25,548,31.115
+25,549,26.4583333333333
+25,550,24.4263333333333
+25,551,20.8703333333333
+25,552,30.7763333333333
+25,553,27.3473333333333
+25,554,25.908
+25,555,23.1986666666667
+25,556,33.401
+25,557,34.671
+25,558,24.511
+25,559,29.2946666666667
+25,560,29.21
+25,561,25.4846666666667
+25,562,21.0396666666667
+25,563,27.94
+25,564,27.2203333333333
+25,565,24.0453333333333
+25,566,21.1666666666667
+25,567,24.257
+25,568,25.8233333333333
+25,569,25.1883333333333
+25,570,19.8543333333333
+25,571,23.7913333333333
+25,572,28.321
+25,573,26.67
+25,574,30.5646666666667
+25,575,23.1563333333333
+25,576,28.4056666666667
+25,577,29.2523333333333
+25,578,28.8713333333333
+25,579,20.828
+25,580,27.8976666666667
+25,581,25.3153333333333
+25,582,24.2993333333333
+25,583,19.7696666666667
+25,584,22.5636666666667
+25,585,32.004
+25,586,23.9606666666667
+25,587,23.495
+25,588,31.4113333333333
+25,589,23.1563333333333
+25,590,20.701
+25,591,29.1253333333333
+25,592,22.8176666666667
+25,593,21.5053333333333
+25,594,22.5636666666667
+25,595,24.13
+25,596,27.8976666666667
+25,597,16.8063333333333
+25,598,27.8976666666667
+25,599,26.9663333333333
+25,600,23.7066666666667
+25,601,27.686
+25,602,24.384
+25,603,31.496
+25,604,29.5486666666667
+25,605,28.4903333333333
+25,606,23.8336666666667
+25,607,26.8393333333333
+25,608,27.178
+25,609,30.5223333333333
+25,610,27.1356666666667
+25,611,28.6596666666667
+25,612,26.3313333333333
+25,613,33.782
+25,614,27.3473333333333
+25,615,27.1356666666667
+25,616,20.9126666666667
+25,617,28.067
+25,618,26.3313333333333
+25,619,30.1413333333333
+25,620,28.1516666666667
+25,621,23.2833333333333
+25,622,27.6436666666667
+25,623,25.781
+25,624,29.083
+25,625,25.146
+25,626,28.6596666666667
+25,627,22.2673333333333
+25,628,26.035
+25,629,22.5213333333333
+25,630,29.7603333333333
+25,631,32.0886666666667
+25,632,25.2306666666667
+25,633,24.6803333333333
+25,634,27.432
+25,635,30.0143333333333
+25,636,23.495
+25,637,26.2466666666667
+25,638,21.6323333333333
+25,639,20.3623333333333
+25,640,25.6116666666667
+25,641,27.4743333333333
+25,642,24.2146666666667
+25,643,24.892
+25,644,25.4846666666667
+25,645,25.781
+25,646,28.1093333333333
+25,647,26.2466666666667
+25,648,26.543
+25,649,30.226
+25,650,23.2833333333333
+25,651,21.336
+25,652,22.5213333333333
+25,653,24.765
+25,654,30.5223333333333
+25,655,27.2203333333333
+25,656,20.9126666666667
+25,657,31.0726666666667
+25,658,23.1563333333333
+25,659,24.765
+25,660,26.8816666666667
+25,661,29.6756666666667
+25,662,30.734
+25,663,25.781
+25,664,27.432
+25,665,28.4056666666667
+25,666,19.685
+25,667,26.543
+25,668,26.8393333333333
+25,669,22.5213333333333
+25,670,34.8403333333333
+25,671,25.1036666666667
+25,672,31.9193333333333
+25,673,26.6276666666667
+25,674,30.9456666666667
+25,675,29.2946666666667
+25,676,18.6266666666667
+25,677,24.4263333333333
+25,678,25.5693333333333
+25,679,22.7753333333333
+25,680,28.7866666666667
+25,681,29.6333333333333
+25,682,24.0876666666667
+25,683,34.5863333333333
+25,684,21.2936666666667
+25,685,27.0086666666667
+25,686,22.352
+25,687,28.7866666666667
+25,688,24.1723333333333
+25,689,25.9926666666667
+25,690,27.178
+25,691,29.4216666666667
+25,692,31.3266666666667
+25,693,24.1723333333333
+25,694,30.5646666666667
+25,695,26.4583333333333
+25,696,32.9353333333333
+25,697,30.6493333333333
+25,698,30.0143333333333
+25,699,29.6756666666667
+25,700,25.0613333333333
+25,701,24.9343333333333
+25,702,26.2043333333333
+25,703,36.1526666666667
+25,704,21.5053333333333
+25,705,25.4423333333333
+25,706,23.114
+25,707,20.447
+25,708,32.385
+25,709,23.495
+25,710,28.9983333333333
+25,711,31.115
+25,712,26.3736666666667
+25,713,26.2466666666667
+25,714,26.162
+25,715,21.209
+25,716,31.0303333333333
+25,717,26.5853333333333
+25,718,26.543
+25,719,27.6436666666667
+25,720,22.3096666666667
+25,721,27.0086666666667
+25,722,27.2203333333333
+25,723,23.5796666666667
+25,724,25.273
+25,725,24.7226666666667
+25,726,19.3463333333333
+25,727,22.9023333333333
+25,728,31.9616666666667
+25,729,23.4103333333333
+25,730,24.5533333333333
+25,731,19.431
+25,732,24.6803333333333
+25,733,32.4273333333333
+25,734,20.3623333333333
+25,735,30.6493333333333
+25,736,21.9286666666667
+25,737,28.448
+25,738,30.0566666666667
+25,739,22.4366666666667
+25,740,30.226
+25,741,29.8873333333333
+25,742,27.305
+25,743,22.4366666666667
+25,744,27.7706666666667
+25,745,25.654
+25,746,23.1563333333333
+25,747,23.0293333333333
+25,748,31.8346666666667
+25,749,25.527
+25,750,23.2833333333333
+25,751,29.8026666666667
+25,752,33.4856666666667
+25,753,32.2156666666667
+25,754,26.3736666666667
+25,755,27.1356666666667
+25,756,24.0876666666667
+25,757,29.21
+25,758,25.1036666666667
+25,759,23.1563333333333
+25,760,22.0556666666667
+25,761,23.495
+25,762,25.2306666666667
+25,763,27.8553333333333
+25,764,25.5693333333333
+25,765,33.655
+25,766,31.0303333333333
+25,767,26.7123333333333
+25,768,27.7706666666667
+25,769,23.622
+25,770,27.5166666666667
+25,771,30.607
+25,772,27.1356666666667
+25,773,21.717
+25,774,29.5063333333333
+25,775,26.67
+25,776,23.114
+25,777,25.8656666666667
+25,778,29.1253333333333
+25,779,24.5956666666667
+25,780,25.654
+25,781,24.4263333333333
+25,782,26.8816666666667
+25,783,28.8713333333333
+25,784,26.543
+25,785,29.6333333333333
+25,786,26.8816666666667
+25,787,26.7546666666667
+25,788,27.8976666666667
+25,789,22.479
+25,790,20.8703333333333
+25,791,26.5006666666667
+25,792,24.8073333333333
+25,793,27.1356666666667
+25,794,21.717
+25,795,28.448
+25,796,27.7706666666667
+25,797,19.3463333333333
+25,798,28.4056666666667
+25,799,33.401
+25,800,31.9193333333333
+25,801,26.797
+25,802,22.8176666666667
+25,803,29.337
+25,804,24.5956666666667
+25,805,24.0876666666667
+25,806,28.7866666666667
+25,807,23.7913333333333
+25,808,21.4206666666667
+25,809,27.3473333333333
+25,810,23.749
+25,811,25.6963333333333
+25,812,22.5213333333333
+25,813,23.876
+25,814,20.9973333333333
+25,815,28.8713333333333
+25,816,24.7226666666667
+25,817,26.6276666666667
+25,818,25.8233333333333
+25,819,36.6606666666667
+25,820,28.194
+25,821,19.0923333333333
+25,822,30.4376666666667
+25,823,23.114
+25,824,21.971
+25,825,21.7593333333333
+25,826,23.1986666666667
+25,827,25.1883333333333
+25,828,25.6116666666667
+25,829,28.575
+25,830,25.2306666666667
+25,831,23.749
+25,832,21.971
+25,833,25.4846666666667
+25,834,26.289
+25,835,37.084
+25,836,31.496
+25,837,24.5956666666667
+25,838,23.7913333333333
+25,839,26.7123333333333
+25,840,26.5853333333333
+25,841,24.8073333333333
+25,842,30.9456666666667
+25,843,22.1403333333333
+25,844,22.9023333333333
+25,845,34.925
+25,846,27.3473333333333
+25,847,29.464
+25,848,31.623
+25,849,26.67
+25,850,30.9033333333333
+25,851,26.0773333333333
+25,852,23.622
+25,853,27.178
+25,854,22.4366666666667
+25,855,26.543
+25,856,26.289
+25,857,32.8506666666667
+25,858,27.0933333333333
+25,859,27.3473333333333
+25,860,25.6116666666667
+25,861,22.3943333333333
+25,862,30.1413333333333
+25,863,31.1996666666667
+25,864,25.1036666666667
+25,865,25.019
+25,866,20.1506666666667
+25,867,24.6803333333333
+25,868,25.9926666666667
+25,869,24.4263333333333
+25,870,24.638
+25,871,21.6746666666667
+25,872,27.2203333333333
+25,873,26.289
+25,874,28.7443333333333
+25,875,24.638
+25,876,20.5316666666667
+25,877,22.5636666666667
+25,878,30.2683333333333
+25,879,24.2993333333333
+25,880,23.7066666666667
+25,881,32.8083333333333
+25,882,21.8863333333333
+25,883,30.5223333333333
+25,884,26.924
+25,885,32.4273333333333
+25,886,26.3736666666667
+25,887,26.924
+25,888,24.765
+25,889,26.5853333333333
+25,890,26.289
+25,891,26.035
+25,892,23.241
+25,893,30.4376666666667
+25,894,27.1356666666667
+25,895,27.8976666666667
+25,896,26.5853333333333
+25,897,31.0726666666667
+25,898,24.13
+25,899,29.4216666666667
+25,900,23.368
+25,901,25.6116666666667
+25,902,31.7923333333333
+25,903,29.4216666666667
+25,904,22.6906666666667
+25,905,30.226
+25,906,27.8553333333333
+25,907,32.3426666666667
+25,908,25.019
+25,909,28.448
+25,910,26.67
+25,911,23.749
+25,912,27.5166666666667
+25,913,33.3586666666667
+25,914,30.2683333333333
+25,915,21.717
+25,916,22.6906666666667
+25,917,21.1666666666667
+25,918,24.0876666666667
+25,919,29.2946666666667
+25,920,25.4
+25,921,25.0613333333333
+25,922,21.209
+25,923,31.7923333333333
+25,924,29.21
+25,925,25.273
+25,926,28.4903333333333
+25,927,28.2786666666667
+25,928,30.353
+25,929,29.464
+25,930,20.8703333333333
+25,931,26.924
+25,932,30.988
+25,933,23.1563333333333
+25,934,27.0933333333333
+25,935,18.1186666666667
+25,936,27.813
+25,937,26.3313333333333
+25,938,27.559
+25,939,26.2043333333333
+25,940,19.304
+25,941,26.3313333333333
+25,942,27.4743333333333
+25,943,25.654
+25,944,25.1883333333333
+25,945,24.13
+25,946,27.5166666666667
+25,947,24.4263333333333
+25,948,25.019
+25,949,29.8873333333333
+25,950,25.4846666666667
+25,951,24.9343333333333
+25,952,31.496
+25,953,25.4846666666667
+25,954,26.543
+25,955,24.9766666666667
+25,956,28.5326666666667
+25,957,29.5486666666667
+25,958,27.3473333333333
+25,959,27.432
+25,960,22.5636666666667
+25,961,26.289
+25,962,27.6436666666667
+25,963,20.7856666666667
+25,964,34.036
+25,965,23.4526666666667
+25,966,26.7123333333333
+25,967,23.368
+25,968,25.6963333333333
+25,969,28.194
+25,970,23.6643333333333
+25,971,32.131
+25,972,24.5533333333333
+25,973,21.082
+25,974,23.1563333333333
+25,975,29.8873333333333
+25,976,30.607
+25,977,28.4056666666667
+25,978,37.719
+25,979,28.194
+25,980,27.7706666666667
+25,981,25.0613333333333
+25,982,23.0293333333333
+25,983,26.1196666666667
+25,984,28.1093333333333
+25,985,27.8976666666667
+25,986,26.3313333333333
+25,987,24.5533333333333
+25,988,30.3953333333333
+25,989,20.0236666666667
+25,990,25.781
+25,991,27.813
+25,992,22.8176666666667
+25,993,25.4423333333333
+25,994,23.5373333333333
+25,995,28.1516666666667
+25,996,23.5796666666667
+25,997,20.447
+25,998,21.1666666666667
+25,999,27.9823333333333
+25,1000,21.6746666666667
+26,1,30.5223333333333
+26,2,21.209
+26,3,26.2678333333333
+26,4,26.0561666666667
+26,5,25.3788333333333
+26,6,27.7706666666667
+26,7,23.749
+26,8,23.1775
+26,9,26.5006666666667
+26,10,22.6271666666667
+26,11,33.6973333333333
+26,12,21.6111666666667
+26,13,23.3256666666667
+26,14,33.1893333333333
+26,15,22.3308333333333
+26,16,20.0871666666667
+26,17,27.051
+26,18,21.6746666666667
+26,19,26.416
+26,20,21.4206666666667
+26,21,22.1615
+26,22,23.5585
+26,23,27.3261666666667
+26,24,22.2885
+26,25,21.5688333333333
+26,26,22.6271666666667
+26,27,23.1351666666667
+26,28,18.6266666666667
+26,29,22.8811666666667
+26,30,26.5006666666667
+26,31,22.1191666666667
+26,32,25.0401666666667
+26,33,20.0871666666667
+26,34,22.9658333333333
+26,35,26.0985
+26,36,22.6271666666667
+26,37,26.8816666666667
+26,38,20.6798333333333
+26,39,24.4686666666667
+26,40,22.987
+26,41,27.4531666666667
+26,42,27.0933333333333
+26,43,29.3793333333333
+26,44,26.924
+26,45,26.6488333333333
+26,46,26.5641666666667
+26,47,25.2095
+26,48,22.86
+26,49,25.6751666666667
+26,50,25.8656666666667
+26,51,20.8915
+26,52,25.781
+26,53,31.5806666666667
+26,54,28.194
+26,55,25.273
+26,56,26.8605
+26,57,25.8021666666667
+26,58,24.5956666666667
+26,59,27.94
+26,60,25.9503333333333
+26,61,24.9766666666667
+26,62,25.5693333333333
+26,63,26.9663333333333
+26,64,22.6906666666667
+26,65,23.5373333333333
+26,66,22.9446666666667
+26,67,24.1723333333333
+26,68,22.1403333333333
+26,69,23.1775
+26,70,20.9338333333333
+26,71,23.368
+26,72,25.4846666666667
+26,73,24.7438333333333
+26,74,27.7283333333333
+26,75,21.3783333333333
+26,76,28.6596666666667
+26,77,24.0241666666667
+26,78,25.7598333333333
+26,79,25.7386666666667
+26,80,24.2146666666667
+26,81,22.0133333333333
+26,82,24.511
+26,83,24.2358333333333
+26,84,27.0933333333333
+26,85,23.368
+26,86,24.1511666666667
+26,87,25.019
+26,88,26.797
+26,89,25.3365
+26,90,24.2993333333333
+26,91,22.6271666666667
+26,92,28.7866666666667
+26,93,25.4846666666667
+26,94,28.7866666666667
+26,95,21.6746666666667
+26,96,26.8816666666667
+26,97,25.2941666666667
+26,98,23.7701666666667
+26,99,23.749
+26,100,25.908
+26,101,27.7283333333333
+26,102,27.051
+26,103,23.7913333333333
+26,104,25.9291666666667
+26,105,26.3948333333333
+26,106,23.368
+26,107,28.0458333333333
+26,108,21.9498333333333
+26,109,17.9705
+26,110,26.8816666666667
+26,111,21.1243333333333
+26,112,19.9601666666667
+26,113,25.3365
+26,114,22.4366666666667
+26,115,21.2936666666667
+26,116,29.5063333333333
+26,117,25.9291666666667
+26,118,22.86
+26,119,24.9978333333333
+26,120,23.114
+26,121,22.9235
+26,122,25.9503333333333
+26,123,24.1723333333333
+26,124,25.3153333333333
+26,125,24.7226666666667
+26,126,24.7015
+26,127,25.1036666666667
+26,128,25.908
+26,129,26.9028333333333
+26,130,27.3685
+26,131,22.8388333333333
+26,132,23.9183333333333
+26,133,28.1516666666667
+26,134,23.8336666666667
+26,135,24.4686666666667
+26,136,26.2043333333333
+26,137,23.6643333333333
+26,138,23.495
+26,139,26.9663333333333
+26,140,27.0721666666667
+26,141,21.7593333333333
+26,142,24.5745
+26,143,26.6065
+26,144,19.7485
+26,145,17.9493333333333
+26,146,20.6375
+26,147,23.6643333333333
+26,148,24.5321666666667
+26,149,23.7066666666667
+26,150,21.844
+26,151,24.892
+26,152,22.8176666666667
+26,153,24.003
+26,154,23.495
+26,155,26.543
+26,156,21.7805
+26,157,19.7696666666667
+26,158,19.5368333333333
+26,159,23.495
+26,160,18.3726666666667
+26,161,30.988
+26,162,26.9875
+26,163,20.1083333333333
+26,164,19.0711666666667
+26,165,18.0763333333333
+26,166,21.6746666666667
+26,167,23.1986666666667
+26,168,21.3783333333333
+26,169,17.907
+26,170,23.7066666666667
+26,171,25.1883333333333
+26,172,25.8868333333333
+26,173,20.8915
+26,174,30.8398333333333
+26,175,24.8073333333333
+26,176,23.1986666666667
+26,177,21.7381666666667
+26,178,24.765
+26,179,20.5951666666667
+26,180,27.2626666666667
+26,181,24.4898333333333
+26,182,23.5796666666667
+26,183,22.8388333333333
+26,184,20.7221666666667
+26,185,23.0716666666667
+26,186,24.638
+26,187,21.971
+26,188,21.6746666666667
+26,189,25.8021666666667
+26,190,22.987
+26,191,25.781
+26,192,21.8228333333333
+26,193,25.019
+26,194,24.0453333333333
+26,195,22.098
+26,196,27.8765
+26,197,21.5688333333333
+26,198,22.4155
+26,199,24.1935
+26,200,24.1511666666667
+26,201,29.7391666666667
+26,202,25.2518333333333
+26,203,20.2353333333333
+26,204,24.8708333333333
+26,205,22.5636666666667
+26,206,26.1831666666667
+26,207,24.1935
+26,208,26.0138333333333
+26,209,23.6431666666667
+26,210,24.765
+26,211,17.0391666666667
+26,212,18.1398333333333
+26,213,17.1026666666667
+26,214,28.3845
+26,215,24.8285
+26,216,22.987
+26,217,19.8755
+26,218,31.1573333333333
+26,219,17.6318333333333
+26,220,22.4155
+26,221,20.9338333333333
+26,222,27.5801666666667
+26,223,21.1031666666667
+26,224,20.8068333333333
+26,225,23.5796666666667
+26,226,22.1615
+26,227,20.0448333333333
+26,228,23.6008333333333
+26,229,22.1191666666667
+26,230,24.5956666666667
+26,231,24.7861666666667
+26,232,23.6008333333333
+26,233,25.0613333333333
+26,234,32.893
+26,235,26.289
+26,236,21.7805
+26,237,21.9498333333333
+26,238,20.6586666666667
+26,239,22.3731666666667
+26,240,24.1088333333333
+26,241,24.7438333333333
+26,242,25.2941666666667
+26,243,26.5853333333333
+26,244,16.2771666666667
+26,245,20.5316666666667
+26,246,21.4841666666667
+26,247,21.1666666666667
+26,248,25.1036666666667
+26,249,24.13
+26,250,29.2946666666667
+26,251,24.6803333333333
+26,252,27.1568333333333
+26,253,29.1253333333333
+26,254,24.1723333333333
+26,255,23.8548333333333
+26,256,22.5001666666667
+26,257,20.2776666666667
+26,258,26.797
+26,259,27.0298333333333
+26,260,29.464
+26,261,24.8496666666667
+26,262,27.8976666666667
+26,263,21.5265
+26,264,24.8073333333333
+26,265,20.193
+26,266,22.2461666666667
+26,267,21.9498333333333
+26,268,21.2513333333333
+26,269,29.8661666666667
+26,270,23.6008333333333
+26,271,25.3153333333333
+26,272,26.3101666666667
+26,273,25.2306666666667
+26,274,30.0355
+26,275,26.1196666666667
+26,276,28.2998333333333
+26,277,23.2621666666667
+26,278,21.0396666666667
+26,279,25.9715
+26,280,22.5001666666667
+26,281,22.1191666666667
+26,282,17.6106666666667
+26,283,23.7701666666667
+26,284,28.067
+26,285,22.0556666666667
+26,286,29.21
+26,287,21.5476666666667
+26,288,28.7866666666667
+26,289,24.9766666666667
+26,290,27.7283333333333
+26,291,27.1145
+26,292,23.4103333333333
+26,293,25.6751666666667
+26,294,25.9503333333333
+26,295,25.3365
+26,296,28.3421666666667
+26,297,25.146
+26,298,25.7386666666667
+26,299,24.5321666666667
+26,300,23.9818333333333
+26,301,19.9813333333333
+26,302,27.3685
+26,303,28.2998333333333
+26,304,23.0928333333333
+26,305,22.9235
+26,306,24.3205
+26,307,24.7861666666667
+26,308,25.6751666666667
+26,309,24.9343333333333
+26,310,25.8868333333333
+26,311,20.0236666666667
+26,312,24.0665
+26,313,28.4903333333333
+26,314,20.2565
+26,315,23.6431666666667
+26,316,23.749
+26,317,26.4371666666667
+26,318,20.2141666666667
+26,319,19.3251666666667
+26,320,23.6431666666667
+26,321,19.6003333333333
+26,322,23.8336666666667
+26,323,21.1878333333333
+26,324,21.3571666666667
+26,325,24.1088333333333
+26,326,22.6695
+26,327,26.797
+26,328,21.6111666666667
+26,329,22.4578333333333
+26,330,21.971
+26,331,24.1723333333333
+26,332,24.2358333333333
+26,333,22.2673333333333
+26,334,23.6643333333333
+26,335,20.8915
+26,336,25.8656666666667
+26,337,23.876
+26,338,25.1248333333333
+26,339,23.749
+26,340,24.0453333333333
+26,341,27.0086666666667
+26,342,22.4366666666667
+26,343,22.3943333333333
+26,344,18.7748333333333
+26,345,24.7226666666667
+26,346,22.8388333333333
+26,347,20.3411666666667
+26,348,29.3158333333333
+26,349,26.3101666666667
+26,350,18.8171666666667
+26,351,29.9296666666667
+26,352,20.9973333333333
+26,353,22.3096666666667
+26,354,26.1196666666667
+26,355,24.0665
+26,356,23.4526666666667
+26,357,23.0505
+26,358,24.765
+26,359,26.6276666666667
+26,360,26.6911666666667
+26,361,27.0933333333333
+26,362,30.3741666666667
+26,363,19.7696666666667
+26,364,20.0236666666667
+26,365,24.9766666666667
+26,366,23.3468333333333
+26,367,21.2936666666667
+26,368,27.432
+26,369,29.4005
+26,370,23.9183333333333
+26,371,21.971
+26,372,20.0025
+26,373,23.749
+26,374,24.1088333333333
+26,375,28.956
+26,376,19.8755
+26,377,25.273
+26,378,22.3096666666667
+26,379,23.0293333333333
+26,380,24.8708333333333
+26,381,29.1465
+26,382,30.8186666666667
+26,383,20.9973333333333
+26,384,21.209
+26,385,27.0721666666667
+26,386,27.8976666666667
+26,387,21.5265
+26,388,23.749
+26,389,26.7335
+26,390,19.7485
+26,391,24.13
+26,392,20.0025
+26,393,20.3411666666667
+26,394,23.0716666666667
+26,395,26.5006666666667
+26,396,21.7805
+26,397,23.8971666666667
+26,398,20.6586666666667
+26,399,25.8656666666667
+26,400,26.6911666666667
+26,401,24.5956666666667
+26,402,20.9761666666667
+26,403,20.2776666666667
+26,404,31.7923333333333
+26,405,30.9033333333333
+26,406,26.0773333333333
+26,407,23.3891666666667
+26,408,29.5486666666667
+26,409,30.353
+26,410,25.019
+26,411,21.8651666666667
+26,412,24.2358333333333
+26,413,26.797
+26,414,19.3886666666667
+26,415,30.6281666666667
+26,416,21.0608333333333
+26,417,25.4846666666667
+26,418,22.6271666666667
+26,419,20.6586666666667
+26,420,29.337
+26,421,25.2518333333333
+26,422,29.718
+26,423,18.6478333333333
+26,424,24.5533333333333
+26,425,21.209
+26,426,23.8548333333333
+26,427,24.7226666666667
+26,428,21.1878333333333
+26,429,23.0293333333333
+26,430,24.003
+26,431,20.2141666666667
+26,432,18.4573333333333
+26,433,23.4738333333333
+26,434,30.0566666666667
+26,435,23.2833333333333
+26,436,23.9606666666667
+26,437,26.67
+26,438,25.2306666666667
+26,439,29.8873333333333
+26,440,23.7913333333333
+26,441,24.7438333333333
+26,442,24.1723333333333
+26,443,24.4686666666667
+26,444,20.955
+26,445,23.4738333333333
+26,446,25.9926666666667
+26,447,25.8021666666667
+26,448,23.7913333333333
+26,449,31.6653333333333
+26,450,24.6168333333333
+26,451,29.8873333333333
+26,452,24.7226666666667
+26,453,21.5688333333333
+26,454,28.2786666666667
+26,455,25.4635
+26,456,22.5001666666667
+26,457,24.1723333333333
+26,458,22.6906666666667
+26,459,21.5053333333333
+26,460,20.9338333333333
+26,461,26.3313333333333
+26,462,25.4635
+26,463,24.4051666666667
+26,464,25.4635
+26,465,19.6215
+26,466,28.1728333333333
+26,467,26.7335
+26,468,22.9023333333333
+26,469,20.8703333333333
+26,470,22.5636666666667
+26,471,27.0298333333333
+26,472,31.9616666666667
+26,473,22.0768333333333
+26,474,26.7123333333333
+26,475,27.7706666666667
+26,476,28.0035
+26,477,23.5796666666667
+26,478,26.7758333333333
+26,479,19.2193333333333
+26,480,26.9663333333333
+26,481,23.368
+26,482,24.892
+26,483,20.9126666666667
+26,484,25.5058333333333
+26,485,24.8496666666667
+26,486,28.4056666666667
+26,487,20.9761666666667
+26,488,20.9973333333333
+26,489,22.8176666666667
+26,490,20.7645
+26,491,25.0613333333333
+26,492,24.9343333333333
+26,493,26.6911666666667
+26,494,19.2828333333333
+26,495,21.9075
+26,496,23.5796666666667
+26,497,30.988
+26,498,25.1883333333333
+26,499,26.7335
+26,500,24.5956666666667
+26,501,22.5636666666667
+26,502,24.0453333333333
+26,503,26.5853333333333
+26,504,21.1455
+26,505,26.5006666666667
+26,506,21.9286666666667
+26,507,23.2833333333333
+26,508,23.3468333333333
+26,509,19.05
+26,510,21.6323333333333
+26,511,22.6906666666667
+26,512,28.575
+26,513,29.1041666666667
+26,514,26.8393333333333
+26,515,20.4681666666667
+26,516,27.7706666666667
+26,517,26.1831666666667
+26,518,23.5585
+26,519,24.4686666666667
+26,520,29.21
+26,521,29.0195
+26,522,23.114
+26,523,19.1558333333333
+26,524,23.8125
+26,525,29.8238333333333
+26,526,25.8868333333333
+26,527,23.3256666666667
+26,528,21.6746666666667
+26,529,28.2786666666667
+26,530,22.0556666666667
+26,531,26.2678333333333
+26,532,23.3045
+26,533,24.8708333333333
+26,534,27.1568333333333
+26,535,24.1511666666667
+26,536,28.6173333333333
+26,537,17.8223333333333
+26,538,24.13
+26,539,19.3886666666667
+26,540,27.4108333333333
+26,541,24.6168333333333
+26,542,28.9983333333333
+26,543,22.8176666666667
+26,544,24.8073333333333
+26,545,23.9606666666667
+26,546,21.0608333333333
+26,547,23.241
+26,548,26.162
+26,549,21.6111666666667
+26,550,25.5481666666667
+26,551,21.4418333333333
+26,552,20.9338333333333
+26,553,22.0133333333333
+26,554,24.6803333333333
+26,555,28.5326666666667
+26,556,24.5956666666667
+26,557,25.9503333333333
+26,558,27.813
+26,559,25.6328333333333
+26,560,25.019
+26,561,24.638
+26,562,24.384
+26,563,27.7495
+26,564,26.7758333333333
+26,565,24.4686666666667
+26,566,18.6478333333333
+26,567,24.1088333333333
+26,568,27.9188333333333
+26,569,24.0453333333333
+26,570,20.5316666666667
+26,571,28.702
+26,572,22.3308333333333
+26,573,22.987
+26,574,23.8548333333333
+26,575,20.8703333333333
+26,576,22.0556666666667
+26,577,24.4686666666667
+26,578,23.4315
+26,579,24.6803333333333
+26,580,19.9601666666667
+26,581,25.5481666666667
+26,582,31.3266666666667
+26,583,27.559
+26,584,18.4996666666667
+26,585,25.7175
+26,586,26.9663333333333
+26,587,26.7758333333333
+26,588,28.448
+26,589,25.9715
+26,590,27.7071666666667
+26,591,21.8651666666667
+26,592,26.1196666666667
+26,593,27.6436666666667
+26,594,21.9075
+26,595,25.4846666666667
+26,596,22.3096666666667
+26,597,31.1573333333333
+26,598,30.9033333333333
+26,599,24.7226666666667
+26,600,22.5213333333333
+26,601,25.2306666666667
+26,602,29.9931666666667
+26,603,22.5213333333333
+26,604,21.5053333333333
+26,605,17.3778333333333
+26,606,26.8393333333333
+26,607,19.431
+26,608,23.2198333333333
+26,609,22.2461666666667
+26,610,19.0923333333333
+26,611,20.2141666666667
+26,612,24.5956666666667
+26,613,26.3736666666667
+26,614,19.431
+26,615,26.035
+26,616,21.082
+26,617,19.7485
+26,618,24.1723333333333
+26,619,23.749
+26,620,24.384
+26,621,22.225
+26,622,23.5373333333333
+26,623,24.9555
+26,624,24.003
+26,625,26.2466666666667
+26,626,22.733
+26,627,23.9183333333333
+26,628,27.8553333333333
+26,629,26.7546666666667
+26,630,27.0933333333333
+26,631,28.2363333333333
+26,632,22.098
+26,633,20.5951666666667
+26,634,21.6323333333333
+26,635,22.0556666666667
+26,636,26.3948333333333
+26,637,28.0246666666667
+26,638,22.9235
+26,639,20.4681666666667
+26,640,23.8125
+26,641,27.0298333333333
+26,642,22.0556666666667
+26,643,19.0076666666667
+26,644,23.6855
+26,645,23.4526666666667
+26,646,24.13
+26,647,21.971
+26,648,31.0091666666667
+26,649,26.543
+26,650,22.2461666666667
+26,651,30.1836666666667
+26,652,25.0401666666667
+26,653,26.3948333333333
+26,654,23.6008333333333
+26,655,21.6746666666667
+26,656,25.9715
+26,657,24.7438333333333
+26,658,24.0241666666667
+26,659,21.9286666666667
+26,660,18.8383333333333
+26,661,21.1455
+26,662,28.0035
+26,663,24.2993333333333
+26,664,24.13
+26,665,24.5321666666667
+26,666,23.8336666666667
+26,667,18.6055
+26,668,28.7231666666667
+26,669,23.1563333333333
+26,670,26.416
+26,671,19.3463333333333
+26,672,31.5383333333333
+26,673,29.1888333333333
+26,674,24.0453333333333
+26,675,25.1883333333333
+26,676,22.6695
+26,677,25.273
+26,678,20.5316666666667
+26,679,23.876
+26,680,26.5853333333333
+26,681,24.7226666666667
+26,682,20.3623333333333
+26,683,25.6328333333333
+26,684,26.7123333333333
+26,685,23.0928333333333
+26,686,23.1986666666667
+26,687,28.5115
+26,688,25.8233333333333
+26,689,24.892
+26,690,26.3101666666667
+26,691,22.1615
+26,692,28.1093333333333
+26,693,25.8021666666667
+26,694,29.0195
+26,695,25.1036666666667
+26,696,26.2255
+26,697,23.1351666666667
+26,698,25.019
+26,699,25.273
+26,700,22.225
+26,701,26.0985
+26,702,29.1041666666667
+26,703,22.2673333333333
+26,704,23.7701666666667
+26,705,21.209
+26,706,26.924
+26,707,22.0768333333333
+26,708,25.6116666666667
+26,709,23.8336666666667
+26,710,24.7861666666667
+26,711,22.9235
+26,712,16.9968333333333
+26,713,21.3148333333333
+26,714,30.8398333333333
+26,715,24.7438333333333
+26,716,22.3731666666667
+26,717,18.8806666666667
+26,718,22.6483333333333
+26,719,28.7866666666667
+26,720,21.0185
+26,721,27.9823333333333
+26,722,26.5006666666667
+26,723,25.8021666666667
+26,724,25.9926666666667
+26,725,25.8656666666667
+26,726,30.5646666666667
+26,727,20.6163333333333
+26,728,25.654
+26,729,28.3633333333333
+26,730,26.1196666666667
+26,731,32.766
+26,732,25.019
+26,733,20.9126666666667
+26,734,20.7221666666667
+26,735,22.8811666666667
+26,736,17.8435
+26,737,20.0448333333333
+26,738,24.2146666666667
+26,739,21.2513333333333
+26,740,25.527
+26,741,26.0561666666667
+26,742,22.7965
+26,743,20.2141666666667
+26,744,26.3525
+26,745,28.8501666666667
+26,746,18.8171666666667
+26,747,18.6266666666667
+26,748,25.6751666666667
+26,749,21.5265
+26,750,28.9983333333333
+26,751,22.2461666666667
+26,752,27.2203333333333
+26,753,23.4738333333333
+26,754,23.3891666666667
+26,755,22.3096666666667
+26,756,22.9023333333333
+26,757,22.606
+26,758,22.0556666666667
+26,759,27.5166666666667
+26,760,25.8868333333333
+26,761,22.86
+26,762,28.7443333333333
+26,763,23.3256666666667
+26,764,21.5476666666667
+26,765,26.3101666666667
+26,766,26.2255
+26,767,20.9973333333333
+26,768,26.0773333333333
+26,769,27.3896666666667
+26,770,26.8393333333333
+26,771,22.2673333333333
+26,772,27.051
+26,773,26.4583333333333
+26,774,23.0505
+26,775,22.5001666666667
+26,776,24.892
+26,777,20.066
+26,778,24.7438333333333
+26,779,28.6173333333333
+26,780,28.5538333333333
+26,781,26.2043333333333
+26,782,23.4103333333333
+26,783,20.6375
+26,784,22.1615
+26,785,30.1625
+26,786,22.3308333333333
+26,787,26.1196666666667
+26,788,28.8713333333333
+26,789,19.685
+26,790,24.9131666666667
+26,791,26.035
+26,792,18.2668333333333
+26,793,22.4366666666667
+26,794,21.4206666666667
+26,795,25.8233333333333
+26,796,28.8501666666667
+26,797,21.1243333333333
+26,798,21.7805
+26,799,27.4743333333333
+26,800,24.9343333333333
+26,801,22.6271666666667
+26,802,25.4423333333333
+26,803,25.4635
+26,804,24.1935
+26,805,25.5481666666667
+26,806,23.749
+26,807,21.1243333333333
+26,808,24.9766666666667
+26,809,27.4743333333333
+26,810,24.8073333333333
+26,811,22.1191666666667
+26,812,20.955
+26,813,26.6911666666667
+26,814,22.8388333333333
+26,815,29.1676666666667
+26,816,27.8553333333333
+26,817,27.7918333333333
+26,818,25.781
+26,819,26.3948333333333
+26,820,23.8971666666667
+26,821,23.6431666666667
+26,822,22.2461666666667
+26,823,23.9395
+26,824,25.3788333333333
+26,825,22.5425
+26,826,25.8233333333333
+26,827,26.6276666666667
+26,828,24.5533333333333
+26,829,21.463
+26,830,22.5848333333333
+26,831,20.447
+26,832,22.225
+26,833,23.7066666666667
+26,834,28.6173333333333
+26,835,22.0556666666667
+26,836,20.8703333333333
+26,837,24.2146666666667
+26,838,23.0293333333333
+26,839,24.7226666666667
+26,840,29.7815
+26,841,23.3045
+26,842,28.067
+26,843,23.1563333333333
+26,844,21.8863333333333
+26,845,24.1723333333333
+26,846,20.1506666666667
+26,847,25.3576666666667
+26,848,25.0401666666667
+26,849,20.4681666666667
+26,850,21.336
+26,851,24.6803333333333
+26,852,26.4583333333333
+26,853,20.193
+26,854,28.9771666666667
+26,855,22.5636666666667
+26,856,21.6958333333333
+26,857,28.2151666666667
+26,858,23.0293333333333
+26,859,21.6535
+26,860,21.3783333333333
+26,861,22.9235
+26,862,23.3468333333333
+26,863,23.749
+26,864,24.8496666666667
+26,865,28.829
+26,866,24.3628333333333
+26,867,27.9823333333333
+26,868,22.7541666666667
+26,869,27.6436666666667
+26,870,20.2988333333333
+26,871,21.971
+26,872,28.8078333333333
+26,873,23.1775
+26,874,24.7861666666667
+26,875,34.2053333333333
+26,876,22.6906666666667
+26,877,22.86
+26,878,18.7325
+26,879,23.622
+26,880,23.7701666666667
+26,881,27.2626666666667
+26,882,21.0185
+26,883,18.7325
+26,884,21.0608333333333
+26,885,25.6963333333333
+26,886,25.7598333333333
+26,887,23.4103333333333
+26,888,25.527
+26,889,22.0133333333333
+26,890,28.4268333333333
+26,891,25.1248333333333
+26,892,21.8228333333333
+26,893,29.4216666666667
+26,894,25.4211666666667
+26,895,25.8021666666667
+26,896,20.2353333333333
+26,897,25.2941666666667
+26,898,28.3845
+26,899,30.6493333333333
+26,900,26.797
+26,901,25.7386666666667
+26,902,22.9658333333333
+26,903,26.6911666666667
+26,904,20.955
+26,905,25.7386666666667
+26,906,23.876
+26,907,22.5001666666667
+26,908,30.988
+26,909,23.6855
+26,910,23.6008333333333
+26,911,20.5528333333333
+26,912,22.733
+26,913,24.0876666666667
+26,914,24.7438333333333
+26,915,21.4418333333333
+26,916,22.098
+26,917,28.5538333333333
+26,918,28.8925
+26,919,23.7701666666667
+26,920,23.7066666666667
+26,921,26.6065
+26,922,22.7753333333333
+26,923,22.1615
+26,924,21.0608333333333
+26,925,24.7438333333333
+26,926,28.4903333333333
+26,927,21.6746666666667
+26,928,23.8971666666667
+26,929,22.5636666666667
+26,930,21.7593333333333
+26,931,23.241
+26,932,21.1243333333333
+26,933,23.8336666666667
+26,934,24.4263333333333
+26,935,19.8331666666667
+26,936,22.225
+26,937,23.1351666666667
+26,938,21.6746666666667
+26,939,21.8228333333333
+26,940,24.9131666666667
+26,941,21.1031666666667
+26,942,25.781
+26,943,22.7118333333333
+26,944,22.3731666666667
+26,945,23.8125
+26,946,29.083
+26,947,19.0923333333333
+26,948,21.844
+26,949,23.7278333333333
+26,950,17.2931666666667
+26,951,18.7325
+26,952,21.082
+26,953,23.1986666666667
+26,954,29.845
+26,955,25.7598333333333
+26,956,23.4526666666667
+26,957,23.0505
+26,958,18.8383333333333
+26,959,24.765
+26,960,22.3731666666667
+26,961,21.2936666666667
+26,962,24.4051666666667
+26,963,24.2358333333333
+26,964,21.2725
+26,965,22.7118333333333
+26,966,23.4738333333333
+26,967,23.5373333333333
+26,968,28.2151666666667
+26,969,21.209
+26,970,25.273
+26,971,24.9766666666667
+26,972,28.0035
+26,973,26.1831666666667
+26,974,24.511
+26,975,22.4155
+26,976,25.7386666666667
+26,977,26.6488333333333
+26,978,28.448
+26,979,18.0763333333333
+26,980,22.2885
+26,981,18.9441666666667
+26,982,28.321
+26,983,25.4635
+26,984,23.6855
+26,985,25.5693333333333
+26,986,26.9663333333333
+26,987,23.9395
+26,988,20.0236666666667
+26,989,25.4846666666667
+26,990,24.1088333333333
+26,991,24.9555
+26,992,24.4051666666667
+26,993,24.6168333333333
+26,994,24.765
+26,995,27.6013333333333
+26,996,20.9973333333333
+26,997,23.2833333333333
+26,998,26.6488333333333
+26,999,21.8228333333333
+26,1000,21.9075
+27,1,34.798
+27,2,25.654
+27,3,34.4381666666667
+27,4,37.592
+27,5,32.385
+27,6,33.3798333333333
+27,7,27.4955
+27,8,24.7438333333333
+27,9,32.4061666666667
+27,10,33.0623333333333
+27,11,29.9508333333333
+27,12,33.9725
+27,13,31.496
+27,14,26.8393333333333
+27,15,35.5388333333333
+27,16,28.8501666666667
+27,17,30.099
+27,18,29.0618333333333
+27,19,32.2156666666667
+27,20,34.3323333333333
+27,21,29.6121666666667
+27,22,26.3101666666667
+27,23,29.337
+27,24,32.4908333333333
+27,25,29.21
+27,26,20.2353333333333
+27,27,29.8661666666667
+27,28,32.8506666666667
+27,29,34.7133333333333
+27,30,29.6968333333333
+27,31,27.1145
+27,32,28.448
+27,33,37.2321666666667
+27,34,33.02
+27,35,31.9405
+27,36,27.1145
+27,37,25.4635
+27,38,32.0463333333333
+27,39,25.908
+27,40,29.3158333333333
+27,41,25.5058333333333
+27,42,27.9823333333333
+27,43,30.2683333333333
+27,44,24.9555
+27,45,23.8336666666667
+27,46,27.6013333333333
+27,47,34.7345
+27,48,35.4753333333333
+27,49,29.6968333333333
+27,50,24.13
+27,51,33.1893333333333
+27,52,27.305
+27,53,28.956
+27,54,27.3896666666667
+27,55,29.9296666666667
+27,56,34.8191666666667
+27,57,26.7546666666667
+27,58,33.5915
+27,59,32.4696666666667
+27,60,30.7551666666667
+27,61,32.258
+27,62,33.3586666666667
+27,63,29.0406666666667
+27,64,32.4908333333333
+27,65,27.9188333333333
+27,66,28.7443333333333
+27,67,36.1315
+27,68,31.7923333333333
+27,69,34.163
+27,70,28.2363333333333
+27,71,26.4583333333333
+27,72,30.861
+27,73,32.8506666666667
+27,74,23.0293333333333
+27,75,32.6813333333333
+27,76,24.4898333333333
+27,77,26.8181666666667
+27,78,33.3586666666667
+27,79,26.5853333333333
+27,80,31.115
+27,81,31.0726666666667
+27,82,34.1841666666667
+27,83,31.3055
+27,84,31.6865
+27,85,29.4005
+27,86,29.4428333333333
+27,87,33.2951666666667
+27,88,34.0571666666667
+27,89,28.0246666666667
+27,90,29.4005
+27,91,29.1888333333333
+27,92,31.3266666666667
+27,93,25.5481666666667
+27,94,29.972
+27,95,35.1366666666667
+27,96,31.496
+27,97,27.7283333333333
+27,98,29.5698333333333
+27,99,29.1676666666667
+27,100,36.322
+27,101,35.5176666666667
+27,102,27.686
+27,103,35.3271666666667
+27,104,32.0886666666667
+27,105,30.8186666666667
+27,106,33.02
+27,107,30.2471666666667
+27,108,27.1145
+27,109,23.9183333333333
+27,110,42.1851666666667
+27,111,27.051
+27,112,29.8661666666667
+27,113,26.9663333333333
+27,114,27.94
+27,115,24.765
+27,116,29.7815
+27,117,30.1625
+27,118,31.2843333333333
+27,119,30.9668333333333
+27,120,34.036
+27,121,30.7128333333333
+27,122,30.5223333333333
+27,123,26.9875
+27,124,25.4
+27,125,35.7293333333333
+27,126,31.0726666666667
+27,127,29.21
+27,128,34.9673333333333
+27,129,25.1036666666667
+27,130,24.9766666666667
+27,131,32.0886666666667
+27,132,33.274
+27,133,28.8925
+27,134,33.3163333333333
+27,135,28.0881666666667
+27,136,32.004
+27,137,30.9033333333333
+27,138,28.5961666666667
+27,139,33.782
+27,140,32.9988333333333
+27,141,27.4108333333333
+27,142,29.2735
+27,143,35.3695
+27,144,28.194
+27,145,31.623
+27,146,33.4645
+27,147,32.6813333333333
+27,148,24.5956666666667
+27,149,26.6276666666667
+27,150,28.448
+27,151,33.2528333333333
+27,152,24.638
+27,153,37.6131666666667
+27,154,27.94
+27,155,31.115
+27,156,26.9028333333333
+27,157,29.2946666666667
+27,158,32.0675
+27,159,29.21
+27,160,29.2311666666667
+27,161,31.1996666666667
+27,162,33.909
+27,163,30.6705
+27,164,32.131
+27,165,26.289
+27,166,33.8666666666667
+27,167,33.5491666666667
+27,168,27.9188333333333
+27,169,32.6813333333333
+27,170,31.9616666666667
+27,171,34.2053333333333
+27,172,38.3328333333333
+27,173,26.4795
+27,174,31.9828333333333
+27,175,29.2523333333333
+27,176,31.4325
+27,177,30.9033333333333
+27,178,25.7386666666667
+27,179,27.6436666666667
+27,180,24.13
+27,181,29.5698333333333
+27,182,30.4376666666667
+27,183,31.2631666666667
+27,184,31.7711666666667
+27,185,27.94
+27,186,26.543
+27,187,32.7025
+27,188,34.1418333333333
+27,189,28.7443333333333
+27,190,35.0731666666667
+27,191,31.6441666666667
+27,192,25.654
+27,193,31.2631666666667
+27,194,27.432
+27,195,35.433
+27,196,29.4428333333333
+27,197,31.8558333333333
+27,198,36.6183333333333
+27,199,29.0406666666667
+27,200,34.3746666666667
+27,201,26.0985
+27,202,28.2575
+27,203,30.6493333333333
+27,204,31.3478333333333
+27,205,38.227
+27,206,34.7768333333333
+27,207,28.1516666666667
+27,208,33.8243333333333
+27,209,33.8031666666667
+27,210,31.5383333333333
+27,211,33.1681666666667
+27,212,30.8398333333333
+27,213,32.9353333333333
+27,214,25.2518333333333
+27,215,36.195
+27,216,32.9565
+27,217,32.4061666666667
+27,218,29.7391666666667
+27,219,37.3168333333333
+27,220,32.8718333333333
+27,221,38.0365
+27,222,25.4423333333333
+27,223,37.973
+27,224,28.4268333333333
+27,225,32.5755
+27,226,33.7185
+27,227,40.1531666666667
+27,228,34.1418333333333
+27,229,32.7236666666667
+27,230,31.4113333333333
+27,231,31.6441666666667
+27,232,30.734
+27,233,27.0086666666667
+27,234,29.3158333333333
+27,235,33.8666666666667
+27,236,28.5115
+27,237,31.1361666666667
+27,238,28.6173333333333
+27,239,28.5538333333333
+27,240,29.9508333333333
+27,241,25.7386666666667
+27,242,30.1625
+27,243,35.56
+27,244,34.3958333333333
+27,245,31.623
+27,246,38.1
+27,247,32.8506666666667
+27,248,25.4211666666667
+27,249,35.0731666666667
+27,250,26.67
+27,251,31.5806666666667
+27,252,31.6653333333333
+27,253,28.0458333333333
+27,254,31.5806666666667
+27,255,29.9085
+27,256,29.1465
+27,257,32.5755
+27,258,36.7241666666667
+27,259,27.8341666666667
+27,260,28.4056666666667
+27,261,34.2265
+27,262,34.8826666666667
+27,263,32.3003333333333
+27,264,29.337
+27,265,30.7128333333333
+27,266,31.1573333333333
+27,267,30.6916666666667
+27,268,27.432
+27,269,28.0458333333333
+27,270,34.5651666666667
+27,271,25.4635
+27,272,31.5595
+27,273,32.4273333333333
+27,274,33.2316666666667
+27,275,32.2156666666667
+27,276,25.2941666666667
+27,277,29.4851666666667
+27,278,38.5445
+27,279,31.623
+27,280,27.559
+27,281,28.9983333333333
+27,282,35.687
+27,283,30.2048333333333
+27,284,31.3478333333333
+27,285,24.1935
+27,286,26.0773333333333
+27,287,28.0881666666667
+27,288,32.4061666666667
+27,289,32.7236666666667
+27,290,32.2156666666667
+27,291,28.575
+27,292,30.1413333333333
+27,293,35.3906666666667
+27,294,35.2636666666667
+27,295,23.9395
+27,296,29.7815
+27,297,29.1041666666667
+27,298,31.242
+27,299,32.9776666666667
+27,300,23.9606666666667
+27,301,35.8563333333333
+27,302,28.1728333333333
+27,303,29.8238333333333
+27,304,29.5063333333333
+27,305,34.8191666666667
+27,306,33.8243333333333
+27,307,24.7861666666667
+27,308,34.9461666666667
+27,309,29.5063333333333
+27,310,28.2786666666667
+27,311,30.988
+27,312,33.4645
+27,313,22.8811666666667
+27,314,28.2575
+27,315,30.5858333333333
+27,316,32.4273333333333
+27,317,29.2946666666667
+27,318,34.9673333333333
+27,319,32.004
+27,320,34.5651666666667
+27,321,28.9983333333333
+27,322,26.6276666666667
+27,323,31.7923333333333
+27,324,40.3436666666667
+27,325,22.6906666666667
+27,326,30.099
+27,327,27.9823333333333
+27,328,26.5853333333333
+27,329,37.2321666666667
+27,330,32.8083333333333
+27,331,28.8925
+27,332,29.0406666666667
+27,333,27.3261666666667
+27,334,39.2218333333333
+27,335,22.352
+27,336,34.3535
+27,337,34.5016666666667
+27,338,32.5543333333333
+27,339,27.2415
+27,340,25.8021666666667
+27,341,24.5321666666667
+27,342,26.7335
+27,343,24.4263333333333
+27,344,35.0096666666667
+27,345,25.0825
+27,346,31.5171666666667
+27,347,30.0778333333333
+27,348,30.6705
+27,349,32.4696666666667
+27,350,29.718
+27,351,27.5166666666667
+27,352,35.7716666666667
+27,353,26.2043333333333
+27,354,28.5538333333333
+27,355,26.3948333333333
+27,356,28.3633333333333
+27,357,32.6601666666667
+27,358,30.8186666666667
+27,359,30.5435
+27,360,34.7556666666667
+27,361,22.4578333333333
+27,362,25.2518333333333
+27,363,24.5956666666667
+27,364,26.1408333333333
+27,365,33.5491666666667
+27,366,32.5755
+27,367,29.0618333333333
+27,368,28.4903333333333
+27,369,31.1996666666667
+27,370,33.9513333333333
+27,371,33.9301666666667
+27,372,33.147
+27,373,22.1826666666667
+27,374,31.2631666666667
+27,375,24.1088333333333
+27,376,23.241
+27,377,34.3958333333333
+27,378,38.0576666666667
+27,379,35.1578333333333
+27,380,31.877
+27,381,33.02
+27,382,26.0773333333333
+27,383,31.5171666666667
+27,384,36.8088333333333
+27,385,28.3421666666667
+27,386,30.7975
+27,387,30.4588333333333
+27,388,31.877
+27,389,34.036
+27,390,28.7231666666667
+27,391,34.7768333333333
+27,392,25.6751666666667
+27,393,38.8408333333333
+27,394,22.5213333333333
+27,395,31.6018333333333
+27,396,33.1681666666667
+27,397,38.8408333333333
+27,398,36.83
+27,399,31.6018333333333
+27,400,25.3153333333333
+27,401,40.7246666666667
+27,402,29.9508333333333
+27,403,29.8026666666667
+27,404,35.1578333333333
+27,405,30.2048333333333
+27,406,29.2523333333333
+27,407,26.8181666666667
+27,408,23.8971666666667
+27,409,25.9926666666667
+27,410,32.3426666666667
+27,411,31.8346666666667
+27,412,33.8666666666667
+27,413,29.1041666666667
+27,414,36.0891666666667
+27,415,34.5228333333333
+27,416,29.8238333333333
+27,417,27.4743333333333
+27,418,36.2796666666667
+27,419,24.7438333333333
+27,420,38.1211666666667
+27,421,30.1836666666667
+27,422,32.9141666666667
+27,423,27.0298333333333
+27,424,31.4536666666667
+27,425,31.4536666666667
+27,426,33.0835
+27,427,31.0091666666667
+27,428,36.4278333333333
+27,429,27.6013333333333
+27,430,23.2621666666667
+27,431,36.2161666666667
+27,432,32.9353333333333
+27,433,29.2311666666667
+27,434,32.258
+27,435,34.3535
+27,436,32.2368333333333
+27,437,35.8351666666667
+27,438,27.0086666666667
+27,439,33.9301666666667
+27,440,29.591
+27,441,24.4686666666667
+27,442,27.7706666666667
+27,443,29.8873333333333
+27,444,29.3793333333333
+27,445,25.5905
+27,446,28.8925
+27,447,27.7706666666667
+27,448,28.6173333333333
+27,449,37.8883333333333
+27,450,29.1888333333333
+27,451,30.5646666666667
+27,452,24.9131666666667
+27,453,23.6008333333333
+27,454,37.9518333333333
+27,455,34.798
+27,456,31.0091666666667
+27,457,32.6601666666667
+27,458,29.21
+27,459,29.337
+27,460,32.5331666666667
+27,461,32.2156666666667
+27,462,32.8506666666667
+27,463,26.8605
+27,464,27.6225
+27,465,33.7185
+27,466,30.2683333333333
+27,467,32.2368333333333
+27,468,28.067
+27,469,26.924
+27,470,24.0665
+27,471,30.7763333333333
+27,472,31.242
+27,473,34.798
+27,474,40.894
+27,475,30.5223333333333
+27,476,28.5538333333333
+27,477,22.86
+27,478,31.242
+27,479,25.5058333333333
+27,480,27.3685
+27,481,33.147
+27,482,27.2203333333333
+27,483,29.6968333333333
+27,484,29.1676666666667
+27,485,28.0458333333333
+27,486,32.3003333333333
+27,487,37.9941666666667
+27,488,26.8181666666667
+27,489,29.464
+27,490,28.9136666666667
+27,491,29.1253333333333
+27,492,26.162
+27,493,32.2791666666667
+27,494,29.1041666666667
+27,495,28.0458333333333
+27,496,32.131
+27,497,28.4903333333333
+27,498,34.3958333333333
+27,499,29.9085
+27,500,35.052
+27,501,31.9828333333333
+27,502,28.1093333333333
+27,503,26.8393333333333
+27,504,30.9668333333333
+27,505,31.3055
+27,506,26.7546666666667
+27,507,35.5811666666667
+27,508,31.369
+27,509,32.639
+27,510,26.924
+27,511,30.2683333333333
+27,512,34.2265
+27,513,37.6555
+27,514,28.2998333333333
+27,515,32.5755
+27,516,28.575
+27,517,22.225
+27,518,33.2105
+27,519,34.8191666666667
+27,520,32.639
+27,521,28.5326666666667
+27,522,30.1836666666667
+27,523,35.2636666666667
+27,524,32.8295
+27,525,26.67
+27,526,31.3478333333333
+27,527,29.6545
+27,528,29.6333333333333
+27,529,27.7706666666667
+27,530,26.3948333333333
+27,531,24.9766666666667
+27,532,33.782
+27,533,31.6865
+27,534,30.5435
+27,535,31.2208333333333
+27,536,24.13
+27,537,25.1248333333333
+27,538,27.8765
+27,539,34.1206666666667
+27,540,27.1145
+27,541,37.338
+27,542,29.1465
+27,543,26.9028333333333
+27,544,32.0675
+27,545,22.098
+27,546,30.48
+27,547,25.2095
+27,548,28.3633333333333
+27,549,31.7288333333333
+27,550,28.1305
+27,551,29.972
+27,552,31.6653333333333
+27,553,28.4903333333333
+27,554,29.8873333333333
+27,555,25.3365
+27,556,25.9503333333333
+27,557,26.416
+27,558,33.5491666666667
+27,559,32.4908333333333
+27,560,31.5383333333333
+27,561,30.2048333333333
+27,562,33.4433333333333
+27,563,27.1145
+27,564,27.6013333333333
+27,565,30.3318333333333
+27,566,29.0195
+27,567,34.5228333333333
+27,568,27.7706666666667
+27,569,32.639
+27,570,30.6493333333333
+27,571,32.3426666666667
+27,572,33.909
+27,573,24.5533333333333
+27,574,31.7711666666667
+27,575,36.8511666666667
+27,576,32.3215
+27,577,32.0463333333333
+27,578,31.2631666666667
+27,579,29.8873333333333
+27,580,27.3261666666667
+27,581,25.7598333333333
+27,582,31.6441666666667
+27,583,32.7871666666667
+27,584,31.3055
+27,585,30.1413333333333
+27,586,34.7556666666667
+27,587,29.21
+27,588,27.8765
+27,589,22.6906666666667
+27,590,32.6813333333333
+27,591,35.6235
+27,592,32.1945
+27,593,27.1356666666667
+27,594,29.8238333333333
+27,595,32.6178333333333
+27,596,35.7293333333333
+27,597,35.179
+27,598,28.5326666666667
+27,599,28.1305
+27,600,33.1893333333333
+27,601,33.1893333333333
+27,602,30.0566666666667
+27,603,34.5863333333333
+27,604,29.718
+27,605,33.2528333333333
+27,606,34.6498333333333
+27,607,25.654
+27,608,26.3736666666667
+27,609,30.9033333333333
+27,610,24.384
+27,611,27.9611666666667
+27,612,31.9616666666667
+27,613,29.2311666666667
+27,614,25.527
+27,615,34.6921666666667
+27,616,27.0298333333333
+27,617,30.226
+27,618,31.115
+27,619,23.9818333333333
+27,620,25.0613333333333
+27,621,34.0571666666667
+27,622,26.5006666666667
+27,623,32.385
+27,624,27.9823333333333
+27,625,32.0675
+27,626,31.6441666666667
+27,627,35.6446666666667
+27,628,29.8873333333333
+27,629,25.0825
+27,630,30.8186666666667
+27,631,28.575
+27,632,32.8506666666667
+27,633,28.2786666666667
+27,634,33.4433333333333
+27,635,24.1723333333333
+27,636,30.988
+27,637,22.0768333333333
+27,638,27.2203333333333
+27,639,33.274
+27,640,32.6813333333333
+27,641,31.5383333333333
+27,642,30.353
+27,643,33.2951666666667
+27,644,29.5698333333333
+27,645,29.7603333333333
+27,646,29.1465
+27,647,30.5011666666667
+27,648,25.5481666666667
+27,649,36.195
+27,650,29.4005
+27,651,29.3793333333333
+27,652,29.21
+27,653,30.099
+27,654,29.2311666666667
+27,655,34.3535
+27,656,30.607
+27,657,27.813
+27,658,30.7975
+27,659,33.655
+27,660,24.0453333333333
+27,661,31.9616666666667
+27,662,26.8393333333333
+27,663,28.6808333333333
+27,664,30.099
+27,665,27.9611666666667
+27,666,28.8925
+27,667,30.1413333333333
+27,668,24.7226666666667
+27,669,27.8341666666667
+27,670,29.8238333333333
+27,671,30.1201666666667
+27,672,33.909
+27,673,26.416
+27,674,20.32
+27,675,29.845
+27,676,28.7231666666667
+27,677,27.8553333333333
+27,678,29.8661666666667
+27,679,24.4263333333333
+27,680,29.4851666666667
+27,681,36.5336666666667
+27,682,32.8083333333333
+27,683,32.8718333333333
+27,684,29.1676666666667
+27,685,30.9245
+27,686,31.3478333333333
+27,687,27.4743333333333
+27,688,27.813
+27,689,33.3798333333333
+27,690,25.9926666666667
+27,691,35.4118333333333
+27,692,38.5656666666667
+27,693,35.3483333333333
+27,694,32.4485
+27,695,27.813
+27,696,32.1098333333333
+27,697,25.1036666666667
+27,698,30.1201666666667
+27,699,29.3793333333333
+27,700,36.2796666666667
+27,701,34.0783333333333
+27,702,31.623
+27,703,31.242
+27,704,28.6808333333333
+27,705,35.052
+27,706,35.7081666666667
+27,707,26.6276666666667
+27,708,27.559
+27,709,34.0783333333333
+27,710,34.3958333333333
+27,711,25.0825
+27,712,32.8083333333333
+27,713,30.8398333333333
+27,714,26.7123333333333
+27,715,32.2791666666667
+27,716,33.4433333333333
+27,717,34.2476666666667
+27,718,34.7133333333333
+27,719,29.2523333333333
+27,720,29.2523333333333
+27,721,33.7396666666667
+27,722,32.0463333333333
+27,723,34.0148333333333
+27,724,37.6555
+27,725,24.765
+27,726,25.6328333333333
+27,727,28.2786666666667
+27,728,30.48
+27,729,31.0726666666667
+27,730,30.1836666666667
+27,731,32.4696666666667
+27,732,28.0458333333333
+27,733,25.4846666666667
+27,734,27.3685
+27,735,31.0303333333333
+27,736,29.6333333333333
+27,737,36.0468333333333
+27,738,32.6813333333333
+27,739,33.0835
+27,740,33.4221666666667
+27,741,32.1098333333333
+27,742,27.3685
+27,743,30.9668333333333
+27,744,41.4443333333333
+27,745,28.956
+27,746,27.4108333333333
+27,747,28.5326666666667
+27,748,27.1991666666667
+27,749,30.9033333333333
+27,750,29.1676666666667
+27,751,31.7923333333333
+27,752,25.1883333333333
+27,753,25.5481666666667
+27,754,28.2363333333333
+27,755,24.8073333333333
+27,756,25.7175
+27,757,31.5383333333333
+27,758,31.9405
+27,759,30.9668333333333
+27,760,30.1625
+27,761,37.3591666666667
+27,762,38.1211666666667
+27,763,34.8191666666667
+27,764,35.1578333333333
+27,765,26.2255
+27,766,29.3581666666667
+27,767,30.1413333333333
+27,768,28.7443333333333
+27,769,28.1305
+27,770,25.273
+27,771,27.1568333333333
+27,772,33.3375
+27,773,26.2043333333333
+27,774,33.02
+27,775,30.9668333333333
+27,776,30.861
+27,777,30.1201666666667
+27,778,24.384
+27,779,24.638
+27,780,32.4273333333333
+27,781,31.9828333333333
+27,782,33.1046666666667
+27,783,31.3055
+27,784,23.2621666666667
+27,785,27.7495
+27,786,29.8873333333333
+27,787,33.5491666666667
+27,788,38.0153333333333
+27,789,28.9983333333333
+27,790,29.083
+27,791,23.114
+27,792,33.3798333333333
+27,793,29.972
+27,794,33.9725
+27,795,31.2631666666667
+27,796,20.9761666666667
+27,797,35.3695
+27,798,33.274
+27,799,32.004
+27,800,28.4903333333333
+27,801,28.4903333333333
+27,802,30.7975
+27,803,25.9926666666667
+27,804,35.0308333333333
+27,805,31.3266666666667
+27,806,31.7923333333333
+27,807,23.7066666666667
+27,808,35.052
+27,809,36.9993333333333
+27,810,36.449
+27,811,33.4433333333333
+27,812,30.099
+27,813,24.13
+27,814,31.2208333333333
+27,815,27.559
+27,816,30.3953333333333
+27,817,33.7185
+27,818,29.4005
+27,819,31.8981666666667
+27,820,30.0778333333333
+27,821,29.3793333333333
+27,822,27.1145
+27,823,22.5848333333333
+27,824,19.8966666666667
+27,825,36.5125
+27,826,27.0721666666667
+27,827,27.8341666666667
+27,828,34.7556666666667
+27,829,28.5961666666667
+27,830,26.2255
+27,831,21.6958333333333
+27,832,25.0613333333333
+27,833,30.734
+27,834,30.3953333333333
+27,835,27.9611666666667
+27,836,33.6761666666667
+27,837,30.861
+27,838,31.2208333333333
+27,839,29.6756666666667
+27,840,28.2363333333333
+27,841,33.5068333333333
+27,842,29.718
+27,843,33.6761666666667
+27,844,29.8238333333333
+27,845,28.7866666666667
+27,846,25.4423333333333
+27,847,29.6545
+27,848,36.9358333333333
+27,849,32.258
+27,850,24.4686666666667
+27,851,30.4588333333333
+27,852,33.8031666666667
+27,853,28.5961666666667
+27,854,33.3798333333333
+27,855,27.559
+27,856,33.0835
+27,857,29.5698333333333
+27,858,27.7706666666667
+27,859,29.1676666666667
+27,860,30.7551666666667
+27,861,27.2203333333333
+27,862,28.8925
+27,863,28.2998333333333
+27,864,33.8878333333333
+27,865,31.242
+27,866,23.495
+27,867,37.8248333333333
+27,868,33.8243333333333
+27,869,34.0148333333333
+27,870,25.3576666666667
+27,871,27.8553333333333
+27,872,37.2533333333333
+27,873,28.0458333333333
+27,874,25.1036666666667
+27,875,32.6601666666667
+27,876,32.5966666666667
+27,877,32.639
+27,878,31.4113333333333
+27,879,33.909
+27,880,28.0035
+27,881,27.8976666666667
+27,882,29.8873333333333
+27,883,33.4856666666667
+27,884,27.7283333333333
+27,885,32.3638333333333
+27,886,32.4696666666667
+27,887,35.4753333333333
+27,888,25.5481666666667
+27,889,27.6648333333333
+27,890,36.5548333333333
+27,891,32.0251666666667
+27,892,34.29
+27,893,32.3426666666667
+27,894,27.3261666666667
+27,895,28.575
+27,896,31.9193333333333
+27,897,26.1831666666667
+27,898,35.0096666666667
+27,899,37.2533333333333
+27,900,36.2161666666667
+27,901,33.9936666666667
+27,902,34.671
+27,903,32.7448333333333
+27,904,31.2208333333333
+27,905,28.0035
+27,906,26.7335
+27,907,28.7443333333333
+27,908,33.9301666666667
+27,909,28.9983333333333
+27,910,28.829
+27,911,31.3901666666667
+27,912,27.94
+27,913,33.3163333333333
+27,914,33.1258333333333
+27,915,33.6126666666667
+27,916,28.9983333333333
+27,917,28.956
+27,918,25.1248333333333
+27,919,29.5275
+27,920,25.654
+27,921,36.4066666666667
+27,922,30.9456666666667
+27,923,33.1046666666667
+27,924,40.9363333333333
+27,925,35.0308333333333
+27,926,33.1046666666667
+27,927,28.448
+27,928,30.7763333333333
+27,929,29.591
+27,930,30.8821666666667
+27,931,28.2151666666667
+27,932,32.6813333333333
+27,933,22.7541666666667
+27,934,34.1206666666667
+27,935,28.8078333333333
+27,936,31.8558333333333
+27,937,25.5058333333333
+27,938,30.6916666666667
+27,939,24.4686666666667
+27,940,32.0463333333333
+27,941,31.6441666666667
+27,942,26.67
+27,943,34.6075
+27,944,32.6178333333333
+27,945,32.2791666666667
+27,946,35.2001666666667
+27,947,27.559
+27,948,31.9193333333333
+27,949,26.9875
+27,950,24.511
+27,951,26.3525
+27,952,26.0985
+27,953,26.2678333333333
+27,954,29.591
+27,955,33.782
+27,956,34.7345
+27,957,26.4795
+27,958,34.2265
+27,959,34.4593333333333
+27,960,30.2471666666667
+27,961,33.3375
+27,962,34.7768333333333
+27,963,37.3803333333333
+27,964,27.2838333333333
+27,965,34.5863333333333
+27,966,32.5966666666667
+27,967,35.1578333333333
+27,968,32.2156666666667
+27,969,26.416
+27,970,32.1521666666667
+27,971,29.1888333333333
+27,972,27.0721666666667
+27,973,32.2156666666667
+27,974,30.5646666666667
+27,975,32.2791666666667
+27,976,31.369
+27,977,21.4841666666667
+27,978,30.9668333333333
+27,979,39.6663333333333
+27,980,26.8181666666667
+27,981,28.1093333333333
+27,982,34.7133333333333
+27,983,32.766
+27,984,29.9296666666667
+27,985,26.9028333333333
+27,986,28.956
+27,987,32.6813333333333
+27,988,32.8083333333333
+27,989,33.0835
+27,990,25.6116666666667
+27,991,32.7236666666667
+27,992,33.1681666666667
+27,993,30.6916666666667
+27,994,28.956
+27,995,35.9833333333333
+27,996,30.9033333333333
+27,997,29.7815
+27,998,24.257
+27,999,29.21
+27,1000,31.1361666666667
+28,1,31.7076666666667
+28,2,23.749
+28,3,36.8088333333333
+28,4,23.4103333333333
+28,5,29.8873333333333
+28,6,24.9766666666667
+28,7,28.8078333333333
+28,8,26.797
+28,9,27.813
+28,10,28.3421666666667
+28,11,31.3266666666667
+28,12,34.8191666666667
+28,13,34.0571666666667
+28,14,29.5698333333333
+28,15,23.1986666666667
+28,16,27.3896666666667
+28,17,29.3581666666667
+28,18,28.6808333333333
+28,19,29.4216666666667
+28,20,29.4851666666667
+28,21,29.6756666666667
+28,22,31.9828333333333
+28,23,30.2895
+28,24,25.8656666666667
+28,25,34.1206666666667
+28,26,32.8506666666667
+28,27,23.0293333333333
+28,28,31.1996666666667
+28,29,25.8445
+28,30,31.496
+28,31,35.0308333333333
+28,32,32.6813333333333
+28,33,37.973
+28,34,25.2941666666667
+28,35,31.4536666666667
+28,36,31.5595
+28,37,32.512
+28,38,27.8553333333333
+28,39,29.3793333333333
+28,40,26.7546666666667
+28,41,38.7773333333333
+28,42,34.9038333333333
+28,43,27.6648333333333
+28,44,27.178
+28,45,31.6018333333333
+28,46,28.8713333333333
+28,47,29.9508333333333
+28,48,32.9776666666667
+28,49,31.3266666666667
+28,50,22.0768333333333
+28,51,34.7345
+28,52,27.9823333333333
+28,53,37.973
+28,54,25.3788333333333
+28,55,26.0138333333333
+28,56,35.7716666666667
+28,57,28.9136666666667
+28,58,30.6281666666667
+28,59,33.9936666666667
+28,60,27.4108333333333
+28,61,32.4061666666667
+28,62,25.4635
+28,63,29.21
+28,64,39.1371666666667
+28,65,26.5006666666667
+28,66,24.638
+28,67,28.448
+28,68,25.9291666666667
+28,69,34.2265
+28,70,24.8285
+28,71,27.7283333333333
+28,72,26.1831666666667
+28,73,27.9823333333333
+28,74,31.242
+28,75,29.4216666666667
+28,76,24.9131666666667
+28,77,27.305
+28,78,29.7603333333333
+28,79,27.9188333333333
+28,80,30.3741666666667
+28,81,22.8176666666667
+28,82,33.1046666666667
+28,83,36.5336666666667
+28,84,28.2998333333333
+28,85,29.8873333333333
+28,86,31.8558333333333
+28,87,38.481
+28,88,31.7711666666667
+28,89,27.0086666666667
+28,90,43.6033333333333
+28,91,27.3261666666667
+28,92,31.0515
+28,93,29.337
+28,94,29.21
+28,95,27.4108333333333
+28,96,28.7443333333333
+28,97,36.195
+28,98,34.671
+28,99,32.4908333333333
+28,100,35.6658333333333
+28,101,28.4056666666667
+28,102,30.5858333333333
+28,103,31.877
+28,104,33.0623333333333
+28,105,32.0675
+28,106,28.0035
+28,107,28.7443333333333
+28,108,32.9776666666667
+28,109,34.9885
+28,110,24.4475
+28,111,33.401
+28,112,22.1191666666667
+28,113,29.5275
+28,114,33.2951666666667
+28,115,32.9141666666667
+28,116,29.3158333333333
+28,117,27.94
+28,118,28.0246666666667
+28,119,39.7933333333333
+28,120,33.528
+28,121,28.8713333333333
+28,122,25.654
+28,123,35.9198333333333
+28,124,35.4541666666667
+28,125,30.5646666666667
+28,126,31.5171666666667
+28,127,26.162
+28,128,27.4531666666667
+28,129,29.1253333333333
+28,130,23.4315
+28,131,25.7598333333333
+28,132,31.3055
+28,133,33.9936666666667
+28,134,24.1723333333333
+28,135,25.781
+28,136,26.8181666666667
+28,137,28.0458333333333
+28,138,24.0241666666667
+28,139,32.385
+28,140,34.4805
+28,141,24.892
+28,142,27.9823333333333
+28,143,33.1893333333333
+28,144,23.8336666666667
+28,145,28.2786666666667
+28,146,36.9146666666667
+28,147,23.6643333333333
+28,148,30.2683333333333
+28,149,29.4005
+28,150,32.5755
+28,151,32.3215
+28,152,37.8036666666667
+28,153,35.941
+28,154,26.8393333333333
+28,155,32.4908333333333
+28,156,26.9875
+28,157,31.6441666666667
+28,158,29.3793333333333
+28,159,30.099
+28,160,29.1465
+28,161,25.1036666666667
+28,162,28.6173333333333
+28,163,29.337
+28,164,32.5966666666667
+28,165,34.5651666666667
+28,166,28.1516666666667
+28,167,37.0205
+28,168,22.0556666666667
+28,169,23.1775
+28,170,28.7443333333333
+28,171,26.7123333333333
+28,172,30.7975
+28,173,31.4325
+28,174,34.1418333333333
+28,175,29.718
+28,176,31.8346666666667
+28,177,30.9456666666667
+28,178,32.4273333333333
+28,179,26.4795
+28,180,32.3003333333333
+28,181,27.4531666666667
+28,182,32.2156666666667
+28,183,29.6756666666667
+28,184,36.8723333333333
+28,185,33.3375
+28,186,25.1036666666667
+28,187,21.4418333333333
+28,188,27.7495
+28,189,33.9301666666667
+28,190,32.5966666666667
+28,191,30.1201666666667
+28,192,37.6766666666667
+28,193,24.9555
+28,194,26.7123333333333
+28,195,34.0783333333333
+28,196,29.1676666666667
+28,197,22.7753333333333
+28,198,26.0773333333333
+28,199,29.0195
+28,200,26.4371666666667
+28,201,34.6075
+28,202,26.67
+28,203,30.3106666666667
+28,204,35.687
+28,205,31.4748333333333
+28,206,28.0881666666667
+28,207,26.924
+28,208,26.8393333333333
+28,209,33.274
+28,210,34.5016666666667
+28,211,37.592
+28,212,35.3271666666667
+28,213,32.1945
+28,214,28.8713333333333
+28,215,34.0783333333333
+28,216,27.7071666666667
+28,217,24.9131666666667
+28,218,21.4841666666667
+28,219,29.1888333333333
+28,220,31.4536666666667
+28,221,26.8816666666667
+28,222,33.1258333333333
+28,223,30.226
+28,224,34.036
+28,225,39.0948333333333
+28,226,37.0628333333333
+28,227,30.0566666666667
+28,228,33.8878333333333
+28,229,27.5801666666667
+28,230,30.5223333333333
+28,231,30.0143333333333
+28,232,32.5755
+28,233,26.5641666666667
+28,234,23.4315
+28,235,28.4268333333333
+28,236,22.7753333333333
+28,237,30.5646666666667
+28,238,27.178
+28,239,25.781
+28,240,30.4165
+28,241,28.6596666666667
+28,242,32.2791666666667
+28,243,32.8718333333333
+28,244,26.2043333333333
+28,245,32.6813333333333
+28,246,33.4221666666667
+28,247,27.1568333333333
+28,248,36.1315
+28,249,35.4753333333333
+28,250,31.0303333333333
+28,251,31.3266666666667
+28,252,23.7066666666667
+28,253,35.3483333333333
+28,254,34.7133333333333
+28,255,36.4278333333333
+28,256,34.036
+28,257,33.782
+28,258,23.7066666666667
+28,259,37.8883333333333
+28,260,35.7081666666667
+28,261,31.2631666666667
+28,262,33.9513333333333
+28,263,26.7335
+28,264,30.1413333333333
+28,265,34.417
+28,266,31.5595
+28,267,30.6916666666667
+28,268,23.6431666666667
+28,269,22.479
+28,270,23.876
+28,271,29.1041666666667
+28,272,32.4485
+28,273,36.6606666666667
+28,274,23.114
+28,275,37.7613333333333
+28,276,27.178
+28,277,32.8083333333333
+28,278,26.3101666666667
+28,279,37.1263333333333
+28,280,22.2885
+28,281,32.9776666666667
+28,282,28.448
+28,283,29.845
+28,284,36.8088333333333
+28,285,30.5011666666667
+28,286,28.575
+28,287,33.2316666666667
+28,288,29.0195
+28,289,35.433
+28,290,26.416
+28,291,38.7773333333333
+28,292,31.5595
+28,293,34.8826666666667
+28,294,27.1991666666667
+28,295,33.7396666666667
+28,296,23.241
+28,297,30.9245
+28,298,27.4955
+28,299,25.9291666666667
+28,300,29.8026666666667
+28,301,39.7721666666667
+28,302,25.273
+28,303,31.8981666666667
+28,304,27.7918333333333
+28,305,32.8718333333333
+28,306,28.6173333333333
+28,307,33.02
+28,308,32.3215
+28,309,25.5058333333333
+28,310,31.496
+28,311,31.369
+28,312,32.3215
+28,313,28.3633333333333
+28,314,27.3473333333333
+28,315,26.5853333333333
+28,316,25.9503333333333
+28,317,28.7231666666667
+28,318,33.4433333333333
+28,319,40.894
+28,320,36.957
+28,321,33.1681666666667
+28,322,32.4696666666667
+28,323,22.098
+28,324,29.3581666666667
+28,325,37.1051666666667
+28,326,30.7551666666667
+28,327,29.7815
+28,328,27.8976666666667
+28,329,34.5228333333333
+28,330,34.7768333333333
+28,331,32.258
+28,332,24.4263333333333
+28,333,29.464
+28,334,29.6756666666667
+28,335,28.7866666666667
+28,336,32.7871666666667
+28,337,28.0246666666667
+28,338,31.1996666666667
+28,339,31.0726666666667
+28,340,26.5641666666667
+28,341,24.4051666666667
+28,342,29.9508333333333
+28,343,30.1201666666667
+28,344,28.7655
+28,345,30.8821666666667
+28,346,34.8615
+28,347,39.497
+28,348,30.7763333333333
+28,349,30.7551666666667
+28,350,32.9565
+28,351,28.1516666666667
+28,352,28.5961666666667
+28,353,26.0773333333333
+28,354,35.3483333333333
+28,355,21.8863333333333
+28,356,26.9663333333333
+28,357,31.0091666666667
+28,358,28.9771666666667
+28,359,29.3158333333333
+28,360,35.7505
+28,361,31.4325
+28,362,29.7391666666667
+28,363,26.162
+28,364,37.5708333333333
+28,365,28.4691666666667
+28,366,27.0298333333333
+28,367,23.368
+28,368,26.5853333333333
+28,369,30.5858333333333
+28,370,37.592
+28,371,28.9136666666667
+28,372,30.5646666666667
+28,373,29.9508333333333
+28,374,32.3638333333333
+28,375,35.9833333333333
+28,376,25.7598333333333
+28,377,24.638
+28,378,32.6178333333333
+28,379,33.7185
+28,380,29.0406666666667
+28,381,32.2791666666667
+28,382,33.0623333333333
+28,383,36.957
+28,384,25.7598333333333
+28,385,29.718
+28,386,34.163
+28,387,35.3483333333333
+28,388,27.8553333333333
+28,389,33.6761666666667
+28,390,24.3416666666667
+28,391,31.9405
+28,392,25.146
+28,393,34.3535
+28,394,27.3473333333333
+28,395,24.765
+28,396,28.6596666666667
+28,397,26.8816666666667
+28,398,27.94
+28,399,29.9085
+28,400,31.6865
+28,401,28.0881666666667
+28,402,31.4113333333333
+28,403,33.1258333333333
+28,404,26.6276666666667
+28,405,29.6121666666667
+28,406,28.2363333333333
+28,407,30.6493333333333
+28,408,27.1145
+28,409,28.2363333333333
+28,410,26.67
+28,411,29.1888333333333
+28,412,36.2585
+28,413,30.0566666666667
+28,414,30.5646666666667
+28,415,29.591
+28,416,28.0458333333333
+28,417,26.67
+28,418,28.2786666666667
+28,419,27.8976666666667
+28,420,27.3473333333333
+28,421,41.021
+28,422,33.4856666666667
+28,423,28.0246666666667
+28,424,28.1305
+28,425,35.2848333333333
+28,426,24.9555
+28,427,23.9818333333333
+28,428,30.1836666666667
+28,429,31.1996666666667
+28,430,29.7391666666667
+28,431,33.4221666666667
+28,432,19.7061666666667
+28,433,25.146
+28,434,24.0453333333333
+28,435,31.3901666666667
+28,436,26.7123333333333
+28,437,29.2523333333333
+28,438,32.4485
+28,439,28.067
+28,440,32.0463333333333
+28,441,29.2311666666667
+28,442,28.2363333333333
+28,443,35.7505
+28,444,26.797
+28,445,32.258
+28,446,29.083
+28,447,29.5698333333333
+28,448,28.6596666666667
+28,449,22.352
+28,450,34.1418333333333
+28,451,25.8656666666667
+28,452,29.6756666666667
+28,453,28.8713333333333
+28,454,32.639
+28,455,24.9343333333333
+28,456,29.591
+28,457,34.29
+28,458,33.5491666666667
+28,459,31.6653333333333
+28,460,19.1981666666667
+28,461,32.639
+28,462,32.512
+28,463,31.6865
+28,464,31.6865
+28,465,29.1253333333333
+28,466,28.5326666666667
+28,467,26.8181666666667
+28,468,31.5595
+28,469,32.2156666666667
+28,470,26.5853333333333
+28,471,30.6493333333333
+28,472,27.7918333333333
+28,473,25.2306666666667
+28,474,23.368
+28,475,33.274
+28,476,28.8925
+28,477,27.813
+28,478,35.7081666666667
+28,479,37.8248333333333
+28,480,32.6601666666667
+28,481,25.6751666666667
+28,482,26.6488333333333
+28,483,22.2038333333333
+28,484,31.2208333333333
+28,485,27.051
+28,486,32.131
+28,487,30.353
+28,488,24.1723333333333
+28,489,31.369
+28,490,27.8765
+28,491,35.2001666666667
+28,492,34.0148333333333
+28,493,30.0143333333333
+28,494,27.1991666666667
+28,495,29.4005
+28,496,26.6065
+28,497,22.7753333333333
+28,498,25.2306666666667
+28,499,36.322
+28,500,32.7448333333333
+28,501,35.6235
+28,502,23.495
+28,503,37.211
+28,504,31.7923333333333
+28,505,40.2801666666667
+28,506,31.4325
+28,507,37.338
+28,508,27.5801666666667
+28,509,32.1098333333333
+28,510,31.9405
+28,511,35.8563333333333
+28,512,34.9461666666667
+28,513,28.2575
+28,514,32.2791666666667
+28,515,20.32
+28,516,34.4593333333333
+28,517,29.845
+28,518,34.9038333333333
+28,519,28.956
+28,520,33.1893333333333
+28,521,34.798
+28,522,30.4588333333333
+28,523,23.1351666666667
+28,524,30.5011666666667
+28,525,27.5166666666667
+28,526,32.7236666666667
+28,527,34.798
+28,528,30.734
+28,529,28.6808333333333
+28,530,31.242
+28,531,38.1423333333333
+28,532,27.5378333333333
+28,533,28.2998333333333
+28,534,32.0251666666667
+28,535,26.7123333333333
+28,536,35.0943333333333
+28,537,31.2843333333333
+28,538,20.828
+28,539,33.4856666666667
+28,540,32.9141666666667
+28,541,30.6493333333333
+28,542,32.9141666666667
+28,543,32.893
+28,544,29.4005
+28,545,31.1996666666667
+28,546,26.5218333333333
+28,547,23.0293333333333
+28,548,32.0251666666667
+28,549,27.1568333333333
+28,550,23.8125
+28,551,25.2095
+28,552,35.687
+28,553,38.3116666666667
+28,554,28.5961666666667
+28,555,23.8125
+28,556,30.9245
+28,557,33.3798333333333
+28,558,29.1888333333333
+28,559,31.8135
+28,560,31.7711666666667
+28,561,31.496
+28,562,34.3746666666667
+28,563,27.9188333333333
+28,564,27.9823333333333
+28,565,30.3106666666667
+28,566,28.6808333333333
+28,567,28.5326666666667
+28,568,30.9456666666667
+28,569,33.8031666666667
+28,570,26.4371666666667
+28,571,32.8295
+28,572,32.5755
+28,573,35.5176666666667
+28,574,32.512
+28,575,18.2668333333333
+28,576,30.6916666666667
+28,577,28.702
+28,578,31.0726666666667
+28,579,25.5905
+28,580,33.3798333333333
+28,581,37.8883333333333
+28,582,30.607
+28,583,27.3473333333333
+28,584,32.7025
+28,585,31.4748333333333
+28,586,32.3426666666667
+28,587,31.0726666666667
+28,588,35.0943333333333
+28,589,37.5073333333333
+28,590,27.2203333333333
+28,591,31.9193333333333
+28,592,32.6813333333333
+28,593,28.0246666666667
+28,594,26.0773333333333
+28,595,28.0035
+28,596,30.6916666666667
+28,597,24.8708333333333
+28,598,31.8135
+28,599,24.3205
+28,600,22.352
+28,601,30.734
+28,602,35.6658333333333
+28,603,34.9885
+28,604,26.5006666666667
+28,605,27.7495
+28,606,31.3901666666667
+28,607,37.2533333333333
+28,608,26.6488333333333
+28,609,34.8191666666667
+28,610,26.1196666666667
+28,611,30.4376666666667
+28,612,36.195
+28,613,27.5378333333333
+28,614,37.9306666666667
+28,615,28.067
+28,616,25.9291666666667
+28,617,26.2466666666667
+28,618,28.7655
+28,619,31.0515
+28,620,31.75
+28,621,27.8553333333333
+28,622,26.5853333333333
+28,623,30.7763333333333
+28,624,27.6013333333333
+28,625,26.797
+28,626,37.6343333333333
+28,627,23.7913333333333
+28,628,29.2523333333333
+28,629,29.5275
+28,630,36.068
+28,631,26.6065
+28,632,33.6338333333333
+28,633,29.5486666666667
+28,634,29.4005
+28,635,36.3643333333333
+28,636,30.48
+28,637,38.8196666666667
+28,638,32.7236666666667
+28,639,33.1046666666667
+28,640,29.337
+28,641,25.527
+28,642,32.2156666666667
+28,643,33.1681666666667
+28,644,30.3318333333333
+28,645,28.3421666666667
+28,646,31.0303333333333
+28,647,32.4061666666667
+28,648,31.369
+28,649,26.6276666666667
+28,650,35.0096666666667
+28,651,27.5166666666667
+28,652,28.5538333333333
+28,653,33.3798333333333
+28,654,23.4738333333333
+28,655,32.2156666666667
+28,656,30.6705
+28,657,29.0406666666667
+28,658,32.3003333333333
+28,659,25.5058333333333
+28,660,27.432
+28,661,37.0628333333333
+28,662,21.082
+28,663,30.0778333333333
+28,664,37.2745
+28,665,31.115
+28,666,43.2646666666667
+28,667,26.2255
+28,668,25.5481666666667
+28,669,34.925
+28,670,27.7706666666667
+28,671,30.2471666666667
+28,672,33.1893333333333
+28,673,27.8765
+28,674,23.7066666666667
+28,675,29.7603333333333
+28,676,35.2213333333333
+28,677,25.8656666666667
+28,678,32.6813333333333
+28,679,31.3478333333333
+28,680,28.6596666666667
+28,681,29.5063333333333
+28,682,33.0411666666667
+28,683,25.8021666666667
+28,684,19.7273333333333
+28,685,31.1573333333333
+28,686,21.971
+28,687,25.4
+28,688,30.9245
+28,689,28.3421666666667
+28,690,33.401
+28,691,31.8346666666667
+28,692,27.9188333333333
+28,693,31.7076666666667
+28,694,31.3266666666667
+28,695,26.3736666666667
+28,696,29.3581666666667
+28,697,28.6385
+28,698,33.5915
+28,699,26.2678333333333
+28,700,27.5378333333333
+28,701,30.1201666666667
+28,702,32.8718333333333
+28,703,37.9306666666667
+28,704,37.2956666666667
+28,705,29.1676666666667
+28,706,31.8135
+28,707,28.2786666666667
+28,708,28.0881666666667
+28,709,32.9776666666667
+28,710,24.7226666666667
+28,711,35.6446666666667
+28,712,34.6075
+28,713,37.846
+28,714,31.5806666666667
+28,715,29.5275
+28,716,33.6126666666667
+28,717,28.1093333333333
+28,718,27.178
+28,719,31.4325
+28,720,30.5223333333333
+28,721,30.988
+28,722,28.321
+28,723,29.3793333333333
+28,724,28.3421666666667
+28,725,31.115
+28,726,35.8986666666667
+28,727,33.5703333333333
+28,728,38.5656666666667
+28,729,31.6441666666667
+28,730,26.4583333333333
+28,731,30.48
+28,732,34.3958333333333
+28,733,28.1728333333333
+28,734,30.0566666666667
+28,735,27.9823333333333
+28,736,32.8506666666667
+28,737,33.6338333333333
+28,738,29.8873333333333
+28,739,27.3473333333333
+28,740,31.0726666666667
+28,741,22.1403333333333
+28,742,23.6643333333333
+28,743,27.4108333333333
+28,744,23.9395
+28,745,31.4325
+28,746,27.8765
+28,747,30.099
+28,748,28.8501666666667
+28,749,36.3643333333333
+28,750,39.9838333333333
+28,751,32.2791666666667
+28,752,33.7396666666667
+28,753,29.5698333333333
+28,754,27.9611666666667
+28,755,32.2791666666667
+28,756,29.6968333333333
+28,757,35.7293333333333
+28,758,34.7133333333333
+28,759,38.2905
+28,760,29.083
+28,761,30.8186666666667
+28,762,29.9508333333333
+28,763,24.2993333333333
+28,764,31.5171666666667
+28,765,28.2786666666667
+28,766,34.925
+28,767,34.2688333333333
+28,768,28.9771666666667
+28,769,29.1676666666667
+28,770,25.4
+28,771,31.496
+28,772,32.0463333333333
+28,773,39.497
+28,774,32.1733333333333
+28,775,26.797
+28,776,24.8496666666667
+28,777,37.4015
+28,778,23.5585
+28,779,28.2998333333333
+28,780,26.2466666666667
+28,781,28.3633333333333
+28,782,30.0355
+28,783,31.6653333333333
+28,784,29.2946666666667
+28,785,34.0783333333333
+28,786,26.67
+28,787,27.305
+28,788,24.9131666666667
+28,789,29.8873333333333
+28,790,38.3963333333333
+28,791,31.7076666666667
+28,792,26.6488333333333
+28,793,25.5693333333333
+28,794,27.7918333333333
+28,795,32.5543333333333
+28,796,27.3685
+28,797,28.4056666666667
+28,798,24.3628333333333
+28,799,31.5806666666667
+28,800,33.782
+28,801,28.448
+28,802,35.8563333333333
+28,803,30.353
+28,804,35.56
+28,805,37.4226666666667
+28,806,29.718
+28,807,29.5063333333333
+28,808,28.5961666666667
+28,809,26.035
+28,810,31.3266666666667
+28,811,29.5486666666667
+28,812,35.5176666666667
+28,813,32.9353333333333
+28,814,26.416
+28,815,33.8243333333333
+28,816,29.337
+28,817,32.8718333333333
+28,818,31.8135
+28,819,31.1573333333333
+28,820,29.845
+28,821,29.6756666666667
+28,822,30.9456666666667
+28,823,34.8615
+28,824,40.4283333333333
+28,825,29.6333333333333
+28,826,26.7335
+28,827,35.306
+28,828,32.8295
+28,829,33.4433333333333
+28,830,31.6653333333333
+28,831,24.5533333333333
+28,832,31.3266666666667
+28,833,29.7815
+28,834,29.1676666666667
+28,835,30.9033333333333
+28,836,36.703
+28,837,25.6751666666667
+28,838,33.4221666666667
+28,839,38.7561666666667
+28,840,31.1361666666667
+28,841,23.5585
+28,842,30.7975
+28,843,27.94
+28,844,28.0035
+28,845,32.258
+28,846,31.9616666666667
+28,847,26.4583333333333
+28,848,29.1253333333333
+28,849,33.6973333333333
+28,850,34.6286666666667
+28,851,30.226
+28,852,34.5651666666667
+28,853,29.1041666666667
+28,854,24.9131666666667
+28,855,35.0943333333333
+28,856,27.7918333333333
+28,857,24.9978333333333
+28,858,26.5218333333333
+28,859,23.8971666666667
+28,860,31.1573333333333
+28,861,29.8238333333333
+28,862,38.227
+28,863,27.686
+28,864,36.8088333333333
+28,865,26.9028333333333
+28,866,29.2946666666667
+28,867,29.6756666666667
+28,868,29.9085
+28,869,32.5543333333333
+28,870,26.9451666666667
+28,871,29.1041666666667
+28,872,24.13
+28,873,28.321
+28,874,29.1253333333333
+28,875,28.3421666666667
+28,876,34.7133333333333
+28,877,28.8713333333333
+28,878,32.9353333333333
+28,879,27.559
+28,880,24.8073333333333
+28,881,29.0618333333333
+28,882,33.1681666666667
+28,883,33.3375
+28,884,27.6013333333333
+28,885,36.703
+28,886,32.893
+28,887,36.3431666666667
+28,888,32.9141666666667
+28,889,35.052
+28,890,26.4795
+28,891,26.9875
+28,892,30.5646666666667
+28,893,25.654
+28,894,25.4423333333333
+28,895,27.686
+28,896,28.9348333333333
+28,897,28.9136666666667
+28,898,25.4
+28,899,30.1413333333333
+28,900,29.4216666666667
+28,901,29.0195
+28,902,35.4753333333333
+28,903,26.67
+28,904,30.0778333333333
+28,905,29.4216666666667
+28,906,37.2533333333333
+28,907,29.8238333333333
+28,908,34.9461666666667
+28,909,35.3271666666667
+28,910,26.2043333333333
+28,911,25.0825
+28,912,29.845
+28,913,31.1573333333333
+28,914,31.0303333333333
+28,915,25.654
+28,916,28.7231666666667
+28,917,31.1361666666667
+28,918,26.7758333333333
+28,919,26.8181666666667
+28,920,30.1836666666667
+28,921,29.9085
+28,922,23.5585
+28,923,27.1356666666667
+28,924,34.5863333333333
+28,925,32.4696666666667
+28,926,28.2998333333333
+28,927,34.3746666666667
+28,928,34.163
+28,929,33.2528333333333
+28,930,32.385
+28,931,25.8233333333333
+28,932,36.1738333333333
+28,933,34.925
+28,934,35.7505
+28,935,26.9451666666667
+28,936,22.098
+28,937,30.353
+28,938,33.5491666666667
+28,939,34.0995
+28,940,26.6276666666667
+28,941,25.5058333333333
+28,942,30.3318333333333
+28,943,28.9136666666667
+28,944,25.3365
+28,945,30.988
+28,946,28.8713333333333
+28,947,30.6281666666667
+28,948,31.2843333333333
+28,949,24.892
+28,950,37.5496666666667
+28,951,27.7283333333333
+28,952,40.9998333333333
+28,953,28.067
+28,954,30.4376666666667
+28,955,28.1516666666667
+28,956,22.8388333333333
+28,957,29.9508333333333
+28,958,33.0623333333333
+28,959,28.8925
+28,960,30.48
+28,961,27.8976666666667
+28,962,36.068
+28,963,38.354
+28,964,26.2678333333333
+28,965,23.6008333333333
+28,966,25.6963333333333
+28,967,31.9616666666667
+28,968,30.2895
+28,969,31.9193333333333
+28,970,29.1888333333333
+28,971,29.4216666666667
+28,972,26.7335
+28,973,30.4376666666667
+28,974,28.3633333333333
+28,975,24.5321666666667
+28,976,28.6173333333333
+28,977,35.7293333333333
+28,978,32.0886666666667
+28,979,31.5383333333333
+28,980,30.48
+28,981,28.7443333333333
+28,982,35.56
+28,983,33.1046666666667
+28,984,30.3318333333333
+28,985,32.0886666666667
+28,986,25.7175
+28,987,33.8243333333333
+28,988,31.3055
+28,989,27.5166666666667
+28,990,33.6761666666667
+28,991,34.2265
+28,992,29.972
+28,993,30.3953333333333
+28,994,30.9456666666667
+28,995,29.1676666666667
+28,996,28.1516666666667
+28,997,31.0515
+28,998,31.4748333333333
+28,999,24.7226666666667
+28,1000,27.3896666666667
+29,1,23.0293333333333
+29,2,28.8713333333333
+29,3,21.6323333333333
+29,4,27.7071666666667
+29,5,29.0406666666667
+29,6,34.5228333333333
+29,7,30.353
+29,8,22.0133333333333
+29,9,35.3695
+29,10,32.385
+29,11,27.3896666666667
+29,12,33.1258333333333
+29,13,29.3581666666667
+29,14,34.8615
+29,15,37.1475
+29,16,28.8078333333333
+29,17,25.4211666666667
+29,18,35.1366666666667
+29,19,33.2951666666667
+29,20,29.337
+29,21,33.528
+29,22,28.2786666666667
+29,23,19.7273333333333
+29,24,34.036
+29,25,26.67
+29,26,35.3271666666667
+29,27,34.7345
+29,28,33.2105
+29,29,24.1723333333333
+29,30,29.464
+29,31,26.5853333333333
+29,32,28.9136666666667
+29,33,28.3845
+29,34,33.8666666666667
+29,35,27.432
+29,36,32.3638333333333
+29,37,28.3845
+29,38,39.2641666666667
+29,39,24.892
+29,40,25.2095
+29,41,34.5228333333333
+29,42,26.0561666666667
+29,43,49.784
+29,44,30.3953333333333
+29,45,29.5486666666667
+29,46,30.7975
+29,47,37.4226666666667
+29,48,32.258
+29,49,32.8083333333333
+29,50,32.385
+29,51,25.5693333333333
+29,52,32.9988333333333
+29,53,26.5641666666667
+29,54,22.1826666666667
+29,55,27.7918333333333
+29,56,30.6493333333333
+29,57,30.6281666666667
+29,58,29.972
+29,59,31.3266666666667
+29,60,36.0468333333333
+29,61,32.4908333333333
+29,62,32.004
+29,63,24.8073333333333
+29,64,36.4913333333333
+29,65,29.21
+29,66,23.6855
+29,67,31.3478333333333
+29,68,23.1775
+29,69,29.1465
+29,70,28.7231666666667
+29,71,30.6916666666667
+29,72,34.417
+29,73,33.9513333333333
+29,74,27.9823333333333
+29,75,32.4908333333333
+29,76,28.1728333333333
+29,77,38.2693333333333
+29,78,33.4221666666667
+29,79,38.5021666666667
+29,80,26.67
+29,81,28.4691666666667
+29,82,30.6705
+29,83,28.7655
+29,84,35.0308333333333
+29,85,28.8925
+29,86,28.1516666666667
+29,87,29.6756666666667
+29,88,27.3685
+29,89,31.5171666666667
+29,90,41.3385
+29,91,27.813
+29,92,31.8558333333333
+29,93,32.004
+29,94,26.1196666666667
+29,95,33.7396666666667
+29,96,32.0463333333333
+29,97,26.3525
+29,98,25.2518333333333
+29,99,26.7335
+29,100,39.1583333333333
+29,101,30.3106666666667
+29,102,25.9926666666667
+29,103,32.7025
+29,104,35.4118333333333
+29,105,36.3643333333333
+29,106,34.0148333333333
+29,107,35.4965
+29,108,32.3215
+29,109,32.9565
+29,110,28.2363333333333
+29,111,31.0515
+29,112,30.0355
+29,113,31.75
+29,114,38.7561666666667
+29,115,34.9038333333333
+29,116,26.5853333333333
+29,117,32.7025
+29,118,26.8605
+29,119,29.9931666666667
+29,120,44.1536666666667
+29,121,26.7335
+29,122,29.4851666666667
+29,123,26.9875
+29,124,35.9198333333333
+29,125,30.8186666666667
+29,126,27.8976666666667
+29,127,22.733
+29,128,30.6493333333333
+29,129,32.3215
+29,130,27.8553333333333
+29,131,35.306
+29,132,38.227
+29,133,28.8713333333333
+29,134,35.6023333333333
+29,135,31.0091666666667
+29,136,31.5595
+29,137,33.5491666666667
+29,138,32.2368333333333
+29,139,33.0411666666667
+29,140,26.6065
+29,141,27.6013333333333
+29,142,25.273
+29,143,33.3586666666667
+29,144,34.0995
+29,145,25.7598333333333
+29,146,38.0365
+29,147,37.5708333333333
+29,148,24.4475
+29,149,30.9668333333333
+29,150,28.1516666666667
+29,151,36.1526666666667
+29,152,26.0773333333333
+29,153,31.7711666666667
+29,154,27.3896666666667
+29,155,22.7118333333333
+29,156,29.4216666666667
+29,157,31.2843333333333
+29,158,26.543
+29,159,23.1563333333333
+29,160,35.4541666666667
+29,161,20.574
+29,162,23.749
+29,163,28.0881666666667
+29,164,18.5208333333333
+29,165,28.9983333333333
+29,166,22.225
+29,167,30.5011666666667
+29,168,27.0721666666667
+29,169,36.1526666666667
+29,170,26.5006666666667
+29,171,34.2265
+29,172,24.0453333333333
+29,173,35.4753333333333
+29,174,33.3586666666667
+29,175,34.8403333333333
+29,176,29.845
+29,177,34.5863333333333
+29,178,28.9771666666667
+29,179,23.1351666666667
+29,180,27.94
+29,181,25.6116666666667
+29,182,28.5538333333333
+29,183,30.4165
+29,184,32.2368333333333
+29,185,35.6023333333333
+29,186,27.2626666666667
+29,187,27.2203333333333
+29,188,30.9456666666667
+29,189,31.3901666666667
+29,190,34.29
+29,191,25.4
+29,192,31.4748333333333
+29,193,25.1883333333333
+29,194,32.2156666666667
+29,195,28.8713333333333
+29,196,28.3421666666667
+29,197,29.1888333333333
+29,198,30.48
+29,199,27.1568333333333
+29,200,23.749
+29,201,24.765
+29,202,32.1945
+29,203,31.0515
+29,204,34.5863333333333
+29,205,46.2703333333333
+29,206,30.5858333333333
+29,207,30.3106666666667
+29,208,19.6215
+29,209,26.7758333333333
+29,210,30.8186666666667
+29,211,31.8135
+29,212,27.4531666666667
+29,213,38.1423333333333
+29,214,27.2415
+29,215,28.0035
+29,216,35.052
+29,217,28.0458333333333
+29,218,26.797
+29,219,34.3746666666667
+29,220,29.6333333333333
+29,221,34.036
+29,222,31.8558333333333
+29,223,24.2781666666667
+29,224,31.5806666666667
+29,225,33.4856666666667
+29,226,29.972
+29,227,34.8403333333333
+29,228,35.8775
+29,229,36.5971666666667
+29,230,27.7706666666667
+29,231,43.2858333333333
+29,232,37.3803333333333
+29,233,34.2053333333333
+29,234,36.8935
+29,235,29.9508333333333
+29,236,32.4696666666667
+29,237,27.5378333333333
+29,238,29.7815
+29,239,35.1578333333333
+29,240,36.2161666666667
+29,241,47.0111666666667
+29,242,32.4696666666667
+29,243,26.9028333333333
+29,244,27.5166666666667
+29,245,40.5553333333333
+29,246,36.0045
+29,247,32.2791666666667
+29,248,35.7928333333333
+29,249,33.0411666666667
+29,250,29.845
+29,251,35.814
+29,252,31.242
+29,253,28.6173333333333
+29,254,36.8088333333333
+29,255,34.1206666666667
+29,256,32.512
+29,257,30.6705
+29,258,34.8403333333333
+29,259,28.1728333333333
+29,260,30.6705
+29,261,28.4691666666667
+29,262,35.1366666666667
+29,263,27.9823333333333
+29,264,31.4325
+29,265,34.671
+29,266,35.814
+29,267,29.6756666666667
+29,268,23.4738333333333
+29,269,36.9781666666667
+29,270,30.5435
+29,271,28.4691666666667
+29,272,27.305
+29,273,33.3163333333333
+29,274,28.3633333333333
+29,275,32.4696666666667
+29,276,23.7278333333333
+29,277,36.4278333333333
+29,278,23.495
+29,279,34.0148333333333
+29,280,35.9198333333333
+29,281,26.035
+29,282,27.1991666666667
+29,283,35.0096666666667
+29,284,31.3478333333333
+29,285,28.1728333333333
+29,286,39.6663333333333
+29,287,30.3953333333333
+29,288,32.3638333333333
+29,289,32.4061666666667
+29,290,25.7598333333333
+29,291,35.4753333333333
+29,292,28.8925
+29,293,34.036
+29,294,27.686
+29,295,32.2791666666667
+29,296,23.6855
+29,297,30.6493333333333
+29,298,37.7613333333333
+29,299,39.878
+29,300,30.8186666666667
+29,301,24.765
+29,302,33.1258333333333
+29,303,30.988
+29,304,34.0571666666667
+29,305,29.5063333333333
+29,306,25.273
+29,307,28.3421666666667
+29,308,35.0308333333333
+29,309,34.1418333333333
+29,310,24.7861666666667
+29,311,22.7965
+29,312,27.5801666666667
+29,313,28.5961666666667
+29,314,33.3375
+29,315,28.2786666666667
+29,316,24.5321666666667
+29,317,32.5755
+29,318,34.7768333333333
+29,319,23.6431666666667
+29,320,22.225
+29,321,25.1248333333333
+29,322,28.7443333333333
+29,323,29.591
+29,324,32.2156666666667
+29,325,38.8408333333333
+29,326,26.3313333333333
+29,327,26.9028333333333
+29,328,24.4051666666667
+29,329,32.385
+29,330,29.0195
+29,331,24.5321666666667
+29,332,29.4428333333333
+29,333,26.4371666666667
+29,334,30.861
+29,335,29.845
+29,336,30.734
+29,337,31.8981666666667
+29,338,26.8816666666667
+29,339,27.9611666666667
+29,340,33.2528333333333
+29,341,20.3411666666667
+29,342,32.7448333333333
+29,343,32.4273333333333
+29,344,38.354
+29,345,29.1253333333333
+29,346,32.766
+29,347,34.6921666666667
+29,348,33.7185
+29,349,25.3788333333333
+29,350,30.734
+29,351,30.6705
+29,352,27.4955
+29,353,39.9626666666667
+29,354,26.7546666666667
+29,355,28.8925
+29,356,30.48
+29,357,33.4856666666667
+29,358,27.6013333333333
+29,359,33.782
+29,360,30.6916666666667
+29,361,37.6343333333333
+29,362,20.4681666666667
+29,363,32.2156666666667
+29,364,30.8398333333333
+29,365,30.5646666666667
+29,366,28.9348333333333
+29,367,29.7391666666667
+29,368,29.9296666666667
+29,369,36.6183333333333
+29,370,33.02
+29,371,24.5533333333333
+29,372,37.6131666666667
+29,373,34.2688333333333
+29,374,28.5326666666667
+29,375,35.433
+29,376,22.5213333333333
+29,377,33.6973333333333
+29,378,30.9456666666667
+29,379,42.3756666666667
+29,380,32.5966666666667
+29,381,36.9146666666667
+29,382,31.6018333333333
+29,383,24.4475
+29,384,39.3911666666667
+29,385,39.8991666666667
+29,386,30.1625
+29,387,45.9105
+29,388,26.1831666666667
+29,389,26.67
+29,390,30.7128333333333
+29,391,29.5063333333333
+29,392,29.5698333333333
+29,393,28.4691666666667
+29,394,27.0721666666667
+29,395,39.3276666666667
+29,396,31.4536666666667
+29,397,25.6328333333333
+29,398,30.4588333333333
+29,399,25.5481666666667
+29,400,36.703
+29,401,37.9941666666667
+29,402,27.686
+29,403,31.2208333333333
+29,404,33.7608333333333
+29,405,32.385
+29,406,29.7603333333333
+29,407,32.639
+29,408,35.56
+29,409,31.3266666666667
+29,410,34.8615
+29,411,34.925
+29,412,23.0081666666667
+29,413,32.1521666666667
+29,414,32.5755
+29,415,24.1723333333333
+29,416,32.893
+29,417,32.639
+29,418,35.2636666666667
+29,419,40.4495
+29,420,32.1098333333333
+29,421,28.7231666666667
+29,422,28.1305
+29,423,27.3473333333333
+29,424,32.5331666666667
+29,425,30.7975
+29,426,33.7396666666667
+29,427,29.4005
+29,428,32.893
+29,429,25.3365
+29,430,39.8991666666667
+29,431,34.7556666666667
+29,432,29.7815
+29,433,32.9565
+29,434,21.8228333333333
+29,435,32.512
+29,436,32.7871666666667
+29,437,32.0463333333333
+29,438,29.9296666666667
+29,439,28.5326666666667
+29,440,31.6018333333333
+29,441,31.2843333333333
+29,442,29.8873333333333
+29,443,34.417
+29,444,32.2791666666667
+29,445,30.9456666666667
+29,446,26.0138333333333
+29,447,23.3468333333333
+29,448,33.8455
+29,449,36.7241666666667
+29,450,39.0101666666667
+29,451,37.4015
+29,452,28.6385
+29,453,23.4103333333333
+29,454,33.3375
+29,455,26.0138333333333
+29,456,25.5693333333333
+29,457,29.5486666666667
+29,458,29.3581666666667
+29,459,26.416
+29,460,36.1315
+29,461,32.4696666666667
+29,462,29.4005
+29,463,31.7923333333333
+29,464,33.2316666666667
+29,465,33.0835
+29,466,24.4475
+29,467,32.2791666666667
+29,468,27.7495
+29,469,33.6126666666667
+29,470,23.0505
+29,471,34.6498333333333
+29,472,30.4165
+29,473,29.8238333333333
+29,474,34.9038333333333
+29,475,27.9611666666667
+29,476,25.4423333333333
+29,477,31.6653333333333
+29,478,25.3576666666667
+29,479,26.8605
+29,480,35.7716666666667
+29,481,32.2368333333333
+29,482,37.4226666666667
+29,483,28.1305
+29,484,38.227
+29,485,31.7288333333333
+29,486,31.0303333333333
+29,487,39.1371666666667
+29,488,28.2786666666667
+29,489,32.6601666666667
+29,490,26.9875
+29,491,30.1201666666667
+29,492,36.2161666666667
+29,493,35.7928333333333
+29,494,28.7655
+29,495,33.6126666666667
+29,496,24.4263333333333
+29,497,29.1888333333333
+29,498,42.4391666666667
+29,499,30.3318333333333
+29,500,32.8506666666667
+29,501,28.8713333333333
+29,502,30.3953333333333
+29,503,34.3111666666667
+29,504,34.671
+29,505,26.7758333333333
+29,506,33.9936666666667
+29,507,31.0091666666667
+29,508,31.369
+29,509,25.8233333333333
+29,510,34.2476666666667
+29,511,24.9555
+29,512,29.0618333333333
+29,513,29.464
+29,514,25.781
+29,515,28.448
+29,516,35.2425
+29,517,28.067
+29,518,42.2698333333333
+29,519,34.9885
+29,520,26.035
+29,521,26.67
+29,522,34.8191666666667
+29,523,34.7133333333333
+29,524,33.7185
+29,525,29.4851666666667
+29,526,27.5378333333333
+29,527,25.5481666666667
+29,528,24.1511666666667
+29,529,30.0355
+29,530,32.5966666666667
+29,531,35.0096666666667
+29,532,32.7025
+29,533,24.1088333333333
+29,534,31.7711666666667
+29,535,20.1295
+29,536,33.5491666666667
+29,537,32.1098333333333
+29,538,26.416
+29,539,17.4201666666667
+29,540,33.7185
+29,541,37.8883333333333
+29,542,36.4066666666667
+29,543,32.4696666666667
+29,544,34.1418333333333
+29,545,25.6328333333333
+29,546,39.2853333333333
+29,547,36.957
+29,548,36.576
+29,549,35.0308333333333
+29,550,27.6225
+29,551,38.2693333333333
+29,552,35.2425
+29,553,29.845
+29,554,28.6385
+29,555,26.5853333333333
+29,556,28.7655
+29,557,32.893
+29,558,26.3101666666667
+29,559,30.8398333333333
+29,560,32.2156666666667
+29,561,26.3736666666667
+29,562,33.147
+29,563,33.3586666666667
+29,564,29.9508333333333
+29,565,32.5543333333333
+29,566,33.4645
+29,567,29.1888333333333
+29,568,28.1305
+29,569,34.6498333333333
+29,570,33.7396666666667
+29,571,28.2363333333333
+29,572,29.4216666666667
+29,573,29.7603333333333
+29,574,31.369
+29,575,35.7928333333333
+29,576,32.9353333333333
+29,577,34.4593333333333
+29,578,30.5435
+29,579,30.2683333333333
+29,580,36.3855
+29,581,23.6643333333333
+29,582,34.925
+29,583,26.1408333333333
+29,584,23.8125
+29,585,34.2053333333333
+29,586,31.4748333333333
+29,587,33.147
+29,588,28.0035
+29,589,36.4278333333333
+29,590,30.3741666666667
+29,591,31.9828333333333
+29,592,27.4108333333333
+29,593,39.2006666666667
+29,594,25.5905
+29,595,21.971
+29,596,26.2255
+29,597,33.782
+29,598,20.193
+29,599,33.6973333333333
+29,600,24.6168333333333
+29,601,36.957
+29,602,30.5646666666667
+29,603,31.2208333333333
+29,604,32.5755
+29,605,29.1253333333333
+29,606,34.3111666666667
+29,607,21.9498333333333
+29,608,33.655
+29,609,28.8713333333333
+29,610,32.512
+29,611,28.9983333333333
+29,612,23.368
+29,613,30.7763333333333
+29,614,28.2786666666667
+29,615,37.2533333333333
+29,616,34.0995
+29,617,36.8723333333333
+29,618,26.8605
+29,619,35.5811666666667
+29,620,30.099
+29,621,28.9771666666667
+29,622,33.6761666666667
+29,623,31.1573333333333
+29,624,29.7391666666667
+29,625,33.7396666666667
+29,626,34.6921666666667
+29,627,33.4221666666667
+29,628,32.6178333333333
+29,629,27.5378333333333
+29,630,37.6343333333333
+29,631,38.7773333333333
+29,632,28.7655
+29,633,33.8031666666667
+29,634,33.8031666666667
+29,635,28.829
+29,636,17.9916666666667
+29,637,33.4856666666667
+29,638,37.1475
+29,639,25.3153333333333
+29,640,27.8976666666667
+29,641,33.8243333333333
+29,642,33.3375
+29,643,31.1361666666667
+29,644,31.369
+29,645,24.5745
+29,646,32.1521666666667
+29,647,40.9363333333333
+29,648,31.1785
+29,649,30.4376666666667
+29,650,39.9838333333333
+29,651,38.0365
+29,652,30.2683333333333
+29,653,38.2058333333333
+29,654,30.5223333333333
+29,655,33.9301666666667
+29,656,33.0623333333333
+29,657,35.5176666666667
+29,658,29.083
+29,659,37.9518333333333
+29,660,30.4376666666667
+29,661,33.1258333333333
+29,662,31.877
+29,663,29.9085
+29,664,34.1418333333333
+29,665,22.4155
+29,666,32.4273333333333
+29,667,34.0571666666667
+29,668,26.9875
+29,669,26.035
+29,670,29.1676666666667
+29,671,27.7706666666667
+29,672,20.5105
+29,673,39.0101666666667
+29,674,23.6855
+29,675,27.5166666666667
+29,676,34.417
+29,677,27.559
+29,678,29.972
+29,679,29.6968333333333
+29,680,37.8036666666667
+29,681,34.8826666666667
+29,682,33.0835
+29,683,22.6695
+29,684,32.4908333333333
+29,685,34.1418333333333
+29,686,31.6653333333333
+29,687,36.9993333333333
+29,688,27.94
+29,689,34.2688333333333
+29,690,30.1201666666667
+29,691,30.3106666666667
+29,692,31.0726666666667
+29,693,29.6333333333333
+29,694,27.7283333333333
+29,695,37.592
+29,696,31.6653333333333
+29,697,29.845
+29,698,32.4696666666667
+29,699,33.0623333333333
+29,700,34.2476666666667
+29,701,39.0736666666667
+29,702,36.7876666666667
+29,703,26.3313333333333
+29,704,29.8661666666667
+29,705,31.2843333333333
+29,706,25.2941666666667
+29,707,31.2631666666667
+29,708,36.3431666666667
+29,709,38.3751666666667
+29,710,29.3793333333333
+29,711,30.48
+29,712,25.3153333333333
+29,713,36.0256666666667
+29,714,27.7071666666667
+29,715,27.9611666666667
+29,716,35.3271666666667
+29,717,29.6545
+29,718,34.163
+29,719,29.083
+29,720,34.4805
+29,721,31.4536666666667
+29,722,27.9823333333333
+29,723,25.7386666666667
+29,724,35.941
+29,725,28.5115
+29,726,32.2368333333333
+29,727,34.417
+29,728,29.8661666666667
+29,729,38.227
+29,730,33.9513333333333
+29,731,29.6333333333333
+29,732,29.8238333333333
+29,733,33.2105
+29,734,27.813
+29,735,27.1568333333333
+29,736,34.0783333333333
+29,737,36.8935
+29,738,33.6761666666667
+29,739,27.3896666666667
+29,740,32.0463333333333
+29,741,30.0355
+29,742,20.5951666666667
+29,743,26.4371666666667
+29,744,33.782
+29,745,30.48
+29,746,26.4371666666667
+29,747,39.6875
+29,748,36.6606666666667
+29,749,36.6606666666667
+29,750,30.1201666666667
+29,751,27.7918333333333
+29,752,35.1155
+29,753,33.6126666666667
+29,754,24.9343333333333
+29,755,30.9456666666667
+29,756,25.273
+29,757,28.321
+29,758,33.3586666666667
+29,759,36.7241666666667
+29,760,29.3581666666667
+29,761,26.5218333333333
+29,762,29.8873333333333
+29,763,29.7603333333333
+29,764,25.9503333333333
+29,765,34.7768333333333
+29,766,31.5383333333333
+29,767,44.0478333333333
+29,768,35.9621666666667
+29,769,32.8718333333333
+29,770,29.0195
+29,771,32.7871666666667
+29,772,35.7081666666667
+29,773,25.8445
+29,774,33.528
+29,775,34.9038333333333
+29,776,21.4418333333333
+29,777,34.8615
+29,778,27.0086666666667
+29,779,28.575
+29,780,37.2321666666667
+29,781,31.496
+29,782,43.053
+29,783,34.5016666666667
+29,784,34.0571666666667
+29,785,31.3266666666667
+29,786,32.3215
+29,787,34.9038333333333
+29,788,30.0566666666667
+29,789,26.9028333333333
+29,790,21.971
+29,791,33.4221666666667
+29,792,26.3101666666667
+29,793,24.6803333333333
+29,794,34.5651666666667
+29,795,33.6338333333333
+29,796,28.7866666666667
+29,797,36.7453333333333
+29,798,30.7975
+29,799,40.4283333333333
+29,800,25.9715
+29,801,32.7236666666667
+29,802,38.989
+29,803,25.5058333333333
+29,804,37.7401666666667
+29,805,29.591
+29,806,29.7391666666667
+29,807,32.0675
+29,808,27.4531666666667
+29,809,37.0628333333333
+29,810,27.3685
+29,811,30.0143333333333
+29,812,26.543
+29,813,32.5543333333333
+29,814,28.448
+29,815,29.2946666666667
+29,816,33.8878333333333
+29,817,28.7866666666667
+29,818,36.5125
+29,819,34.9885
+29,820,36.2373333333333
+29,821,30.4588333333333
+29,822,33.147
+29,823,33.5068333333333
+29,824,31.2843333333333
+29,825,32.9353333333333
+29,826,25.1036666666667
+29,827,32.4696666666667
+29,828,36.0468333333333
+29,829,31.6441666666667
+29,830,28.6173333333333
+29,831,32.1945
+29,832,37.2321666666667
+29,833,27.5801666666667
+29,834,26.9028333333333
+29,835,41.1903333333333
+29,836,31.6441666666667
+29,837,34.6286666666667
+29,838,37.465
+29,839,24.2993333333333
+29,840,30.4588333333333
+29,841,32.766
+29,842,38.8196666666667
+29,843,31.75
+29,844,34.1841666666667
+29,845,31.0091666666667
+29,846,27.2626666666667
+29,847,28.5115
+29,848,33.4221666666667
+29,849,36.068
+29,850,30.5858333333333
+29,851,34.8826666666667
+29,852,32.0675
+29,853,30.6281666666667
+29,854,31.9828333333333
+29,855,30.5435
+29,856,33.528
+29,857,32.6178333333333
+29,858,36.4278333333333
+29,859,31.877
+29,860,30.3741666666667
+29,861,31.2631666666667
+29,862,37.4226666666667
+29,863,37.3803333333333
+29,864,26.416
+29,865,29.0195
+29,866,34.2688333333333
+29,867,29.7815
+29,868,40.3225
+29,869,27.8553333333333
+29,870,26.0138333333333
+29,871,35.4965
+29,872,32.4908333333333
+29,873,36.8511666666667
+29,874,38.2058333333333
+29,875,30.4588333333333
+29,876,42.7143333333333
+29,877,28.0458333333333
+29,878,36.0468333333333
+29,879,31.0303333333333
+29,880,26.6276666666667
+29,881,31.75
+29,882,26.6276666666667
+29,883,40.3436666666667
+29,884,31.5806666666667
+29,885,28.6596666666667
+29,886,25.8656666666667
+29,887,30.6281666666667
+29,888,38.7773333333333
+29,889,33.2316666666667
+29,890,25.9926666666667
+29,891,31.1573333333333
+29,892,35.6658333333333
+29,893,29.1253333333333
+29,894,32.6601666666667
+29,895,36.4066666666667
+29,896,23.5585
+29,897,40.259
+29,898,25.5693333333333
+29,899,40.2378333333333
+29,900,33.2951666666667
+29,901,35.8351666666667
+29,902,24.9555
+29,903,26.3101666666667
+29,904,35.3906666666667
+29,905,28.829
+29,906,44.1536666666667
+29,907,34.925
+29,908,34.3111666666667
+29,909,32.4485
+29,910,34.036
+29,911,36.2585
+29,912,32.8083333333333
+29,913,39.9626666666667
+29,914,31.5806666666667
+29,915,30.1836666666667
+29,916,22.987
+29,917,30.2895
+29,918,27.8976666666667
+29,919,37.8036666666667
+29,920,32.2156666666667
+29,921,29.4216666666667
+29,922,31.115
+29,923,28.6385
+29,924,28.1516666666667
+29,925,27.1568333333333
+29,926,33.6973333333333
+29,927,30.607
+29,928,35.8563333333333
+29,929,32.9776666666667
+29,930,20.6375
+29,931,24.3205
+29,932,37.8248333333333
+29,933,27.0721666666667
+29,934,33.2528333333333
+29,935,35.0308333333333
+29,936,35.1155
+29,937,33.782
+29,938,33.9513333333333
+29,939,41.1056666666667
+29,940,26.9451666666667
+29,941,23.4526666666667
+29,942,33.5068333333333
+29,943,25.0825
+29,944,27.559
+29,945,27.1991666666667
+29,946,32.1733333333333
+29,947,29.1041666666667
+29,948,31.9193333333333
+29,949,28.9348333333333
+29,950,28.8078333333333
+29,951,32.7025
+29,952,24.5745
+29,953,35.179
+29,954,32.4696666666667
+29,955,35.3906666666667
+29,956,34.5016666666667
+29,957,23.5585
+29,958,30.9033333333333
+29,959,27.3685
+29,960,29.464
+29,961,34.8826666666667
+29,962,24.4263333333333
+29,963,29.1676666666667
+29,964,26.9028333333333
+29,965,33.3586666666667
+29,966,26.924
+29,967,27.1356666666667
+29,968,31.623
+29,969,32.9565
+29,970,28.3633333333333
+29,971,36.1526666666667
+29,972,31.6441666666667
+29,973,31.2631666666667
+29,974,26.3313333333333
+29,975,33.4856666666667
+29,976,27.9611666666667
+29,977,30.5646666666667
+29,978,28.1305
+29,979,26.6911666666667
+29,980,30.7975
+29,981,34.0995
+29,982,30.2471666666667
+29,983,35.814
+29,984,29.5698333333333
+29,985,41.8888333333333
+29,986,31.6441666666667
+29,987,34.7345
+29,988,27.8765
+29,989,33.2951666666667
+29,990,28.9136666666667
+29,991,33.5703333333333
+29,992,25.4211666666667
+29,993,33.147
+29,994,32.4061666666667
+29,995,30.48
+29,996,28.8925
+29,997,33.147
+29,998,31.5806666666667
+29,999,31.0091666666667
+29,1000,24.7861666666667
+30,1,44.7675
+30,2,43.7303333333333
+30,3,40.894
+30,4,31.0091666666667
+30,5,35.2213333333333
+30,6,33.528
+30,7,38.3116666666667
+30,8,32.7448333333333
+30,9,25.8868333333333
+30,10,33.7396666666667
+30,11,30.0355
+30,12,32.3638333333333
+30,13,27.0721666666667
+30,14,36.1738333333333
+30,15,37.3168333333333
+30,16,40.3013333333333
+30,17,31.7711666666667
+30,18,27.305
+30,19,35.1366666666667
+30,20,34.3958333333333
+30,21,26.67
+30,22,35.2001666666667
+30,23,32.3638333333333
+30,24,29.6545
+30,25,33.7396666666667
+30,26,37.973
+30,27,30.3741666666667
+30,28,33.5703333333333
+30,29,40.3225
+30,30,27.8341666666667
+30,31,42.6296666666667
+30,32,37.1898333333333
+30,33,36.576
+30,34,39.7086666666667
+30,35,31.877
+30,36,33.2316666666667
+30,37,25.4846666666667
+30,38,34.9673333333333
+30,39,27.559
+30,40,32.6178333333333
+30,41,37.8883333333333
+30,42,29.9085
+30,43,32.258
+30,44,35.6235
+30,45,25.019
+30,46,41.6348333333333
+30,47,23.5796666666667
+30,48,25.8021666666667
+30,49,33.6126666666667
+30,50,31.7076666666667
+30,51,35.0943333333333
+30,52,33.9513333333333
+30,53,27.7495
+30,54,37.7825
+30,55,32.3426666666667
+30,56,37.4438333333333
+30,57,29.845
+30,58,28.6808333333333
+30,59,34.7133333333333
+30,60,31.0515
+30,61,34.3535
+30,62,36.1738333333333
+30,63,29.7815
+30,64,26.4371666666667
+30,65,24.257
+30,66,37.846
+30,67,29.3158333333333
+30,68,36.5548333333333
+30,69,34.4805
+30,70,36.195
+30,71,32.5966666666667
+30,72,33.1681666666667
+30,73,36.068
+30,74,36.0256666666667
+30,75,33.0623333333333
+30,76,34.163
+30,77,31.75
+30,78,33.5068333333333
+30,79,27.3896666666667
+30,80,36.703
+30,81,31.623
+30,82,37.0205
+30,83,34.3958333333333
+30,84,32.8295
+30,85,32.9988333333333
+30,86,25.9291666666667
+30,87,28.9348333333333
+30,88,42.7778333333333
+30,89,22.0556666666667
+30,90,31.242
+30,91,35.687
+30,92,35.3483333333333
+30,93,38.481
+30,94,33.6973333333333
+30,95,36.8723333333333
+30,96,38.481
+30,97,28.6385
+30,98,35.2213333333333
+30,99,32.3426666666667
+30,100,28.7655
+30,101,31.8981666666667
+30,102,25.7175
+30,103,40.3436666666667
+30,104,35.3695
+30,105,40.6188333333333
+30,106,26.3736666666667
+30,107,25.3788333333333
+30,108,32.131
+30,109,31.6018333333333
+30,110,30.988
+30,111,27.6225
+30,112,32.0251666666667
+30,113,28.702
+30,114,36.6395
+30,115,33.6973333333333
+30,116,31.5383333333333
+30,117,39.8991666666667
+30,118,31.0938333333333
+30,119,37.5708333333333
+30,120,32.1945
+30,121,29.4005
+30,122,42.8413333333333
+30,123,29.0195
+30,124,35.0731666666667
+30,125,34.544
+30,126,27.178
+30,127,30.0355
+30,128,33.9513333333333
+30,129,27.8553333333333
+30,130,30.7975
+30,131,36.0891666666667
+30,132,29.6121666666667
+30,133,38.7985
+30,134,38.862
+30,135,28.5115
+30,136,34.6286666666667
+30,137,29.4005
+30,138,34.3323333333333
+30,139,32.8506666666667
+30,140,42.3121666666667
+30,141,40.9998333333333
+30,142,30.9456666666667
+30,143,34.6498333333333
+30,144,33.7396666666667
+30,145,30.9668333333333
+30,146,26.6065
+30,147,28.3421666666667
+30,148,25.9715
+30,149,40.1108333333333
+30,150,32.0463333333333
+30,151,32.0251666666667
+30,152,25.6328333333333
+30,153,38.4175
+30,154,41.2961666666667
+30,155,29.0195
+30,156,42.672
+30,157,28.9983333333333
+30,158,29.9931666666667
+30,159,39.3488333333333
+30,160,35.2001666666667
+30,161,29.8661666666667
+30,162,35.7716666666667
+30,163,29.21
+30,164,31.6653333333333
+30,165,30.4165
+30,166,30.1625
+30,167,28.1728333333333
+30,168,31.9828333333333
+30,169,28.0881666666667
+30,170,20.5105
+30,171,33.6761666666667
+30,172,29.9508333333333
+30,173,33.147
+30,174,39.7933333333333
+30,175,30.607
+30,176,25.019
+30,177,33.3586666666667
+30,178,36.3643333333333
+30,179,28.4268333333333
+30,180,30.3741666666667
+30,181,40.0896666666667
+30,182,36.0891666666667
+30,183,41.3173333333333
+30,184,34.163
+30,185,38.5021666666667
+30,186,27.7283333333333
+30,187,33.5068333333333
+30,188,38.1
+30,189,30.8398333333333
+30,190,41.2961666666667
+30,191,31.4325
+30,192,27.5166666666667
+30,193,30.607
+30,194,27.2626666666667
+30,195,25.4846666666667
+30,196,39.5605
+30,197,37.1051666666667
+30,198,37.6766666666667
+30,199,26.4583333333333
+30,200,40.8728333333333
+30,201,35.0096666666667
+30,202,31.0515
+30,203,32.3215
+30,204,33.655
+30,205,37.973
+30,206,38.6503333333333
+30,207,32.9565
+30,208,33.4433333333333
+30,209,27.6436666666667
+30,210,36.8723333333333
+30,211,35.5176666666667
+30,212,34.036
+30,213,25.5905
+30,214,27.9611666666667
+30,215,28.5961666666667
+30,216,32.8718333333333
+30,217,39.5181666666667
+30,218,38.7773333333333
+30,219,25.8445
+30,220,32.0463333333333
+30,221,37.7825
+30,222,40.2166666666667
+30,223,39.116
+30,224,25.2518333333333
+30,225,40.0261666666667
+30,226,41.656
+30,227,33.2951666666667
+30,228,32.1945
+30,229,33.5491666666667
+30,230,27.9188333333333
+30,231,39.6663333333333
+30,232,29.1253333333333
+30,233,31.0091666666667
+30,234,31.1361666666667
+30,235,30.861
+30,236,35.6235
+30,237,31.369
+30,238,36.195
+30,239,33.3586666666667
+30,240,35.3695
+30,241,28.8501666666667
+30,242,25.019
+30,243,24.7015
+30,244,29.2946666666667
+30,245,35.7505
+30,246,35.6235
+30,247,30.6281666666667
+30,248,32.5331666666667
+30,249,32.6601666666667
+30,250,30.8398333333333
+30,251,37.9306666666667
+30,252,30.9668333333333
+30,253,33.02
+30,254,33.8878333333333
+30,255,37.338
+30,256,40.513
+30,257,27.7706666666667
+30,258,31.877
+30,259,29.0195
+30,260,28.702
+30,261,36.6606666666667
+30,262,33.4221666666667
+30,263,42.0158333333333
+30,264,23.9606666666667
+30,265,41.9523333333333
+30,266,30.9033333333333
+30,267,32.4061666666667
+30,268,27.6013333333333
+30,269,26.6488333333333
+30,270,27.7706666666667
+30,271,31.6653333333333
+30,272,32.1733333333333
+30,273,36.2373333333333
+30,274,34.3535
+30,275,31.496
+30,276,35.3906666666667
+30,277,32.5755
+30,278,33.0623333333333
+30,279,34.9885
+30,280,30.4376666666667
+30,281,31.0938333333333
+30,282,25.6116666666667
+30,283,37.3803333333333
+30,284,43.9843333333333
+30,285,26.5641666666667
+30,286,28.6385
+30,287,32.7871666666667
+30,288,33.147
+30,289,28.3421666666667
+30,290,31.6441666666667
+30,291,41.8465
+30,292,26.8393333333333
+30,293,33.8666666666667
+30,294,34.1206666666667
+30,295,34.417
+30,296,32.6813333333333
+30,297,31.7288333333333
+30,298,36.4701666666667
+30,299,30.1413333333333
+30,300,39.9203333333333
+30,301,30.2048333333333
+30,302,39.5605
+30,303,28.448
+30,304,34.036
+30,305,23.5796666666667
+30,306,34.5016666666667
+30,307,37.1263333333333
+30,308,33.909
+30,309,31.7288333333333
+30,310,29.718
+30,311,23.9395
+30,312,37.4438333333333
+30,313,33.9513333333333
+30,314,32.6813333333333
+30,315,30.6493333333333
+30,316,37.5708333333333
+30,317,35.1155
+30,318,34.7133333333333
+30,319,30.7128333333333
+30,320,25.7386666666667
+30,321,35.0731666666667
+30,322,31.2631666666667
+30,323,26.9451666666667
+30,324,37.9306666666667
+30,325,30.2471666666667
+30,326,31.7076666666667
+30,327,31.3478333333333
+30,328,38.3116666666667
+30,329,42.9895
+30,330,37.1263333333333
+30,331,35.2425
+30,332,33.3798333333333
+30,333,30.861
+30,334,37.2533333333333
+30,335,31.2631666666667
+30,336,29.7815
+30,337,35.5811666666667
+30,338,29.4851666666667
+30,339,29.2735
+30,340,25.6751666666667
+30,341,28.575
+30,342,32.131
+30,343,28.194
+30,344,28.1516666666667
+30,345,35.9198333333333
+30,346,36.3855
+30,347,34.7768333333333
+30,348,30.0355
+30,349,31.6441666666667
+30,350,30.9033333333333
+30,351,38.7561666666667
+30,352,32.385
+30,353,31.4325
+30,354,31.496
+30,355,25.0613333333333
+30,356,26.5641666666667
+30,357,28.4903333333333
+30,358,25.2941666666667
+30,359,24.7015
+30,360,28.0458333333333
+30,361,30.5646666666667
+30,362,35.4965
+30,363,33.02
+30,364,40.9998333333333
+30,365,37.719
+30,366,31.8558333333333
+30,367,32.4908333333333
+30,368,27.0721666666667
+30,369,34.798
+30,370,36.1315
+30,371,24.384
+30,372,36.2161666666667
+30,373,25.1248333333333
+30,374,28.8078333333333
+30,375,34.4805
+30,376,26.5006666666667
+30,377,36.9993333333333
+30,378,34.2476666666667
+30,379,32.3003333333333
+30,380,23.2198333333333
+30,381,25.273
+30,382,31.115
+30,383,36.4066666666667
+30,384,30.9456666666667
+30,385,31.8346666666667
+30,386,32.4273333333333
+30,387,33.0623333333333
+30,388,30.3106666666667
+30,389,27.178
+30,390,34.0148333333333
+30,391,34.3323333333333
+30,392,38.0576666666667
+30,393,34.3323333333333
+30,394,33.7396666666667
+30,395,32.8506666666667
+30,396,32.9353333333333
+30,397,32.1733333333333
+30,398,35.2425
+30,399,32.0251666666667
+30,400,29.1676666666667
+30,401,35.0308333333333
+30,402,30.9456666666667
+30,403,39.0313333333333
+30,404,33.6338333333333
+30,405,35.3906666666667
+30,406,31.2843333333333
+30,407,36.6395
+30,408,32.4485
+30,409,38.2905
+30,410,42.291
+30,411,29.0618333333333
+30,412,27.94
+30,413,41.2538333333333
+30,414,29.1888333333333
+30,415,34.0995
+30,416,28.9136666666667
+30,417,33.2316666666667
+30,418,38.5445
+30,419,21.59
+30,420,30.607
+30,421,43.2011666666667
+30,422,28.2363333333333
+30,423,29.9931666666667
+30,424,39.37
+30,425,28.5115
+30,426,32.0251666666667
+30,427,29.2946666666667
+30,428,34.2688333333333
+30,429,43.1165
+30,430,31.4325
+30,431,39.0313333333333
+30,432,30.2683333333333
+30,433,29.083
+30,434,35.2848333333333
+30,435,29.2735
+30,436,30.1201666666667
+30,437,27.2415
+30,438,29.9296666666667
+30,439,40.4071666666667
+30,440,31.2208333333333
+30,441,26.7123333333333
+30,442,34.0783333333333
+30,443,28.2786666666667
+30,444,34.544
+30,445,27.6648333333333
+30,446,26.2043333333333
+30,447,27.7495
+30,448,36.703
+30,449,33.401
+30,450,33.9725
+30,451,28.8925
+30,452,30.4376666666667
+30,453,37.1686666666667
+30,454,32.7871666666667
+30,455,26.9875
+30,456,25.1036666666667
+30,457,31.242
+30,458,36.5548333333333
+30,459,31.6018333333333
+30,460,30.5011666666667
+30,461,30.6916666666667
+30,462,40.3436666666667
+30,463,34.0995
+30,464,39.878
+30,465,26.9451666666667
+30,466,30.5646666666667
+30,467,25.0825
+30,468,26.6276666666667
+30,469,30.988
+30,470,28.6173333333333
+30,471,27.8765
+30,472,27.559
+30,473,36.0256666666667
+30,474,28.7231666666667
+30,475,44.8521666666667
+30,476,31.8135
+30,477,39.116
+30,478,31.5806666666667
+30,479,37.4015
+30,480,38.1423333333333
+30,481,32.2368333333333
+30,482,30.607
+30,483,35.4541666666667
+30,484,31.2208333333333
+30,485,38.5445
+30,486,26.8393333333333
+30,487,27.8765
+30,488,35.1155
+30,489,32.3215
+30,490,28.0246666666667
+30,491,33.3798333333333
+30,492,27.6013333333333
+30,493,28.0246666666667
+30,494,30.5858333333333
+30,495,25.6751666666667
+30,496,35.5176666666667
+30,497,38.8196666666667
+30,498,31.7288333333333
+30,499,38.6715
+30,500,37.3591666666667
+30,501,25.4635
+30,502,29.5698333333333
+30,503,26.2043333333333
+30,504,32.4908333333333
+30,505,32.9776666666667
+30,506,40.2166666666667
+30,507,32.9565
+30,508,35.9198333333333
+30,509,35.5176666666667
+30,510,31.6653333333333
+30,511,41.5925
+30,512,37.719
+30,513,33.8455
+30,514,30.099
+30,515,33.1681666666667
+30,516,32.3426666666667
+30,517,28.3633333333333
+30,518,34.8403333333333
+30,519,24.1511666666667
+30,520,37.6766666666667
+30,521,24.5745
+30,522,42.1428333333333
+30,523,30.8821666666667
+30,524,31.2843333333333
+30,525,30.2895
+30,526,31.0515
+30,527,31.0091666666667
+30,528,31.623
+30,529,32.512
+30,530,38.8408333333333
+30,531,27.4531666666667
+30,532,34.8615
+30,533,36.6395
+30,534,34.5863333333333
+30,535,34.3535
+30,536,28.448
+30,537,36.4066666666667
+30,538,32.5543333333333
+30,539,34.8615
+30,540,36.0468333333333
+30,541,33.401
+30,542,32.5543333333333
+30,543,22.3943333333333
+30,544,24.8496666666667
+30,545,31.0515
+30,546,35.7505
+30,547,28.1728333333333
+30,548,23.2833333333333
+30,549,32.3003333333333
+30,550,43.2223333333333
+30,551,29.3581666666667
+30,552,23.2833333333333
+30,553,33.8878333333333
+30,554,39.6451666666667
+30,555,35.0731666666667
+30,556,30.099
+30,557,37.8036666666667
+30,558,29.9931666666667
+30,559,40.6611666666667
+30,560,31.4325
+30,561,30.3953333333333
+30,562,35.8775
+30,563,29.5486666666667
+30,564,34.6498333333333
+30,565,33.274
+30,566,43.18
+30,567,36.5125
+30,568,34.5651666666667
+30,569,26.8605
+30,570,29.2735
+30,571,29.1888333333333
+30,572,30.7128333333333
+30,573,40.6188333333333
+30,574,28.8713333333333
+30,575,43.1588333333333
+30,576,36.1315
+30,577,27.1145
+30,578,40.4283333333333
+30,579,37.5496666666667
+30,580,32.9776666666667
+30,581,31.877
+30,582,29.972
+30,583,26.8816666666667
+30,584,30.0778333333333
+30,585,25.4846666666667
+30,586,31.0091666666667
+30,587,31.8981666666667
+30,588,28.4903333333333
+30,589,37.8883333333333
+30,590,39.1371666666667
+30,591,31.3266666666667
+30,592,40.3013333333333
+30,593,28.194
+30,594,33.6761666666667
+30,595,31.4536666666667
+30,596,37.8036666666667
+30,597,35.3695
+30,598,33.655
+30,599,34.29
+30,600,31.8558333333333
+30,601,37.9941666666667
+30,602,26.9875
+30,603,33.4645
+30,604,34.4805
+30,605,33.4645
+30,606,37.1475
+30,607,33.3163333333333
+30,608,29.1888333333333
+30,609,24.638
+30,610,30.988
+30,611,31.1573333333333
+30,612,33.6126666666667
+30,613,27.0086666666667
+30,614,36.068
+30,615,31.5383333333333
+30,616,36.9781666666667
+30,617,30.0566666666667
+30,618,32.4908333333333
+30,619,36.0256666666667
+30,620,28.956
+30,621,27.559
+30,622,35.6023333333333
+30,623,43.0953333333333
+30,624,36.9358333333333
+30,625,30.5435
+30,626,39.2218333333333
+30,627,38.3751666666667
+30,628,37.4438333333333
+30,629,27.6013333333333
+30,630,35.7716666666667
+30,631,26.5641666666667
+30,632,38.1
+30,633,23.8971666666667
+30,634,36.3855
+30,635,26.9028333333333
+30,636,27.94
+30,637,44.8521666666667
+30,638,42.9683333333333
+30,639,33.0411666666667
+30,640,32.258
+30,641,31.2208333333333
+30,642,36.1526666666667
+30,643,40.513
+30,644,31.5806666666667
+30,645,35.179
+30,646,34.5228333333333
+30,647,28.067
+30,648,31.5171666666667
+30,649,35.0731666666667
+30,650,24.7861666666667
+30,651,35.179
+30,652,31.3901666666667
+30,653,23.7913333333333
+30,654,35.9621666666667
+30,655,31.8981666666667
+30,656,33.4221666666667
+30,657,31.4748333333333
+30,658,32.5331666666667
+30,659,30.353
+30,660,26.6065
+30,661,33.2105
+30,662,28.2786666666667
+30,663,25.6963333333333
+30,664,29.6968333333333
+30,665,27.6648333333333
+30,666,24.3416666666667
+30,667,37.7825
+30,668,33.401
+30,669,32.2791666666667
+30,670,34.3323333333333
+30,671,36.7453333333333
+30,672,30.1625
+30,673,38.2905
+30,674,37.6766666666667
+30,675,37.211
+30,676,38.8196666666667
+30,677,33.4221666666667
+30,678,39.2641666666667
+30,679,27.4531666666667
+30,680,29.845
+30,681,35.8563333333333
+30,682,29.1041666666667
+30,683,34.1841666666667
+30,684,32.4485
+30,685,30.226
+30,686,29.5275
+30,687,38.3751666666667
+30,688,33.401
+30,689,38.6291666666667
+30,690,24.3205
+30,691,31.877
+30,692,27.3685
+30,693,39.3276666666667
+30,694,25.9503333333333
+30,695,29.1253333333333
+30,696,32.7448333333333
+30,697,37.5496666666667
+30,698,36.0256666666667
+30,699,37.4015
+30,700,32.385
+30,701,34.2688333333333
+30,702,32.9776666666667
+30,703,23.0928333333333
+30,704,35.2425
+30,705,37.9095
+30,706,29.464
+30,707,32.5331666666667
+30,708,28.2998333333333
+30,709,36.0468333333333
+30,710,38.9255
+30,711,32.3003333333333
+30,712,31.5806666666667
+30,713,41.1268333333333
+30,714,31.0726666666667
+30,715,30.4376666666667
+30,716,37.9095
+30,717,32.1098333333333
+30,718,34.925
+30,719,45.5083333333333
+30,720,34.29
+30,721,28.0458333333333
+30,722,31.1785
+30,723,29.718
+30,724,37.9518333333333
+30,725,34.3323333333333
+30,726,29.972
+30,727,37.592
+30,728,24.384
+30,729,28.0035
+30,730,29.0195
+30,731,37.0416666666667
+30,732,45.9316666666667
+30,733,29.9508333333333
+30,734,39.5816666666667
+30,735,29.6121666666667
+30,736,33.2528333333333
+30,737,32.1521666666667
+30,738,24.765
+30,739,33.401
+30,740,36.0468333333333
+30,741,34.798
+30,742,40.8728333333333
+30,743,40.3225
+30,744,37.1475
+30,745,33.3798333333333
+30,746,30.5011666666667
+30,747,32.0463333333333
+30,748,37.9518333333333
+30,749,33.6973333333333
+30,750,36.703
+30,751,37.973
+30,752,31.3901666666667
+30,753,23.114
+30,754,28.5115
+30,755,34.925
+30,756,36.1315
+30,757,34.2688333333333
+30,758,32.8083333333333
+30,759,31.6018333333333
+30,760,33.274
+30,761,33.1681666666667
+30,762,34.0995
+30,763,31.369
+30,764,36.8088333333333
+30,765,26.1196666666667
+30,766,40.5765
+30,767,43.4551666666667
+30,768,29.21
+30,769,36.6818333333333
+30,770,29.9931666666667
+30,771,35.7081666666667
+30,772,33.3798333333333
+30,773,35.306
+30,774,30.3741666666667
+30,775,30.8398333333333
+30,776,30.5223333333333
+30,777,33.782
+30,778,33.9301666666667
+30,779,41.8253333333333
+30,780,32.766
+30,781,38.1211666666667
+30,782,36.0891666666667
+30,783,25.8233333333333
+30,784,33.2951666666667
+30,785,30.734
+30,786,29.7391666666667
+30,787,33.9301666666667
+30,788,41.6348333333333
+30,789,34.7768333333333
+30,790,34.5863333333333
+30,791,33.8666666666667
+30,792,39.37
+30,793,39.6451666666667
+30,794,38.5656666666667
+30,795,36.3643333333333
+30,796,34.4381666666667
+30,797,25.019
+30,798,39.0948333333333
+30,799,39.5605
+30,800,31.115
+30,801,31.9405
+30,802,29.5486666666667
+30,803,33.6126666666667
+30,804,33.8878333333333
+30,805,27.0298333333333
+30,806,27.8341666666667
+30,807,24.1088333333333
+30,808,34.0783333333333
+30,809,28.829
+30,810,27.8765
+30,811,28.4056666666667
+30,812,40.767
+30,813,40.9363333333333
+30,814,34.3535
+30,815,37.1051666666667
+30,816,34.3746666666667
+30,817,27.559
+30,818,29.8873333333333
+30,819,35.1366666666667
+30,820,28.7443333333333
+30,821,36.4913333333333
+30,822,32.0463333333333
+30,823,32.766
+30,824,36.2796666666667
+30,825,25.9503333333333
+30,826,33.5068333333333
+30,827,40.9786666666667
+30,828,28.8078333333333
+30,829,28.5961666666667
+30,830,26.5853333333333
+30,831,32.5543333333333
+30,832,32.7025
+30,833,30.1201666666667
+30,834,32.0886666666667
+30,835,32.6813333333333
+30,836,36.4066666666667
+30,837,26.0773333333333
+30,838,28.7231666666667
+30,839,31.9616666666667
+30,840,32.2156666666667
+30,841,39.624
+30,842,33.4433333333333
+30,843,30.8821666666667
+30,844,34.798
+30,845,25.0613333333333
+30,846,31.8346666666667
+30,847,46.3126666666667
+30,848,35.56
+30,849,32.4908333333333
+30,850,36.4913333333333
+30,851,20.1295
+30,852,25.3365
+30,853,32.9141666666667
+30,854,27.9823333333333
+30,855,36.4913333333333
+30,856,34.2265
+30,857,28.2786666666667
+30,858,31.623
+30,859,37.2745
+30,860,29.5698333333333
+30,861,32.2791666666667
+30,862,43.0741666666667
+30,863,35.5176666666667
+30,864,30.7551666666667
+30,865,32.8506666666667
+30,866,30.3106666666667
+30,867,38.6926666666667
+30,868,34.0783333333333
+30,869,24.2993333333333
+30,870,25.7386666666667
+30,871,38.4175
+30,872,29.337
+30,873,36.1526666666667
+30,874,39.624
+30,875,32.004
+30,876,39.0313333333333
+30,877,32.8295
+30,878,29.2523333333333
+30,879,34.7768333333333
+30,880,36.83
+30,881,39.624
+30,882,30.5646666666667
+30,883,39.9838333333333
+30,884,33.147
+30,885,31.7711666666667
+30,886,32.4908333333333
+30,887,31.1573333333333
+30,888,35.7081666666667
+30,889,29.1253333333333
+30,890,34.2476666666667
+30,891,38.3751666666667
+30,892,33.528
+30,893,33.5491666666667
+30,894,32.8295
+30,895,38.7138333333333
+30,896,28.5538333333333
+30,897,35.3271666666667
+30,898,28.8713333333333
+30,899,25.273
+30,900,40.0473333333333
+30,901,32.6813333333333
+30,902,33.7396666666667
+30,903,32.4273333333333
+30,904,33.655
+30,905,39.2218333333333
+30,906,46.7148333333333
+30,907,32.6178333333333
+30,908,32.8506666666667
+30,909,36.7453333333333
+30,910,32.6601666666667
+30,911,45.3601666666667
+30,912,37.2533333333333
+30,913,35.7293333333333
+30,914,36.4278333333333
+30,915,28.4268333333333
+30,916,31.6865
+30,917,36.8723333333333
+30,918,42.6085
+30,919,37.7825
+30,920,32.766
+30,921,34.7768333333333
+30,922,28.6808333333333
+30,923,30.6493333333333
+30,924,38.5445
+30,925,37.0628333333333
+30,926,29.6545
+30,927,32.9353333333333
+30,928,40.4706666666667
+30,929,32.9988333333333
+30,930,34.7345
+30,931,26.3525
+30,932,35.3906666666667
+30,933,28.0035
+30,934,32.3638333333333
+30,935,39.878
+30,936,24.9978333333333
+30,937,35.8351666666667
+30,938,34.6286666666667
+30,939,26.1196666666667
+30,940,35.1155
+30,941,32.4485
+30,942,36.703
+30,943,26.8605
+30,944,38.2481666666667
+30,945,24.0665
+30,946,26.9451666666667
+30,947,31.5595
+30,948,32.7025
+30,949,32.131
+30,950,34.0995
+30,951,36.8935
+30,952,27.4108333333333
+30,953,28.4268333333333
+30,954,27.9611666666667
+30,955,29.3158333333333
+30,956,30.7128333333333
+30,957,31.1785
+30,958,34.0783333333333
+30,959,35.0943333333333
+30,960,30.0143333333333
+30,961,23.4526666666667
+30,962,30.48
+30,963,35.6023333333333
+30,964,36.0256666666667
+30,965,30.9245
+30,966,26.3948333333333
+30,967,30.8398333333333
+30,968,39.0525
+30,969,32.1521666666667
+30,970,35.1578333333333
+30,971,29.8873333333333
+30,972,34.798
+30,973,29.9296666666667
+30,974,33.2105
+30,975,41.5078333333333
+30,976,39.8568333333333
+30,977,35.1578333333333
+30,978,39.3276666666667
+30,979,33.4856666666667
+30,980,32.4061666666667
+30,981,34.1841666666667
+30,982,32.5755
+30,983,28.829
+30,984,31.0091666666667
+30,985,27.9823333333333
+30,986,34.0148333333333
+30,987,29.8026666666667
+30,988,31.75
+30,989,31.3266666666667
+30,990,37.1263333333333
+30,991,29.5698333333333
+30,992,30.3741666666667
+30,993,36.0045
+30,994,32.9353333333333
+30,995,30.4376666666667
+30,996,32.5331666666667
+30,997,29.5486666666667
+30,998,35.3695
+30,999,33.3586666666667
+30,1000,32.893
+31,1,17.7165
+31,2,27.7071666666667
+31,3,25.6116666666667
+31,4,21.2725
+31,5,18.923
+31,6,26.3101666666667
+31,7,27.7918333333333
+31,8,25.6751666666667
+31,9,20.5951666666667
+31,10,23.5585
+31,11,24.3628333333333
+31,12,25.8868333333333
+31,13,28.829
+31,14,24.3205
+31,15,23.2833333333333
+31,16,26.6488333333333
+31,17,24.7226666666667
+31,18,25.3576666666667
+31,19,22.2673333333333
+31,20,29.5486666666667
+31,21,26.2043333333333
+31,22,20.4046666666667
+31,23,22.9235
+31,24,20.7856666666667
+31,25,24.13
+31,26,24.9343333333333
+31,27,20.9761666666667
+31,28,26.3948333333333
+31,29,28.067
+31,30,20.5528333333333
+31,31,28.0458333333333
+31,32,21.8651666666667
+31,33,26.035
+31,34,24.7438333333333
+31,35,33.5703333333333
+31,36,27.305
+31,37,27.6225
+31,38,29.9296666666667
+31,39,22.8176666666667
+31,40,26.1831666666667
+31,41,28.448
+31,42,27.6648333333333
+31,43,20.2141666666667
+31,44,22.3731666666667
+31,45,24.1088333333333
+31,46,17.526
+31,47,27.6436666666667
+31,48,26.6065
+31,49,25.2518333333333
+31,50,27.051
+31,51,30.6493333333333
+31,52,24.384
+31,53,30.3318333333333
+31,54,24.8708333333333
+31,55,27.3261666666667
+31,56,16.6158333333333
+31,57,22.5636666666667
+31,58,27.432
+31,59,23.1775
+31,60,32.131
+31,61,25.5693333333333
+31,62,25.9715
+31,63,28.2998333333333
+31,64,21.6323333333333
+31,65,26.0985
+31,66,28.6808333333333
+31,67,18.161
+31,68,28.321
+31,69,24.257
+31,70,22.5213333333333
+31,71,17.653
+31,72,23.6643333333333
+31,73,26.5641666666667
+31,74,24.4263333333333
+31,75,26.2466666666667
+31,76,20.7221666666667
+31,77,25.3153333333333
+31,78,26.5006666666667
+31,79,22.2673333333333
+31,80,26.2466666666667
+31,81,29.0406666666667
+31,82,28.3845
+31,83,27.8765
+31,84,26.2678333333333
+31,85,22.4155
+31,86,25.1036666666667
+31,87,23.3468333333333
+31,88,21.6958333333333
+31,89,24.9978333333333
+31,90,22.0768333333333
+31,91,25.781
+31,92,23.4526666666667
+31,93,25.5905
+31,94,27.8765
+31,95,24.511
+31,96,26.4795
+31,97,24.3628333333333
+31,98,26.1408333333333
+31,99,26.8816666666667
+31,100,28.4268333333333
+31,101,28.0881666666667
+31,102,21.3571666666667
+31,103,23.114
+31,104,26.5641666666667
+31,105,28.5961666666667
+31,106,20.574
+31,107,30.0143333333333
+31,108,23.6643333333333
+31,109,26.8181666666667
+31,110,20.6798333333333
+31,111,22.6483333333333
+31,112,32.4696666666667
+31,113,27.9611666666667
+31,114,22.5001666666667
+31,115,27.3473333333333
+31,116,21.9921666666667
+31,117,20.8068333333333
+31,118,30.9668333333333
+31,119,24.9978333333333
+31,120,26.2466666666667
+31,121,22.4366666666667
+31,122,24.7226666666667
+31,123,17.8646666666667
+31,124,17.9281666666667
+31,125,26.6911666666667
+31,126,26.289
+31,127,25.3153333333333
+31,128,22.733
+31,129,24.8708333333333
+31,130,24.8073333333333
+31,131,25.3153333333333
+31,132,28.3421666666667
+31,133,27.8976666666667
+31,134,28.067
+31,135,26.5218333333333
+31,136,24.2146666666667
+31,137,26.4795
+31,138,23.7913333333333
+31,139,23.9183333333333
+31,140,26.4795
+31,141,22.5636666666667
+31,142,21.0396666666667
+31,143,26.7758333333333
+31,144,27.2838333333333
+31,145,28.2151666666667
+31,146,20.2353333333333
+31,147,26.5853333333333
+31,148,26.2043333333333
+31,149,21.2513333333333
+31,150,18.5631666666667
+31,151,21.971
+31,152,26.5641666666667
+31,153,23.6643333333333
+31,154,20.5316666666667
+31,155,21.2725
+31,156,31.7076666666667
+31,157,26.289
+31,158,25.1883333333333
+31,159,26.3736666666667
+31,160,21.1878333333333
+31,161,25.7598333333333
+31,162,29.5275
+31,163,28.2151666666667
+31,164,23.241
+31,165,23.9818333333333
+31,166,23.4526666666667
+31,167,28.9348333333333
+31,168,23.6431666666667
+31,169,22.8811666666667
+31,170,28.1093333333333
+31,171,20.828
+31,172,29.6756666666667
+31,173,18.4785
+31,174,28.9136666666667
+31,175,29.4005
+31,176,29.7815
+31,177,29.2311666666667
+31,178,22.8176666666667
+31,179,28.7443333333333
+31,180,23.622
+31,181,23.241
+31,182,22.9658333333333
+31,183,22.86
+31,184,24.2993333333333
+31,185,21.6111666666667
+31,186,24.9978333333333
+31,187,22.1403333333333
+31,188,32.7448333333333
+31,189,20.9973333333333
+31,190,24.257
+31,191,23.622
+31,192,20.3411666666667
+31,193,24.003
+31,194,21.0185
+31,195,25.908
+31,196,27.0298333333333
+31,197,32.8083333333333
+31,198,30.2048333333333
+31,199,20.1083333333333
+31,200,24.1723333333333
+31,201,26.6911666666667
+31,202,25.6963333333333
+31,203,22.6695
+31,204,28.7443333333333
+31,205,22.8176666666667
+31,206,21.9286666666667
+31,207,29.9085
+31,208,36.8935
+31,209,26.0561666666667
+31,210,24.4263333333333
+31,211,22.0345
+31,212,26.4583333333333
+31,213,27.6648333333333
+31,214,18.9865
+31,215,23.0716666666667
+31,216,20.447
+31,217,25.2518333333333
+31,218,25.8656666666667
+31,219,20.2776666666667
+31,220,24.5745
+31,221,24.9343333333333
+31,222,19.3886666666667
+31,223,30.3953333333333
+31,224,22.6483333333333
+31,225,28.194
+31,226,23.6431666666667
+31,227,21.1666666666667
+31,228,19.2616666666667
+31,229,23.0505
+31,230,22.7541666666667
+31,231,22.0345
+31,232,19.2616666666667
+31,233,25.781
+31,234,22.6483333333333
+31,235,19.685
+31,236,28.5538333333333
+31,237,29.591
+31,238,26.543
+31,239,21.9286666666667
+31,240,21.1031666666667
+31,241,26.2043333333333
+31,242,26.0138333333333
+31,243,16.9756666666667
+31,244,27.0298333333333
+31,245,24.9766666666667
+31,246,28.4903333333333
+31,247,23.622
+31,248,21.5053333333333
+31,249,21.2936666666667
+31,250,25.8233333333333
+31,251,21.971
+31,252,26.2466666666667
+31,253,20.1506666666667
+31,254,21.1666666666667
+31,255,27.813
+31,256,21.6323333333333
+31,257,25.1671666666667
+31,258,23.7701666666667
+31,259,19.304
+31,260,29.9085
+31,261,29.0406666666667
+31,262,28.1305
+31,263,26.1408333333333
+31,264,20.193
+31,265,26.3525
+31,266,26.2466666666667
+31,267,26.7335
+31,268,25.0613333333333
+31,269,18.288
+31,270,22.5848333333333
+31,271,23.2621666666667
+31,272,28.1093333333333
+31,273,21.4206666666667
+31,274,29.21
+31,275,22.86
+31,276,23.4103333333333
+31,277,27.8976666666667
+31,278,20.0871666666667
+31,279,30.0778333333333
+31,280,27.7283333333333
+31,281,24.8496666666667
+31,282,25.0825
+31,283,23.0505
+31,284,28.4691666666667
+31,285,25.781
+31,286,20.8491666666667
+31,287,23.4526666666667
+31,288,24.3205
+31,289,25.781
+31,290,25.3153333333333
+31,291,28.5326666666667
+31,292,32.8083333333333
+31,293,34.1841666666667
+31,294,28.4268333333333
+31,295,24.1723333333333
+31,296,21.0396666666667
+31,297,29.337
+31,298,22.2461666666667
+31,299,20.8491666666667
+31,300,30.6916666666667
+31,301,22.1826666666667
+31,302,24.9343333333333
+31,303,26.0561666666667
+31,304,23.5585
+31,305,25.654
+31,306,25.4
+31,307,21.8651666666667
+31,308,23.114
+31,309,28.829
+31,310,22.1191666666667
+31,311,23.4103333333333
+31,312,17.6953333333333
+31,313,26.1831666666667
+31,314,25.8656666666667
+31,315,19.939
+31,316,20.574
+31,317,26.9451666666667
+31,318,21.6535
+31,319,26.1196666666667
+31,320,23.0505
+31,321,31.115
+31,322,29.2523333333333
+31,323,24.13
+31,324,18.9441666666667
+31,325,24.2781666666667
+31,326,27.5378333333333
+31,327,22.1826666666667
+31,328,26.4795
+31,329,24.8708333333333
+31,330,24.3416666666667
+31,331,27.0933333333333
+31,332,24.003
+31,333,23.1563333333333
+31,334,26.0773333333333
+31,335,20.4681666666667
+31,336,28.2998333333333
+31,337,22.1191666666667
+31,338,19.1558333333333
+31,339,22.8811666666667
+31,340,26.1831666666667
+31,341,26.7758333333333
+31,342,27.432
+31,343,27.1145
+31,344,25.4423333333333
+31,345,23.749
+31,346,25.8021666666667
+31,347,30.3741666666667
+31,348,26.7123333333333
+31,349,24.2781666666667
+31,350,25.2095
+31,351,24.6168333333333
+31,352,29.9085
+31,353,30.7763333333333
+31,354,19.558
+31,355,21.0608333333333
+31,356,22.1191666666667
+31,357,21.717
+31,358,22.606
+31,359,26.924
+31,360,28.2363333333333
+31,361,25.5058333333333
+31,362,25.146
+31,363,24.638
+31,364,26.9875
+31,365,23.9395
+31,366,23.114
+31,367,24.13
+31,368,18.415
+31,369,28.9348333333333
+31,370,21.4206666666667
+31,371,18.542
+31,372,20.1718333333333
+31,373,19.8966666666667
+31,374,29.0195
+31,375,20.7433333333333
+31,376,25.273
+31,377,21.8228333333333
+31,378,25.6751666666667
+31,379,25.0401666666667
+31,380,22.6695
+31,381,23.5796666666667
+31,382,27.2203333333333
+31,383,20.7856666666667
+31,384,26.5853333333333
+31,385,29.6968333333333
+31,386,25.7386666666667
+31,387,31.496
+31,388,24.7861666666667
+31,389,23.9395
+31,390,24.638
+31,391,30.48
+31,392,26.67
+31,393,23.3045
+31,394,24.2781666666667
+31,395,24.511
+31,396,24.1511666666667
+31,397,24.5321666666667
+31,398,27.2415
+31,399,29.4005
+31,400,23.4103333333333
+31,401,24.0241666666667
+31,402,20.7221666666667
+31,403,23.8125
+31,404,20.6163333333333
+31,405,27.7918333333333
+31,406,27.178
+31,407,27.3473333333333
+31,408,19.3251666666667
+31,409,24.13
+31,410,25.4211666666667
+31,411,19.7061666666667
+31,412,25.0825
+31,413,24.4475
+31,414,20.574
+31,415,27.3261666666667
+31,416,26.67
+31,417,29.591
+31,418,22.5001666666667
+31,419,19.431
+31,420,25.5693333333333
+31,421,25.5905
+31,422,23.7701666666667
+31,423,24.7226666666667
+31,424,26.7123333333333
+31,425,25.7386666666667
+31,426,33.8243333333333
+31,427,18.796
+31,428,24.892
+31,429,25.273
+31,430,24.7861666666667
+31,431,22.2038333333333
+31,432,21.209
+31,433,20.5316666666667
+31,434,26.797
+31,435,25.1671666666667
+31,436,23.114
+31,437,21.7381666666667
+31,438,24.4263333333333
+31,439,22.5848333333333
+31,440,22.1403333333333
+31,441,27.686
+31,442,25.2095
+31,443,21.4418333333333
+31,444,29.591
+31,445,27.813
+31,446,23.1351666666667
+31,447,22.6271666666667
+31,448,24.4898333333333
+31,449,17.3143333333333
+31,450,23.3891666666667
+31,451,24.1088333333333
+31,452,27.5378333333333
+31,453,28.7655
+31,454,30.0566666666667
+31,455,31.1573333333333
+31,456,29.845
+31,457,27.051
+31,458,29.1041666666667
+31,459,31.877
+31,460,23.2833333333333
+31,461,20.1295
+31,462,23.495
+31,463,23.7701666666667
+31,464,25.9503333333333
+31,465,21.209
+31,466,31.9193333333333
+31,467,27.5378333333333
+31,468,23.2198333333333
+31,469,24.9766666666667
+31,470,26.289
+31,471,26.7546666666667
+31,472,25.654
+31,473,20.5105
+31,474,35.7716666666667
+31,475,26.6065
+31,476,22.5425
+31,477,26.8816666666667
+31,478,29.337
+31,479,31.5806666666667
+31,480,28.9136666666667
+31,481,21.209
+31,482,26.6911666666667
+31,483,18.9653333333333
+31,484,20.3623333333333
+31,485,30.0355
+31,486,26.2466666666667
+31,487,23.8971666666667
+31,488,24.5321666666667
+31,489,27.6225
+31,490,25.5905
+31,491,29.1676666666667
+31,492,23.114
+31,493,27.0721666666667
+31,494,25.4846666666667
+31,495,20.6586666666667
+31,496,28.0458333333333
+31,497,22.3943333333333
+31,498,30.3953333333333
+31,499,24.3205
+31,500,23.5373333333333
+31,501,25.3153333333333
+31,502,24.384
+31,503,27.559
+31,504,29.6545
+31,505,26.5006666666667
+31,506,20.955
+31,507,24.9555
+31,508,22.7753333333333
+31,509,21.2301666666667
+31,510,24.9766666666667
+31,511,28.2363333333333
+31,512,22.4155
+31,513,22.3731666666667
+31,514,21.5688333333333
+31,515,24.7226666666667
+31,516,24.257
+31,517,22.2461666666667
+31,518,29.21
+31,519,21.4206666666667
+31,520,22.6906666666667
+31,521,28.9771666666667
+31,522,22.9023333333333
+31,523,25.1036666666667
+31,524,24.1723333333333
+31,525,26.5641666666667
+31,526,31.3266666666667
+31,527,21.8651666666667
+31,528,28.3845
+31,529,28.7655
+31,530,20.5528333333333
+31,531,24.1511666666667
+31,532,26.3101666666667
+31,533,24.765
+31,534,22.5848333333333
+31,535,30.861
+31,536,29.6545
+31,537,23.6008333333333
+31,538,21.2513333333333
+31,539,27.8341666666667
+31,540,22.4366666666667
+31,541,24.9978333333333
+31,542,19.6638333333333
+31,543,22.7753333333333
+31,544,24.0453333333333
+31,545,26.4371666666667
+31,546,23.3891666666667
+31,547,21.463
+31,548,30.6281666666667
+31,549,26.0773333333333
+31,550,27.1145
+31,551,23.3256666666667
+31,552,20.8703333333333
+31,553,26.1831666666667
+31,554,26.3313333333333
+31,555,26.4371666666667
+31,556,29.1041666666667
+31,557,23.2833333333333
+31,558,22.7118333333333
+31,559,32.0251666666667
+31,560,22.8811666666667
+31,561,24.0876666666667
+31,562,26.0985
+31,563,28.956
+31,564,20.2988333333333
+31,565,23.9395
+31,566,23.7701666666667
+31,567,27.1145
+31,568,23.8336666666667
+31,569,24.4686666666667
+31,570,20.9761666666667
+31,571,22.0133333333333
+31,572,24.7015
+31,573,26.4583333333333
+31,574,25.8233333333333
+31,575,23.5161666666667
+31,576,21.7381666666667
+31,577,23.3045
+31,578,23.0081666666667
+31,579,27.6013333333333
+31,580,23.0081666666667
+31,581,28.6596666666667
+31,582,16.9121666666667
+31,583,28.4903333333333
+31,584,23.7278333333333
+31,585,26.9875
+31,586,27.7706666666667
+31,587,24.5533333333333
+31,588,21.082
+31,589,24.511
+31,590,28.1093333333333
+31,591,25.0401666666667
+31,592,22.7118333333333
+31,593,22.5636666666667
+31,594,26.8181666666667
+31,595,24.7861666666667
+31,596,30.5435
+31,597,28.9771666666667
+31,598,25.273
+31,599,27.8976666666667
+31,600,23.8548333333333
+31,601,24.1723333333333
+31,602,23.1986666666667
+31,603,26.9451666666667
+31,604,28.4056666666667
+31,605,21.2513333333333
+31,606,28.5326666666667
+31,607,21.1031666666667
+31,608,27.4531666666667
+31,609,27.8976666666667
+31,610,21.8863333333333
+31,611,25.5693333333333
+31,612,27.305
+31,613,27.0298333333333
+31,614,28.448
+31,615,26.0138333333333
+31,616,20.9761666666667
+31,617,24.6591666666667
+31,618,23.8125
+31,619,25.4
+31,620,24.003
+31,621,24.3628333333333
+31,622,26.8605
+31,623,24.765
+31,624,23.2833333333333
+31,625,30.5646666666667
+31,626,23.9183333333333
+31,627,19.0923333333333
+31,628,27.0721666666667
+31,629,25.654
+31,630,20.4893333333333
+31,631,32.4061666666667
+31,632,24.9978333333333
+31,633,23.4526666666667
+31,634,27.813
+31,635,28.2575
+31,636,20.701
+31,637,24.0876666666667
+31,638,30.5223333333333
+31,639,23.9183333333333
+31,640,25.1883333333333
+31,641,19.4521666666667
+31,642,31.0938333333333
+31,643,24.9131666666667
+31,644,23.9606666666667
+31,645,24.4051666666667
+31,646,24.1511666666667
+31,647,26.3948333333333
+31,648,25.5481666666667
+31,649,24.3416666666667
+31,650,21.082
+31,651,26.7123333333333
+31,652,32.258
+31,653,19.939
+31,654,20.2141666666667
+31,655,21.1031666666667
+31,656,23.7701666666667
+31,657,33.147
+31,658,28.194
+31,659,23.6643333333333
+31,660,27.8765
+31,661,25.2518333333333
+31,662,23.2198333333333
+31,663,27.6013333333333
+31,664,25.3365
+31,665,22.6483333333333
+31,666,20.1083333333333
+31,667,20.9761666666667
+31,668,22.6695
+31,669,27.9188333333333
+31,670,23.8971666666667
+31,671,24.892
+31,672,27.3685
+31,673,30.5011666666667
+31,674,26.4583333333333
+31,675,33.401
+31,676,19.3251666666667
+31,677,22.733
+31,678,25.4846666666667
+31,679,25.8445
+31,680,20.9126666666667
+31,681,24.384
+31,682,21.1878333333333
+31,683,26.4795
+31,684,25.781
+31,685,27.686
+31,686,23.0505
+31,687,21.1455
+31,688,22.7753333333333
+31,689,21.6746666666667
+31,690,25.4423333333333
+31,691,24.511
+31,692,31.0091666666667
+31,693,22.7965
+31,694,20.5951666666667
+31,695,25.9926666666667
+31,696,20.7856666666667
+31,697,23.7066666666667
+31,698,20.8703333333333
+31,699,18.923
+31,700,23.4526666666667
+31,701,24.3416666666667
+31,702,24.5956666666667
+31,703,22.8388333333333
+31,704,20.32
+31,705,23.2621666666667
+31,706,25.7175
+31,707,20.574
+31,708,23.2621666666667
+31,709,27.94
+31,710,19.812
+31,711,25.1883333333333
+31,712,22.5425
+31,713,27.051
+31,714,30.3741666666667
+31,715,16.8698333333333
+31,716,22.3096666666667
+31,717,19.431
+31,718,19.8966666666667
+31,719,23.3045
+31,720,27.3261666666667
+31,721,21.336
+31,722,21.2301666666667
+31,723,27.1145
+31,724,23.4526666666667
+31,725,23.1351666666667
+31,726,25.527
+31,727,25.9715
+31,728,22.4155
+31,729,23.749
+31,730,27.8976666666667
+31,731,23.7066666666667
+31,732,27.1145
+31,733,21.7381666666667
+31,734,20.955
+31,735,23.622
+31,736,22.3731666666667
+31,737,27.7283333333333
+31,738,26.5218333333333
+31,739,28.4903333333333
+31,740,23.7701666666667
+31,741,21.6746666666667
+31,742,22.4366666666667
+31,743,22.2673333333333
+31,744,23.8125
+31,745,27.8341666666667
+31,746,19.812
+31,747,26.035
+31,748,27.8976666666667
+31,749,27.2203333333333
+31,750,30.353
+31,751,21.2725
+31,752,25.5481666666667
+31,753,32.0463333333333
+31,754,26.5853333333333
+31,755,21.3571666666667
+31,756,28.4056666666667
+31,757,24.257
+31,758,29.6333333333333
+31,759,27.4743333333333
+31,760,25.2518333333333
+31,761,24.2146666666667
+31,762,22.352
+31,763,21.3995
+31,764,23.7066666666667
+31,765,26.162
+31,766,24.7015
+31,767,26.162
+31,768,24.9343333333333
+31,769,30.1836666666667
+31,770,25.4846666666667
+31,771,25.273
+31,772,30.0143333333333
+31,773,27.1356666666667
+31,774,16.383
+31,775,22.8388333333333
+31,776,23.6431666666667
+31,777,28.3845
+31,778,26.162
+31,779,22.7753333333333
+31,780,24.8496666666667
+31,781,24.9555
+31,782,22.5213333333333
+31,783,27.3685
+31,784,28.9348333333333
+31,785,33.2316666666667
+31,786,20.5316666666667
+31,787,26.5218333333333
+31,788,24.3205
+31,789,18.8383333333333
+31,790,20.066
+31,791,31.2208333333333
+31,792,33.3375
+31,793,28.1728333333333
+31,794,29.1041666666667
+31,795,26.2043333333333
+31,796,21.7805
+31,797,21.8228333333333
+31,798,21.1878333333333
+31,799,22.3308333333333
+31,800,18.5208333333333
+31,801,22.4155
+31,802,23.5161666666667
+31,803,24.1088333333333
+31,804,28.4903333333333
+31,805,23.0505
+31,806,32.9988333333333
+31,807,22.733
+31,808,22.7541666666667
+31,809,22.1191666666667
+31,810,23.9183333333333
+31,811,31.3055
+31,812,20.0025
+31,813,27.8553333333333
+31,814,16.9121666666667
+31,815,19.8755
+31,816,26.1831666666667
+31,817,20.7856666666667
+31,818,28.5326666666667
+31,819,26.2678333333333
+31,820,20.066
+31,821,24.13
+31,822,24.0241666666667
+31,823,22.7753333333333
+31,824,18.5631666666667
+31,825,25.273
+31,826,25.5693333333333
+31,827,28.321
+31,828,23.5161666666667
+31,829,29.9085
+31,830,25.2095
+31,831,18.161
+31,832,25.3153333333333
+31,833,20.7856666666667
+31,834,23.7701666666667
+31,835,21.844
+31,836,27.1991666666667
+31,837,24.6168333333333
+31,838,26.5218333333333
+31,839,21.971
+31,840,29.1676666666667
+31,841,25.8233333333333
+31,842,25.6328333333333
+31,843,28.2998333333333
+31,844,23.0505
+31,845,23.2198333333333
+31,846,24.4051666666667
+31,847,22.5001666666667
+31,848,23.5161666666667
+31,849,27.9823333333333
+31,850,25.6116666666667
+31,851,24.7861666666667
+31,852,22.9023333333333
+31,853,24.4686666666667
+31,854,20.5105
+31,855,24.3416666666667
+31,856,25.3365
+31,857,31.8346666666667
+31,858,24.3628333333333
+31,859,24.3416666666667
+31,860,23.8336666666667
+31,861,22.987
+31,862,23.1986666666667
+31,863,20.8703333333333
+31,864,25.908
+31,865,25.0401666666667
+31,866,25.0825
+31,867,24.9343333333333
+31,868,24.2146666666667
+31,869,24.2993333333333
+31,870,24.8496666666667
+31,871,27.2415
+31,872,23.114
+31,873,25.4846666666667
+31,874,26.67
+31,875,28.5538333333333
+31,876,28.5115
+31,877,27.8976666666667
+31,878,28.4268333333333
+31,879,24.7226666666667
+31,880,27.178
+31,881,21.971
+31,882,27.3261666666667
+31,883,25.146
+31,884,22.733
+31,885,25.7386666666667
+31,886,26.9451666666667
+31,887,24.5533333333333
+31,888,27.4743333333333
+31,889,26.5218333333333
+31,890,25.2941666666667
+31,891,27.8976666666667
+31,892,19.0711666666667
+31,893,22.7753333333333
+31,894,27.305
+31,895,28.1093333333333
+31,896,24.0876666666667
+31,897,26.6065
+31,898,20.9761666666667
+31,899,23.4315
+31,900,24.9131666666667
+31,901,24.1088333333333
+31,902,21.209
+31,903,28.7866666666667
+31,904,25.1036666666667
+31,905,25.146
+31,906,26.0985
+31,907,27.686
+31,908,22.0768333333333
+31,909,20.7856666666667
+31,910,26.4795
+31,911,24.638
+31,912,25.908
+31,913,29.21
+31,914,27.0933333333333
+31,915,30.226
+31,916,25.4635
+31,917,24.6168333333333
+31,918,21.4206666666667
+31,919,28.5326666666667
+31,920,24.7861666666667
+31,921,22.2885
+31,922,26.2678333333333
+31,923,23.9395
+31,924,22.7753333333333
+31,925,24.9766666666667
+31,926,23.7066666666667
+31,927,26.035
+31,928,25.3153333333333
+31,929,23.0928333333333
+31,930,25.8656666666667
+31,931,22.2038333333333
+31,932,27.4108333333333
+31,933,17.3566666666667
+31,934,26.162
+31,935,27.5378333333333
+31,936,30.5223333333333
+31,937,25.3576666666667
+31,938,24.1935
+31,939,23.114
+31,940,27.0298333333333
+31,941,23.0505
+31,942,22.7753333333333
+31,943,25.4423333333333
+31,944,20.955
+31,945,26.543
+31,946,22.8176666666667
+31,947,26.2255
+31,948,26.0561666666667
+31,949,24.1511666666667
+31,950,23.1563333333333
+31,951,24.4051666666667
+31,952,21.7593333333333
+31,953,21.5053333333333
+31,954,22.606
+31,955,20.6375
+31,956,28.3421666666667
+31,957,16.5946666666667
+31,958,20.9973333333333
+31,959,23.9183333333333
+31,960,25.9926666666667
+31,961,23.6643333333333
+31,962,21.1878333333333
+31,963,18.6478333333333
+31,964,25.273
+31,965,24.8496666666667
+31,966,25.6751666666667
+31,967,23.622
+31,968,21.8863333333333
+31,969,26.543
+31,970,20.1083333333333
+31,971,17.8646666666667
+31,972,26.7546666666667
+31,973,23.4526666666667
+31,974,23.2833333333333
+31,975,19.4733333333333
+31,976,23.1351666666667
+31,977,28.4903333333333
+31,978,23.8548333333333
+31,979,24.0876666666667
+31,980,27.4955
+31,981,24.765
+31,982,22.2885
+31,983,25.0401666666667
+31,984,21.971
+31,985,27.559
+31,986,25.6116666666667
+31,987,29.4428333333333
+31,988,22.9023333333333
+31,989,22.3943333333333
+31,990,20.4046666666667
+31,991,25.273
+31,992,22.733
+31,993,25.6328333333333
+31,994,26.67
+31,995,25.2306666666667
+31,996,27.813
+31,997,26.5218333333333
+31,998,21.6323333333333
+31,999,21.2301666666667
+31,1000,26.7335
+32,1,28.2448
+32,2,24.4517333333333
+32,3,24.6422333333333
+32,4,33.9809666666667
+32,5,27.6606
+32,6,27.0594666666667
+32,7,31.4198
+32,8,26.6192
+32,9,24.2146666666667
+32,10,24.2697
+32,11,27.6225
+32,12,25.2306666666667
+32,13,31.0726666666667
+32,14,27.1145
+32,15,29.0660666666667
+32,16,31.0176333333333
+32,17,22.6314
+32,18,30.3784
+32,19,28.1516666666667
+32,20,32.6855666666667
+32,21,18.7579
+32,22,30.5054
+32,23,26.2297333333333
+32,24,27.6436666666667
+32,25,29.2608
+32,26,24.3797666666667
+32,27,28.5623
+32,28,21.9794666666667
+32,29,22.1276333333333
+32,30,28.4776333333333
+32,31,22.9446666666667
+32,32,24.5194666666667
+32,33,28.3718
+32,34,32.4950666666667
+32,35,30.8017333333333
+32,36,28.9221333333333
+32,37,28.2998333333333
+32,38,23.8802333333333
+32,39,23.6855
+32,40,28.3887333333333
+32,41,31.8981666666667
+32,42,26.4202333333333
+32,43,29.1888333333333
+32,44,29.4682333333333
+32,45,19.5156666666667
+32,46,23.3510666666667
+32,47,32.1987333333333
+32,48,26.035
+32,49,27.3304
+32,50,31.8643
+32,51,24.2781666666667
+32,52,23.9183333333333
+32,53,26.2974666666667
+32,54,24.6507
+32,55,28.7443333333333
+32,56,26.7123333333333
+32,57,33.0835
+32,58,26.6573
+32,59,29.4259
+32,60,25.3407333333333
+32,61,27.7706666666667
+32,62,24.4348
+32,63,24.8962333333333
+32,64,21.5138
+32,65,25.0274666666667
+32,66,28.0712333333333
+32,67,27.4531666666667
+32,68,24.6210666666667
+32,69,27.305
+32,70,30.2514
+32,71,35.1155
+32,72,28.5538333333333
+32,73,28.4691666666667
+32,74,26.2551333333333
+32,75,24.1723333333333
+32,76,29.0449
+32,77,26.4371666666667
+32,78,27.7495
+32,79,21.8694
+32,80,24.0241666666667
+32,81,24.1088333333333
+32,82,28.9517666666667
+32,83,27.5674666666667
+32,84,27.0340666666667
+32,85,30.6281666666667
+32,86,27.4997333333333
+32,87,23.9860666666667
+32,88,25.0486333333333
+32,89,27.1356666666667
+32,90,24.8158
+32,91,17.2550666666667
+32,92,27.1653
+32,93,31.75
+32,94,30.3022
+32,95,29.2946666666667
+32,96,25.5143
+32,97,21.9329
+32,98,26.162
+32,99,32.0717333333333
+32,100,24.5618
+32,101,25.8699
+32,102,22.2292333333333
+32,103,24.6676333333333
+32,104,27.2923
+32,105,24.5152333333333
+32,106,26.4583333333333
+32,107,23.3087333333333
+32,108,28.8078333333333
+32,109,21.5053333333333
+32,110,30.9668333333333
+32,111,28.4437666666667
+32,112,19.5834
+32,113,23.9225666666667
+32,114,26.7377333333333
+32,115,25.1333
+32,116,25.6582333333333
+32,117,19.6511333333333
+32,118,25.9545666666667
+32,119,23.5627333333333
+32,120,28.5834666666667
+32,121,29.0449
+32,122,28.8713333333333
+32,123,27.3092333333333
+32,124,20.7264
+32,125,26.2509
+32,126,24.6464666666667
+32,127,28.2151666666667
+32,128,28.6004
+32,129,24.4094
+32,130,21.6789
+32,131,29.2523333333333
+32,132,27.4404666666667
+32,133,22.8007333333333
+32,134,27.7537333333333
+32,135,24.5956666666667
+32,136,23.6050666666667
+32,137,28.0077333333333
+32,138,22.3139
+32,139,25.3068666666667
+32,140,25.5143
+32,141,25.2941666666667
+32,142,31.0853666666667
+32,143,26.797
+32,144,25.0444
+32,145,27.5801666666667
+32,146,22.9235
+32,147,23.6770333333333
+32,148,28.9136666666667
+32,149,19.685
+32,150,25.6243666666667
+32,151,26.1831666666667
+32,152,23.3341333333333
+32,153,26.7546666666667
+32,154,27.7749
+32,155,27.1399
+32,156,28.9136666666667
+32,157,24.1638666666667
+32,158,18.6478333333333
+32,159,31.8219666666667
+32,160,26.0858
+32,161,25.8529666666667
+32,162,25.9291666666667
+32,163,28.2786666666667
+32,164,29.7222333333333
+32,165,28.4903333333333
+32,166,27.6267333333333
+32,167,28.6681333333333
+32,168,22.5001666666667
+32,169,24.9555
+32,170,25.2772333333333
+32,171,23.3595333333333
+32,172,33.0623333333333
+32,173,25.8868333333333
+32,174,32.7702333333333
+32,175,30.7594
+32,176,26.2636
+32,177,25.146
+32,178,22.5636666666667
+32,179,23.6685666666667
+32,180,21.4841666666667
+32,181,24.8496666666667
+32,182,29.8280666666667
+32,183,25.6582333333333
+32,184,19.8162333333333
+32,185,31.8558333333333
+32,186,24.0792
+32,187,19.6342
+32,188,24.9385666666667
+32,189,22.2080666666667
+32,190,32.4781333333333
+32,191,27.2923
+32,192,28.2067
+32,193,25.4084666666667
+32,194,25.2095
+32,195,27.559
+32,196,24.9089333333333
+32,197,23.3087333333333
+32,198,20.7433333333333
+32,199,28.3252333333333
+32,200,24.4729
+32,201,30.2302333333333
+32,202,24.0072333333333
+32,203,26.1704666666667
+32,204,23.3468333333333
+32,205,18.288
+32,206,25.4423333333333
+32,207,21.8482333333333
+32,208,29.337
+32,209,24.2358333333333
+32,210,28.8544
+32,211,27.4743333333333
+32,212,26.8012333333333
+32,213,23.0801333333333
+32,214,25.2857
+32,215,25.8572
+32,216,25.1671666666667
+32,217,23.3722333333333
+32,218,24.4094
+32,219,22.2123
+32,220,28.575
+32,221,28.1093333333333
+32,222,27.2711333333333
+32,223,23.6008333333333
+32,224,26.5514666666667
+32,225,26.3948333333333
+32,226,30.4461333333333
+32,227,28.9814
+32,228,23.9183333333333
+32,229,25.9122333333333
+32,230,23.5458
+32,231,25.1248333333333
+32,232,24.6041333333333
+32,233,26.1408333333333
+32,234,24.4517333333333
+32,235,26.4414
+32,236,29.2819666666667
+32,237,25.8699
+32,238,24.8115666666667
+32,239,20.3835
+32,240,30.4884666666667
+32,241,25.2222
+32,242,23.7278333333333
+32,243,25.7217333333333
+32,244,24.3289666666667
+32,245,27.8553333333333
+32,246,28.575
+32,247,25.6455333333333
+32,248,26.1027333333333
+32,249,27.305
+32,250,25.4846666666667
+32,251,29.3793333333333
+32,252,25.8445
+32,253,22.3139
+32,254,23.6474
+32,255,25.5312333333333
+32,256,23.241
+32,257,24.9978333333333
+32,258,27.6225
+32,259,28.6131
+32,260,23.3934
+32,261,24.765
+32,262,21.8016666666667
+32,263,24.9004666666667
+32,264,24.7142
+32,265,26.8181666666667
+32,266,27.3304
+32,267,26.8859
+32,268,24.9809
+32,269,23.5500333333333
+32,270,26.0180666666667
+32,271,24.6210666666667
+32,272,25.4211666666667
+32,273,22.9489
+32,274,31.0853666666667
+32,275,30.0609
+32,276,25.6370666666667
+32,277,24.9851333333333
+32,278,17.5979666666667
+32,279,26.0180666666667
+32,280,27.0933333333333
+32,281,24.5618
+32,282,25.3153333333333
+32,283,27.6479
+32,284,24.7226666666667
+32,285,26.2085666666667
+32,286,25.1502333333333
+32,287,27.5674666666667
+32,288,28.321
+32,289,30.4207333333333
+32,290,21.3995
+32,291,32.6093666666667
+32,292,28.4310666666667
+32,293,26.7208
+32,294,27.7749
+32,295,26.6530666666667
+32,296,25.3830666666667
+32,297,25.7852333333333
+32,298,21.4460666666667
+32,299,26.9494
+32,300,26.2297333333333
+32,301,29.5275
+32,302,25.3238
+32,303,27.5886333333333
+32,304,26.0773333333333
+32,305,21.9371333333333
+32,306,22.6737333333333
+32,307,30.2937333333333
+32,308,19.5410666666667
+32,309,27.3939
+32,310,31.6272333333333
+32,311,27.0552333333333
+32,312,23.3553
+32,313,25.3026333333333
+32,314,25.8783666666667
+32,315,25.1502333333333
+32,316,23.6855
+32,317,22.5763666666667
+32,318,26.2763
+32,319,30.4419
+32,320,29.0914666666667
+32,321,32.9141666666667
+32,322,25.9757333333333
+32,323,24.7269
+32,324,27.6309666666667
+32,325,31.4748333333333
+32,326,28.2617333333333
+32,327,23.2664
+32,328,26.797
+32,329,28.1347333333333
+32,330,25.4635
+32,331,26.5641666666667
+32,332,21.1497333333333
+32,333,27.2288
+32,334,24.0876666666667
+32,335,25.6370666666667
+32,336,35.6235
+32,337,23.368
+32,338,25.8106333333333
+32,339,29.7222333333333
+32,340,21.6789
+32,341,22.2504
+32,342,29.6121666666667
+32,343,21.1285666666667
+32,344,23.1182333333333
+32,345,20.828
+32,346,27.3092333333333
+32,347,22.3308333333333
+32,348,29.1507333333333
+32,349,21.9964
+32,350,30.0185666666667
+32,351,28.2786666666667
+32,352,20.8322333333333
+32,353,25.6328333333333
+32,354,28.0500666666667
+32,355,23.5712
+32,356,23.9268
+32,357,24.6168333333333
+32,358,29.2311666666667
+32,359,24.892
+32,360,26.0858
+32,361,23.0293333333333
+32,362,22.0048666666667
+32,363,23.6050666666667
+32,364,32.0124666666667
+32,365,28.067
+32,366,29.1507333333333
+32,367,26.2974666666667
+32,368,28.0924
+32,369,29.4216666666667
+32,370,24.2654666666667
+32,371,25.8868333333333
+32,372,25.5693333333333
+32,373,24.2824
+32,374,25.8487333333333
+32,375,27.6733
+32,376,27.4574
+32,377,25.2095
+32,378,26.8689666666667
+32,379,27.0086666666667
+32,380,23.6855
+32,381,25.3661333333333
+32,382,20.9761666666667
+32,383,23.2240666666667
+32,384,21.3783333333333
+32,385,31.7076666666667
+32,386,30.8821666666667
+32,387,33.5788
+32,388,24.2189
+32,389,24.0284
+32,390,24.8539
+32,391,26.5091333333333
+32,392,26.6488333333333
+32,393,30.6916666666667
+32,394,28.9136666666667
+32,395,27.1653
+32,396,27.9696333333333
+32,397,28.6893
+32,398,24.8073333333333
+32,399,27.8341666666667
+32,400,26.9494
+32,401,25.5058333333333
+32,402,29.6841333333333
+32,403,19.7146333333333
+32,404,22.2377
+32,405,25.9334
+32,406,25.6243666666667
+32,407,27.3981333333333
+32,408,31.7584666666667
+32,409,26.2043333333333
+32,410,23.9056333333333
+32,411,26.6488333333333
+32,412,25.8656666666667
+32,413,20.5528333333333
+32,414,25.0401666666667
+32,415,25.3238
+32,416,28.3845
+32,417,28.3464
+32,418,26.3736666666667
+32,419,22.4663
+32,420,22.2080666666667
+32,421,24.0241666666667
+32,422,28.0924
+32,423,25.4550333333333
+32,424,28.9390666666667
+32,425,28.6596666666667
+32,426,25.7937
+32,427,29.3031333333333
+32,428,26.6488333333333
+32,429,26.2720666666667
+32,430,23.0505
+32,431,28.1728333333333
+32,432,19.2743666666667
+32,433,25.8741333333333
+32,434,29.2523333333333
+32,435,21.7508666666667
+32,436,28.3845
+32,437,23.8336666666667
+32,438,27.4955
+32,439,18.5674
+32,440,26.0011333333333
+32,441,30.226
+32,442,27.5632333333333
+32,443,26.5726333333333
+32,444,25.6370666666667
+32,445,32.0294
+32,446,24.0284
+32,447,20.8957333333333
+32,448,26.6954
+32,449,22.7203
+32,450,29.4894
+32,451,23.8590666666667
+32,452,28.1770666666667
+32,453,32.4104
+32,454,19.8416333333333
+32,455,24.7142
+32,456,24.3289666666667
+32,457,31.8812333333333
+32,458,25.4
+32,459,30.226
+32,460,32.8506666666667
+32,461,20.0914
+32,462,28.0500666666667
+32,463,28.5538333333333
+32,464,32.0124666666667
+32,465,26.7123333333333
+32,466,26.8054666666667
+32,467,26.1239
+32,468,23.3129666666667
+32,469,21.8016666666667
+32,470,28.4818666666667
+32,471,22.9700666666667
+32,472,25.8995333333333
+32,473,20.701
+32,474,28.2363333333333
+32,475,31.9659
+32,476,28.3083
+32,477,24.9978333333333
+32,478,28.1686
+32,479,28.0289
+32,480,24.3247333333333
+32,481,24.3247333333333
+32,482,23.4992333333333
+32,483,25.9799666666667
+32,484,30.6705
+32,485,25.7302
+32,486,29.0533666666667
+32,487,28.2829
+32,488,27.7706666666667
+32,489,23.6982
+32,490,28.956
+32,491,21.3868
+32,492,27.1695333333333
+32,493,30.3784
+32,494,26.6530666666667
+32,495,26.5091333333333
+32,496,21.8694
+32,497,30.1709666666667
+32,498,28.7485666666667
+32,499,27.1568333333333
+32,500,29.8238333333333
+32,501,24.1384666666667
+32,502,24.1765666666667
+32,503,27.7960666666667
+32,504,30.1244
+32,505,23.9014
+32,506,28.0035
+32,507,31.75
+32,508,27.2034
+32,509,23.7998
+32,510,32.5077666666667
+32,511,26.5218333333333
+32,512,33.0411666666667
+32,513,27.178
+32,514,25.3873
+32,515,22.1191666666667
+32,516,31.1785
+32,517,21.5984666666667
+32,518,24.2654666666667
+32,519,24.4263333333333
+32,520,23.7363
+32,521,21.336
+32,522,24.9639666666667
+32,523,26.3567333333333
+32,524,26.0815666666667
+32,525,26.162
+32,526,30.8186666666667
+32,527,26.0519333333333
+32,528,29.1168666666667
+32,529,29.6756666666667
+32,530,28.5580666666667
+32,531,25.4042333333333
+32,532,24.6803333333333
+32,533,25.9926666666667
+32,534,23.6304666666667
+32,535,27.8595666666667
+32,536,25.9757333333333
+32,537,27.2203333333333
+32,538,27.94
+32,539,25.1079
+32,540,30.2471666666667
+32,541,25.6370666666667
+32,542,29.3116
+32,543,29.0872333333333
+32,544,28.2659666666667
+32,545,19.5791666666667
+32,546,26.5091333333333
+32,547,25.3238
+32,548,28.5326666666667
+32,549,25.8868333333333
+32,550,25.4042333333333
+32,551,29.8915666666667
+32,552,21.4460666666667
+32,553,25.8910666666667
+32,554,27.1822333333333
+32,555,24.0284
+32,556,30.9245
+32,557,24.6083666666667
+32,558,26.0223
+32,559,26.0434666666667
+32,560,28.575
+32,561,29.3412333333333
+32,562,28.3294666666667
+32,563,29.2989
+32,564,28.1305
+32,565,22.0175666666667
+32,566,29.3200666666667
+32,567,24.5575666666667
+32,568,24.765
+32,569,25.0020666666667
+32,570,22.2715666666667
+32,571,23.1055333333333
+32,572,24.2231333333333
+32,573,24.257
+32,574,25.6582333333333
+32,575,28.067
+32,576,26.2043333333333
+32,577,25.0274666666667
+32,578,26.4414
+32,579,23.495
+32,580,28.2871333333333
+32,581,30.0185666666667
+32,582,26.1027333333333
+32,583,23.9183333333333
+32,584,28.5538333333333
+32,585,29.1676666666667
+32,586,28.2405666666667
+32,587,33.5068333333333
+32,588,27.3558
+32,589,28.4903333333333
+32,590,30.1074666666667
+32,591,32.6686333333333
+32,592,25.5989666666667
+32,593,22.5890666666667
+32,594,25.9757333333333
+32,595,25.4465666666667
+32,596,22.5679
+32,597,28.9009666666667
+32,598,20.8618666666667
+32,599,29.3624
+32,600,27.7918333333333
+32,601,24.8539
+32,602,26.8478
+32,603,27.2626666666667
+32,604,21.3190666666667
+32,605,29.5994666666667
+32,606,26.1196666666667
+32,607,25.9969
+32,608,24.8962333333333
+32,609,27.3304
+32,610,24.6803333333333
+32,611,20.3835
+32,612,29.2311666666667
+32,613,29.6545
+32,614,32.1394666666667
+32,615,30.8186666666667
+32,616,25.0613333333333
+32,617,27.8807333333333
+32,618,26.3355666666667
+32,619,28.4353
+32,620,24.7099666666667
+32,621,25.1502333333333
+32,622,23.2494666666667
+32,623,23.9437333333333
+32,624,32.7236666666667
+32,625,29.1719
+32,626,26.8689666666667
+32,627,28.0035
+32,628,27.3685
+32,629,26.1874
+32,630,24.13
+32,631,23.9225666666667
+32,632,32.0886666666667
+32,633,25.6201333333333
+32,634,28.575
+32,635,26.6276666666667
+32,636,26.2466666666667
+32,637,25.9969
+32,638,29.9085
+32,639,27.7579666666667
+32,640,22.6695
+32,641,26.0053666666667
+32,642,24.2400666666667
+32,643,31.3097333333333
+32,644,26.6319
+32,645,30.0820666666667
+32,646,29.3878
+32,647,22.6271666666667
+32,648,28.1982333333333
+32,649,27.2415
+32,650,26.1831666666667
+32,651,27.7706666666667
+32,652,29.1507333333333
+32,653,23.7320666666667
+32,654,26.8266333333333
+32,655,27.6521333333333
+32,656,28.7231666666667
+32,657,26.9959666666667
+32,658,29.8704
+32,659,27.2838333333333
+32,660,28.8798
+32,661,28.6639
+32,662,26.3567333333333
+32,663,23.749
+32,664,25.9334
+32,665,25.5312333333333
+32,666,25.6624666666667
+32,667,30.2556333333333
+32,668,25.5312333333333
+32,669,31.7627
+32,670,27.6267333333333
+32,671,26.7800666666667
+32,672,25.1883333333333
+32,673,25.7471333333333
+32,674,29.5825333333333
+32,675,26.2128
+32,676,27.4531666666667
+32,677,31.1361666666667
+32,678,31.5214
+32,679,24.003
+32,680,29.2269333333333
+32,681,28.4945666666667
+32,682,21.1328
+32,683,28.0712333333333
+32,684,24.6845666666667
+32,685,24.5406333333333
+32,686,31.5256333333333
+32,687,33.9428666666667
+32,688,36.3262333333333
+32,689,27.4743333333333
+32,690,24.4051666666667
+32,691,23.1351666666667
+32,692,26.3736666666667
+32,693,30.3784
+32,694,24.3416666666667
+32,695,25.4338666666667
+32,696,29.5063333333333
+32,697,24.765
+32,698,19.6045666666667
+32,699,32.4485
+32,700,29.2311666666667
+32,701,20.1633666666667
+32,702,25.1036666666667
+32,703,28.6004
+32,704,26.6954
+32,705,24.384
+32,706,31.2208333333333
+32,707,25.9334
+32,708,22.9446666666667
+32,709,28.8755666666667
+32,710,30.6112333333333
+32,711,26.1831666666667
+32,712,23.7871
+32,713,22.1911333333333
+32,714,27.2457333333333
+32,715,27.178
+32,716,25.5778
+32,717,29.6545
+32,718,21.9159666666667
+32,719,28.194
+32,720,26.2974666666667
+32,721,29.8534666666667
+32,722,22.7753333333333
+32,723,29.3243
+32,724,22.6779666666667
+32,725,30.3191333333333
+32,726,26.3779
+32,727,25.3407333333333
+32,728,20.955
+32,729,26.3398
+32,730,27.8807333333333
+32,731,23.9860666666667
+32,732,21.971
+32,733,29.2946666666667
+32,734,26.4879666666667
+32,735,26.6784666666667
+32,736,31.3266666666667
+32,737,23.6431666666667
+32,738,28.6385
+32,739,33.4475666666667
+32,740,28.2194
+32,741,24.3670666666667
+32,742,29.4978666666667
+32,743,24.9343333333333
+32,744,24.4686666666667
+32,745,22.4874666666667
+32,746,24.3459
+32,747,27.9188333333333
+32,748,24.0072333333333
+32,749,22.6144666666667
+32,750,26.3101666666667
+32,751,20.8915
+32,752,27.1610666666667
+32,753,22.8430666666667
+32,754,25.019
+32,755,23.1436333333333
+32,756,28.3294666666667
+32,757,21.0650666666667
+32,758,29.464
+32,759,29.2608
+32,760,21.7847333333333
+32,761,28.3167666666667
+32,762,29.9593
+32,763,30.0820666666667
+32,764,31.3266666666667
+32,765,21.8059
+32,766,27.5717
+32,767,30.2683333333333
+32,768,23.2240666666667
+32,769,29.4682333333333
+32,770,26.8393333333333
+32,771,23.3045
+32,772,25.2645333333333
+32,773,21.7424
+32,774,24.5533333333333
+32,775,32.1945
+32,776,23.5204
+32,777,22.1699666666667
+32,778,26.035
+32,779,19.1431333333333
+32,780,25.3407333333333
+32,781,25.6963333333333
+32,782,30.7001333333333
+32,783,30.1455666666667
+32,784,24.7142
+32,785,24.4475
+32,786,21.3825666666667
+32,787,33.9513333333333
+32,788,24.0157
+32,789,28.7231666666667
+32,790,25.3788333333333
+32,791,29.2608
+32,792,28.3845
+32,793,32.0929
+32,794,25.273
+32,795,24.6210666666667
+32,796,23.8590666666667
+32,797,33.3883
+32,798,27.9019
+32,799,27.2711333333333
+32,800,27.3304
+32,801,32.3511333333333
+32,802,25.6751666666667
+32,803,31.1615666666667
+32,804,24.7861666666667
+32,805,29.4470666666667
+32,806,23.6135333333333
+32,807,26.2805333333333
+32,808,22.3562333333333
+32,809,28.7104666666667
+32,810,25.7471333333333
+32,811,25.908
+32,812,23.2240666666667
+32,813,25.3576666666667
+32,814,27.1695333333333
+32,815,31.4155666666667
+32,816,28.7866666666667
+32,817,22.4366666666667
+32,818,22.6271666666667
+32,819,22.8938666666667
+32,820,23.6262333333333
+32,821,26.8605
+32,822,27.6479
+32,823,21.4841666666667
+32,824,24.8835333333333
+32,825,31.4198
+32,826,28.7062333333333
+32,827,21.0396666666667
+32,828,26.797
+32,829,30.0863
+32,830,23.6939666666667
+32,831,31.4833
+32,832,24.7565333333333
+32,833,27.3896666666667
+32,834,32.2368333333333
+32,835,23.5839
+32,836,31.75
+32,837,27.7156333333333
+32,838,23.6643333333333
+32,839,24.4094
+32,840,23.3087333333333
+32,841,23.9606666666667
+32,842,23.0081666666667
+32,843,28.3421666666667
+32,844,29.4428333333333
+32,845,21.0058
+32,846,27.305
+32,847,26.8859
+32,848,25.1714
+32,849,28.5538333333333
+32,850,26.8351
+32,851,23.4145666666667
+32,852,28.0289
+32,853,25.4084666666667
+32,854,22.7160666666667
+32,855,25.9799666666667
+32,856,24.6210666666667
+32,857,26.4837333333333
+32,858,31.2885666666667
+32,859,26.2255
+32,860,25.7005666666667
+32,861,29.7434
+32,862,18.6986333333333
+32,863,29.4428333333333
+32,864,28.1770666666667
+32,865,23.7955666666667
+32,866,25.5058333333333
+32,867,29.2565666666667
+32,868,25.6159
+32,869,28.1347333333333
+32,870,29.6248666666667
+32,871,26.3228666666667
+32,872,23.7320666666667
+32,873,28.8628666666667
+32,874,27.3473333333333
+32,875,26.9282333333333
+32,876,23.5585
+32,877,28.4522333333333
+32,878,25.6370666666667
+32,879,21.9964
+32,880,31.1234666666667
+32,881,28.0543
+32,882,25.5354666666667
+32,883,23.4315
+32,884,26.7800666666667
+32,885,25.6116666666667
+32,886,25.1248333333333
+32,887,28.0416
+32,888,21.1666666666667
+32,889,25.4508
+32,890,25.7386666666667
+32,891,29.5486666666667
+32,892,25.3153333333333
+32,893,27.4531666666667
+32,894,28.8332333333333
+32,895,29.0279666666667
+32,896,30.9118
+32,897,24.6422333333333
+32,898,27.3304
+32,899,26.1916333333333
+32,900,28.1982333333333
+32,901,28.067
+32,902,24.4602
+32,903,25.527
+32,904,29.7391666666667
+32,905,26.0392333333333
+32,906,26.6530666666667
+32,907,27.6690666666667
+32,908,24.3670666666667
+32,909,29.6799
+32,910,29.845
+32,911,24.7904
+32,912,27.7114
+32,913,27.1229666666667
+32,914,25.5100666666667
+32,915,26.0646333333333
+32,916,26.4371666666667
+32,917,25.9164666666667
+32,918,21.0608333333333
+32,919,28.9348333333333
+32,920,22.1022333333333
+32,921,25.9926666666667
+32,922,21.5307333333333
+32,923,30.226
+32,924,25.9799666666667
+32,925,21.9964
+32,926,22.9446666666667
+32,927,21.6323333333333
+32,928,25.3788333333333
+32,929,28.2829
+32,930,25.3830666666667
+32,931,24.4729
+32,932,29.5486666666667
+32,933,31.5595
+32,934,27.432
+32,935,24.0284
+32,936,26.0604
+32,937,25.3661333333333
+32,938,23.5585
+32,939,30.099
+32,940,30.4842333333333
+32,941,21.4884
+32,942,32.0929
+32,943,26.8943666666667
+32,944,27.1568333333333
+32,945,23.7066666666667
+32,946,30.2683333333333
+32,947,24.9343333333333
+32,948,24.9978333333333
+32,949,31.9659
+32,950,28.3675666666667
+32,951,23.2621666666667
+32,952,26.9663333333333
+32,953,26.9917333333333
+32,954,24.7988666666667
+32,955,23.0589666666667
+32,956,31.5002333333333
+32,957,30.1032333333333
+32,958,25.3746
+32,959,25.7852333333333
+32,960,26.1239
+32,961,31.5679666666667
+32,962,25.4423333333333
+32,963,25.6963333333333
+32,964,31.5383333333333
+32,965,28.8713333333333
+32,966,26.924
+32,967,26.6954
+32,968,29.083
+32,969,26.9494
+32,970,20.2438
+32,971,26.6276666666667
+32,972,28.9602333333333
+32,973,28.6639
+32,974,27.8341666666667
+32,975,32.3426666666667
+32,976,23.7998
+32,977,24.8835333333333
+32,978,26.9451666666667
+32,979,26.2509
+32,980,29.1930666666667
+32,981,23.0335666666667
+32,982,26.6276666666667
+32,983,26.6742333333333
+32,984,23.0505
+32,985,31.9616666666667
+32,986,25.1756333333333
+32,987,28.7062333333333
+32,988,27.1399
+32,989,27.4150666666667
+32,990,30.4630666666667
+32,991,29.083
+32,992,26.7377333333333
+32,993,27.5209
+32,994,24.8158
+32,995,26.3779
+32,996,28.3845
+32,997,25.4931333333333
+32,998,32.4104
+32,999,26.3948333333333
+32,1000,31.6865
+33,1,32.5966666666667
+33,2,33.4433333333333
+33,3,33.1681666666667
+33,4,29.5063333333333
+33,5,30.1836666666667
+33,6,31.3266666666667
+33,7,29.8873333333333
+33,8,37.6343333333333
+33,9,35.9833333333333
+33,10,35.7081666666667
+33,11,33.5915
+33,12,34.163
+33,13,28.6808333333333
+33,14,29.2735
+33,15,30.5646666666667
+33,16,25.3365
+33,17,27.3261666666667
+33,18,33.6973333333333
+33,19,27.8553333333333
+33,20,35.3695
+33,21,27.94
+33,22,30.5858333333333
+33,23,34.2265
+33,24,28.4056666666667
+33,25,33.1681666666667
+33,26,29.464
+33,27,26.8181666666667
+33,28,28.0881666666667
+33,29,36.8935
+33,30,27.0298333333333
+33,31,31.7288333333333
+33,32,35.7293333333333
+33,33,32.1945
+33,34,33.9513333333333
+33,35,31.496
+33,36,29.6968333333333
+33,37,37.084
+33,38,27.94
+33,39,32.5755
+33,40,30.607
+33,41,32.893
+33,42,27.305
+33,43,42.5661666666667
+33,44,25.3365
+33,45,33.3375
+33,46,23.114
+33,47,36.2585
+33,48,32.0251666666667
+33,49,27.3685
+33,50,36.83
+33,51,28.2151666666667
+33,52,28.9136666666667
+33,53,29.21
+33,54,27.1568333333333
+33,55,23.5373333333333
+33,56,31.8346666666667
+33,57,30.7551666666667
+33,58,32.5331666666667
+33,59,31.2843333333333
+33,60,35.433
+33,61,38.735
+33,62,31.1361666666667
+33,63,24.0876666666667
+33,64,36.576
+33,65,33.02
+33,66,25.2518333333333
+33,67,28.1305
+33,68,32.258
+33,69,25.7598333333333
+33,70,33.8878333333333
+33,71,32.258
+33,72,28.575
+33,73,29.7815
+33,74,32.4908333333333
+33,75,28.9983333333333
+33,76,28.2786666666667
+33,77,34.0571666666667
+33,78,34.3746666666667
+33,79,30.0566666666667
+33,80,27.5801666666667
+33,81,29.9085
+33,82,32.4485
+33,83,35.9621666666667
+33,84,25.0401666666667
+33,85,25.2306666666667
+33,86,30.6281666666667
+33,87,32.8083333333333
+33,88,26.7546666666667
+33,89,33.655
+33,90,33.782
+33,91,26.2466666666667
+33,92,34.9673333333333
+33,93,27.4743333333333
+33,94,33.9513333333333
+33,95,38.2905
+33,96,33.0623333333333
+33,97,32.4061666666667
+33,98,32.4696666666667
+33,99,33.401
+33,100,32.1945
+33,101,31.8558333333333
+33,102,35.433
+33,103,23.241
+33,104,32.0886666666667
+33,105,28.067
+33,106,26.543
+33,107,25.2518333333333
+33,108,32.258
+33,109,36.83
+33,110,28.4056666666667
+33,111,33.3798333333333
+33,112,25.9715
+33,113,34.3535
+33,114,31.5806666666667
+33,115,34.0995
+33,116,30.3953333333333
+33,117,23.749
+33,118,24.1935
+33,119,34.4805
+33,120,34.8615
+33,121,27.432
+33,122,31.2843333333333
+33,123,37.084
+33,124,34.7556666666667
+33,125,30.6281666666667
+33,126,29.9931666666667
+33,127,35.1578333333333
+33,128,31.5171666666667
+33,129,31.1361666666667
+33,130,33.7396666666667
+33,131,38.481
+33,132,29.1465
+33,133,26.3736666666667
+33,134,32.8083333333333
+33,135,33.401
+33,136,31.496
+33,137,32.4485
+33,138,25.5058333333333
+33,139,25.7386666666667
+33,140,27.5166666666667
+33,141,23.6855
+33,142,35.4965
+33,143,39.5181666666667
+33,144,35.8986666666667
+33,145,29.6333333333333
+33,146,24.0241666666667
+33,147,27.4743333333333
+33,148,31.369
+33,149,34.8826666666667
+33,150,34.2476666666667
+33,151,29.8026666666667
+33,152,27.8553333333333
+33,153,30.8398333333333
+33,154,32.5755
+33,155,34.5016666666667
+33,156,33.401
+33,157,30.5435
+33,158,25.8021666666667
+33,159,29.21
+33,160,27.3261666666667
+33,161,28.0458333333333
+33,162,25.2518333333333
+33,163,30.226
+33,164,27.686
+33,165,28.1516666666667
+33,166,37.4226666666667
+33,167,29.1041666666667
+33,168,32.4485
+33,169,24.765
+33,170,29.6333333333333
+33,171,29.0618333333333
+33,172,29.0618333333333
+33,173,27.4743333333333
+33,174,31.6441666666667
+33,175,34.3111666666667
+33,176,26.1831666666667
+33,177,35.0943333333333
+33,178,25.5693333333333
+33,179,25.8656666666667
+33,180,28.5538333333333
+33,181,32.512
+33,182,26.7335
+33,183,26.0773333333333
+33,184,25.654
+33,185,37.211
+33,186,30.7975
+33,187,27.432
+33,188,30.5435
+33,189,28.1516666666667
+33,190,32.6813333333333
+33,191,26.6911666666667
+33,192,33.4221666666667
+33,193,33.4856666666667
+33,194,30.9668333333333
+33,195,33.3375
+33,196,27.4743333333333
+33,197,32.5543333333333
+33,198,23.6643333333333
+33,199,34.5651666666667
+33,200,30.2683333333333
+33,201,39.1583333333333
+33,202,35.2425
+33,203,27.0933333333333
+33,204,30.6493333333333
+33,205,26.797
+33,206,27.305
+33,207,26.162
+33,208,35.2425
+33,209,27.2203333333333
+33,210,22.9658333333333
+33,211,29.845
+33,212,29.1465
+33,213,33.9513333333333
+33,214,30.7128333333333
+33,215,33.147
+33,216,27.1145
+33,217,30.4165
+33,218,35.8351666666667
+33,219,29.845
+33,220,30.9245
+33,221,27.94
+33,222,30.9245
+33,223,29.591
+33,224,33.9725
+33,225,33.9513333333333
+33,226,29.21
+33,227,33.7185
+33,228,26.0561666666667
+33,229,26.8605
+33,230,29.2735
+33,231,30.8186666666667
+33,232,29.9296666666667
+33,233,27.8765
+33,234,27.2203333333333
+33,235,29.3158333333333
+33,236,30.3318333333333
+33,237,36.4701666666667
+33,238,26.9028333333333
+33,239,30.6493333333333
+33,240,32.512
+33,241,27.7706666666667
+33,242,34.9038333333333
+33,243,30.9245
+33,244,28.7443333333333
+33,245,30.0143333333333
+33,246,22.9446666666667
+33,247,32.7448333333333
+33,248,31.9828333333333
+33,249,32.131
+33,250,28.8078333333333
+33,251,29.3793333333333
+33,252,27.7283333333333
+33,253,33.8455
+33,254,31.4325
+33,255,30.9456666666667
+33,256,29.5486666666667
+33,257,28.7231666666667
+33,258,34.0571666666667
+33,259,28.7443333333333
+33,260,24.0241666666667
+33,261,27.3473333333333
+33,262,25.908
+33,263,33.6973333333333
+33,264,29.8238333333333
+33,265,34.925
+33,266,24.8073333333333
+33,267,31.4113333333333
+33,268,31.2208333333333
+33,269,34.8615
+33,270,26.3313333333333
+33,271,32.7025
+33,272,33.782
+33,273,35.0731666666667
+33,274,28.321
+33,275,33.5068333333333
+33,276,32.9565
+33,277,33.7396666666667
+33,278,32.0463333333333
+33,279,25.4
+33,280,29.8238333333333
+33,281,31.5383333333333
+33,282,29.4005
+33,283,31.1785
+33,284,32.0463333333333
+33,285,32.9353333333333
+33,286,31.9828333333333
+33,287,32.3426666666667
+33,288,28.2786666666667
+33,289,31.4113333333333
+33,290,28.4056666666667
+33,291,35.1366666666667
+33,292,30.48
+33,293,34.3746666666667
+33,294,33.8455
+33,295,32.2156666666667
+33,296,33.4856666666667
+33,297,30.8186666666667
+33,298,32.6813333333333
+33,299,34.1418333333333
+33,300,29.337
+33,301,29.3581666666667
+33,302,29.464
+33,303,33.7396666666667
+33,304,36.576
+33,305,33.274
+33,306,26.035
+33,307,17.5895
+33,308,28.7866666666667
+33,309,34.8191666666667
+33,310,31.4113333333333
+33,311,29.0618333333333
+33,312,28.0458333333333
+33,313,32.0463333333333
+33,314,32.8506666666667
+33,315,30.226
+33,316,29.845
+33,317,30.5011666666667
+33,318,27.2626666666667
+33,319,22.9446666666667
+33,320,28.9348333333333
+33,321,32.3003333333333
+33,322,27.559
+33,323,30.3106666666667
+33,324,26.3313333333333
+33,325,36.4913333333333
+33,326,32.4273333333333
+33,327,26.4583333333333
+33,328,31.8558333333333
+33,329,33.8666666666667
+33,330,23.0716666666667
+33,331,26.162
+33,332,34.0995
+33,333,27.5378333333333
+33,334,36.2796666666667
+33,335,25.5693333333333
+33,336,31.7288333333333
+33,337,34.29
+33,338,29.7603333333333
+33,339,27.6013333333333
+33,340,33.5703333333333
+33,341,31.5383333333333
+33,342,34.6921666666667
+33,343,26.7123333333333
+33,344,29.2735
+33,345,32.6178333333333
+33,346,23.3468333333333
+33,347,29.5275
+33,348,27.9823333333333
+33,349,32.4273333333333
+33,350,27.7071666666667
+33,351,34.0783333333333
+33,352,27.3261666666667
+33,353,34.3323333333333
+33,354,31.9616666666667
+33,355,36.7876666666667
+33,356,31.0938333333333
+33,357,26.5853333333333
+33,358,30.1625
+33,359,33.1258333333333
+33,360,34.5651666666667
+33,361,29.6333333333333
+33,362,30.7975
+33,363,32.7871666666667
+33,364,31.0726666666667
+33,365,31.8558333333333
+33,366,31.877
+33,367,23.8971666666667
+33,368,27.7706666666667
+33,369,29.7603333333333
+33,370,23.5585
+33,371,36.1526666666667
+33,372,28.0246666666667
+33,373,31.877
+33,374,35.3906666666667
+33,375,35.2636666666667
+33,376,30.6916666666667
+33,377,24.7226666666667
+33,378,29.9296666666667
+33,379,36.9358333333333
+33,380,19.6215
+33,381,31.3901666666667
+33,382,28.6173333333333
+33,383,25.7175
+33,384,35.2001666666667
+33,385,34.7556666666667
+33,386,30.353
+33,387,34.2688333333333
+33,388,33.0411666666667
+33,389,36.322
+33,390,28.0881666666667
+33,391,26.162
+33,392,29.8873333333333
+33,393,33.274
+33,394,35.2848333333333
+33,395,31.7923333333333
+33,396,38.608
+33,397,28.6596666666667
+33,398,32.7025
+33,399,30.5223333333333
+33,400,28.575
+33,401,28.194
+33,402,33.1681666666667
+33,403,33.1258333333333
+33,404,35.7716666666667
+33,405,38.354
+33,406,29.9296666666667
+33,407,29.6968333333333
+33,408,31.5383333333333
+33,409,36.1103333333333
+33,410,21.7593333333333
+33,411,36.1526666666667
+33,412,34.5016666666667
+33,413,31.6018333333333
+33,414,26.543
+33,415,33.2105
+33,416,29.4851666666667
+33,417,29.2523333333333
+33,418,32.893
+33,419,24.4898333333333
+33,420,32.0675
+33,421,27.0721666666667
+33,422,29.845
+33,423,25.781
+33,424,42.2486666666667
+33,425,34.7556666666667
+33,426,34.9038333333333
+33,427,32.766
+33,428,30.5858333333333
+33,429,34.925
+33,430,27.0086666666667
+33,431,28.6385
+33,432,28.1305
+33,433,35.3483333333333
+33,434,24.3416666666667
+33,435,37.7825
+33,436,34.7133333333333
+33,437,34.3958333333333
+33,438,32.1945
+33,439,28.5961666666667
+33,440,25.654
+33,441,28.2151666666667
+33,442,35.56
+33,443,28.5115
+33,444,32.5755
+33,445,25.0613333333333
+33,446,31.242
+33,447,26.5218333333333
+33,448,29.8873333333333
+33,449,24.1935
+33,450,28.8501666666667
+33,451,32.5331666666667
+33,452,29.4428333333333
+33,453,31.9828333333333
+33,454,36.4913333333333
+33,455,27.4955
+33,456,30.5858333333333
+33,457,34.544
+33,458,33.7396666666667
+33,459,31.5383333333333
+33,460,32.7236666666667
+33,461,32.0675
+33,462,27.178
+33,463,33.02
+33,464,24.8073333333333
+33,465,30.9668333333333
+33,466,34.3958333333333
+33,467,31.2208333333333
+33,468,32.0675
+33,469,26.3101666666667
+33,470,26.3525
+33,471,31.4748333333333
+33,472,34.5863333333333
+33,473,21.8863333333333
+33,474,36.8511666666667
+33,475,35.3271666666667
+33,476,31.2843333333333
+33,477,40.5976666666667
+33,478,25.019
+33,479,32.4696666666667
+33,480,28.575
+33,481,29.21
+33,482,27.3896666666667
+33,483,29.5698333333333
+33,484,29.5698333333333
+33,485,36.8723333333333
+33,486,34.2688333333333
+33,487,27.813
+33,488,30.1201666666667
+33,489,33.274
+33,490,23.241
+33,491,28.829
+33,492,30.4165
+33,493,30.0566666666667
+33,494,28.4903333333333
+33,495,28.8713333333333
+33,496,29.0618333333333
+33,497,27.7283333333333
+33,498,28.6385
+33,499,32.5331666666667
+33,500,24.1511666666667
+33,501,34.8191666666667
+33,502,25.0613333333333
+33,503,31.7288333333333
+33,504,30.7128333333333
+33,505,32.4273333333333
+33,506,35.306
+33,507,36.449
+33,508,37.3803333333333
+33,509,28.575
+33,510,30.1201666666667
+33,511,32.9353333333333
+33,512,29.1465
+33,513,28.2786666666667
+33,514,31.5806666666667
+33,515,32.9988333333333
+33,516,29.4428333333333
+33,517,31.9828333333333
+33,518,27.7706666666667
+33,519,27.051
+33,520,30.988
+33,521,32.1945
+33,522,20.4893333333333
+33,523,33.1681666666667
+33,524,33.02
+33,525,33.8243333333333
+33,526,29.8026666666667
+33,527,32.385
+33,528,31.7923333333333
+33,529,28.8501666666667
+33,530,21.8863333333333
+33,531,34.3323333333333
+33,532,23.1775
+33,533,31.3055
+33,534,27.7918333333333
+33,535,39.9838333333333
+33,536,28.5326666666667
+33,537,34.671
+33,538,23.8971666666667
+33,539,37.973
+33,540,27.8553333333333
+33,541,27.3261666666667
+33,542,26.2043333333333
+33,543,27.1991666666667
+33,544,27.7283333333333
+33,545,30.2683333333333
+33,546,31.3901666666667
+33,547,26.6911666666667
+33,548,33.1893333333333
+33,549,25.9503333333333
+33,550,33.1258333333333
+33,551,36.703
+33,552,27.051
+33,553,30.2683333333333
+33,554,28.0881666666667
+33,555,33.1046666666667
+33,556,26.9451666666667
+33,557,31.0726666666667
+33,558,32.6601666666667
+33,559,34.0783333333333
+33,560,28.6808333333333
+33,561,28.9136666666667
+33,562,31.3266666666667
+33,563,38.5233333333333
+33,564,34.8403333333333
+33,565,29.3158333333333
+33,566,27.3261666666667
+33,567,35.8351666666667
+33,568,32.8506666666667
+33,569,31.5171666666667
+33,570,33.6973333333333
+33,571,32.5755
+33,572,32.8295
+33,573,33.528
+33,574,29.9085
+33,575,32.258
+33,576,34.544
+33,577,36.2585
+33,578,23.6431666666667
+33,579,35.7716666666667
+33,580,32.2156666666667
+33,581,32.512
+33,582,30.3318333333333
+33,583,33.02
+33,584,32.1098333333333
+33,585,33.9936666666667
+33,586,37.084
+33,587,30.2895
+33,588,32.9988333333333
+33,589,27.4531666666667
+33,590,33.274
+33,591,30.7763333333333
+33,592,37.1263333333333
+33,593,29.0618333333333
+33,594,28.067
+33,595,34.925
+33,596,35.4753333333333
+33,597,32.3215
+33,598,30.3106666666667
+33,599,29.3793333333333
+33,600,32.4273333333333
+33,601,34.5863333333333
+33,602,31.6018333333333
+33,603,30.7975
+33,604,30.988
+33,605,30.6916666666667
+33,606,33.9513333333333
+33,607,33.6973333333333
+33,608,24.765
+33,609,30.099
+33,610,32.9141666666667
+33,611,28.4056666666667
+33,612,31.9828333333333
+33,613,25.3365
+33,614,30.734
+33,615,28.194
+33,616,29.2311666666667
+33,617,22.86
+33,618,27.6436666666667
+33,619,35.052
+33,620,44.704
+33,621,28.8078333333333
+33,622,33.4856666666667
+33,623,31.3901666666667
+33,624,34.7133333333333
+33,625,29.083
+33,626,32.7025
+33,627,28.448
+33,628,33.7396666666667
+33,629,30.48
+33,630,38.6715
+33,631,31.0091666666667
+33,632,31.4748333333333
+33,633,32.4908333333333
+33,634,28.1093333333333
+33,635,39.243
+33,636,32.9353333333333
+33,637,40.7246666666667
+33,638,26.8816666666667
+33,639,37.7613333333333
+33,640,30.734
+33,641,28.7231666666667
+33,642,31.242
+33,643,31.8135
+33,644,32.3426666666667
+33,645,28.0458333333333
+33,646,37.338
+33,647,27.3685
+33,648,33.3586666666667
+33,649,28.8925
+33,650,31.6653333333333
+33,651,32.8083333333333
+33,652,32.0886666666667
+33,653,27.5166666666667
+33,654,29.6968333333333
+33,655,36.449
+33,656,27.3473333333333
+33,657,25.3576666666667
+33,658,38.1846666666667
+33,659,38.354
+33,660,36.8088333333333
+33,661,30.2048333333333
+33,662,29.6756666666667
+33,663,35.0096666666667
+33,664,28.8078333333333
+33,665,32.8295
+33,666,33.655
+33,667,31.9193333333333
+33,668,30.6493333333333
+33,669,28.7866666666667
+33,670,32.4696666666667
+33,671,32.1098333333333
+33,672,31.6653333333333
+33,673,33.5068333333333
+33,674,32.9776666666667
+33,675,34.3111666666667
+33,676,28.6808333333333
+33,677,28.9348333333333
+33,678,31.6865
+33,679,32.3003333333333
+33,680,30.099
+33,681,27.0086666666667
+33,682,24.638
+33,683,34.3535
+33,684,28.9771666666667
+33,685,32.3426666666667
+33,686,31.7711666666667
+33,687,31.496
+33,688,31.1573333333333
+33,689,27.5378333333333
+33,690,27.7283333333333
+33,691,27.9823333333333
+33,692,29.5063333333333
+33,693,23.8125
+33,694,26.8393333333333
+33,695,29.718
+33,696,25.9291666666667
+33,697,27.4743333333333
+33,698,35.6658333333333
+33,699,30.4376666666667
+33,700,33.8243333333333
+33,701,25.2095
+33,702,41.8253333333333
+33,703,38.0576666666667
+33,704,29.972
+33,705,34.5016666666667
+33,706,30.4165
+33,707,26.6488333333333
+33,708,30.5858333333333
+33,709,30.5646666666667
+33,710,24.4898333333333
+33,711,28.7443333333333
+33,712,29.4216666666667
+33,713,30.226
+33,714,33.7185
+33,715,36.322
+33,716,31.115
+33,717,26.7123333333333
+33,718,37.9941666666667
+33,719,28.7655
+33,720,25.273
+33,721,29.7391666666667
+33,722,28.6385
+33,723,32.2156666666667
+33,724,28.194
+33,725,36.703
+33,726,33.4856666666667
+33,727,33.3163333333333
+33,728,27.9611666666667
+33,729,34.9461666666667
+33,730,28.7231666666667
+33,731,35.1578333333333
+33,732,30.48
+33,733,28.4268333333333
+33,734,35.1578333333333
+33,735,25.5481666666667
+33,736,30.4165
+33,737,26.7335
+33,738,34.5228333333333
+33,739,25.5481666666667
+33,740,31.3055
+33,741,25.6328333333333
+33,742,40.4918333333333
+33,743,27.6013333333333
+33,744,28.448
+33,745,32.9776666666667
+33,746,33.528
+33,747,33.2528333333333
+33,748,32.5331666666667
+33,749,33.1258333333333
+33,750,33.528
+33,751,33.3163333333333
+33,752,36.6183333333333
+33,753,31.9828333333333
+33,754,34.2053333333333
+33,755,33.1046666666667
+33,756,40.0896666666667
+33,757,34.8615
+33,758,30.734
+33,759,28.5538333333333
+33,760,35.1155
+33,761,30.48
+33,762,28.8501666666667
+33,763,33.1893333333333
+33,764,33.4856666666667
+33,765,28.2151666666667
+33,766,34.6286666666667
+33,767,25.654
+33,768,32.9776666666667
+33,769,30.5646666666667
+33,770,28.1516666666667
+33,771,26.4371666666667
+33,772,23.1775
+33,773,30.9245
+33,774,38.4386666666667
+33,775,26.6065
+33,776,29.4428333333333
+33,777,29.4005
+33,778,26.2466666666667
+33,779,28.2575
+33,780,29.7815
+33,781,31.0303333333333
+33,782,30.1836666666667
+33,783,30.099
+33,784,32.9353333333333
+33,785,28.6385
+33,786,32.7448333333333
+33,787,35.3906666666667
+33,788,28.7866666666667
+33,789,23.9606666666667
+33,790,29.5275
+33,791,33.5915
+33,792,31.369
+33,793,33.2528333333333
+33,794,30.9245
+33,795,28.8501666666667
+33,796,32.8718333333333
+33,797,27.2838333333333
+33,798,39.4546666666667
+33,799,29.6333333333333
+33,800,25.6751666666667
+33,801,30.7128333333333
+33,802,38.227
+33,803,33.3375
+33,804,29.8238333333333
+33,805,32.7025
+33,806,27.7706666666667
+33,807,26.1408333333333
+33,808,24.0876666666667
+33,809,31.8135
+33,810,37.4226666666667
+33,811,34.2053333333333
+33,812,31.9616666666667
+33,813,26.6065
+33,814,36.576
+33,815,24.7015
+33,816,30.48
+33,817,31.75
+33,818,32.1521666666667
+33,819,30.5858333333333
+33,820,34.0783333333333
+33,821,25.7386666666667
+33,822,30.2895
+33,823,33.8031666666667
+33,824,33.4221666666667
+33,825,35.2425
+33,826,33.528
+33,827,32.5755
+33,828,26.2466666666667
+33,829,38.8831666666667
+33,830,31.1785
+33,831,36.195
+33,832,31.75
+33,833,28.6385
+33,834,36.1103333333333
+33,835,34.8403333333333
+33,836,36.5971666666667
+33,837,30.8821666666667
+33,838,30.3106666666667
+33,839,33.1681666666667
+33,840,27.686
+33,841,29.5063333333333
+33,842,23.0928333333333
+33,843,28.4268333333333
+33,844,31.8135
+33,845,23.8971666666667
+33,846,25.3576666666667
+33,847,28.956
+33,848,26.8816666666667
+33,849,35.7716666666667
+33,850,25.6116666666667
+33,851,28.2151666666667
+33,852,28.6596666666667
+33,853,29.8026666666667
+33,854,36.1103333333333
+33,855,28.9983333333333
+33,856,28.1728333333333
+33,857,32.6813333333333
+33,858,31.7076666666667
+33,859,27.6648333333333
+33,860,36.4913333333333
+33,861,25.5693333333333
+33,862,22.7541666666667
+33,863,29.6968333333333
+33,864,36.2585
+33,865,30.8186666666667
+33,866,36.2796666666667
+33,867,29.2311666666667
+33,868,33.2528333333333
+33,869,28.2786666666667
+33,870,31.7288333333333
+33,871,33.8666666666667
+33,872,33.02
+33,873,25.8021666666667
+33,874,31.8135
+33,875,23.8548333333333
+33,876,30.1413333333333
+33,877,30.099
+33,878,25.6328333333333
+33,879,39.3065
+33,880,30.353
+33,881,26.1196666666667
+33,882,38.4386666666667
+33,883,27.9823333333333
+33,884,34.1841666666667
+33,885,36.6606666666667
+33,886,26.4583333333333
+33,887,27.4743333333333
+33,888,29.6968333333333
+33,889,34.7133333333333
+33,890,28.194
+33,891,30.5646666666667
+33,892,33.8243333333333
+33,893,29.5275
+33,894,30.353
+33,895,31.115
+33,896,31.496
+33,897,31.115
+33,898,36.5548333333333
+33,899,28.7866666666667
+33,900,31.9193333333333
+33,901,31.3266666666667
+33,902,41.2538333333333
+33,903,25.019
+33,904,40.9786666666667
+33,905,30.4165
+33,906,34.29
+33,907,25.2095
+33,908,27.8341666666667
+33,909,34.036
+33,910,26.797
+33,911,34.9885
+33,912,30.0566666666667
+33,913,33.7185
+33,914,33.655
+33,915,31.4748333333333
+33,916,25.4423333333333
+33,917,32.3638333333333
+33,918,28.9136666666667
+33,919,25.4846666666667
+33,920,31.0515
+33,921,34.2476666666667
+33,922,29.5486666666667
+33,923,32.5755
+33,924,40.5553333333333
+33,925,31.1996666666667
+33,926,33.2528333333333
+33,927,31.4748333333333
+33,928,34.8191666666667
+33,929,26.8816666666667
+33,930,36.576
+33,931,34.1206666666667
+33,932,28.321
+33,933,27.686
+33,934,31.1361666666667
+33,935,32.3638333333333
+33,936,39.7086666666667
+33,937,37.719
+33,938,35.2001666666667
+33,939,30.226
+33,940,29.6545
+33,941,29.2311666666667
+33,942,33.401
+33,943,37.0416666666667
+33,944,28.2998333333333
+33,945,32.8506666666667
+33,946,33.274
+33,947,26.6911666666667
+33,948,29.5698333333333
+33,949,37.0628333333333
+33,950,33.4433333333333
+33,951,29.8026666666667
+33,952,32.8506666666667
+33,953,30.5858333333333
+33,954,32.4485
+33,955,26.0985
+33,956,26.4583333333333
+33,957,27.7071666666667
+33,958,30.3741666666667
+33,959,24.1723333333333
+33,960,28.829
+33,961,29.6756666666667
+33,962,40.767
+33,963,27.0933333333333
+33,964,22.9023333333333
+33,965,34.8191666666667
+33,966,35.8775
+33,967,29.6333333333333
+33,968,33.655
+33,969,29.8873333333333
+33,970,30.7128333333333
+33,971,29.4216666666667
+33,972,31.0938333333333
+33,973,29.3793333333333
+33,974,26.3948333333333
+33,975,29.8873333333333
+33,976,35.179
+33,977,34.8826666666667
+33,978,36.1103333333333
+33,979,39.0736666666667
+33,980,29.3581666666667
+33,981,31.7076666666667
+33,982,28.6596666666667
+33,983,30.5011666666667
+33,984,29.8026666666667
+33,985,30.0566666666667
+33,986,25.8656666666667
+33,987,35.1155
+33,988,32.4273333333333
+33,989,26.1408333333333
+33,990,29.1676666666667
+33,991,26.8181666666667
+33,992,34.2265
+33,993,33.9936666666667
+33,994,26.7758333333333
+33,995,26.4583333333333
+33,996,32.6601666666667
+33,997,23.7278333333333
+33,998,35.7928333333333
+33,999,33.5491666666667
+33,1000,27.7495
+34,1,22.3181333333333
+34,2,25.8233333333333
+34,3,25.9334
+34,4,22.5213333333333
+34,5,19.4564
+34,6,26.1069666666667
+34,7,21.5138
+34,8,28.1305
+34,9,24.4051666666667
+34,10,28.5411333333333
+34,11,21.4291333333333
+34,12,23.7786333333333
+34,13,25.1079
+34,14,20.1506666666667
+34,15,22.5636666666667
+34,16,21.6111666666667
+34,17,23.1013
+34,18,25.4677333333333
+34,19,24.5194666666667
+34,20,20.0956333333333
+34,21,30.4630666666667
+34,22,25.2941666666667
+34,23,24.9597333333333
+34,24,20.3496333333333
+34,25,24.9766666666667
+34,26,20.2395666666667
+34,27,23.6939666666667
+34,28,29.3624
+34,29,23.3468333333333
+34,30,20.5147333333333
+34,31,28.2236333333333
+34,32,25.2137333333333
+34,33,26.2932333333333
+34,34,26.3990666666667
+34,35,26.9028333333333
+34,36,23.3045
+34,37,30.8017333333333
+34,38,20.4089
+34,39,26.3355666666667
+34,40,19.1177333333333
+34,41,25.5947333333333
+34,42,21.5519
+34,43,28.1601333333333
+34,44,26.7123333333333
+34,45,28.4099
+34,46,23.6135333333333
+34,47,23.2833333333333
+34,48,24.7904
+34,49,23.4103333333333
+34,50,26.8097
+34,51,30.4419
+34,52,23.4018666666667
+34,53,27.3515666666667
+34,54,21.0227333333333
+34,55,25.2476
+34,56,26.0858
+34,57,25.9926666666667
+34,58,22.7160666666667
+34,59,20.6375
+34,60,27.6013333333333
+34,61,28.4310666666667
+34,62,34.0402333333333
+34,63,23.4823
+34,64,24.5787333333333
+34,65,31.2885666666667
+34,66,25.8699
+34,67,25.3153333333333
+34,68,34.1714666666667
+34,69,32.0463333333333
+34,70,26.2974666666667
+34,71,21.336
+34,72,27.4955
+34,73,24.5364
+34,74,23.9649
+34,75,32.5628
+34,76,22.1234
+34,77,31.0769
+34,78,19.6638333333333
+34,79,19.0923333333333
+34,80,21.6323333333333
+34,81,21.4757
+34,82,30.3741666666667
+34,83,25.2772333333333
+34,84,24.9343333333333
+34,85,25.1290666666667
+34,86,26.7800666666667
+34,87,24.8708333333333
+34,88,28.1220333333333
+34,89,17.6741666666667
+34,90,28.0712333333333
+34,91,26.3355666666667
+34,92,26.5006666666667
+34,93,27.6055666666667
+34,94,29.2565666666667
+34,95,24.2781666666667
+34,96,29.6418
+34,97,24.9216333333333
+34,98,26.7208
+34,99,25.4423333333333
+34,100,28.9390666666667
+34,101,25.7556
+34,102,28.0924
+34,103,22.4620666666667
+34,104,29.5402
+34,105,25.8445
+34,106,34.1503
+34,107,26.162
+34,108,19.9601666666667
+34,109,27.9865666666667
+34,110,27.0764
+34,111,23.2791
+34,112,22.1869
+34,113,21.5053333333333
+34,114,20.9846333333333
+34,115,20.6375
+34,116,25.7894666666667
+34,117,27.0002
+34,118,25.146
+34,119,26.3355666666667
+34,120,19.3082333333333
+34,121,25.1798666666667
+34,122,21.2301666666667
+34,123,22.1869
+34,124,21.1031666666667
+34,125,25.9757333333333
+34,126,22.6525666666667
+34,127,26.0392333333333
+34,128,27.8638
+34,129,20.2565
+34,130,31.2674
+34,131,24.5575666666667
+34,132,25.6159
+34,133,25.2391333333333
+34,134,23.0293333333333
+34,135,20.4046666666667
+34,136,28.5580666666667
+34,137,23.9014
+34,138,20.4935666666667
+34,139,22.2292333333333
+34,140,20.7264
+34,141,28.2829
+34,142,26.6573
+34,143,29.6629666666667
+34,144,20.1337333333333
+34,145,21.9583
+34,146,27.4828
+34,147,25.3873
+34,148,22.0768333333333
+34,149,28.6173333333333
+34,150,20.7856666666667
+34,151,30.1879
+34,152,25.7640666666667
+34,153,31.0388
+34,154,29.4851666666667
+34,155,26.8605
+34,156,30.353
+34,157,24.8158
+34,158,26.0773333333333
+34,159,27.3515666666667
+34,160,23.9860666666667
+34,161,28.9602333333333
+34,162,29.1338
+34,163,24.4305666666667
+34,164,27.5166666666667
+34,165,21.2428666666667
+34,166,31.8346666666667
+34,167,26.1450666666667
+34,168,29.6164
+34,169,26.5514666666667
+34,170,24.5533333333333
+34,171,33.4052333333333
+34,172,29.5698333333333
+34,173,24.1130666666667
+34,174,25.0698
+34,175,20.2607333333333
+34,176,28.1305
+34,177,24.511
+34,178,23.5881333333333
+34,179,27.3515666666667
+34,180,18.2668333333333
+34,181,26.7377333333333
+34,182,29.9296666666667
+34,183,26.2551333333333
+34,184,30.6578
+34,185,27.1864666666667
+34,186,29.1041666666667
+34,187,24.1003666666667
+34,188,21.6365666666667
+34,189,27.2288
+34,190,23.8125
+34,191,24.8962333333333
+34,192,20.7052333333333
+34,193,20.3454
+34,194,25.4762
+34,195,23.3045
+34,196,24.6210666666667
+34,197,25.7005666666667
+34,198,19.6215
+34,199,27.2330333333333
+34,200,25.1925666666667
+34,201,21.9329
+34,202,22.7795666666667
+34,203,22.1445666666667
+34,204,21.5688333333333
+34,205,20.1337333333333
+34,206,28.8078333333333
+34,207,28.8120666666667
+34,208,25.2137333333333
+34,209,25.4084666666667
+34,210,24.5787333333333
+34,211,24.4940666666667
+34,212,25.1502333333333
+34,213,22.2334666666667
+34,214,23.0759
+34,215,27.2245666666667
+34,216,27.1610666666667
+34,217,27.2415
+34,218,24.0453333333333
+34,219,22.5298
+34,220,23.7998
+34,221,22.8642333333333
+34,222,19.0754
+34,223,27.8214666666667
+34,224,22.606
+34,225,24.8285
+34,226,24.638
+34,227,23.5796666666667
+34,228,24.3247333333333
+34,229,22.1657333333333
+34,230,28.0246666666667
+34,231,26.4456333333333
+34,232,33.5915
+34,233,30.5519666666667
+34,234,26.9028333333333
+34,235,23.5204
+34,236,24.7438333333333
+34,237,34.8445666666667
+34,238,27.5378333333333
+34,239,26.1747
+34,240,25.2306666666667
+34,241,20.4681666666667
+34,242,22.1911333333333
+34,243,24.1215333333333
+34,244,24.7057333333333
+34,245,26.5006666666667
+34,246,24.5999
+34,247,24.8539
+34,248,25.3449666666667
+34,249,36.5548333333333
+34,250,27.3685
+34,251,25.2984
+34,252,26.3736666666667
+34,253,24.7226666666667
+34,254,23.495
+34,255,25.273
+34,256,24.7565333333333
+34,257,22.7541666666667
+34,258,21.2174666666667
+34,259,26.9451666666667
+34,260,20.5316666666667
+34,261,24.3459
+34,262,27.051
+34,263,25.9842
+34,264,24.0072333333333
+34,265,25.0401666666667
+34,266,21.0015666666667
+34,267,30.5392666666667
+34,268,26.6573
+34,269,21.1074
+34,270,27.8595666666667
+34,271,28.1347333333333
+34,272,24.7311333333333
+34,273,23.9860666666667
+34,274,26.2255
+34,275,21.5265
+34,276,17.5895
+34,277,23.3934
+34,278,27.3896666666667
+34,279,21.082
+34,280,21.8482333333333
+34,281,22.0175666666667
+34,282,27.7325666666667
+34,283,29.4089666666667
+34,284,27.5293666666667
+34,285,28.9221333333333
+34,286,28.8713333333333
+34,287,25.8064
+34,288,26.8181666666667
+34,289,23.3087333333333
+34,290,22.0175666666667
+34,291,27.8172333333333
+34,292,21.1793666666667
+34,293,20.2819
+34,294,22.098
+34,295,24.9174
+34,296,21.9117333333333
+34,297,21.5095666666667
+34,298,24.3078
+34,299,18.0975
+34,300,22.4028
+34,301,24.2231333333333
+34,302,23.5585
+34,303,23.6262333333333
+34,304,25.5735666666667
+34,305,23.1055333333333
+34,306,22.3181333333333
+34,307,25.6794
+34,308,25.6413
+34,309,28.3464
+34,310,28.0035
+34,311,25.1714
+34,312,21.5095666666667
+34,313,29.6333333333333
+34,314,31.4409666666667
+34,315,23.4526666666667
+34,316,30.2006
+34,317,24.1130666666667
+34,318,24.8115666666667
+34,319,25.9545666666667
+34,320,24.3247333333333
+34,321,21.3444666666667
+34,322,23.1563333333333
+34,323,28.2278666666667
+34,324,19.6638333333333
+34,325,28.8247666666667
+34,326,30.0651333333333
+34,327,21.082
+34,328,24.003
+34,329,21.7254666666667
+34,330,21.59
+34,331,19.8628
+34,332,22.9700666666667
+34,333,20.1337333333333
+34,334,24.1342333333333
+34,335,25.6624666666667
+34,336,28.9983333333333
+34,337,29.5740666666667
+34,338,23.0293333333333
+34,339,32.8549
+34,340,27.9569333333333
+34,341,27.0933333333333
+34,342,26.9663333333333
+34,343,19.4056
+34,344,26.4668
+34,345,27.5801666666667
+34,346,28.7697333333333
+34,347,23.8379
+34,348,27.1060333333333
+34,349,29.2692666666667
+34,350,23.1859666666667
+34,351,31.6738
+34,352,19.2828333333333
+34,353,25.5693333333333
+34,354,22.987
+34,355,30.1201666666667
+34,356,17.6614666666667
+34,357,25.8021666666667
+34,358,24.892
+34,359,22.5467333333333
+34,360,25.8445
+34,361,20.4089
+34,362,24.6464666666667
+34,363,28.1135666666667
+34,364,23.9437333333333
+34,365,22.5001666666667
+34,366,23.6474
+34,367,24.8581333333333
+34,368,27.8807333333333
+34,369,25.9503333333333
+34,370,27.4785666666667
+34,371,29.0872333333333
+34,372,27.6055666666667
+34,373,24.257
+34,374,24.0241666666667
+34,375,27.8087666666667
+34,376,25.0655666666667
+34,377,28.2575
+34,378,21.4037333333333
+34,379,25.7259666666667
+34,380,27.8595666666667
+34,381,27.8595666666667
+34,382,28.0881666666667
+34,383,26.4625666666667
+34,384,28.0289
+34,385,17.8223333333333
+34,386,24.5533333333333
+34,387,25.146
+34,388,20.9973333333333
+34,389,22.1911333333333
+34,390,24.5025333333333
+34,391,19.4183
+34,392,25.1502333333333
+34,393,25.1883333333333
+34,394,30.0185666666667
+34,395,22.3012
+34,396,22.4155
+34,397,27.305
+34,398,28.6004
+34,399,25.9376333333333
+34,400,27.0467666666667
+34,401,24.3289666666667
+34,402,25.9715
+34,403,25.6624666666667
+34,404,22.7584
+34,405,22.8473
+34,406,20.3877333333333
+34,407,31.1023
+34,408,27.0298333333333
+34,409,28.3040666666667
+34,410,26.3652
+34,411,30.1498
+34,412,26.3567333333333
+34,413,26.1493
+34,414,25.019
+34,415,23.1394
+34,416,29.3454666666667
+34,417,26.5218333333333
+34,418,28.4310666666667
+34,419,19.2193333333333
+34,420,20.8745666666667
+34,421,29.9085
+34,422,31.0134
+34,423,28.194
+34,424,23.8633
+34,425,26.8816666666667
+34,426,24.5702666666667
+34,427,27.0552333333333
+34,428,21.7000666666667
+34,429,22.3096666666667
+34,430,29.9974
+34,431,27.9273
+34,432,25.6624666666667
+34,433,22.0556666666667
+34,434,23.8167333333333
+34,435,25.2645333333333
+34,436,31.5425666666667
+34,437,23.2198333333333
+34,438,22.5679
+34,439,24.6422333333333
+34,440,25.4042333333333
+34,441,26.5895666666667
+34,442,28.1347333333333
+34,443,27.6225
+34,444,26.0223
+34,445,28.194
+34,446,29.8026666666667
+34,447,24.8115666666667
+34,448,22.8854
+34,449,21.844
+34,450,26.1450666666667
+34,451,23.5034666666667
+34,452,26.2297333333333
+34,453,25.4296333333333
+34,454,25.8233333333333
+34,455,30.2471666666667
+34,456,26.1874
+34,457,23.5161666666667
+34,458,22.0556666666667
+34,459,28.7909
+34,460,31.7161333333333
+34,461,23.114
+34,462,22.4409
+34,463,27.2499666666667
+34,464,29.2396333333333
+34,465,24.2908666666667
+34,466,28.0500666666667
+34,467,27.6055666666667
+34,468,29.5952333333333
+34,469,19.3082333333333
+34,470,26.0900333333333
+34,471,25.8233333333333
+34,472,26.8689666666667
+34,473,27.7918333333333
+34,474,30.1244
+34,475,23.0293333333333
+34,476,31.8389
+34,477,19.6934666666667
+34,478,24.9851333333333
+34,479,23.8548333333333
+34,480,24.6718666666667
+34,481,21.2767333333333
+34,482,23.2960333333333
+34,483,21.1497333333333
+34,484,26.2297333333333
+34,485,21.6958333333333
+34,486,26.1874
+34,487,22.5255666666667
+34,488,30.6112333333333
+34,489,22.5679
+34,490,26.3567333333333
+34,491,29.972
+34,492,21.7424
+34,493,27.8172333333333
+34,494,21.5095666666667
+34,495,29.9931666666667
+34,496,23.2452333333333
+34,497,25.8106333333333
+34,498,22.86
+34,499,21.9286666666667
+34,500,26.3144
+34,501,34.4381666666667
+34,502,26.2255
+34,503,29.3200666666667
+34,504,29.2608
+34,505,21.3783333333333
+34,506,26.8435666666667
+34,507,28.0500666666667
+34,508,28.8925
+34,509,29.1338
+34,510,22.8007333333333
+34,511,24.9639666666667
+34,512,21.2344
+34,513,29.464
+34,514,21.7381666666667
+34,515,23.9860666666667
+34,516,20.5105
+34,517,23.7320666666667
+34,518,22.3054333333333
+34,519,33.4264
+34,520,31.6441666666667
+34,521,24.9597333333333
+34,522,24.6507
+34,523,27.8341666666667
+34,524,25.0486333333333
+34,525,21.5688333333333
+34,526,31.1912
+34,527,28.8713333333333
+34,528,30.734
+34,529,24.9555
+34,530,27.2203333333333
+34,531,24.0749666666667
+34,532,29.6841333333333
+34,533,22.9446666666667
+34,534,25.0655666666667
+34,535,21.7212333333333
+34,536,25.7386666666667
+34,537,23.6093
+34,538,25.7471333333333
+34,539,26.3101666666667
+34,540,24.1130666666667
+34,541,28.0500666666667
+34,542,29.2735
+34,543,23.5204
+34,544,27.1991666666667
+34,545,27.1568333333333
+34,546,27.4955
+34,547,25.7429
+34,548,21.0481333333333
+34,549,27.2669
+34,550,30.4038
+34,551,23.0335666666667
+34,552,22.4451333333333
+34,553,28.5326666666667
+34,554,26.7546666666667
+34,555,21.463
+34,556,26.1874
+34,557,18.2964666666667
+34,558,25.8487333333333
+34,559,27.9315333333333
+34,560,20.2184
+34,561,25.1925666666667
+34,562,29.7222333333333
+34,563,30.6959
+34,564,32.4781333333333
+34,565,26.5684
+34,566,25.8487333333333
+34,567,26.5218333333333
+34,568,24.1342333333333
+34,569,27.9611666666667
+34,570,28.3083
+34,571,26.8605
+34,572,28.4522333333333
+34,573,25.9334
+34,574,32.3257333333333
+34,575,22.8388333333333
+34,576,26.67
+34,577,19.7739
+34,578,20.8915
+34,579,20.5528333333333
+34,580,22.4663
+34,581,19.5664666666667
+34,582,21.2725
+34,583,25.8021666666667
+34,584,26.2466666666667
+34,585,30.2895
+34,586,25.7640666666667
+34,587,30.988
+34,588,28.4734
+34,589,27.6436666666667
+34,590,18.6732333333333
+34,591,28.7231666666667
+34,592,23.4780666666667
+34,593,21.844
+34,594,26.5049
+34,595,22.0175666666667
+34,596,27.5039666666667
+34,597,27.5166666666667
+34,598,27.0975666666667
+34,599,22.5298
+34,600,22.4832333333333
+34,601,27.3473333333333
+34,602,33.2824666666667
+34,603,26.3525
+34,604,24.1596333333333
+34,605,17.2550666666667
+34,606,26.1662333333333
+34,607,26.3101666666667
+34,608,28.5115
+34,609,23.4780666666667
+34,610,28.5157333333333
+34,611,22.7965
+34,612,24.5618
+34,613,28.0246666666667
+34,614,25.4042333333333
+34,615,22.1022333333333
+34,616,24.4263333333333
+34,617,34.3111666666667
+34,618,26.3779
+34,619,23.4145666666667
+34,620,24.6168333333333
+34,621,24.13
+34,622,26.0223
+34,623,30.5731333333333
+34,624,24.6253
+34,625,27.686
+34,626,27.8976666666667
+34,627,28.8925
+34,628,28.2151666666667
+34,629,30.9329666666667
+34,630,21.9286666666667
+34,631,21.0439
+34,632,29.1761333333333
+34,633,24.9597333333333
+34,634,23.7786333333333
+34,635,30.3784
+34,636,24.7226666666667
+34,637,24.4686666666667
+34,638,29.4428333333333
+34,639,27.432
+34,640,26.7546666666667
+34,641,20.7518
+34,642,20.4935666666667
+34,643,29.718
+34,644,22.8430666666667
+34,645,27.7706666666667
+34,646,29.4936333333333
+34,647,27.4616333333333
+34,648,28.702
+34,649,19.0288333333333
+34,650,21.2555666666667
+34,651,21.9921666666667
+34,652,30.4630666666667
+34,653,27.8553333333333
+34,654,25.8487333333333
+34,655,27.051
+34,656,27.5420666666667
+34,657,25.5905
+34,658,21.2386333333333
+34,659,23.0716666666667
+34,660,23.0928333333333
+34,661,28.6596666666667
+34,662,24.8708333333333
+34,663,27.1102666666667
+34,664,28.2194
+34,665,23.9437333333333
+34,666,27.1145
+34,667,29.5698333333333
+34,668,21.4418333333333
+34,669,27.6690666666667
+34,670,28.2871333333333
+34,671,24.3670666666667
+34,672,30.5562
+34,673,21.8651666666667
+34,674,24.7057333333333
+34,675,22.3774
+34,676,24.7904
+34,677,31.5298666666667
+34,678,24.8539
+34,679,25.5100666666667
+34,680,22.8642333333333
+34,681,23.6897333333333
+34,682,27.9865666666667
+34,683,30.2683333333333
+34,684,22.6525666666667
+34,685,24.7946333333333
+34,686,23.5712
+34,687,27.4997333333333
+34,688,26.2509
+34,689,32.5162333333333
+34,690,25.3365
+34,691,25.3873
+34,692,27.9865666666667
+34,693,27.5632333333333
+34,694,28.4988
+34,695,26.5345333333333
+34,696,27.0425333333333
+34,697,23.8971666666667
+34,698,31.4155666666667
+34,699,30.1455666666667
+34,700,19.9855666666667
+34,701,22.7584
+34,702,23.7913333333333
+34,703,23.622
+34,704,23.8125
+34,705,31.6060666666667
+34,706,21.8270666666667
+34,707,24.4983
+34,708,33.1131333333333
+34,709,31.5806666666667
+34,710,28.0246666666667
+34,711,24.3459
+34,712,25.2603
+34,713,26.6488333333333
+34,714,24.1554
+34,715,19.6426666666667
+34,716,31.6695666666667
+34,717,30.226
+34,718,22.0218
+34,719,25.9799666666667
+34,720,23.2240666666667
+34,721,24.7904
+34,722,23.1394
+34,723,19.6045666666667
+34,724,28.1982333333333
+34,725,25.7386666666667
+34,726,23.9903
+34,727,28.8501666666667
+34,728,33.7015666666667
+34,729,27.7579666666667
+34,730,28.4691666666667
+34,731,25.0232333333333
+34,732,29.7222333333333
+34,733,30.1032333333333
+34,734,28.6385
+34,735,27.2415
+34,736,27.9696333333333
+34,737,27.2542
+34,738,30.6916666666667
+34,739,29.3878
+34,740,24.8115666666667
+34,741,21.0227333333333
+34,742,25.4
+34,743,28.8713333333333
+34,744,27.8680333333333
+34,745,25.0867333333333
+34,746,23.5881333333333
+34,747,26.7462
+34,748,23.7278333333333
+34,749,24.9343333333333
+34,750,23.4103333333333
+34,751,25.4846666666667
+34,752,26.1831666666667
+34,753,23.9014
+34,754,23.3087333333333
+34,755,24.4094
+34,756,21.2936666666667
+34,757,25.0063
+34,758,26.1069666666667
+34,759,27.5928666666667
+34,760,32.2156666666667
+34,761,23.2621666666667
+34,762,27.2245666666667
+34,763,32.0505666666667
+34,764,22.2038333333333
+34,765,26.67
+34,766,26.7589
+34,767,21.7254666666667
+34,768,26.4837333333333
+34,769,26.2509
+34,770,25.1671666666667
+34,771,25.5524
+34,772,33.3629
+34,773,29.6206333333333
+34,774,30.9964666666667
+34,775,28.4310666666667
+34,776,28.067
+34,777,23.5585
+34,778,28.5961666666667
+34,779,27.8384
+34,780,28.448
+34,781,25.8868333333333
+34,782,27.5209
+34,783,24.4517333333333
+34,784,24.0241666666667
+34,785,24.9597333333333
+34,786,21.7424
+34,787,21.209
+34,788,20.7264
+34,789,27.7283333333333
+34,790,18.2922333333333
+34,791,24.9809
+34,792,23.7701666666667
+34,793,28.5115
+34,794,20.9042
+34,795,23.5669666666667
+34,796,24.2697
+34,797,29.6121666666667
+34,798,22.4155
+34,799,27.5209
+34,800,23.6770333333333
+34,801,19.4733333333333
+34,802,23.2664
+34,803,34.4043
+34,804,24.1427
+34,805,23.4357333333333
+34,806,24.7057333333333
+34,807,25.2095
+34,808,25.7683
+34,809,27.1822333333333
+34,810,33.4687333333333
+34,811,21.4249
+34,812,27.4531666666667
+34,813,25.5481666666667
+34,814,24.7015
+34,815,22.479
+34,816,20.7687333333333
+34,817,22.1869
+34,818,29.1084
+34,819,28.7443333333333
+34,820,29.7899666666667
+34,821,25.8868333333333
+34,822,30.2556333333333
+34,823,21.9540666666667
+34,824,29.4259
+34,825,24.6845666666667
+34,826,23.7109
+34,827,24.2781666666667
+34,828,27.9188333333333
+34,829,26.9917333333333
+34,830,26.797
+34,831,24.1977333333333
+34,832,28.0797
+34,833,23.1605666666667
+34,834,20.9761666666667
+34,835,22.9912333333333
+34,836,28.2363333333333
+34,837,26.7377333333333
+34,838,18.8679666666667
+34,839,28.4056666666667
+34,840,28.6469666666667
+34,841,30.4630666666667
+34,842,26.4541
+34,843,26.2509
+34,844,22.6271666666667
+34,845,21.9540666666667
+34,846,23.3553
+34,847,25.1671666666667
+34,848,28.8501666666667
+34,849,25.9122333333333
+34,850,29.6206333333333
+34,851,23.2494666666667
+34,852,20.0236666666667
+34,853,25.7852333333333
+34,854,27.6648333333333
+34,855,23.9014
+34,856,23.0505
+34,857,25.3619
+34,858,23.7701666666667
+34,859,23.9860666666667
+34,860,31.3309
+34,861,21.844
+34,862,19.9474666666667
+34,863,27.3515666666667
+34,864,23.8336666666667
+34,865,25.7217333333333
+34,866,28.1559
+34,867,30.1413333333333
+34,868,24.9004666666667
+34,869,29.3708666666667
+34,870,21.7466333333333
+34,871,23.9479666666667
+34,872,24.257
+34,873,27.4404666666667
+34,874,32.8549
+34,875,27.0552333333333
+34,876,25.4677333333333
+34,877,25.0698
+34,878,34.0571666666667
+34,879,26.9875
+34,880,23.1986666666667
+34,881,22.3435333333333
+34,882,23.7109
+34,883,24.9978333333333
+34,884,28.9136666666667
+34,885,23.4315
+34,886,24.7988666666667
+34,887,28.8925
+34,888,16.4253333333333
+34,889,28.1135666666667
+34,890,24.2612333333333
+34,891,23.0124
+34,892,25.2137333333333
+34,893,23.4780666666667
+34,894,26.5895666666667
+34,895,29.1973
+34,896,25.4846666666667
+34,897,19.7315666666667
+34,898,26.3398
+34,899,26.5853333333333
+34,900,26.4583333333333
+34,901,30.1625
+34,902,25.2518333333333
+34,903,28.4691666666667
+34,904,20.1083333333333
+34,905,29.1930666666667
+34,906,28.5369
+34,907,24.7480666666667
+34,908,25.7513666666667
+34,909,22.4197333333333
+34,910,23.4992333333333
+34,911,27.5801666666667
+34,912,27.7918333333333
+34,913,23.2029
+34,914,25.7259666666667
+34,915,24.7015
+34,916,24.4094
+34,917,23.0124
+34,918,32.1987333333333
+34,919,29.2946666666667
+34,920,23.4103333333333
+34,921,25.1036666666667
+34,922,25.1290666666667
+34,923,24.6803333333333
+34,924,29.6968333333333
+34,925,26.2932333333333
+34,926,27.5844
+34,927,25.8021666666667
+34,928,28.8078333333333
+34,929,24.2908666666667
+34,930,24.1511666666667
+34,931,26.7885333333333
+34,932,26.6530666666667
+34,933,26.6911666666667
+34,934,25.146
+34,935,24.4051666666667
+34,936,33.0835
+34,937,22.7541666666667
+34,938,24.4517333333333
+34,939,24.5321666666667
+34,940,25.2560666666667
+34,941,24.8200333333333
+34,942,19.9813333333333
+34,943,21.8482333333333
+34,944,26.289
+34,945,24.3501333333333
+34,946,26.2128
+34,947,27.4997333333333
+34,948,19.5199
+34,949,23.0124
+34,950,35.0350666666667
+34,951,26.2255
+34,952,26.7885333333333
+34,953,28.1347333333333
+34,954,21.336
+34,955,24.0749666666667
+34,956,23.3129666666667
+34,957,21.3190666666667
+34,958,28.3337
+34,959,18.8764333333333
+34,960,31.3139666666667
+34,961,20.1506666666667
+34,962,22.6314
+34,963,29.8280666666667
+34,964,32.2283666666667
+34,965,22.9319666666667
+34,966,27.813
+34,967,23.3087333333333
+34,968,18.7917666666667
+34,969,23.4611333333333
+34,970,25.9334
+34,971,25.1248333333333
+34,972,26.8647333333333
+34,973,29.8873333333333
+34,974,25.1290666666667
+34,975,20.5401333333333
+34,976,27.1907
+34,977,25.0020666666667
+34,978,21.082
+34,979,23.8971666666667
+34,980,22.3985666666667
+34,981,27.3515666666667
+34,982,22.6906666666667
+34,983,26.0985
+34,984,23.0547333333333
+34,985,26.5938
+34,986,24.7861666666667
+34,987,28.5538333333333
+34,988,25.527
+34,989,26.8689666666667
+34,990,26.0815666666667
+34,991,23.5585
+34,992,24.5533333333333
+34,993,25.1248333333333
+34,994,24.4263333333333
+34,995,29.6587333333333
+34,996,20.6036333333333
+34,997,29.5740666666667
+34,998,28.956
+34,999,30.1836666666667
+34,1000,22.8430666666667
+35,1,32.4908333333333
+35,2,31.1785
+35,3,27.1568333333333
+35,4,36.7665
+35,5,35.0943333333333
+35,6,34.0148333333333
+35,7,32.0463333333333
+35,8,31.6441666666667
+35,9,33.8666666666667
+35,10,25.9503333333333
+35,11,33.9725
+35,12,27.5801666666667
+35,13,35.052
+35,14,30.3953333333333
+35,15,31.1361666666667
+35,16,30.861
+35,17,31.1361666666667
+35,18,24.9766666666667
+35,19,29.4005
+35,20,35.306
+35,21,33.4856666666667
+35,22,27.7283333333333
+35,23,30.861
+35,24,27.1145
+35,25,27.0933333333333
+35,26,28.0458333333333
+35,27,29.8873333333333
+35,28,28.2363333333333
+35,29,24.257
+35,30,29.1253333333333
+35,31,31.7076666666667
+35,32,31.4325
+35,33,35.0096666666667
+35,34,31.4748333333333
+35,35,32.3426666666667
+35,36,30.607
+35,37,38.2693333333333
+35,38,41.9946666666667
+35,39,31.4536666666667
+35,40,31.4536666666667
+35,41,27.0298333333333
+35,42,34.9885
+35,43,28.0458333333333
+35,44,31.1361666666667
+35,45,30.7763333333333
+35,46,28.5538333333333
+35,47,27.8765
+35,48,38.0576666666667
+35,49,37.2321666666667
+35,50,33.9513333333333
+35,51,30.6493333333333
+35,52,27.6436666666667
+35,53,26.3313333333333
+35,54,26.7546666666667
+35,55,25.8868333333333
+35,56,29.2523333333333
+35,57,31.0091666666667
+35,58,32.1733333333333
+35,59,34.4381666666667
+35,60,36.5548333333333
+35,61,32.8718333333333
+35,62,29.3793333333333
+35,63,25.1036666666667
+35,64,34.036
+35,65,31.75
+35,66,32.7025
+35,67,30.9668333333333
+35,68,32.0886666666667
+35,69,27.6436666666667
+35,70,35.2001666666667
+35,71,35.179
+35,72,38.7561666666667
+35,73,31.1785
+35,74,43.6456666666667
+35,75,31.0091666666667
+35,76,37.6978333333333
+35,77,30.5646666666667
+35,78,27.7071666666667
+35,79,40.3648333333333
+35,80,26.2678333333333
+35,81,37.5073333333333
+35,82,30.7975
+35,83,28.1516666666667
+35,84,35.9198333333333
+35,85,32.5331666666667
+35,86,31.0515
+35,87,34.5228333333333
+35,88,26.7758333333333
+35,89,35.4118333333333
+35,90,28.7866666666667
+35,91,29.9296666666667
+35,92,35.1366666666667
+35,93,27.0298333333333
+35,94,30.4165
+35,95,27.2415
+35,96,26.1408333333333
+35,97,36.3431666666667
+35,98,29.337
+35,99,27.5378333333333
+35,100,34.1841666666667
+35,101,36.7876666666667
+35,102,32.0675
+35,103,23.241
+35,104,32.6601666666667
+35,105,31.0303333333333
+35,106,28.7231666666667
+35,107,27.7706666666667
+35,108,28.5115
+35,109,34.2688333333333
+35,110,27.1568333333333
+35,111,20.2776666666667
+35,112,40.4495
+35,113,31.9405
+35,114,30.3741666666667
+35,115,31.2208333333333
+35,116,32.8718333333333
+35,117,42.1851666666667
+35,118,37.1263333333333
+35,119,30.6916666666667
+35,120,37.338
+35,121,27.6013333333333
+35,122,39.751
+35,123,31.9405
+35,124,22.2673333333333
+35,125,23.2198333333333
+35,126,27.4108333333333
+35,127,26.3736666666667
+35,128,39.0736666666667
+35,129,40.0473333333333
+35,130,42.037
+35,131,38.1211666666667
+35,132,28.6385
+35,133,38.9678333333333
+35,134,30.6493333333333
+35,135,26.5218333333333
+35,136,25.9926666666667
+35,137,32.1521666666667
+35,138,40.4706666666667
+35,139,35.56
+35,140,28.829
+35,141,31.1785
+35,142,30.8821666666667
+35,143,31.0091666666667
+35,144,28.2998333333333
+35,145,33.3163333333333
+35,146,31.8135
+35,147,30.3953333333333
+35,148,27.813
+35,149,35.8775
+35,150,35.8351666666667
+35,151,35.2001666666667
+35,152,37.9518333333333
+35,153,32.4273333333333
+35,154,33.3375
+35,155,35.8986666666667
+35,156,29.6333333333333
+35,157,35.7716666666667
+35,158,24.3205
+35,159,32.5755
+35,160,38.354
+35,161,34.5016666666667
+35,162,37.1898333333333
+35,163,29.1253333333333
+35,164,25.781
+35,165,27.4955
+35,166,32.9776666666667
+35,167,28.2363333333333
+35,168,28.1516666666667
+35,169,24.8708333333333
+35,170,34.4381666666667
+35,171,28.2998333333333
+35,172,36.3431666666667
+35,173,32.8718333333333
+35,174,33.7396666666667
+35,175,32.4273333333333
+35,176,29.1888333333333
+35,177,29.4005
+35,178,26.2466666666667
+35,179,35.814
+35,180,36.0468333333333
+35,181,28.2998333333333
+35,182,27.8341666666667
+35,183,38.2481666666667
+35,184,35.1578333333333
+35,185,28.6385
+35,186,35.4753333333333
+35,187,29.4216666666667
+35,188,30.9668333333333
+35,189,31.1996666666667
+35,190,31.4325
+35,191,33.8878333333333
+35,192,38.2905
+35,193,32.0463333333333
+35,194,37.7825
+35,195,31.3901666666667
+35,196,35.7716666666667
+35,197,35.7081666666667
+35,198,26.9875
+35,199,35.6658333333333
+35,200,35.4118333333333
+35,201,32.639
+35,202,31.496
+35,203,30.7128333333333
+35,204,29.9085
+35,205,32.5543333333333
+35,206,33.9725
+35,207,28.702
+35,208,33.8878333333333
+35,209,24.9555
+35,210,28.5961666666667
+35,211,31.8981666666667
+35,212,40.767
+35,213,34.1418333333333
+35,214,26.2255
+35,215,36.2796666666667
+35,216,34.798
+35,217,27.1991666666667
+35,218,30.0355
+35,219,28.6173333333333
+35,220,27.4955
+35,221,43.2011666666667
+35,222,30.1836666666667
+35,223,30.353
+35,224,25.2518333333333
+35,225,32.2368333333333
+35,226,37.4015
+35,227,27.7283333333333
+35,228,28.9771666666667
+35,229,36.3008333333333
+35,230,39.3911666666667
+35,231,30.48
+35,232,28.3421666666667
+35,233,32.2156666666667
+35,234,29.3581666666667
+35,235,27.7918333333333
+35,236,38.9043333333333
+35,237,38.1635
+35,238,29.5698333333333
+35,239,33.4645
+35,240,37.5708333333333
+35,241,33.6761666666667
+35,242,34.6286666666667
+35,243,34.925
+35,244,28.956
+35,245,34.7768333333333
+35,246,29.1041666666667
+35,247,26.2466666666667
+35,248,35.4541666666667
+35,249,37.1475
+35,250,30.4165
+35,251,35.6023333333333
+35,252,36.6606666666667
+35,253,35.4753333333333
+35,254,33.147
+35,255,26.3101666666667
+35,256,30.1413333333333
+35,257,33.1893333333333
+35,258,25.0613333333333
+35,259,31.9828333333333
+35,260,30.5223333333333
+35,261,35.3906666666667
+35,262,29.3793333333333
+35,263,33.3375
+35,264,28.4903333333333
+35,265,32.1733333333333
+35,266,33.7396666666667
+35,267,32.4696666666667
+35,268,33.02
+35,269,30.3106666666667
+35,270,31.0091666666667
+35,271,34.3746666666667
+35,272,30.0355
+35,273,36.7665
+35,274,30.4165
+35,275,29.4851666666667
+35,276,33.02
+35,277,26.7758333333333
+35,278,35.4753333333333
+35,279,30.734
+35,280,29.6756666666667
+35,281,32.4696666666667
+35,282,36.703
+35,283,32.4696666666667
+35,284,29.2946666666667
+35,285,35.0096666666667
+35,286,31.4325
+35,287,25.7175
+35,288,26.543
+35,289,35.1578333333333
+35,290,36.5548333333333
+35,291,41.2538333333333
+35,292,25.8233333333333
+35,293,33.1681666666667
+35,294,30.4376666666667
+35,295,36.3431666666667
+35,296,32.5755
+35,297,38.9043333333333
+35,298,37.9941666666667
+35,299,28.2151666666667
+35,300,27.7283333333333
+35,301,32.385
+35,302,26.1408333333333
+35,303,27.2626666666667
+35,304,26.9451666666667
+35,305,31.9405
+35,306,33.9725
+35,307,36.3855
+35,308,35.7716666666667
+35,309,27.1145
+35,310,29.0618333333333
+35,311,39.243
+35,312,32.1733333333333
+35,313,28.575
+35,314,34.3323333333333
+35,315,32.0675
+35,316,24.5956666666667
+35,317,25.908
+35,318,31.75
+35,319,30.1201666666667
+35,320,32.131
+35,321,29.1676666666667
+35,322,34.8191666666667
+35,323,30.4588333333333
+35,324,37.8671666666667
+35,325,29.4216666666667
+35,326,31.4748333333333
+35,327,34.2476666666667
+35,328,30.4165
+35,329,36.5548333333333
+35,330,33.1258333333333
+35,331,26.6911666666667
+35,332,31.877
+35,333,35.687
+35,334,40.1955
+35,335,34.5863333333333
+35,336,28.9136666666667
+35,337,28.067
+35,338,30.48
+35,339,28.5326666666667
+35,340,30.6281666666667
+35,341,31.3478333333333
+35,342,30.1836666666667
+35,343,26.8181666666667
+35,344,35.2213333333333
+35,345,36.4278333333333
+35,346,27.0086666666667
+35,347,25.1248333333333
+35,348,30.0143333333333
+35,349,33.6761666666667
+35,350,27.8341666666667
+35,351,30.5646666666667
+35,352,34.4593333333333
+35,353,37.719
+35,354,34.925
+35,355,29.8661666666667
+35,356,32.7871666666667
+35,357,28.575
+35,358,34.6075
+35,359,33.5068333333333
+35,360,34.4805
+35,361,29.6756666666667
+35,362,34.4805
+35,363,29.5698333333333
+35,364,29.2735
+35,365,28.4268333333333
+35,366,36.7453333333333
+35,367,31.7711666666667
+35,368,33.6126666666667
+35,369,29.4216666666667
+35,370,31.0726666666667
+35,371,36.9358333333333
+35,372,33.7608333333333
+35,373,37.5285
+35,374,31.0091666666667
+35,375,31.8981666666667
+35,376,35.941
+35,377,35.5176666666667
+35,378,31.115
+35,379,30.5646666666667
+35,380,34.1418333333333
+35,381,34.417
+35,382,33.4433333333333
+35,383,31.4536666666667
+35,384,35.4753333333333
+35,385,33.2951666666667
+35,386,26.3313333333333
+35,387,34.2688333333333
+35,388,32.0675
+35,389,28.575
+35,390,36.3431666666667
+35,391,30.2895
+35,392,25.7386666666667
+35,393,32.4485
+35,394,35.56
+35,395,34.2265
+35,396,30.0355
+35,397,36.83
+35,398,28.8925
+35,399,28.6173333333333
+35,400,31.8558333333333
+35,401,27.5801666666667
+35,402,34.9673333333333
+35,403,38.735
+35,404,34.7768333333333
+35,405,33.6761666666667
+35,406,29.6121666666667
+35,407,35.4965
+35,408,37.084
+35,409,34.6498333333333
+35,410,33.909
+35,411,32.2156666666667
+35,412,36.8088333333333
+35,413,21.463
+35,414,38.0153333333333
+35,415,28.7866666666667
+35,416,27.9611666666667
+35,417,35.2848333333333
+35,418,41.2115
+35,419,31.7711666666667
+35,420,38.2481666666667
+35,421,29.2946666666667
+35,422,29.591
+35,423,36.1526666666667
+35,424,24.2358333333333
+35,425,29.083
+35,426,33.4856666666667
+35,427,29.9508333333333
+35,428,29.8238333333333
+35,429,31.8981666666667
+35,430,32.6813333333333
+35,431,41.8041666666667
+35,432,32.7236666666667
+35,433,30.7763333333333
+35,434,22.1615
+35,435,28.2363333333333
+35,436,36.9781666666667
+35,437,30.3741666666667
+35,438,26.6488333333333
+35,439,34.0995
+35,440,42.164
+35,441,35.1578333333333
+35,442,26.416
+35,443,27.559
+35,444,37.2956666666667
+35,445,28.1093333333333
+35,446,25.1671666666667
+35,447,30.607
+35,448,24.892
+35,449,32.7025
+35,450,29.5698333333333
+35,451,32.9141666666667
+35,452,32.0675
+35,453,31.3266666666667
+35,454,27.2626666666667
+35,455,29.5486666666667
+35,456,30.861
+35,457,27.5166666666667
+35,458,28.1305
+35,459,27.7071666666667
+35,460,29.3793333333333
+35,461,23.368
+35,462,36.6606666666667
+35,463,34.1206666666667
+35,464,31.3055
+35,465,25.6963333333333
+35,466,31.6441666666667
+35,467,40.6188333333333
+35,468,32.6813333333333
+35,469,32.258
+35,470,32.6178333333333
+35,471,29.21
+35,472,38.8408333333333
+35,473,35.56
+35,474,34.163
+35,475,38.735
+35,476,36.6395
+35,477,30.5011666666667
+35,478,31.369
+35,479,22.3943333333333
+35,480,28.6173333333333
+35,481,32.8295
+35,482,34.036
+35,483,26.8605
+35,484,33.2316666666667
+35,485,33.9936666666667
+35,486,34.3323333333333
+35,487,33.147
+35,488,27.6225
+35,489,30.7551666666667
+35,490,27.9823333333333
+35,491,34.9673333333333
+35,492,35.3483333333333
+35,493,35.306
+35,494,37.3168333333333
+35,495,27.6013333333333
+35,496,35.2636666666667
+35,497,22.1191666666667
+35,498,30.3106666666667
+35,499,28.2575
+35,500,27.2626666666667
+35,501,29.8026666666667
+35,502,28.6173333333333
+35,503,32.2791666666667
+35,504,31.1996666666667
+35,505,29.7603333333333
+35,506,37.6343333333333
+35,507,30.7128333333333
+35,508,23.4315
+35,509,30.6705
+35,510,22.9446666666667
+35,511,39.5605
+35,512,31.496
+35,513,28.0881666666667
+35,514,36.5125
+35,515,32.8718333333333
+35,516,30.1413333333333
+35,517,32.7025
+35,518,27.559
+35,519,34.0571666666667
+35,520,28.8501666666667
+35,521,28.7231666666667
+35,522,33.2528333333333
+35,523,32.8718333333333
+35,524,37.1686666666667
+35,525,33.1046666666667
+35,526,34.7768333333333
+35,527,30.6916666666667
+35,528,32.1733333333333
+35,529,30.3741666666667
+35,530,37.1898333333333
+35,531,33.4856666666667
+35,532,34.6498333333333
+35,533,34.9673333333333
+35,534,28.6173333333333
+35,535,33.2105
+35,536,41.5078333333333
+35,537,32.7448333333333
+35,538,29.1041666666667
+35,539,33.2316666666667
+35,540,26.289
+35,541,33.4856666666667
+35,542,40.64
+35,543,32.639
+35,544,35.7716666666667
+35,545,32.7448333333333
+35,546,31.4748333333333
+35,547,31.242
+35,548,30.3106666666667
+35,549,29.0618333333333
+35,550,30.9456666666667
+35,551,30.734
+35,552,35.0308333333333
+35,553,26.6911666666667
+35,554,39.0101666666667
+35,555,25.6116666666667
+35,556,29.5698333333333
+35,557,35.4118333333333
+35,558,30.7551666666667
+35,559,29.1888333333333
+35,560,33.0835
+35,561,33.2316666666667
+35,562,21.9921666666667
+35,563,30.5435
+35,564,26.0773333333333
+35,565,36.9781666666667
+35,566,30.3953333333333
+35,567,26.4583333333333
+35,568,36.6606666666667
+35,569,41.9311666666667
+35,570,35.1155
+35,571,34.6498333333333
+35,572,31.6865
+35,573,28.829
+35,574,29.9085
+35,575,27.6225
+35,576,27.9823333333333
+35,577,32.5755
+35,578,26.1408333333333
+35,579,37.5073333333333
+35,580,32.2791666666667
+35,581,28.956
+35,582,30.5435
+35,583,26.4795
+35,584,30.3953333333333
+35,585,33.5491666666667
+35,586,32.1945
+35,587,38.7138333333333
+35,588,31.0938333333333
+35,589,35.3906666666667
+35,590,27.178
+35,591,29.3581666666667
+35,592,28.8925
+35,593,28.067
+35,594,31.0938333333333
+35,595,35.5811666666667
+35,596,31.623
+35,597,28.0881666666667
+35,598,32.8295
+35,599,38.3963333333333
+35,600,30.6493333333333
+35,601,32.2791666666667
+35,602,29.4216666666667
+35,603,28.575
+35,604,28.2575
+35,605,29.0406666666667
+35,606,29.5486666666667
+35,607,33.2316666666667
+35,608,30.8398333333333
+35,609,36.2373333333333
+35,610,32.5966666666667
+35,611,27.2203333333333
+35,612,33.4433333333333
+35,613,31.9193333333333
+35,614,39.624
+35,615,30.1836666666667
+35,616,31.8558333333333
+35,617,30.5435
+35,618,28.1305
+35,619,27.4531666666667
+35,620,33.8455
+35,621,30.8186666666667
+35,622,31.8981666666667
+35,623,30.353
+35,624,30.6281666666667
+35,625,32.004
+35,626,21.8016666666667
+35,627,28.4903333333333
+35,628,34.2265
+35,629,34.417
+35,630,29.9931666666667
+35,631,23.5161666666667
+35,632,27.7071666666667
+35,633,26.2043333333333
+35,634,35.2636666666667
+35,635,29.718
+35,636,31.2208333333333
+35,637,33.02
+35,638,32.1098333333333
+35,639,30.4376666666667
+35,640,37.0416666666667
+35,641,34.7768333333333
+35,642,31.75
+35,643,25.273
+35,644,29.718
+35,645,34.6498333333333
+35,646,38.862
+35,647,28.4903333333333
+35,648,28.5538333333333
+35,649,35.6023333333333
+35,650,26.924
+35,651,26.5641666666667
+35,652,32.0463333333333
+35,653,33.528
+35,654,28.2151666666667
+35,655,34.2053333333333
+35,656,33.02
+35,657,32.3426666666667
+35,658,25.6963333333333
+35,659,32.5755
+35,660,38.2905
+35,661,29.1676666666667
+35,662,28.2575
+35,663,34.544
+35,664,34.9885
+35,665,35.2425
+35,666,32.6813333333333
+35,667,36.6818333333333
+35,668,37.6131666666667
+35,669,27.0086666666667
+35,670,26.797
+35,671,33.3375
+35,672,31.6865
+35,673,29.8026666666667
+35,674,29.9296666666667
+35,675,39.4335
+35,676,25.9715
+35,677,37.2533333333333
+35,678,25.3153333333333
+35,679,40.0473333333333
+35,680,28.0246666666667
+35,681,35.052
+35,682,39.9203333333333
+35,683,28.3633333333333
+35,684,33.4856666666667
+35,685,26.289
+35,686,34.2265
+35,687,35.7505
+35,688,26.9663333333333
+35,689,28.575
+35,690,25.6116666666667
+35,691,40.6188333333333
+35,692,27.1568333333333
+35,693,30.5858333333333
+35,694,26.162
+35,695,25.4635
+35,696,36.1526666666667
+35,697,28.3421666666667
+35,698,38.354
+35,699,26.5853333333333
+35,700,30.6916666666667
+35,701,27.94
+35,702,28.9136666666667
+35,703,25.5481666666667
+35,704,37.2956666666667
+35,705,26.4795
+35,706,33.6973333333333
+35,707,37.465
+35,708,26.1831666666667
+35,709,32.0463333333333
+35,710,35.941
+35,711,31.8558333333333
+35,712,31.1996666666667
+35,713,32.6601666666667
+35,714,30.8186666666667
+35,715,39.2853333333333
+35,716,30.0355
+35,717,38.608
+35,718,46.7148333333333
+35,719,32.8718333333333
+35,720,28.0246666666667
+35,721,30.226
+35,722,34.163
+35,723,31.9193333333333
+35,724,34.0995
+35,725,27.5378333333333
+35,726,32.512
+35,727,31.4325
+35,728,31.3055
+35,729,26.035
+35,730,32.1733333333333
+35,731,34.0148333333333
+35,732,29.6333333333333
+35,733,28.0881666666667
+35,734,31.369
+35,735,26.8393333333333
+35,736,32.3426666666667
+35,737,29.1041666666667
+35,738,28.829
+35,739,34.6075
+35,740,26.4795
+35,741,28.194
+35,742,36.0045
+35,743,38.5656666666667
+35,744,32.9988333333333
+35,745,29.337
+35,746,28.9348333333333
+35,747,43.4551666666667
+35,748,34.544
+35,749,33.3798333333333
+35,750,33.909
+35,751,34.9885
+35,752,32.3003333333333
+35,753,33.782
+35,754,32.4061666666667
+35,755,31.5383333333333
+35,756,27.1991666666667
+35,757,39.7298333333333
+35,758,28.7655
+35,759,40.5765
+35,760,39.9626666666667
+35,761,33.9301666666667
+35,762,31.5383333333333
+35,763,33.6761666666667
+35,764,33.401
+35,765,26.9028333333333
+35,766,34.5651666666667
+35,767,29.083
+35,768,27.3685
+35,769,32.3426666666667
+35,770,34.7768333333333
+35,771,33.4645
+35,772,29.4851666666667
+35,773,32.4696666666667
+35,774,28.2786666666667
+35,775,34.2476666666667
+35,776,31.6653333333333
+35,777,35.2425
+35,778,33.4221666666667
+35,779,31.4113333333333
+35,780,30.861
+35,781,37.9518333333333
+35,782,34.0571666666667
+35,783,32.766
+35,784,31.496
+35,785,39.1795
+35,786,36.449
+35,787,33.5068333333333
+35,788,31.0938333333333
+35,789,28.2786666666667
+35,790,32.3215
+35,791,30.8821666666667
+35,792,26.0561666666667
+35,793,25.2095
+35,794,37.4015
+35,795,31.0515
+35,796,39.37
+35,797,32.3638333333333
+35,798,32.8506666666667
+35,799,32.4485
+35,800,27.1991666666667
+35,801,29.3793333333333
+35,802,26.5006666666667
+35,803,32.2156666666667
+35,804,40.4706666666667
+35,805,25.9291666666667
+35,806,26.7546666666667
+35,807,30.9456666666667
+35,808,35.7081666666667
+35,809,34.4805
+35,810,29.8238333333333
+35,811,29.083
+35,812,31.7076666666667
+35,813,32.9565
+35,814,32.004
+35,815,29.5063333333333
+35,816,28.0458333333333
+35,817,32.9988333333333
+35,818,31.7076666666667
+35,819,29.2946666666667
+35,820,28.321
+35,821,29.1888333333333
+35,822,29.6968333333333
+35,823,36.5971666666667
+35,824,29.3581666666667
+35,825,40.5341666666667
+35,826,24.384
+35,827,34.6075
+35,828,33.5491666666667
+35,829,27.4108333333333
+35,830,31.877
+35,831,28.9348333333333
+35,832,35.3271666666667
+35,833,29.3793333333333
+35,834,28.3845
+35,835,36.322
+35,836,31.1785
+35,837,37.1051666666667
+35,838,26.3736666666667
+35,839,34.6286666666667
+35,840,30.6916666666667
+35,841,28.4268333333333
+35,842,37.4226666666667
+35,843,34.5863333333333
+35,844,32.1945
+35,845,37.1051666666667
+35,846,27.2626666666667
+35,847,32.131
+35,848,33.2951666666667
+35,849,29.4216666666667
+35,850,32.4061666666667
+35,851,31.2208333333333
+35,852,34.036
+35,853,37.7401666666667
+35,854,30.3106666666667
+35,855,32.3638333333333
+35,856,33.6338333333333
+35,857,32.8506666666667
+35,858,27.813
+35,859,30.5435
+35,860,30.5011666666667
+35,861,28.8501666666667
+35,862,35.306
+35,863,31.4113333333333
+35,864,34.8826666666667
+35,865,34.6498333333333
+35,866,33.7396666666667
+35,867,34.6921666666667
+35,868,30.0143333333333
+35,869,38.3751666666667
+35,870,34.0995
+35,871,27.6436666666667
+35,872,29.9085
+35,873,32.3003333333333
+35,874,28.1093333333333
+35,875,40.1531666666667
+35,876,29.1041666666667
+35,877,26.924
+35,878,27.6648333333333
+35,879,31.7076666666667
+35,880,31.3478333333333
+35,881,34.798
+35,882,33.4856666666667
+35,883,31.5806666666667
+35,884,31.5806666666667
+35,885,25.3153333333333
+35,886,28.194
+35,887,29.3158333333333
+35,888,34.5016666666667
+35,889,29.4428333333333
+35,890,37.084
+35,891,26.797
+35,892,24.257
+35,893,29.1888333333333
+35,894,30.3953333333333
+35,895,30.0566666666667
+35,896,41.6136666666667
+35,897,23.8548333333333
+35,898,30.226
+35,899,34.2688333333333
+35,900,40.0896666666667
+35,901,37.0628333333333
+35,902,32.385
+35,903,35.306
+35,904,38.4175
+35,905,26.7546666666667
+35,906,30.6705
+35,907,35.8986666666667
+35,908,33.2528333333333
+35,909,44.0901666666667
+35,910,38.8831666666667
+35,911,31.369
+35,912,25.0825
+35,913,30.6281666666667
+35,914,31.5383333333333
+35,915,32.1945
+35,916,30.9033333333333
+35,917,34.8615
+35,918,27.813
+35,919,27.4743333333333
+35,920,26.5218333333333
+35,921,31.5383333333333
+35,922,29.5698333333333
+35,923,33.7185
+35,924,31.369
+35,925,29.6545
+35,926,30.2895
+35,927,29.6121666666667
+35,928,31.1996666666667
+35,929,29.9508333333333
+35,930,25.8656666666667
+35,931,34.5651666666667
+35,932,35.7505
+35,933,28.067
+35,934,33.9513333333333
+35,935,32.5755
+35,936,27.1356666666667
+35,937,31.2208333333333
+35,938,30.1413333333333
+35,939,30.5011666666667
+35,940,24.8073333333333
+35,941,37.4438333333333
+35,942,35.7928333333333
+35,943,35.2636666666667
+35,944,25.0825
+35,945,30.1625
+35,946,26.924
+35,947,38.3963333333333
+35,948,36.5125
+35,949,28.2363333333333
+35,950,26.5006666666667
+35,951,27.3685
+35,952,35.7716666666667
+35,953,32.7871666666667
+35,954,25.5481666666667
+35,955,34.3323333333333
+35,956,33.8243333333333
+35,957,22.6906666666667
+35,958,29.8873333333333
+35,959,35.3906666666667
+35,960,33.5915
+35,961,37.6766666666667
+35,962,29.845
+35,963,35.6446666666667
+35,964,27.4743333333333
+35,965,34.1841666666667
+35,966,27.3473333333333
+35,967,25.8445
+35,968,28.8078333333333
+35,969,30.8398333333333
+35,970,29.3793333333333
+35,971,33.8455
+35,972,31.8981666666667
+35,973,42.5661666666667
+35,974,31.7711666666667
+35,975,30.2471666666667
+35,976,27.94
+35,977,27.8976666666667
+35,978,36.1738333333333
+35,979,31.1573333333333
+35,980,35.7081666666667
+35,981,31.6653333333333
+35,982,39.9203333333333
+35,983,30.1413333333333
+35,984,34.3746666666667
+35,985,38.0365
+35,986,42.0158333333333
+35,987,27.6225
+35,988,36.0468333333333
+35,989,33.1681666666667
+35,990,26.8393333333333
+35,991,33.0411666666667
+35,992,33.3586666666667
+35,993,34.3535
+35,994,30.9456666666667
+35,995,35.7081666666667
+35,996,31.115
+35,997,34.2053333333333
+35,998,38.4386666666667
+35,999,33.4645
+35,1000,28.6385
+36,1,26.6107333333333
+36,2,29.2142333333333
+36,3,26.3525
+36,4,31.6568666666667
+36,5,22.9912333333333
+36,6,25.3619
+36,7,22.3816333333333
+36,8,35.8224666666667
+36,9,24.8200333333333
+36,10,24.2993333333333
+36,11,20.7983666666667
+36,12,31.1827333333333
+36,13,29.6672
+36,14,22.1488
+36,15,21.5476666666667
+36,16,21.1751333333333
+36,17,33.7481333333333
+36,18,31.4833
+36,19,29.845
+36,20,20.3919666666667
+36,21,26.9748
+36,22,27.6479
+36,23,24.5787333333333
+36,24,35.8902
+36,25,33.9979
+36,26,25.5143
+36,27,20.5570666666667
+36,28,26.5514666666667
+36,29,21.6154
+36,30,26.5049
+36,31,31.7881
+36,32,21.5519
+36,33,26.4879666666667
+36,34,25.0613333333333
+36,35,22.9531333333333
+36,36,21.2344
+36,37,17.9324
+36,38,23.9098666666667
+36,39,34.3577333333333
+36,40,27.9103666666667
+36,41,21.9371333333333
+36,42,27.2923
+36,43,33.3629
+36,44,24.7353666666667
+36,45,21.1328
+36,46,25.6836333333333
+36,47,24.7523
+36,48,20.2014666666667
+36,49,28.3421666666667
+36,50,24.5829666666667
+36,51,21.4206666666667
+36,52,28.7824333333333
+36,53,24.7269
+36,54,29.5740666666667
+36,55,19.4394666666667
+36,56,24.3247333333333
+36,57,26.5684
+36,58,24.2189
+36,59,28.0246666666667
+36,60,22.8388333333333
+36,61,32.6051333333333
+36,62,31.8643
+36,63,30.5773666666667
+36,64,28.6385
+36,65,35.3017666666667
+36,66,30.9922333333333
+36,67,29.3285333333333
+36,68,26.9113
+36,69,30.8821666666667
+36,70,24.3967
+36,71,22.1657333333333
+36,72,24.4432666666667
+36,73,23.4569
+36,74,31.0176333333333
+36,75,29.0533666666667
+36,76,23.3468333333333
+36,77,17.0603333333333
+36,78,27.2880666666667
+36,79,23.7955666666667
+36,80,19.8204666666667
+36,81,22.4959333333333
+36,82,25.4550333333333
+36,83,22.9700666666667
+36,84,23.9395
+36,85,28.0712333333333
+36,86,27.7791333333333
+36,87,33.8709
+36,88,28.7951333333333
+36,89,26.1450666666667
+36,90,26.4625666666667
+36,91,31.4536666666667
+36,92,29.5148
+36,93,25.4846666666667
+36,94,26.4456333333333
+36,95,25.2814666666667
+36,96,32.258
+36,97,25.8741333333333
+36,98,32.3130333333333
+36,99,28.8798
+36,100,24.1554
+36,101,27.0848666666667
+36,102,28.7316333333333
+36,103,23.5839
+36,104,22.1361
+36,105,24.2019666666667
+36,106,26.7419666666667
+36,107,28.4353
+36,108,30.0228
+36,109,29.1846
+36,110,18.6055
+36,111,22.6398666666667
+36,112,29.9381333333333
+36,113,36.2627333333333
+36,114,34.7260333333333
+36,115,27.4870333333333
+36,116,24.5702666666667
+36,117,22.5044
+36,118,26.4752666666667
+36,119,34.0868
+36,120,31.4917666666667
+36,121,18.8679666666667
+36,122,30.6620333333333
+36,123,20.4978
+36,124,31.5679666666667
+36,125,20.4597
+36,126,26.7589
+36,127,27.4574
+36,128,22.5721333333333
+36,129,23.2452333333333
+36,130,26.7419666666667
+36,131,20.4724
+36,132,22.2504
+36,133,27.6944666666667
+36,134,22.0175666666667
+36,135,22.8642333333333
+36,136,20.2692
+36,137,27.4785666666667
+36,138,26.2085666666667
+36,139,27.3473333333333
+36,140,22.9065666666667
+36,141,29.1338
+36,142,21.2725
+36,143,22.1699666666667
+36,144,26.7885333333333
+36,145,22.8642333333333
+36,146,20.4681666666667
+36,147,20.7348666666667
+36,148,19.0965666666667
+36,149,19.9474666666667
+36,150,16.6708666666667
+36,151,24.5533333333333
+36,152,32.4231
+36,153,31.4198
+36,154,25.4931333333333
+36,155,24.9343333333333
+36,156,25.0698
+36,157,30.0736
+36,158,25.0274666666667
+36,159,30.6916666666667
+36,160,23.1182333333333
+36,161,23.8802333333333
+36,162,24.5237
+36,163,21.8016666666667
+36,164,30.5435
+36,165,21.6365666666667
+36,166,30.2768
+36,167,30.2725666666667
+36,168,26.6615333333333
+36,169,34.3535
+36,170,18.8002333333333
+36,171,33.9386333333333
+36,172,22.4493666666667
+36,173,29.0872333333333
+36,174,23.9225666666667
+36,175,20.8703333333333
+36,176,27.2288
+36,177,22.6779666666667
+36,178,29.0745333333333
+36,179,23.5246333333333
+36,180,30.7721
+36,181,27.7664333333333
+36,182,33.1300666666667
+36,183,24.4051666666667
+36,184,33.2655333333333
+36,185,27.7537333333333
+36,186,22.8261333333333
+36,187,29.1168666666667
+36,188,20.9846333333333
+36,189,22.6525666666667
+36,190,27.8976666666667
+36,191,30.226
+36,192,30.0355
+36,193,26.5303
+36,194,20.4808666666667
+36,195,19.4521666666667
+36,196,31.5044666666667
+36,197,21.6408
+36,198,23.1013
+36,199,30.5519666666667
+36,200,29.0660666666667
+36,201,30.8906333333333
+36,202,24.9809
+36,203,34.4212333333333
+36,204,26.7800666666667
+36,205,27.9273
+36,206,27.8299333333333
+36,207,24.7480666666667
+36,208,23.6008333333333
+36,209,25.3068666666667
+36,210,25.7217333333333
+36,211,27.94
+36,212,19.8543333333333
+36,213,33.6846333333333
+36,214,22.8303666666667
+36,215,24.8031
+36,216,22.098
+36,217,32.2029666666667
+36,218,23.1563333333333
+36,219,24.4856
+36,220,27.9019
+36,221,23.4103333333333
+36,222,28.1389666666667
+36,223,24.3882333333333
+36,224,22.9108
+36,225,19.3167
+36,226,21.9329
+36,227,27.6775333333333
+36,228,28.2405666666667
+36,229,27.5378333333333
+36,230,24.5618
+36,231,36.5844666666667
+36,232,21.2471
+36,233,34.0868
+36,234,32.1818
+36,235,21.9329
+36,236,23.8971666666667
+36,237,25.7852333333333
+36,238,29.8704
+36,239,30.2344666666667
+36,240,33.5237666666667
+36,241,31.6145333333333
+36,242,25.5354666666667
+36,243,23.6516333333333
+36,244,24.1554
+36,245,21.4503
+36,246,26.8901333333333
+36,247,27.7622
+36,248,25.0486333333333
+36,249,24.2146666666667
+36,250,22.8811666666667
+36,251,25.7005666666667
+36,252,22.5467333333333
+36,253,25.5989666666667
+36,254,34.6540666666667
+36,255,27.9865666666667
+36,256,21.8059
+36,257,30.1413333333333
+36,258,21.2640333333333
+36,259,27.7071666666667
+36,260,30.1921333333333
+36,261,29.2904333333333
+36,262,27.7325666666667
+36,263,25.8360333333333
+36,264,26.1027333333333
+36,265,30.0101
+36,266,28.8840333333333
+36,267,23.749
+36,268,24.8581333333333
+36,269,26.9494
+36,270,30.7001333333333
+36,271,29.9847
+36,272,29.0491333333333
+36,273,23.3764666666667
+36,274,25.1121333333333
+36,275,23.4738333333333
+36,276,21.0185
+36,277,24.5872
+36,278,25.8233333333333
+36,279,28.1982333333333
+36,280,29.4555333333333
+36,281,21.5984666666667
+36,282,27.3812
+36,283,25.7259666666667
+36,284,21.0947
+36,285,23.1267
+36,286,23.7574666666667
+36,287,29.6672
+36,288,25.4296333333333
+36,289,24.9851333333333
+36,290,24.9555
+36,291,26.8266333333333
+36,292,23.3468333333333
+36,293,22.0768333333333
+36,294,27.7368
+36,295,28.7147
+36,296,22.4282
+36,297,25.7090333333333
+36,298,24.0199333333333
+36,299,25.0782666666667
+36,300,22.5721333333333
+36,301,25.6455333333333
+36,302,23.7278333333333
+36,303,20.9677
+36,304,27.9442333333333
+36,305,20.4978
+36,306,26.3821333333333
+36,307,19.4098333333333
+36,308,26.1874
+36,309,27.7664333333333
+36,310,23.1817333333333
+36,311,28.9602333333333
+36,312,26.6488333333333
+36,313,25.6582333333333
+36,314,18.4277
+36,315,24.9936
+36,316,24.0792
+36,317,25.1544666666667
+36,318,26.0900333333333
+36,319,27.9484666666667
+36,320,21.8313
+36,321,26.3144
+36,322,23.4145666666667
+36,323,25.2984
+36,324,26.2212666666667
+36,325,28.3294666666667
+36,326,20.1633666666667
+36,327,21.4503
+36,328,27.6013333333333
+36,329,26.8478
+36,330,26.4329333333333
+36,331,29.1846
+36,332,28.3040666666667
+36,333,27.2245666666667
+36,334,16.8063333333333
+36,335,24.4136333333333
+36,336,29.1973
+36,337,27.2288
+36,338,20.9592333333333
+36,339,42.3418
+36,340,25.1502333333333
+36,341,29.1888333333333
+36,342,24.4348
+36,343,27.6309666666667
+36,344,20.2395666666667
+36,345,24.8666
+36,346,32.3892333333333
+36,347,21.8990333333333
+36,348,31.4452
+36,349,22.9362
+36,350,24.5237
+36,351,34.5651666666667
+36,352,19.8966666666667
+36,353,19.3124666666667
+36,354,19.9686333333333
+36,355,29.8577
+36,356,30.6620333333333
+36,357,22.8473
+36,358,21.8821
+36,359,28.6342666666667
+36,360,33.3544333333333
+36,361,22.1530333333333
+36,362,30.4969333333333
+36,363,26.0858
+36,364,26.2509
+36,365,28.6681333333333
+36,366,24.9809
+36,367,25.5439333333333
+36,368,21.717
+36,369,20.8703333333333
+36,370,26.1112
+36,371,32.9692
+36,372,26.3271
+36,373,30.7170666666667
+36,374,29.9169666666667
+36,375,20.0279
+36,376,30.1328666666667
+36,377,37.719
+36,378,27.9569333333333
+36,379,22.9277333333333
+36,380,27.7241
+36,381,24.1596333333333
+36,382,25.4338666666667
+36,383,24.9809
+36,384,19.9051333333333
+36,385,29.6079333333333
+36,386,25.3449666666667
+36,387,25.3195666666667
+36,388,17.7207333333333
+36,389,16.8783
+36,390,21.1793666666667
+36,391,23.2071333333333
+36,392,26.4202333333333
+36,393,23.2113666666667
+36,394,23.9606666666667
+36,395,24.5152333333333
+36,396,28.4522333333333
+36,397,20.8703333333333
+36,398,31.3563
+36,399,24.1765666666667
+36,400,27.1610666666667
+36,401,24.7099666666667
+36,402,19.5199
+36,403,21.8948
+36,404,27.1399
+36,405,29.4555333333333
+36,406,21.463
+36,407,18.4658
+36,408,22.3350666666667
+36,409,25.3111
+36,410,23.9479666666667
+36,411,27.8003
+36,412,28.2871333333333
+36,413,28.0162
+36,414,24.9258666666667
+36,415,21.7424
+36,416,27.1483666666667
+36,417,20.6629
+36,418,26.4033
+36,419,29.1211
+36,420,25.3195666666667
+36,421,29.5994666666667
+36,422,18.1017333333333
+36,423,25.6794
+36,424,21.1285666666667
+36,425,24.8369666666667
+36,426,26.924
+36,427,26.9282333333333
+36,428,25.2095
+36,429,23.5204
+36,430,25.3746
+36,431,21.9371333333333
+36,432,25.7175
+36,433,21.9413666666667
+36,434,21.4460666666667
+36,435,29.0110333333333
+36,436,27.1187333333333
+36,437,27.8722666666667
+36,438,25.1883333333333
+36,439,24.1638666666667
+36,440,22.5763666666667
+36,441,19.9009
+36,442,26.1958666666667
+36,443,28.9009666666667
+36,444,24.9639666666667
+36,445,31.9913
+36,446,21.9202
+36,447,22.1445666666667
+36,448,27.7283333333333
+36,449,25.7725333333333
+36,450,26.1196666666667
+36,451,21.5349666666667
+36,452,28.5834666666667
+36,453,31.5044666666667
+36,454,24.0284
+36,455,19.4818
+36,456,32.3511333333333
+36,457,32.4146333333333
+36,458,25.2857
+36,459,21.0523666666667
+36,460,20.8999666666667
+36,461,26.5387666666667
+36,462,25.7556
+36,463,30.4038
+36,464,35.0985666666667
+36,465,22.0429666666667
+36,466,33.4814333333333
+36,467,27.2457333333333
+36,468,27.9188333333333
+36,469,18.8849
+36,470,32.1056
+36,471,26.4710333333333
+36,472,19.0584666666667
+36,473,30.0270333333333
+36,474,20.1549
+36,475,20.5570666666667
+36,476,33.9005333333333
+36,477,28.1982333333333
+36,478,28.8925
+36,479,23.7532333333333
+36,480,22.3435333333333
+36,481,28.6935333333333
+36,482,26.8308666666667
+36,483,29.0025666666667
+36,484,24.6507
+36,485,20.6840666666667
+36,486,26.5514666666667
+36,487,29.9974
+36,488,23.8506
+36,489,30.7001333333333
+36,490,29.9381333333333
+36,491,23.5839
+36,492,23.3341333333333
+36,493,26.5514666666667
+36,494,26.2974666666667
+36,495,22.9065666666667
+36,496,27.0383
+36,497,30.0905333333333
+36,498,20.6417333333333
+36,499,23.5331
+36,500,29.4936333333333
+36,501,28.5580666666667
+36,502,28.9390666666667
+36,503,23.8336666666667
+36,504,28.0966333333333
+36,505,21.2809666666667
+36,506,26.2509
+36,507,21.1709
+36,508,29.3454666666667
+36,509,32.1013666666667
+36,510,25.4465666666667
+36,511,24.9131666666667
+36,512,20.7475666666667
+36,513,21.3402333333333
+36,514,25.9672666666667
+36,515,20.1337333333333
+36,516,29.5529
+36,517,25.9334
+36,518,26.3017
+36,519,21.7678
+36,520,24.6761
+36,521,20.9804
+36,522,31.8600666666667
+36,523,27.0425333333333
+36,524,19.812
+36,525,27.6733
+36,526,31.8897
+36,527,31.5891333333333
+36,528,22.1699666666667
+36,529,25.1290666666667
+36,530,28.9433
+36,531,31.7373
+36,532,31.5595
+36,533,37.1602
+36,534,18.2922333333333
+36,535,22.7584
+36,536,31.496
+36,537,26.0265333333333
+36,538,28.5411333333333
+36,539,26.3609666666667
+36,540,27.6394333333333
+36,541,19.5283666666667
+36,542,29.464
+36,543,30.8652333333333
+36,544,23.0166333333333
+36,545,29.0237333333333
+36,546,23.1605666666667
+36,547,20.5824666666667
+36,548,25.9461
+36,549,22.9192666666667
+36,550,32.3511333333333
+36,551,22.1911333333333
+36,552,25.1290666666667
+36,553,28.3633333333333
+36,554,26.6615333333333
+36,555,35.179
+36,556,21.5519
+36,557,29.9085
+36,558,26.1662333333333
+36,559,24.5702666666667
+36,560,32.0929
+36,561,26.9070666666667
+36,562,26.5641666666667
+36,563,25.7725333333333
+36,564,24.0961333333333
+36,565,21.2725
+36,566,23.0420333333333
+36,567,28.0077333333333
+36,568,31.4367333333333
+36,569,23.9649
+36,570,26.6784666666667
+36,571,22.3181333333333
+36,572,24.8793
+36,573,21.9329
+36,574,28.2151666666667
+36,575,23.0674333333333
+36,576,21.9837
+36,577,21.6154
+36,578,25.9461
+36,579,24.4559666666667
+36,580,23.1859666666667
+36,581,24.2908666666667
+36,582,25.2433666666667
+36,583,23.7066666666667
+36,584,23.0547333333333
+36,585,22.7499333333333
+36,586,31.6865
+36,587,28.3929666666667
+36,588,29.7942
+36,589,26.2551333333333
+36,590,22.2927333333333
+36,591,28.5877
+36,592,21.2936666666667
+36,593,26.0053666666667
+36,594,29.7137666666667
+36,595,31.7330666666667
+36,596,20.0025
+36,597,25.5185333333333
+36,598,25.1968
+36,599,23.1309333333333
+36,600,20.7306333333333
+36,601,26.6192
+36,602,26.5938
+36,603,27.8341666666667
+36,604,21.0354333333333
+36,605,29.2777333333333
+36,606,29.5529
+36,607,18.4446333333333
+36,608,23.2367666666667
+36,609,30.9922333333333
+36,610,24.8962333333333
+36,611,27.0425333333333
+36,612,25.9926666666667
+36,613,28.0373666666667
+36,614,35.4287666666667
+36,615,24.1342333333333
+36,616,29.5571333333333
+36,617,18.923
+36,618,27.5293666666667
+36,619,19.6257333333333
+36,620,27.1610666666667
+36,621,27.8299333333333
+36,622,21.1412666666667
+36,623,25.6370666666667
+36,624,17.8435
+36,625,18.9907333333333
+36,626,31.5002333333333
+36,627,22.5594333333333
+36,628,22.2673333333333
+36,629,27.8087666666667
+36,630,28.3718
+36,631,19.0754
+36,632,28.7316333333333
+36,633,25.7640666666667
+36,634,19.6723
+36,635,22.1911333333333
+36,636,22.8896333333333
+36,637,20.9804
+36,638,25.7259666666667
+36,639,31.9024
+36,640,26.1493
+36,641,27.1145
+36,642,23.368
+36,643,24.9385666666667
+36,644,29.0491333333333
+36,645,23.7913333333333
+36,646,20.0490666666667
+36,647,29.2692666666667
+36,648,24.1977333333333
+36,649,22.1445666666667
+36,650,33.909
+36,651,26.162
+36,652,25.4042333333333
+36,653,26.9705666666667
+36,654,25.0063
+36,655,20.2353333333333
+36,656,20.0871666666667
+36,657,34.3154
+36,658,23.2706333333333
+36,659,31.7330666666667
+36,660,24.4813666666667
+36,661,26.5641666666667
+36,662,27.6013333333333
+36,663,25.8529666666667
+36,664,31.6780333333333
+36,665,21.4672333333333
+36,666,24.5618
+36,667,19.1008
+36,668,24.5364
+36,669,26.8393333333333
+36,670,29.0957
+36,671,40.6569333333333
+36,672,26.2297333333333
+36,673,29.3962666666667
+36,674,26.4202333333333
+36,675,25.9799666666667
+36,676,23.3595333333333
+36,677,22.3731666666667
+36,678,21.1158666666667
+36,679,27.2669
+36,680,36.1145666666667
+36,681,22.1234
+36,682,33.0877333333333
+36,683,26.3652
+36,684,23.8336666666667
+36,685,20.5782333333333
+36,686,27.0594666666667
+36,687,27.051
+36,688,21.2979
+36,689,30.9964666666667
+36,690,24.4729
+36,691,24.5025333333333
+36,692,26.8774333333333
+36,693,24.0538
+36,694,20.0067333333333
+36,695,30.4038
+36,696,22.8219
+36,697,29.7899666666667
+36,698,20.3623333333333
+36,699,30.8059666666667
+36,700,30.2006
+36,701,22.3774
+36,702,26.3736666666667
+36,703,23.2537
+36,704,22.5509666666667
+36,705,31.2462333333333
+36,706,21.1920666666667
+36,707,27.6606
+36,708,26.4625666666667
+36,709,25.3576666666667
+36,710,25.9884333333333
+36,711,24.1215333333333
+36,712,28.5665333333333
+36,713,23.9733666666667
+36,714,22.2165333333333
+36,715,30.0397333333333
+36,716,28.4183666666667
+36,717,19.0584666666667
+36,718,31.1869666666667
+36,719,23.3976333333333
+36,720,30.3276
+36,721,24.1257666666667
+36,722,27.9484666666667
+36,723,29.4894
+36,724,20.4046666666667
+36,725,20.4427666666667
+36,726,29.0491333333333
+36,727,25.1248333333333
+36,728,27.8341666666667
+36,729,32.258
+36,730,25.6159
+36,731,27.9950333333333
+36,732,26.8943666666667
+36,733,26.0858
+36,734,26.9536333333333
+36,735,28.0585333333333
+36,736,22.5086333333333
+36,737,26.1493
+36,738,20.9423
+36,739,26.8774333333333
+36,740,20.3242333333333
+36,741,28.3802666666667
+36,742,22.9573666666667
+36,743,28.7104666666667
+36,744,24.8496666666667
+36,745,27.3515666666667
+36,746,25.7725333333333
+36,747,22.5425
+36,748,27.0467666666667
+36,749,29.3200666666667
+36,750,29.2819666666667
+36,751,25.7386666666667
+36,752,24.6845666666667
+36,753,35.6658333333333
+36,754,26.2763
+36,755,23.5500333333333
+36,756,26.4244666666667
+36,757,25.5058333333333
+36,758,30.0016333333333
+36,759,30.4461333333333
+36,760,24.6253
+36,761,24.6126
+36,762,21.5942333333333
+36,763,23.0589666666667
+36,764,35.2763666666667
+36,765,25.0063
+36,766,24.9047
+36,767,27.3304
+36,768,24.9385666666667
+36,769,24.9639666666667
+36,770,24.2231333333333
+36,771,24.8962333333333
+36,772,21.5307333333333
+36,773,28.1008666666667
+36,774,24.8369666666667
+36,775,25.3492
+36,776,32.1394666666667
+36,777,31.1869666666667
+36,778,24.4686666666667
+36,779,19.4183
+36,780,25.2603
+36,781,29.1973
+36,782,29.0576
+36,783,26.6149666666667
+36,784,24.0919
+36,785,34.0783333333333
+36,786,22.6568
+36,787,34.3450333333333
+36,788,26.2974666666667
+36,789,23.6728
+36,790,22.1276333333333
+36,791,32.0463333333333
+36,792,25.0867333333333
+36,793,19.4140666666667
+36,794,26.1281333333333
+36,795,22.0429666666667
+36,796,24.0919
+36,797,21.9625333333333
+36,798,25.9715
+36,799,29.2523333333333
+36,800,27.3431
+36,801,26.8859
+36,802,32.1733333333333
+36,803,27.2880666666667
+36,804,28.3040666666667
+36,805,32.3257333333333
+36,806,24.511
+36,807,28.4734
+36,808,23.8209666666667
+36,809,23.3553
+36,810,23.8336666666667
+36,811,27.6563666666667
+36,812,25.1333
+36,813,23.4442
+36,814,25.0952
+36,815,22.7203
+36,816,21.6111666666667
+36,817,27.4150666666667
+36,818,26.7377333333333
+36,819,20.8830333333333
+36,820,22.6991333333333
+36,821,26.4498666666667
+36,822,20.2395666666667
+36,823,25.5397
+36,824,26.6954
+36,825,34.2138
+36,826,31.0176333333333
+36,827,26.0731
+36,828,38.1846666666667
+36,829,29.9085
+36,830,24.4136333333333
+36,831,18.9357
+36,832,26.7419666666667
+36,833,25.0444
+36,834,28.7274
+36,835,28.6681333333333
+36,836,26.8901333333333
+36,837,24.7226666666667
+36,838,24.0326333333333
+36,839,28.0500666666667
+36,840,23.3172
+36,841,31.4621333333333
+36,842,34.5778666666667
+36,843,31.0176333333333
+36,844,20.7264
+36,845,23.3172
+36,846,26.6615333333333
+36,847,20.5105
+36,848,25.0486333333333
+36,849,28.3845
+36,850,25.5778
+36,851,18.0001333333333
+36,852,23.5627333333333
+36,853,28.7570333333333
+36,854,24.4305666666667
+36,855,29.2354
+36,856,22.9531333333333
+36,857,25.0613333333333
+36,858,21.0269666666667
+36,859,25.9291666666667
+36,860,25.5312333333333
+36,861,22.0175666666667
+36,862,26.1493
+36,863,26.162
+36,864,21.5476666666667
+36,865,21.4249
+36,866,20.3665666666667
+36,867,24.7142
+36,868,21.7127666666667
+36,869,23.1944333333333
+36,870,22.4197333333333
+36,871,26.5091333333333
+36,872,19.5961
+36,873,23.9479666666667
+36,874,24.8623666666667
+36,875,20.2819
+36,876,23.6347
+36,877,34.6244333333333
+36,878,22.5975333333333
+36,879,24.7057333333333
+36,880,25.8572
+36,881,21.4460666666667
+36,882,18.4785
+36,883,24.8708333333333
+36,884,29.4851666666667
+36,885,30.6154666666667
+36,886,28.4564666666667
+36,887,23.9437333333333
+36,888,23.9606666666667
+36,889,21.5519
+36,890,36.1103333333333
+36,891,14.3340666666667
+36,892,29.1295666666667
+36,893,26.0646333333333
+36,894,22.8684666666667
+36,895,26.2128
+36,896,21.6619666666667
+36,897,28.2956
+36,898,31.0218666666667
+36,899,22.8430666666667
+36,900,29.9804666666667
+36,901,25.8741333333333
+36,902,26.3990666666667
+36,903,26.5006666666667
+36,904,27.9611666666667
+36,905,24.9682
+36,906,30.8906333333333
+36,907,26.4710333333333
+36,908,23.7998
+36,909,30.6959
+36,910,19.9178333333333
+36,911,25.3830666666667
+36,912,25.1544666666667
+36,913,23.2071333333333
+36,914,29.9339
+36,915,29.6756666666667
+36,916,25.7005666666667
+36,917,29.9508333333333
+36,918,30.5011666666667
+36,919,23.4569
+36,920,37.1898333333333
+36,921,34.0741
+36,922,24.4221
+36,923,23.5881333333333
+36,924,24.4305666666667
+36,925,22.6568
+36,926,19.5453
+36,927,26.1916333333333
+36,928,21.6154
+36,929,23.6516333333333
+36,930,25.8402666666667
+36,931,21.1920666666667
+36,932,26.6361333333333
+36,933,35.5684666666667
+36,934,26.2551333333333
+36,935,21.6027
+36,936,22.8684666666667
+36,937,29.3751
+36,938,21.8524666666667
+36,939,15.1976666666667
+36,940,26.7165666666667
+36,941,24.3713
+36,942,30.9795333333333
+36,943,22.5890666666667
+36,944,26.0053666666667
+36,945,23.1902
+36,946,26.1493
+36,947,23.3510666666667
+36,948,29.0914666666667
+36,949,13.2503333333333
+36,950,24.9682
+36,951,37.3083666666667
+36,952,19.2659
+36,953,31.2462333333333
+36,954,18.7621333333333
+36,955,23.9945333333333
+36,956,28.5242
+36,957,21.7889666666667
+36,958,27.8849666666667
+36,959,21.3825666666667
+36,960,26.9155333333333
+36,961,21.5603666666667
+36,962,18.8637333333333
+36,963,23.9776
+36,964,29.0152666666667
+36,965,20.0279
+36,966,27.4870333333333
+36,967,27.8595666666667
+36,968,19.9898
+36,969,23.2748666666667
+36,970,27.0425333333333
+36,971,22.1742
+36,972,23.6939666666667
+36,973,23.3256666666667
+36,974,28.2659666666667
+36,975,26.3398
+36,976,27.1991666666667
+36,977,18.2753
+36,978,23.2071333333333
+36,979,24.4517333333333
+36,980,34.7260333333333
+36,981,23.2664
+36,982,29.8958
+36,983,21.9159666666667
+36,984,28.1432
+36,985,18.3557333333333
+36,986,32.9861333333333
+36,987,28.2024666666667
+36,988,32.2453
+36,989,25.5524
+36,990,38.8450666666667
+36,991,30.2598666666667
+36,992,27.3346333333333
+36,993,28.3972
+36,994,21.2682666666667
+36,995,29.6418
+36,996,26.5303
+36,997,25.6794
+36,998,28.1178
+36,999,24.003
+36,1000,23.7617
+37,1,22.5848333333333
+37,2,21.1878333333333
+37,3,38.9466666666667
+37,4,28.194
+37,5,32.9353333333333
+37,6,33.6761666666667
+37,7,33.9725
+37,8,34.0995
+37,9,32.258
+37,10,26.67
+37,11,35.9621666666667
+37,12,32.9141666666667
+37,13,19.2193333333333
+37,14,37.8671666666667
+37,15,23.749
+37,16,24.3628333333333
+37,17,26.0561666666667
+37,18,30.1625
+37,19,22.8176666666667
+37,20,26.5641666666667
+37,21,28.2151666666667
+37,22,25.4211666666667
+37,23,23.368
+37,24,30.7975
+37,25,31.3055
+37,26,33.401
+37,27,33.8455
+37,28,36.5125
+37,29,22.2885
+37,30,37.211
+37,31,22.3731666666667
+37,32,32.766
+37,33,25.273
+37,34,38.2905
+37,35,40.513
+37,36,47.3075
+37,37,28.8713333333333
+37,38,27.305
+37,39,31.7711666666667
+37,40,29.5063333333333
+37,41,39.0948333333333
+37,42,36.6818333333333
+37,43,22.8176666666667
+37,44,28.0035
+37,45,32.0886666666667
+37,46,33.2528333333333
+37,47,33.1681666666667
+37,48,27.3685
+37,49,32.3215
+37,50,30.4588333333333
+37,51,33.782
+37,52,32.258
+37,53,41.8253333333333
+37,54,38.3328333333333
+37,55,29.591
+37,56,28.829
+37,57,38.3328333333333
+37,58,21.082
+37,59,33.7396666666667
+37,60,33.2316666666667
+37,61,37.719
+37,62,29.9296666666667
+37,63,26.6911666666667
+37,64,35.4541666666667
+37,65,41.7618333333333
+37,66,34.2688333333333
+37,67,36.7453333333333
+37,68,31.0726666666667
+37,69,30.0143333333333
+37,70,36.1738333333333
+37,71,28.5326666666667
+37,72,28.9136666666667
+37,73,37.3803333333333
+37,74,29.972
+37,75,27.7495
+37,76,46.609
+37,77,26.6276666666667
+37,78,37.9095
+37,79,26.4795
+37,80,38.5233333333333
+37,81,40.9363333333333
+37,82,44.8945
+37,83,34.2476666666667
+37,84,33.5703333333333
+37,85,38.3116666666667
+37,86,29.0195
+37,87,41.0633333333333
+37,88,36.3643333333333
+37,89,39.4758333333333
+37,90,22.6906666666667
+37,91,40.259
+37,92,22.7965
+37,93,29.5698333333333
+37,94,32.1733333333333
+37,95,27.94
+37,96,27.813
+37,97,27.1145
+37,98,35.4753333333333
+37,99,34.9461666666667
+37,100,28.1305
+37,101,36.4066666666667
+37,102,25.8445
+37,103,37.6343333333333
+37,104,37.8883333333333
+37,105,21.1666666666667
+37,106,25.3365
+37,107,30.8821666666667
+37,108,36.6606666666667
+37,109,36.2796666666667
+37,110,28.4268333333333
+37,111,44.196
+37,112,33.8243333333333
+37,113,38.6715
+37,114,30.3953333333333
+37,115,27.1568333333333
+37,116,28.6385
+37,117,29.6333333333333
+37,118,29.4216666666667
+37,119,31.9193333333333
+37,120,29.6121666666667
+37,121,39.3065
+37,122,18.0128333333333
+37,123,29.1465
+37,124,33.1046666666667
+37,125,33.02
+37,126,41.4443333333333
+37,127,25.5481666666667
+37,128,33.147
+37,129,39.2218333333333
+37,130,32.2791666666667
+37,131,31.9828333333333
+37,132,28.7866666666667
+37,133,35.2636666666667
+37,134,30.3318333333333
+37,135,32.4908333333333
+37,136,46.6513333333333
+37,137,33.4433333333333
+37,138,31.8346666666667
+37,139,45.0003333333333
+37,140,37.9306666666667
+37,141,25.9291666666667
+37,142,34.5863333333333
+37,143,31.3266666666667
+37,144,29.3793333333333
+37,145,43.3281666666667
+37,146,24.9343333333333
+37,147,31.877
+37,148,31.6865
+37,149,42.9048333333333
+37,150,28.5961666666667
+37,151,33.5703333333333
+37,152,29.337
+37,153,43.561
+37,154,21.5688333333333
+37,155,33.0835
+37,156,22.7965
+37,157,39.4123333333333
+37,158,31.3055
+37,159,30.3106666666667
+37,160,31.3478333333333
+37,161,37.6766666666667
+37,162,37.1898333333333
+37,163,31.6865
+37,164,24.8285
+37,165,26.9028333333333
+37,166,43.7726666666667
+37,167,28.9771666666667
+37,168,22.0133333333333
+37,169,24.9343333333333
+37,170,38.735
+37,171,26.4583333333333
+37,172,34.2053333333333
+37,173,33.9936666666667
+37,174,31.7711666666667
+37,175,30.353
+37,176,39.0736666666667
+37,177,43.7303333333333
+37,178,33.8666666666667
+37,179,25.3576666666667
+37,180,30.5858333333333
+37,181,27.6436666666667
+37,182,40.8728333333333
+37,183,46.3973333333333
+37,184,31.1996666666667
+37,185,48.4716666666667
+37,186,21.6323333333333
+37,187,40.513
+37,188,25.5905
+37,189,23.5796666666667
+37,190,33.0835
+37,191,36.1526666666667
+37,192,24.3205
+37,193,26.7546666666667
+37,194,41.021
+37,195,30.48
+37,196,31.4536666666667
+37,197,36.3008333333333
+37,198,37.846
+37,199,30.48
+37,200,41.4231666666667
+37,201,31.3266666666667
+37,202,31.3055
+37,203,45.3601666666667
+37,204,39.7721666666667
+37,205,24.9555
+37,206,23.9183333333333
+37,207,36.9358333333333
+37,208,27.8553333333333
+37,209,37.4226666666667
+37,210,31.1785
+37,211,33.5491666666667
+37,212,40.0473333333333
+37,213,26.5641666666667
+37,214,34.0783333333333
+37,215,43.1376666666667
+37,216,21.5476666666667
+37,217,37.1263333333333
+37,218,35.3483333333333
+37,219,34.798
+37,220,28.1728333333333
+37,221,32.8506666666667
+37,222,33.7608333333333
+37,223,33.5915
+37,224,29.4005
+37,225,36.3855
+37,226,27.7283333333333
+37,227,28.8078333333333
+37,228,38.354
+37,229,26.7123333333333
+37,230,42.037
+37,231,31.2208333333333
+37,232,38.6926666666667
+37,233,31.8981666666667
+37,234,36.5336666666667
+37,235,29.7603333333333
+37,236,38.862
+37,237,33.8031666666667
+37,238,42.5026666666667
+37,239,30.1836666666667
+37,240,26.5641666666667
+37,241,23.0928333333333
+37,242,28.1516666666667
+37,243,33.147
+37,244,35.5176666666667
+37,245,28.7443333333333
+37,246,25.1248333333333
+37,247,33.2316666666667
+37,248,28.2998333333333
+37,249,43.053
+37,250,40.132
+37,251,34.7133333333333
+37,252,30.7763333333333
+37,253,33.655
+37,254,25.654
+37,255,30.0566666666667
+37,256,33.8666666666667
+37,257,27.7071666666667
+37,258,31.5595
+37,259,23.7913333333333
+37,260,44.4923333333333
+37,261,31.6865
+37,262,42.672
+37,263,27.3896666666667
+37,264,36.6183333333333
+37,265,27.3261666666667
+37,266,31.2208333333333
+37,267,30.8186666666667
+37,268,36.4278333333333
+37,269,32.2156666666667
+37,270,36.5971666666667
+37,271,27.8765
+37,272,27.178
+37,273,36.9993333333333
+37,274,34.3323333333333
+37,275,32.6178333333333
+37,276,37.5708333333333
+37,277,24.8285
+37,278,25.8868333333333
+37,279,28.0458333333333
+37,280,37.4226666666667
+37,281,31.9405
+37,282,36.576
+37,283,28.448
+37,284,30.353
+37,285,26.4371666666667
+37,286,32.4696666666667
+37,287,35.5176666666667
+37,288,23.6008333333333
+37,289,34.5016666666667
+37,290,30.226
+37,291,29.5486666666667
+37,292,37.2321666666667
+37,293,28.0458333333333
+37,294,35.7081666666667
+37,295,26.4583333333333
+37,296,31.3055
+37,297,30.6916666666667
+37,298,33.1893333333333
+37,299,40.64
+37,300,25.4635
+37,301,28.7443333333333
+37,302,42.2063333333333
+37,303,28.5326666666667
+37,304,37.6978333333333
+37,305,37.592
+37,306,31.2631666666667
+37,307,33.2316666666667
+37,308,34.6921666666667
+37,309,34.6075
+37,310,32.4696666666667
+37,311,23.0928333333333
+37,312,32.1733333333333
+37,313,36.0256666666667
+37,314,31.0726666666667
+37,315,42.037
+37,316,38.5656666666667
+37,317,30.226
+37,318,34.2053333333333
+37,319,25.146
+37,320,30.6705
+37,321,36.4913333333333
+37,322,30.8398333333333
+37,323,27.432
+37,324,21.9921666666667
+37,325,28.6596666666667
+37,326,30.861
+37,327,27.686
+37,328,33.5068333333333
+37,329,34.7133333333333
+37,330,31.7711666666667
+37,331,46.863
+37,332,37.1686666666667
+37,333,34.925
+37,334,29.2735
+37,335,23.4315
+37,336,25.3576666666667
+37,337,35.433
+37,338,35.2636666666667
+37,339,40.6823333333333
+37,340,26.3525
+37,341,40.0261666666667
+37,342,33.4433333333333
+37,343,36.9358333333333
+37,344,33.8666666666667
+37,345,28.4056666666667
+37,346,26.6911666666667
+37,347,37.2745
+37,348,41.1268333333333
+37,349,28.4903333333333
+37,350,27.2626666666667
+37,351,30.3953333333333
+37,352,30.3741666666667
+37,353,35.56
+37,354,28.4056666666667
+37,355,26.4583333333333
+37,356,26.9663333333333
+37,357,33.02
+37,358,35.3906666666667
+37,359,29.8873333333333
+37,360,34.1418333333333
+37,361,41.4866666666667
+37,362,31.4325
+37,363,27.0933333333333
+37,364,43.688
+37,365,33.3586666666667
+37,366,29.2946666666667
+37,367,26.8816666666667
+37,368,38.9466666666667
+37,369,36.0468333333333
+37,370,33.6761666666667
+37,371,31.242
+37,372,32.3638333333333
+37,373,28.4268333333333
+37,374,43.6456666666667
+37,375,31.8346666666667
+37,376,21.1243333333333
+37,377,28.7655
+37,378,34.3111666666667
+37,379,29.4216666666667
+37,380,22.86
+37,381,29.6756666666667
+37,382,35.4965
+37,383,31.7288333333333
+37,384,35.1155
+37,385,36.8511666666667
+37,386,28.321
+37,387,29.9085
+37,388,28.2363333333333
+37,389,30.5223333333333
+37,390,31.3055
+37,391,30.6916666666667
+37,392,32.1521666666667
+37,393,24.8496666666667
+37,394,43.8785
+37,395,29.0195
+37,396,36.1103333333333
+37,397,29.6756666666667
+37,398,36.0468333333333
+37,399,32.9776666666667
+37,400,29.0195
+37,401,34.3323333333333
+37,402,36.2585
+37,403,25.6963333333333
+37,404,37.5073333333333
+37,405,23.8971666666667
+37,406,34.6921666666667
+37,407,27.7495
+37,408,29.6545
+37,409,40.5553333333333
+37,410,42.3756666666667
+37,411,25.1883333333333
+37,412,34.7345
+37,413,30.607
+37,414,32.3426666666667
+37,415,31.3266666666667
+37,416,34.0783333333333
+37,417,44.1113333333333
+37,418,28.1305
+37,419,33.9301666666667
+37,420,43.7938333333333
+37,421,31.115
+37,422,33.9513333333333
+37,423,35.0096666666667
+37,424,31.877
+37,425,29.591
+37,426,28.956
+37,427,30.607
+37,428,36.7453333333333
+37,429,36.3431666666667
+37,430,25.2095
+37,431,25.8656666666667
+37,432,32.3003333333333
+37,433,29.7815
+37,434,35.1366666666667
+37,435,32.0675
+37,436,35.7505
+37,437,36.1738333333333
+37,438,32.6813333333333
+37,439,32.3003333333333
+37,440,30.6493333333333
+37,441,28.7443333333333
+37,442,36.195
+37,443,31.3901666666667
+37,444,36.6818333333333
+37,445,31.9616666666667
+37,446,33.3798333333333
+37,447,29.9931666666667
+37,448,35.433
+37,449,32.9776666666667
+37,450,42.5873333333333
+37,451,27.686
+37,452,20.6163333333333
+37,453,30.8186666666667
+37,454,39.5393333333333
+37,455,25.5905
+37,456,36.5336666666667
+37,457,30.5223333333333
+37,458,28.9348333333333
+37,459,43.434
+37,460,32.2156666666667
+37,461,33.655
+37,462,29.4005
+37,463,40.64
+37,464,41.1268333333333
+37,465,23.0928333333333
+37,466,26.543
+37,467,26.8393333333333
+37,468,23.876
+37,469,37.5073333333333
+37,470,42.037
+37,471,51.7101666666667
+37,472,35.2213333333333
+37,473,25.0613333333333
+37,474,35.2425
+37,475,30.0566666666667
+37,476,34.8403333333333
+37,477,28.0881666666667
+37,478,36.6606666666667
+37,479,28.829
+37,480,30.5646666666667
+37,481,30.2471666666667
+37,482,21.2936666666667
+37,483,37.0628333333333
+37,484,30.4376666666667
+37,485,38.5656666666667
+37,486,31.9828333333333
+37,487,33.8031666666667
+37,488,33.4645
+37,489,18.6055
+37,490,29.845
+37,491,34.8826666666667
+37,492,36.2796666666667
+37,493,29.2311666666667
+37,494,31.3478333333333
+37,495,28.4056666666667
+37,496,36.4913333333333
+37,497,27.9823333333333
+37,498,34.8826666666667
+37,499,26.9663333333333
+37,500,32.8083333333333
+37,501,29.1465
+37,502,39.37
+37,503,28.2575
+37,504,32.5331666666667
+37,505,41.5078333333333
+37,506,25.4423333333333
+37,507,31.4113333333333
+37,508,37.8883333333333
+37,509,45.9528333333333
+37,510,31.2631666666667
+37,511,37.8036666666667
+37,512,33.909
+37,513,27.4108333333333
+37,514,31.75
+37,515,45.2331666666667
+37,516,24.2993333333333
+37,517,23.7278333333333
+37,518,34.1418333333333
+37,519,32.9353333333333
+37,520,23.4315
+37,521,41.5925
+37,522,31.6865
+37,523,32.3215
+37,524,35.3695
+37,525,21.8651666666667
+37,526,34.7556666666667
+37,527,35.0308333333333
+37,528,34.5016666666667
+37,529,27.8553333333333
+37,530,32.004
+37,531,35.2213333333333
+37,532,34.7345
+37,533,35.6658333333333
+37,534,33.1681666666667
+37,535,27.4531666666667
+37,536,22.86
+37,537,27.7071666666667
+37,538,28.1093333333333
+37,539,22.098
+37,540,20.1295
+37,541,32.1521666666667
+37,542,37.1686666666667
+37,543,28.2786666666667
+37,544,25.4423333333333
+37,545,25.6328333333333
+37,546,29.5275
+37,547,37.592
+37,548,43.9631666666667
+37,549,36.3855
+37,550,32.4061666666667
+37,551,29.6756666666667
+37,552,47.6461666666667
+37,553,40.64
+37,554,24.5533333333333
+37,555,32.7871666666667
+37,556,32.0251666666667
+37,557,37.2533333333333
+37,558,46.6936666666667
+37,559,42.8836666666667
+37,560,37.719
+37,561,31.496
+37,562,31.3901666666667
+37,563,32.1521666666667
+37,564,32.1945
+37,565,23.5373333333333
+37,566,29.845
+37,567,38.1211666666667
+37,568,45.593
+37,569,31.2208333333333
+37,570,33.1893333333333
+37,571,48.006
+37,572,40.5765
+37,573,29.2523333333333
+37,574,30.099
+37,575,27.0086666666667
+37,576,23.5796666666667
+37,577,19.4521666666667
+37,578,28.1305
+37,579,30.099
+37,580,32.131
+37,581,27.8765
+37,582,24.4475
+37,583,36.7241666666667
+37,584,33.274
+37,585,32.3426666666667
+37,586,32.8295
+37,587,32.1945
+37,588,23.3891666666667
+37,589,29.5063333333333
+37,590,38.4598333333333
+37,591,31.9616666666667
+37,592,28.448
+37,593,37.6766666666667
+37,594,38.7773333333333
+37,595,20.8703333333333
+37,596,30.5858333333333
+37,597,34.8191666666667
+37,598,33.3163333333333
+37,599,46.6301666666667
+37,600,27.0721666666667
+37,601,34.1418333333333
+37,602,31.5383333333333
+37,603,32.9353333333333
+37,604,22.352
+37,605,34.9461666666667
+37,606,43.8996666666667
+37,607,34.0571666666667
+37,608,26.9451666666667
+37,609,32.4061666666667
+37,610,30.3953333333333
+37,611,33.3798333333333
+37,612,28.6596666666667
+37,613,32.7448333333333
+37,614,30.3318333333333
+37,615,31.0303333333333
+37,616,27.5801666666667
+37,617,26.3525
+37,618,33.1893333333333
+37,619,32.3003333333333
+37,620,38.0153333333333
+37,621,34.7345
+37,622,20.6798333333333
+37,623,34.8191666666667
+37,624,25.5481666666667
+37,625,29.4851666666667
+37,626,32.4696666666667
+37,627,27.0721666666667
+37,628,33.6973333333333
+37,629,43.6033333333333
+37,630,39.2641666666667
+37,631,29.5275
+37,632,28.2575
+37,633,34.0571666666667
+37,634,34.3111666666667
+37,635,35.4118333333333
+37,636,19.05
+37,637,35.2636666666667
+37,638,30.6705
+37,639,23.622
+37,640,29.6756666666667
+37,641,30.5646666666667
+37,642,37.9095
+37,643,32.7025
+37,644,27.3473333333333
+37,645,32.9353333333333
+37,646,31.496
+37,647,32.131
+37,648,37.2745
+37,649,41.3173333333333
+37,650,33.8031666666667
+37,651,32.004
+37,652,26.2255
+37,653,32.9353333333333
+37,654,45.085
+37,655,32.4696666666667
+37,656,19.4521666666667
+37,657,24.7015
+37,658,31.4113333333333
+37,659,34.0148333333333
+37,660,31.1573333333333
+37,661,32.512
+37,662,30.9033333333333
+37,663,30.734
+37,664,29.718
+37,665,36.957
+37,666,26.3313333333333
+37,667,32.1945
+37,668,32.7871666666667
+37,669,35.5388333333333
+37,670,37.9518333333333
+37,671,24.384
+37,672,28.6596666666667
+37,673,31.3266666666667
+37,674,30.8186666666667
+37,675,31.0515
+37,676,29.591
+37,677,28.194
+37,678,43.4763333333333
+37,679,36.8935
+37,680,23.876
+37,681,44.5346666666667
+37,682,28.575
+37,683,27.3473333333333
+37,684,31.9405
+37,685,38.354
+37,686,30.3953333333333
+37,687,45.0003333333333
+37,688,34.2053333333333
+37,689,26.3948333333333
+37,690,34.9885
+37,691,31.623
+37,692,36.449
+37,693,32.385
+37,694,19.7908333333333
+37,695,27.6013333333333
+37,696,39.9203333333333
+37,697,31.8135
+37,698,43.4128333333333
+37,699,44.8098333333333
+37,700,31.4536666666667
+37,701,39.1583333333333
+37,702,31.8346666666667
+37,703,40.005
+37,704,39.5816666666667
+37,705,30.607
+37,706,38.862
+37,707,31.5806666666667
+37,708,37.5285
+37,709,32.4696666666667
+37,710,31.4113333333333
+37,711,26.1196666666667
+37,712,37.5496666666667
+37,713,27.9823333333333
+37,714,27.9823333333333
+37,715,29.6545
+37,716,33.1893333333333
+37,717,25.0613333333333
+37,718,28.6596666666667
+37,719,38.2481666666667
+37,720,30.9245
+37,721,35.0731666666667
+37,722,36.195
+37,723,23.9606666666667
+37,724,25.146
+37,725,34.798
+37,726,25.4846666666667
+37,727,28.6808333333333
+37,728,24.7226666666667
+37,729,34.925
+37,730,35.8563333333333
+37,731,34.2476666666667
+37,732,51.9006666666667
+37,733,32.8506666666667
+37,734,27.1145
+37,735,27.9611666666667
+37,736,33.909
+37,737,37.465
+37,738,28.0881666666667
+37,739,32.9353333333333
+37,740,35.9621666666667
+37,741,36.5971666666667
+37,742,37.6766666666667
+37,743,23.1351666666667
+37,744,32.3426666666667
+37,745,48.8738333333333
+37,746,31.7711666666667
+37,747,31.2208333333333
+37,748,23.5796666666667
+37,749,32.8506666666667
+37,750,36.957
+37,751,34.9038333333333
+37,752,26.3525
+37,753,34.6921666666667
+37,754,34.1206666666667
+37,755,43.7303333333333
+37,756,42.799
+37,757,29.0195
+37,758,20.2988333333333
+37,759,32.1945
+37,760,36.1315
+37,761,31.9828333333333
+37,762,33.9513333333333
+37,763,23.0081666666667
+37,764,28.1305
+37,765,30.7763333333333
+37,766,29.1465
+37,767,39.3911666666667
+37,768,31.2208333333333
+37,769,24.9131666666667
+37,770,33.147
+37,771,35.5176666666667
+37,772,28.1305
+37,773,36.1738333333333
+37,774,39.2006666666667
+37,775,43.3281666666667
+37,776,27.8553333333333
+37,777,31.115
+37,778,44.5135
+37,779,36.7665
+37,780,28.8501666666667
+37,781,31.4325
+37,782,37.7613333333333
+37,783,42.164
+37,784,27.9611666666667
+37,785,26.0561666666667
+37,786,35.6023333333333
+37,787,29.3158333333333
+37,788,32.258
+37,789,29.5063333333333
+37,790,41.2326666666667
+37,791,29.6121666666667
+37,792,38.0788333333333
+37,793,28.702
+37,794,33.1258333333333
+37,795,33.9513333333333
+37,796,37.084
+37,797,34.8826666666667
+37,798,29.2946666666667
+37,799,31.4325
+37,800,40.5553333333333
+37,801,33.782
+37,802,36.2373333333333
+37,803,36.5336666666667
+37,804,38.6503333333333
+37,805,24.9343333333333
+37,806,23.1351666666667
+37,807,38.3963333333333
+37,808,29.6333333333333
+37,809,35.7293333333333
+37,810,31.1996666666667
+37,811,42.8625
+37,812,22.5848333333333
+37,813,38.2905
+37,814,31.5171666666667
+37,815,30.1413333333333
+37,816,41.1268333333333
+37,817,29.6121666666667
+37,818,35.3271666666667
+37,819,29.4851666666667
+37,820,38.862
+37,821,30.8821666666667
+37,822,29.5063333333333
+37,823,44.6616666666667
+37,824,23.495
+37,825,36.4278333333333
+37,826,33.0623333333333
+37,827,34.671
+37,828,37.8671666666667
+37,829,37.1898333333333
+37,830,27.5801666666667
+37,831,32.2156666666667
+37,832,36.9993333333333
+37,833,35.5811666666667
+37,834,36.5971666666667
+37,835,28.7443333333333
+37,836,34.036
+37,837,23.8971666666667
+37,838,31.4325
+37,839,33.909
+37,840,27.5378333333333
+37,841,32.7871666666667
+37,842,33.1893333333333
+37,843,33.401
+37,844,30.1625
+37,845,25.5693333333333
+37,846,38.0576666666667
+37,847,37.3803333333333
+37,848,45.2966666666667
+37,849,33.7185
+37,850,27.559
+37,851,26.1831666666667
+37,852,31.5383333333333
+37,853,27.432
+37,854,30.3318333333333
+37,855,30.6916666666667
+37,856,36.068
+37,857,28.9983333333333
+37,858,30.3318333333333
+37,859,32.0463333333333
+37,860,42.3333333333333
+37,861,44.3653333333333
+37,862,27.2203333333333
+37,863,24.5745
+37,864,32.004
+37,865,32.1521666666667
+37,866,26.4371666666667
+37,867,25.6328333333333
+37,868,29.21
+37,869,28.9136666666667
+37,870,35.433
+37,871,37.6766666666667
+37,872,33.6126666666667
+37,873,34.4805
+37,874,26.416
+37,875,23.241
+37,876,23.4315
+37,877,32.0675
+37,878,31.9405
+37,879,27.2626666666667
+37,880,36.8088333333333
+37,881,44.1748333333333
+37,882,35.8563333333333
+37,883,29.8238333333333
+37,884,36.7665
+37,885,22.2038333333333
+37,886,42.3545
+37,887,39.6451666666667
+37,888,36.1526666666667
+37,889,31.8558333333333
+37,890,45.212
+37,891,26.9451666666667
+37,892,27.3685
+37,893,27.5378333333333
+37,894,39.8356666666667
+37,895,27.8765
+37,896,26.2466666666667
+37,897,30.0778333333333
+37,898,31.115
+37,899,39.8568333333333
+37,900,24.2358333333333
+37,901,33.8031666666667
+37,902,34.8191666666667
+37,903,32.6601666666667
+37,904,28.829
+37,905,32.9565
+37,906,29.591
+37,907,32.131
+37,908,37.7825
+37,909,25.2095
+37,910,31.4748333333333
+37,911,38.5445
+37,912,35.4965
+37,913,38.7138333333333
+37,914,29.1465
+37,915,28.9771666666667
+37,916,29.8238333333333
+37,917,31.4325
+37,918,25.908
+37,919,29.718
+37,920,33.6126666666667
+37,921,31.242
+37,922,24.9978333333333
+37,923,35.7716666666667
+37,924,37.6766666666667
+37,925,32.3426666666667
+37,926,28.3845
+37,927,28.3633333333333
+37,928,29.1253333333333
+37,929,34.8403333333333
+37,930,24.8073333333333
+37,931,33.1681666666667
+37,932,31.9193333333333
+37,933,37.2956666666667
+37,934,31.623
+37,935,32.5331666666667
+37,936,33.8031666666667
+37,937,21.4206666666667
+37,938,21.1666666666667
+37,939,30.988
+37,940,27.6013333333333
+37,941,29.4428333333333
+37,942,29.7815
+37,943,23.6855
+37,944,36.6395
+37,945,26.162
+37,946,27.6436666666667
+37,947,40.4706666666667
+37,948,30.1413333333333
+37,949,36.6606666666667
+37,950,40.4706666666667
+37,951,27.4108333333333
+37,952,28.1093333333333
+37,953,30.2895
+37,954,29.972
+37,955,32.7871666666667
+37,956,33.3798333333333
+37,957,22.3308333333333
+37,958,41.2961666666667
+37,959,31.4325
+37,960,30.2895
+37,961,34.3535
+37,962,32.131
+37,963,31.2208333333333
+37,964,25.5058333333333
+37,965,31.242
+37,966,37.5073333333333
+37,967,28.2363333333333
+37,968,30.1625
+37,969,30.4376666666667
+37,970,34.5016666666667
+37,971,31.7288333333333
+37,972,38.0153333333333
+37,973,32.1098333333333
+37,974,29.21
+37,975,31.242
+37,976,35.4541666666667
+37,977,43.3493333333333
+37,978,40.2166666666667
+37,979,32.3003333333333
+37,980,28.0881666666667
+37,981,38.862
+37,982,27.686
+37,983,42.7778333333333
+37,984,25.4846666666667
+37,985,38.6503333333333
+37,986,34.7768333333333
+37,987,28.067
+37,988,30.0143333333333
+37,989,38.9678333333333
+37,990,28.7866666666667
+37,991,40.4071666666667
+37,992,25.2306666666667
+37,993,26.1196666666667
+37,994,33.147
+37,995,33.1681666666667
+37,996,28.5538333333333
+37,997,30.9456666666667
+37,998,38.8408333333333
+37,999,29.7603333333333
+37,1000,33.2316666666667
+38,1,20.5951666666667
+38,2,18.3515
+38,3,23.9606666666667
+38,4,19.3886666666667
+38,5,21.4418333333333
+38,6,17.653
+38,7,23.3891666666667
+38,8,25.019
+38,9,24.8285
+38,10,20.5105
+38,11,26.8816666666667
+38,12,25.2941666666667
+38,13,19.0711666666667
+38,14,25.6116666666667
+38,15,25.1883333333333
+38,16,22.5001666666667
+38,17,18.0551666666667
+38,18,28.4691666666667
+38,19,24.003
+38,20,23.1986666666667
+38,21,20.9338333333333
+38,22,23.114
+38,23,22.8176666666667
+38,24,17.907
+38,25,24.5533333333333
+38,26,17.8646666666667
+38,27,21.3571666666667
+38,28,17.4836666666667
+38,29,23.9183333333333
+38,30,25.781
+38,31,23.6431666666667
+38,32,20.6586666666667
+38,33,20.8703333333333
+38,34,25.6116666666667
+38,35,19.685
+38,36,20.4681666666667
+38,37,14.9225
+38,38,19.8755
+38,39,22.1191666666667
+38,40,23.5161666666667
+38,41,27.2626666666667
+38,42,18.6478333333333
+38,43,20.9338333333333
+38,44,22.3943333333333
+38,45,23.3045
+38,46,28.6173333333333
+38,47,24.9978333333333
+38,48,23.114
+38,49,20.2776666666667
+38,50,26.1831666666667
+38,51,17.3566666666667
+38,52,28.956
+38,53,25.2095
+38,54,24.0876666666667
+38,55,24.2781666666667
+38,56,21.2301666666667
+38,57,25.6963333333333
+38,58,26.543
+38,59,24.0453333333333
+38,60,20.2141666666667
+38,61,22.7541666666667
+38,62,24.7438333333333
+38,63,22.606
+38,64,27.3473333333333
+38,65,20.0236666666667
+38,66,26.416
+38,67,22.0556666666667
+38,68,30.6281666666667
+38,69,27.0721666666667
+38,70,25.8233333333333
+38,71,21.9498333333333
+38,72,20.9126666666667
+38,73,20.4681666666667
+38,74,23.6855
+38,75,21.5688333333333
+38,76,26.2678333333333
+38,77,28.8078333333333
+38,78,18.7536666666667
+38,79,19.1981666666667
+38,80,24.2993333333333
+38,81,25.2095
+38,82,27.4743333333333
+38,83,23.2198333333333
+38,84,23.1775
+38,85,18.9653333333333
+38,86,25.1671666666667
+38,87,22.1191666666667
+38,88,20.5951666666667
+38,89,25.5693333333333
+38,90,24.9343333333333
+38,91,24.4475
+38,92,20.193
+38,93,20.3835
+38,94,29.8238333333333
+38,95,26.0773333333333
+38,96,17.9916666666667
+38,97,18.3726666666667
+38,98,23.368
+38,99,23.368
+38,100,20.9126666666667
+38,101,26.162
+38,102,23.114
+38,103,22.5001666666667
+38,104,27.7706666666667
+38,105,23.6008333333333
+38,106,25.019
+38,107,27.559
+38,108,22.5636666666667
+38,109,24.2358333333333
+38,110,20.2141666666667
+38,111,23.6643333333333
+38,112,22.0768333333333
+38,113,22.0556666666667
+38,114,23.6431666666667
+38,115,24.5745
+38,116,22.4366666666667
+38,117,18.8595
+38,118,22.479
+38,119,21.2513333333333
+38,120,23.7066666666667
+38,121,19.4945
+38,122,23.9395
+38,123,21.1031666666667
+38,124,24.511
+38,125,21.2936666666667
+38,126,26.5641666666667
+38,127,22.0345
+38,128,24.6803333333333
+38,129,25.6116666666667
+38,130,26.5218333333333
+38,131,24.4686666666667
+38,132,22.733
+38,133,24.9978333333333
+38,134,21.1243333333333
+38,135,22.4366666666667
+38,136,22.2673333333333
+38,137,28.4268333333333
+38,138,20.5951666666667
+38,139,20.193
+38,140,19.8966666666667
+38,141,19.558
+38,142,25.2518333333333
+38,143,23.9183333333333
+38,144,17.7588333333333
+38,145,22.9023333333333
+38,146,20.6163333333333
+38,147,20.574
+38,148,17.526
+38,149,26.3101666666667
+38,150,20.9761666666667
+38,151,20.066
+38,152,22.3943333333333
+38,153,26.289
+38,154,30.2895
+38,155,24.1088333333333
+38,156,24.3205
+38,157,16.9545
+38,158,23.2833333333333
+38,159,18.4361666666667
+38,160,20.6163333333333
+38,161,20.1718333333333
+38,162,22.6695
+38,163,23.3891666666667
+38,164,24.8708333333333
+38,165,27.1568333333333
+38,166,24.13
+38,167,17.5048333333333
+38,168,18.2033333333333
+38,169,17.526
+38,170,23.876
+38,171,26.2255
+38,172,20.0448333333333
+38,173,15.0918333333333
+38,174,25.8656666666667
+38,175,21.9921666666667
+38,176,21.9498333333333
+38,177,28.2575
+38,178,19.7061666666667
+38,179,26.5853333333333
+38,180,21.1031666666667
+38,181,19.1346666666667
+38,182,23.4526666666667
+38,183,20.7433333333333
+38,184,26.9451666666667
+38,185,19.4945
+38,186,24.2781666666667
+38,187,19.4521666666667
+38,188,25.273
+38,189,23.8336666666667
+38,190,23.4103333333333
+38,191,23.5796666666667
+38,192,26.9451666666667
+38,193,25.1883333333333
+38,194,22.6906666666667
+38,195,19.939
+38,196,22.2038333333333
+38,197,22.4155
+38,198,22.3943333333333
+38,199,23.8971666666667
+38,200,20.5105
+38,201,22.6483333333333
+38,202,23.6643333333333
+38,203,21.3995
+38,204,17.6953333333333
+38,205,20.3835
+38,206,19.4733333333333
+38,207,19.1346666666667
+38,208,22.9023333333333
+38,209,24.1088333333333
+38,210,24.257
+38,211,23.5161666666667
+38,212,23.749
+38,213,20.1295
+38,214,22.7965
+38,215,22.3943333333333
+38,216,23.8336666666667
+38,217,22.606
+38,218,23.9395
+38,219,27.7283333333333
+38,220,22.6906666666667
+38,221,30.3106666666667
+38,222,21.2725
+38,223,21.1878333333333
+38,224,22.5001666666667
+38,225,23.8971666666667
+38,226,21.1455
+38,227,22.5213333333333
+38,228,23.1351666666667
+38,229,25.2095
+38,230,23.8548333333333
+38,231,17.6741666666667
+38,232,21.0608333333333
+38,233,27.2838333333333
+38,234,21.844
+38,235,18.669
+38,236,20.447
+38,237,21.4206666666667
+38,238,21.5265
+38,239,20.6375
+38,240,20.1083333333333
+38,241,23.0081666666667
+38,242,21.3148333333333
+38,243,18.8806666666667
+38,244,23.8548333333333
+38,245,28.194
+38,246,17.9493333333333
+38,247,20.9126666666667
+38,248,24.3628333333333
+38,249,24.4475
+38,250,20.0448333333333
+38,251,22.1615
+38,252,24.638
+38,253,27.6436666666667
+38,254,20.5528333333333
+38,255,21.4418333333333
+38,256,23.9818333333333
+38,257,21.1878333333333
+38,258,17.7165
+38,259,23.495
+38,260,22.7541666666667
+38,261,22.2038333333333
+38,262,26.0561666666667
+38,263,23.9183333333333
+38,264,23.6431666666667
+38,265,19.7485
+38,266,22.2885
+38,267,23.4103333333333
+38,268,28.0035
+38,269,25.6751666666667
+38,270,25.146
+38,271,22.6483333333333
+38,272,26.2043333333333
+38,273,22.4578333333333
+38,274,23.8336666666667
+38,275,26.416
+38,276,12.6576666666667
+38,277,23.0293333333333
+38,278,24.4686666666667
+38,279,21.336
+38,280,21.7805
+38,281,21.6535
+38,282,22.3731666666667
+38,283,20.447
+38,284,21.1455
+38,285,25.146
+38,286,24.384
+38,287,22.9235
+38,288,19.5791666666667
+38,289,25.6751666666667
+38,290,20.8915
+38,291,24.5533333333333
+38,292,21.7381666666667
+38,293,15.748
+38,294,25.2095
+38,295,21.1666666666667
+38,296,27.3896666666667
+38,297,25.8445
+38,298,24.1935
+38,299,25.7175
+38,300,23.6008333333333
+38,301,21.7805
+38,302,24.0876666666667
+38,303,21.9075
+38,304,17.8223333333333
+38,305,20.3835
+38,306,26.2678333333333
+38,307,19.5791666666667
+38,308,21.5053333333333
+38,309,19.7485
+38,310,23.4526666666667
+38,311,23.1351666666667
+38,312,19.939
+38,313,18.8171666666667
+38,314,28.321
+38,315,22.3096666666667
+38,316,24.1723333333333
+38,317,21.4418333333333
+38,318,24.765
+38,319,27.9823333333333
+38,320,22.5848333333333
+38,321,22.1615
+38,322,19.6426666666667
+38,323,16.9756666666667
+38,324,29.5486666666667
+38,325,22.3096666666667
+38,326,24.257
+38,327,23.7066666666667
+38,328,25.0825
+38,329,15.2823333333333
+38,330,27.3261666666667
+38,331,21.6323333333333
+38,332,24.2358333333333
+38,333,24.7861666666667
+38,334,20.6586666666667
+38,335,21.8863333333333
+38,336,20.4893333333333
+38,337,29.4216666666667
+38,338,28.8925
+38,339,23.9606666666667
+38,340,23.6008333333333
+38,341,20.8491666666667
+38,342,20.9338333333333
+38,343,27.1991666666667
+38,344,26.6065
+38,345,22.6271666666667
+38,346,22.5213333333333
+38,347,24.6591666666667
+38,348,18.8806666666667
+38,349,19.8966666666667
+38,350,18.7113333333333
+38,351,21.2725
+38,352,22.3308333333333
+38,353,21.4206666666667
+38,354,23.1563333333333
+38,355,20.8491666666667
+38,356,23.8336666666667
+38,357,21.1666666666667
+38,358,18.1186666666667
+38,359,20.701
+38,360,25.3365
+38,361,25.8656666666667
+38,362,24.1723333333333
+38,363,20.2776666666667
+38,364,26.035
+38,365,25.8021666666667
+38,366,24.8496666666667
+38,367,25.8656666666667
+38,368,22.1191666666667
+38,369,21.0185
+38,370,29.2735
+38,371,28.1728333333333
+38,372,22.6906666666667
+38,373,20.1083333333333
+38,374,27.7918333333333
+38,375,21.5265
+38,376,22.733
+38,377,24.8073333333333
+38,378,26.6276666666667
+38,379,24.257
+38,380,20.7856666666667
+38,381,23.0928333333333
+38,382,17.018
+38,383,23.2198333333333
+38,384,23.1351666666667
+38,385,20.1295
+38,386,27.0086666666667
+38,387,20.8491666666667
+38,388,23.0716666666667
+38,389,23.4526666666667
+38,390,21.4418333333333
+38,391,20.32
+38,392,24.4898333333333
+38,393,22.6695
+38,394,21.6746666666667
+38,395,20.066
+38,396,20.8915
+38,397,25.3153333333333
+38,398,20.2353333333333
+38,399,18.2245
+38,400,22.4155
+38,401,23.8548333333333
+38,402,27.1356666666667
+38,403,20.8703333333333
+38,404,17.0815
+38,405,21.6535
+38,406,22.0768333333333
+38,407,28.9348333333333
+38,408,25.5905
+38,409,20.5528333333333
+38,410,26.5641666666667
+38,411,22.2673333333333
+38,412,22.7753333333333
+38,413,16.0866666666667
+38,414,24.5745
+38,415,21.1243333333333
+38,416,20.701
+38,417,22.8176666666667
+38,418,17.1661666666667
+38,419,21.3783333333333
+38,420,21.7381666666667
+38,421,19.7273333333333
+38,422,22.3943333333333
+38,423,21.2725
+38,424,18.415
+38,425,22.225
+38,426,21.8863333333333
+38,427,17.526
+38,428,23.4526666666667
+38,429,25.1671666666667
+38,430,19.304
+38,431,15.8115
+38,432,24.7861666666667
+38,433,22.9658333333333
+38,434,20.4893333333333
+38,435,20.9973333333333
+38,436,20.193
+38,437,21.0185
+38,438,21.7805
+38,439,26.4583333333333
+38,440,19.177
+38,441,20.3411666666667
+38,442,20.2353333333333
+38,443,25.146
+38,444,21.5688333333333
+38,445,25.7386666666667
+38,446,24.8496666666667
+38,447,18.0551666666667
+38,448,25.8656666666667
+38,449,21.5265
+38,450,21.0608333333333
+38,451,17.145
+38,452,24.4686666666667
+38,453,22.479
+38,454,21.9286666666667
+38,455,18.288
+38,456,21.3995
+38,457,23.368
+38,458,23.8125
+38,459,27.0298333333333
+38,460,28.3845
+38,461,25.1248333333333
+38,462,23.6008333333333
+38,463,33.1893333333333
+38,464,24.2993333333333
+38,465,26.3736666666667
+38,466,17.9281666666667
+38,467,24.9343333333333
+38,468,23.9818333333333
+38,469,22.2673333333333
+38,470,23.8125
+38,471,19.431
+38,472,21.0185
+38,473,22.8176666666667
+38,474,24.2146666666667
+38,475,24.1723333333333
+38,476,20.5951666666667
+38,477,23.0928333333333
+38,478,20.066
+38,479,20.9973333333333
+38,480,20.6375
+38,481,24.3416666666667
+38,482,19.6426666666667
+38,483,19.6215
+38,484,21.209
+38,485,19.3251666666667
+38,486,25.1248333333333
+38,487,22.9658333333333
+38,488,20.6586666666667
+38,489,23.5161666666667
+38,490,26.1196666666667
+38,491,23.5796666666667
+38,492,22.606
+38,493,22.3731666666667
+38,494,23.114
+38,495,19.939
+38,496,25.0825
+38,497,26.3101666666667
+38,498,20.0448333333333
+38,499,20.4681666666667
+38,500,23.7701666666667
+38,501,21.1031666666667
+38,502,28.4903333333333
+38,503,18.7325
+38,504,23.8125
+38,505,20.066
+38,506,21.5476666666667
+38,507,20.4046666666667
+38,508,22.0133333333333
+38,509,27.3261666666667
+38,510,20.5951666666667
+38,511,25.9291666666667
+38,512,22.5848333333333
+38,513,20.0871666666667
+38,514,20.1718333333333
+38,515,23.8125
+38,516,17.6106666666667
+38,517,24.0453333333333
+38,518,21.6746666666667
+38,519,25.273
+38,520,21.1031666666667
+38,521,19.1346666666667
+38,522,24.5956666666667
+38,523,23.9606666666667
+38,524,24.9131666666667
+38,525,20.0871666666667
+38,526,17.3355
+38,527,20.8491666666667
+38,528,18.7536666666667
+38,529,19.8755
+38,530,19.685
+38,531,20.9973333333333
+38,532,23.9606666666667
+38,533,25.6116666666667
+38,534,23.0716666666667
+38,535,19.9813333333333
+38,536,22.0768333333333
+38,537,18.7113333333333
+38,538,26.7546666666667
+38,539,24.9555
+38,540,23.3891666666667
+38,541,25.6328333333333
+38,542,21.6323333333333
+38,543,20.1718333333333
+38,544,26.7123333333333
+38,545,21.9921666666667
+38,546,24.892
+38,547,20.6586666666667
+38,548,21.0185
+38,549,26.8393333333333
+38,550,24.9555
+38,551,22.4578333333333
+38,552,18.2456666666667
+38,553,20.5105
+38,554,21.5476666666667
+38,555,20.828
+38,556,24.13
+38,557,26.4583333333333
+38,558,22.0345
+38,559,17.2085
+38,560,21.5688333333333
+38,561,24.9131666666667
+38,562,14.8801666666667
+38,563,23.7278333333333
+38,564,27.3261666666667
+38,565,29.9931666666667
+38,566,22.7118333333333
+38,567,19.0711666666667
+38,568,23.749
+38,569,26.1196666666667
+38,570,20.1083333333333
+38,571,23.4526666666667
+38,572,19.3463333333333
+38,573,32.0463333333333
+38,574,24.7438333333333
+38,575,20.1718333333333
+38,576,21.844
+38,577,24.4475
+38,578,27.3685
+38,579,17.78
+38,580,21.0608333333333
+38,581,27.432
+38,582,22.6906666666667
+38,583,17.3355
+38,584,22.7753333333333
+38,585,13.716
+38,586,22.3096666666667
+38,587,21.3148333333333
+38,588,22.9658333333333
+38,589,23.6431666666667
+38,590,19.4733333333333
+38,591,23.9606666666667
+38,592,24.9343333333333
+38,593,22.1191666666667
+38,594,20.193
+38,595,23.3468333333333
+38,596,26.2043333333333
+38,597,21.971
+38,598,20.7433333333333
+38,599,23.3256666666667
+38,600,19.2828333333333
+38,601,26.4795
+38,602,22.352
+38,603,25.9291666666667
+38,604,27.686
+38,605,23.2198333333333
+38,606,20.6163333333333
+38,607,24.2781666666667
+38,608,21.5688333333333
+38,609,21.717
+38,610,24.765
+38,611,21.3783333333333
+38,612,21.6746666666667
+38,613,20.3411666666667
+38,614,24.2993333333333
+38,615,18.8171666666667
+38,616,26.0773333333333
+38,617,21.2301666666667
+38,618,28.6173333333333
+38,619,30.4165
+38,620,17.6318333333333
+38,621,23.1775
+38,622,26.0773333333333
+38,623,22.6483333333333
+38,624,21.082
+38,625,22.86
+38,626,22.5636666666667
+38,627,18.4361666666667
+38,628,22.9446666666667
+38,629,23.749
+38,630,20.8703333333333
+38,631,25.0825
+38,632,21.9498333333333
+38,633,18.6266666666667
+38,634,22.0768333333333
+38,635,25.7598333333333
+38,636,19.3886666666667
+38,637,24.0876666666667
+38,638,22.5213333333333
+38,639,18.3938333333333
+38,640,17.1238333333333
+38,641,15.0283333333333
+38,642,22.8388333333333
+38,643,23.9183333333333
+38,644,25.0401666666667
+38,645,24.0241666666667
+38,646,29.0195
+38,647,25.8445
+38,648,21.6746666666667
+38,649,21.9075
+38,650,22.2885
+38,651,21.8228333333333
+38,652,22.1826666666667
+38,653,18.8383333333333
+38,654,22.1826666666667
+38,655,18.4996666666667
+38,656,24.4686666666667
+38,657,20.3623333333333
+38,658,19.7273333333333
+38,659,24.8073333333333
+38,660,21.3783333333333
+38,661,20.7433333333333
+38,662,22.4578333333333
+38,663,19.4945
+38,664,19.2193333333333
+38,665,20.4258333333333
+38,666,29.3793333333333
+38,667,24.8073333333333
+38,668,21.463
+38,669,22.987
+38,670,25.3576666666667
+38,671,30.9245
+38,672,20.1718333333333
+38,673,22.6906666666667
+38,674,22.5636666666667
+38,675,22.8388333333333
+38,676,27.178
+38,677,21.971
+38,678,19.2193333333333
+38,679,24.0665
+38,680,23.7701666666667
+38,681,16.3195
+38,682,18.7748333333333
+38,683,19.2616666666667
+38,684,23.0928333333333
+38,685,18.2456666666667
+38,686,20.3411666666667
+38,687,23.4738333333333
+38,688,25.0825
+38,689,22.1403333333333
+38,690,23.6431666666667
+38,691,20.3835
+38,692,20.0025
+38,693,19.1135
+38,694,22.098
+38,695,21.5053333333333
+38,696,20.3835
+38,697,18.8806666666667
+38,698,23.9395
+38,699,25.4211666666667
+38,700,25.4635
+38,701,25.3576666666667
+38,702,21.5476666666667
+38,703,20.2988333333333
+38,704,23.5373333333333
+38,705,24.8285
+38,706,24.7438333333333
+38,707,22.5213333333333
+38,708,21.6958333333333
+38,709,15.1976666666667
+38,710,23.6643333333333
+38,711,16.4888333333333
+38,712,22.8388333333333
+38,713,20.7221666666667
+38,714,19.1558333333333
+38,715,25.3788333333333
+38,716,25.019
+38,717,26.8181666666667
+38,718,24.5533333333333
+38,719,23.6643333333333
+38,720,22.9658333333333
+38,721,28.2786666666667
+38,722,30.353
+38,723,21.3148333333333
+38,724,24.2146666666667
+38,725,20.7856666666667
+38,726,24.638
+38,727,17.2931666666667
+38,728,21.1666666666667
+38,729,18.8171666666667
+38,730,18.4573333333333
+38,731,22.4366666666667
+38,732,22.0556666666667
+38,733,27.3473333333333
+38,734,24.1935
+38,735,24.0241666666667
+38,736,25.4846666666667
+38,737,22.6695
+38,738,24.2781666666667
+38,739,15.9173333333333
+38,740,24.257
+38,741,25.0401666666667
+38,742,28.7443333333333
+38,743,23.241
+38,744,22.5425
+38,745,17.3566666666667
+38,746,22.5213333333333
+38,747,23.4103333333333
+38,748,21.8016666666667
+38,749,25.5481666666667
+38,750,28.702
+38,751,24.7226666666667
+38,752,23.8971666666667
+38,753,24.2358333333333
+38,754,23.7278333333333
+38,755,21.3995
+38,756,17.399
+38,757,27.4743333333333
+38,758,15.3881666666667
+38,759,18.3938333333333
+38,760,20.6163333333333
+38,761,22.9235
+38,762,23.114
+38,763,16.4041666666667
+38,764,22.987
+38,765,28.3845
+38,766,26.9028333333333
+38,767,21.2301666666667
+38,768,24.9766666666667
+38,769,23.4103333333333
+38,770,26.8816666666667
+38,771,22.3731666666667
+38,772,22.0556666666667
+38,773,19.8966666666667
+38,774,18.415
+38,775,25.5905
+38,776,24.0876666666667
+38,777,24.8708333333333
+38,778,23.2833333333333
+38,779,23.7066666666667
+38,780,22.86
+38,781,17.907
+38,782,24.7015
+38,783,18.4785
+38,784,25.0613333333333
+38,785,25.2518333333333
+38,786,22.7965
+38,787,20.4258333333333
+38,788,18.2033333333333
+38,789,22.8811666666667
+38,790,26.162
+38,791,16.129
+38,792,25.1671666666667
+38,793,21.4841666666667
+38,794,22.5001666666667
+38,795,26.543
+38,796,24.638
+38,797,23.4526666666667
+38,798,25.1248333333333
+38,799,23.2198333333333
+38,800,25.781
+38,801,19.0288333333333
+38,802,19.8331666666667
+38,803,24.638
+38,804,21.7381666666667
+38,805,23.8548333333333
+38,806,22.2038333333333
+38,807,24.2993333333333
+38,808,26.0773333333333
+38,809,25.0613333333333
+38,810,23.6855
+38,811,23.6008333333333
+38,812,18.9018333333333
+38,813,24.8708333333333
+38,814,20.2988333333333
+38,815,23.5585
+38,816,23.4103333333333
+38,817,18.161
+38,818,21.5476666666667
+38,819,22.6906666666667
+38,820,23.0081666666667
+38,821,23.5796666666667
+38,822,25.3365
+38,823,22.1403333333333
+38,824,18.0128333333333
+38,825,23.0293333333333
+38,826,26.6065
+38,827,24.3416666666667
+38,828,20.9761666666667
+38,829,23.6431666666667
+38,830,26.4583333333333
+38,831,22.9658333333333
+38,832,26.162
+38,833,21.209
+38,834,23.4315
+38,835,23.6643333333333
+38,836,24.8285
+38,837,22.3731666666667
+38,838,23.9606666666667
+38,839,16.6581666666667
+38,840,21.717
+38,841,22.5848333333333
+38,842,23.6643333333333
+38,843,21.5688333333333
+38,844,23.1775
+38,845,23.5161666666667
+38,846,21.0185
+38,847,26.1408333333333
+38,848,16.3195
+38,849,24.3416666666667
+38,850,24.4686666666667
+38,851,20.6163333333333
+38,852,26.0561666666667
+38,853,20.7856666666667
+38,854,21.336
+38,855,27.1356666666667
+38,856,20.5105
+38,857,24.9766666666667
+38,858,22.225
+38,859,20.9338333333333
+38,860,29.1041666666667
+38,861,23.3256666666667
+38,862,19.4945
+38,863,24.0876666666667
+38,864,16.2983333333333
+38,865,23.3891666666667
+38,866,21.971
+38,867,22.3096666666667
+38,868,23.4526666666667
+38,869,23.114
+38,870,22.2461666666667
+38,871,23.2833333333333
+38,872,26.6488333333333
+38,873,22.606
+38,874,22.4578333333333
+38,875,21.9286666666667
+38,876,17.4836666666667
+38,877,20.5105
+38,878,24.8285
+38,879,19.7696666666667
+38,880,28.4056666666667
+38,881,17.8646666666667
+38,882,18.4573333333333
+38,883,20.574
+38,884,16.7005
+38,885,21.6746666666667
+38,886,13.9911666666667
+38,887,24.8073333333333
+38,888,26.1196666666667
+38,889,21.9498333333333
+38,890,21.1455
+38,891,22.6483333333333
+38,892,23.0293333333333
+38,893,20.8491666666667
+38,894,26.3101666666667
+38,895,22.1403333333333
+38,896,21.7381666666667
+38,897,23.3468333333333
+38,898,18.6901666666667
+38,899,19.7485
+38,900,18.9653333333333
+38,901,26.2255
+38,902,18.2456666666667
+38,903,19.2193333333333
+38,904,22.0345
+38,905,23.7278333333333
+38,906,18.7325
+38,907,21.5265
+38,908,19.0711666666667
+38,909,23.0293333333333
+38,910,23.749
+38,911,26.0773333333333
+38,912,20.6375
+38,913,22.9658333333333
+38,914,21.59
+38,915,21.5053333333333
+38,916,19.812
+38,917,21.0608333333333
+38,918,18.0128333333333
+38,919,23.4315
+38,920,18.0551666666667
+38,921,24.6803333333333
+38,922,29.9508333333333
+38,923,22.2461666666667
+38,924,22.3096666666667
+38,925,27.2626666666667
+38,926,26.162
+38,927,24.2781666666667
+38,928,19.812
+38,929,24.638
+38,930,21.0608333333333
+38,931,22.1191666666667
+38,932,20.7856666666667
+38,933,29.464
+38,934,22.1191666666667
+38,935,21.5265
+38,936,24.4898333333333
+38,937,23.2621666666667
+38,938,25.7598333333333
+38,939,28.067
+38,940,23.3468333333333
+38,941,27.7283333333333
+38,942,23.1351666666667
+38,943,26.4795
+38,944,24.257
+38,945,24.7226666666667
+38,946,17.0391666666667
+38,947,27.051
+38,948,24.8285
+38,949,25.2518333333333
+38,950,20.7221666666667
+38,951,19.5791666666667
+38,952,22.6483333333333
+38,953,25.9291666666667
+38,954,20.7856666666667
+38,955,17.7588333333333
+38,956,23.241
+38,957,20.6375
+38,958,23.3045
+38,959,23.1986666666667
+38,960,16.2771666666667
+38,961,24.7438333333333
+38,962,22.3943333333333
+38,963,20.9338333333333
+38,964,22.86
+38,965,26.1408333333333
+38,966,18.161
+38,967,21.0608333333333
+38,968,26.6065
+38,969,20.2776666666667
+38,970,18.5843333333333
+38,971,31.4536666666667
+38,972,22.2038333333333
+38,973,23.749
+38,974,20.2565
+38,975,23.0081666666667
+38,976,24.4263333333333
+38,977,22.2461666666667
+38,978,24.3628333333333
+38,979,18.6266666666667
+38,980,23.7066666666667
+38,981,25.7386666666667
+38,982,25.908
+38,983,20.8915
+38,984,28.575
+38,985,19.1558333333333
+38,986,19.05
+38,987,20.8703333333333
+38,988,23.1775
+38,989,24.13
+38,990,26.9875
+38,991,21.8016666666667
+38,992,19.6638333333333
+38,993,18.2456666666667
+38,994,24.1511666666667
+38,995,22.5213333333333
+38,996,23.7913333333333
+38,997,21.1455
+38,998,23.749
+38,999,25.3788333333333
+38,1000,16.1713333333333
+39,1,33.2951666666667
+39,2,36.83
+39,3,35.7293333333333
+39,4,37.1898333333333
+39,5,33.0411666666667
+39,6,34.3535
+39,7,28.4056666666667
+39,8,25.7598333333333
+39,9,28.194
+39,10,31.0091666666667
+39,11,31.4748333333333
+39,12,32.4908333333333
+39,13,32.4485
+39,14,28.4691666666667
+39,15,28.4691666666667
+39,16,28.0035
+39,17,32.8083333333333
+39,18,26.4371666666667
+39,19,28.3633333333333
+39,20,34.4593333333333
+39,21,29.0406666666667
+39,22,36.83
+39,23,37.4438333333333
+39,24,33.274
+39,25,35.179
+39,26,40.0685
+39,27,29.5486666666667
+39,28,31.877
+39,29,34.3958333333333
+39,30,26.8393333333333
+39,31,31.8558333333333
+39,32,26.9451666666667
+39,33,33.3586666666667
+39,34,34.6075
+39,35,33.9513333333333
+39,36,30.861
+39,37,39.2006666666667
+39,38,28.1728333333333
+39,39,26.3736666666667
+39,40,29.2946666666667
+39,41,27.1568333333333
+39,42,23.0928333333333
+39,43,38.5656666666667
+39,44,29.1676666666667
+39,45,31.5383333333333
+39,46,33.3375
+39,47,30.353
+39,48,32.0886666666667
+39,49,24.9555
+39,50,28.1305
+39,51,27.1356666666667
+39,52,36.0468333333333
+39,53,30.8186666666667
+39,54,34.7133333333333
+39,55,34.2265
+39,56,33.4433333333333
+39,57,28.5961666666667
+39,58,30.6916666666667
+39,59,34.9885
+39,60,23.4738333333333
+39,61,37.6131666666667
+39,62,29.0406666666667
+39,63,21.8228333333333
+39,64,34.7345
+39,65,23.5796666666667
+39,66,27.2203333333333
+39,67,24.7015
+39,68,31.4113333333333
+39,69,28.9983333333333
+39,70,33.0623333333333
+39,71,33.7185
+39,72,28.321
+39,73,37.5285
+39,74,34.4381666666667
+39,75,23.7701666666667
+39,76,29.6968333333333
+39,77,34.925
+39,78,30.1201666666667
+39,79,35.6658333333333
+39,80,27.2415
+39,81,28.829
+39,82,30.988
+39,83,24.2358333333333
+39,84,32.7871666666667
+39,85,29.6968333333333
+39,86,31.0303333333333
+39,87,31.75
+39,88,30.607
+39,89,29.8238333333333
+39,90,27.559
+39,91,28.4056666666667
+39,92,34.798
+39,93,30.3318333333333
+39,94,36.195
+39,95,34.1418333333333
+39,96,33.0411666666667
+39,97,34.6286666666667
+39,98,29.8026666666667
+39,99,28.0881666666667
+39,100,31.4325
+39,101,25.654
+39,102,39.8568333333333
+39,103,32.0675
+39,104,28.3633333333333
+39,105,28.6808333333333
+39,106,27.9188333333333
+39,107,39.0101666666667
+39,108,31.6441666666667
+39,109,32.131
+39,110,35.9833333333333
+39,111,31.6653333333333
+39,112,31.5383333333333
+39,113,25.6751666666667
+39,114,30.2048333333333
+39,115,27.3685
+39,116,24.2146666666667
+39,117,29.5063333333333
+39,118,30.6916666666667
+39,119,34.417
+39,120,32.1098333333333
+39,121,34.544
+39,122,30.4588333333333
+39,123,35.687
+39,124,28.194
+39,125,29.4005
+39,126,33.8878333333333
+39,127,28.4268333333333
+39,128,32.5755
+39,129,29.8661666666667
+39,130,34.6921666666667
+39,131,30.1625
+39,132,36.3643333333333
+39,133,35.433
+39,134,25.3153333333333
+39,135,33.655
+39,136,33.6761666666667
+39,137,27.3896666666667
+39,138,34.8615
+39,139,26.8393333333333
+39,140,34.7133333333333
+39,141,28.8925
+39,142,30.7551666666667
+39,143,29.8026666666667
+39,144,26.543
+39,145,37.1051666666667
+39,146,25.0825
+39,147,29.7603333333333
+39,148,29.4216666666667
+39,149,25.908
+39,150,32.4696666666667
+39,151,30.6493333333333
+39,152,32.3003333333333
+39,153,29.8873333333333
+39,154,28.0035
+39,155,32.8718333333333
+39,156,29.21
+39,157,27.9188333333333
+39,158,27.7071666666667
+39,159,28.5326666666667
+39,160,31.0726666666667
+39,161,29.6121666666667
+39,162,35.4541666666667
+39,163,30.7128333333333
+39,164,36.3855
+39,165,25.9291666666667
+39,166,33.02
+39,167,19.2828333333333
+39,168,24.8285
+39,169,31.6865
+39,170,28.3845
+39,171,26.2466666666667
+39,172,28.2363333333333
+39,173,28.3421666666667
+39,174,40.5341666666667
+39,175,24.0665
+39,176,25.7175
+39,177,33.909
+39,178,28.4903333333333
+39,179,29.972
+39,180,30.9456666666667
+39,181,30.1201666666667
+39,182,32.7025
+39,183,31.75
+39,184,33.2105
+39,185,28.1516666666667
+39,186,36.0045
+39,187,37.4015
+39,188,39.2218333333333
+39,189,27.6225
+39,190,38.5445
+39,191,33.782
+39,192,34.544
+39,193,34.0148333333333
+39,194,31.7923333333333
+39,195,27.559
+39,196,30.6281666666667
+39,197,30.2471666666667
+39,198,23.0081666666667
+39,199,29.083
+39,200,31.2208333333333
+39,201,22.098
+39,202,30.734
+39,203,32.8083333333333
+39,204,23.7913333333333
+39,205,30.5646666666667
+39,206,38.5445
+39,207,32.4273333333333
+39,208,30.5223333333333
+39,209,35.687
+39,210,30.2895
+39,211,35.941
+39,212,25.7175
+39,213,32.639
+39,214,25.0825
+39,215,30.7128333333333
+39,216,28.5115
+39,217,31.7076666666667
+39,218,28.1093333333333
+39,219,36.5971666666667
+39,220,31.3478333333333
+39,221,36.449
+39,222,39.8568333333333
+39,223,30.9456666666667
+39,224,29.1253333333333
+39,225,29.1041666666667
+39,226,28.9983333333333
+39,227,33.2528333333333
+39,228,36.8723333333333
+39,229,30.2471666666667
+39,230,35.7505
+39,231,31.1361666666667
+39,232,32.512
+39,233,25.908
+39,234,29.1888333333333
+39,235,27.813
+39,236,33.8878333333333
+39,237,37.1475
+39,238,39.4335
+39,239,24.0665
+39,240,36.703
+39,241,33.8878333333333
+39,242,32.2156666666667
+39,243,28.4691666666667
+39,244,27.3261666666667
+39,245,27.305
+39,246,26.1196666666667
+39,247,36.2161666666667
+39,248,29.9296666666667
+39,249,27.1356666666667
+39,250,35.6235
+39,251,26.2043333333333
+39,252,37.465
+39,253,23.0293333333333
+39,254,22.733
+39,255,31.0515
+39,256,34.2053333333333
+39,257,29.7391666666667
+39,258,35.433
+39,259,35.2848333333333
+39,260,33.401
+39,261,35.052
+39,262,36.2796666666667
+39,263,31.496
+39,264,31.9616666666667
+39,265,33.2951666666667
+39,266,33.8878333333333
+39,267,36.6183333333333
+39,268,33.4856666666667
+39,269,22.1615
+39,270,32.9353333333333
+39,271,33.909
+39,272,35.7293333333333
+39,273,34.6921666666667
+39,274,28.6808333333333
+39,275,25.4423333333333
+39,276,24.7438333333333
+39,277,39.0525
+39,278,27.813
+39,279,25.5905
+39,280,34.0148333333333
+39,281,29.0618333333333
+39,282,29.9931666666667
+39,283,29.0618333333333
+39,284,33.3375
+39,285,30.7128333333333
+39,286,29.4851666666667
+39,287,25.6328333333333
+39,288,26.7546666666667
+39,289,36.9781666666667
+39,290,29.7603333333333
+39,291,24.7438333333333
+39,292,28.1516666666667
+39,293,33.1258333333333
+39,294,36.3008333333333
+39,295,35.7928333333333
+39,296,26.9451666666667
+39,297,27.8341666666667
+39,298,32.9353333333333
+39,299,32.3003333333333
+39,300,31.8346666666667
+39,301,21.463
+39,302,32.893
+39,303,27.2626666666667
+39,304,34.5651666666667
+39,305,32.1521666666667
+39,306,32.9988333333333
+39,307,32.4273333333333
+39,308,33.7185
+39,309,32.5543333333333
+39,310,30.3741666666667
+39,311,24.0665
+39,312,33.2528333333333
+39,313,32.1098333333333
+39,314,36.4278333333333
+39,315,26.4583333333333
+39,316,28.0458333333333
+39,317,28.3421666666667
+39,318,33.1681666666667
+39,319,24.9555
+39,320,31.9405
+39,321,28.5538333333333
+39,322,23.1563333333333
+39,323,31.4325
+39,324,27.6225
+39,325,26.3525
+39,326,29.972
+39,327,33.8243333333333
+39,328,32.2791666666667
+39,329,36.4278333333333
+39,330,28.829
+39,331,28.8925
+39,332,29.5275
+39,333,27.4743333333333
+39,334,35.3271666666667
+39,335,33.8878333333333
+39,336,27.7071666666667
+39,337,30.4376666666667
+39,338,30.6281666666667
+39,339,25.0613333333333
+39,340,26.7758333333333
+39,341,30.5858333333333
+39,342,32.9565
+39,343,38.4386666666667
+39,344,30.4165
+39,345,30.2683333333333
+39,346,31.5383333333333
+39,347,29.9085
+39,348,29.6968333333333
+39,349,32.893
+39,350,25.019
+39,351,39.2641666666667
+39,352,29.6333333333333
+39,353,34.8403333333333
+39,354,29.1888333333333
+39,355,26.0985
+39,356,26.924
+39,357,34.4805
+39,358,32.5966666666667
+39,359,30.9033333333333
+39,360,21.1455
+39,361,27.4955
+39,362,28.194
+39,363,32.0675
+39,364,28.9983333333333
+39,365,29.4428333333333
+39,366,30.7975
+39,367,32.4908333333333
+39,368,33.8243333333333
+39,369,26.035
+39,370,32.5966666666667
+39,371,30.607
+39,372,36.0468333333333
+39,373,35.052
+39,374,32.0886666666667
+39,375,23.114
+39,376,36.0468333333333
+39,377,24.7015
+39,378,35.3906666666667
+39,379,29.3581666666667
+39,380,38.0153333333333
+39,381,33.7608333333333
+39,382,26.9663333333333
+39,383,29.0406666666667
+39,384,30.8398333333333
+39,385,40.0685
+39,386,35.2848333333333
+39,387,33.1258333333333
+39,388,32.1521666666667
+39,389,28.0881666666667
+39,390,27.9188333333333
+39,391,30.2683333333333
+39,392,30.7975
+39,393,26.0561666666667
+39,394,30.8186666666667
+39,395,27.1356666666667
+39,396,31.9405
+39,397,27.0933333333333
+39,398,29.3158333333333
+39,399,23.0716666666667
+39,400,33.02
+39,401,26.7758333333333
+39,402,28.1728333333333
+39,403,31.3478333333333
+39,404,28.9983333333333
+39,405,29.8873333333333
+39,406,30.8186666666667
+39,407,25.5481666666667
+39,408,25.1883333333333
+39,409,32.2368333333333
+39,410,28.2151666666667
+39,411,26.9875
+39,412,31.7923333333333
+39,413,30.1836666666667
+39,414,31.0515
+39,415,30.5435
+39,416,35.9198333333333
+39,417,30.4588333333333
+39,418,31.5595
+39,419,33.909
+39,420,32.7871666666667
+39,421,35.5388333333333
+39,422,22.7965
+39,423,37.465
+39,424,34.5228333333333
+39,425,31.9405
+39,426,35.8563333333333
+39,427,29.972
+39,428,25.6751666666667
+39,429,25.3365
+39,430,27.3473333333333
+39,431,37.0628333333333
+39,432,28.1093333333333
+39,433,28.7443333333333
+39,434,25.8445
+39,435,33.147
+39,436,29.9508333333333
+39,437,29.2523333333333
+39,438,31.7288333333333
+39,439,24.4475
+39,440,27.432
+39,441,31.4325
+39,442,37.9306666666667
+39,443,32.131
+39,444,32.8718333333333
+39,445,30.7975
+39,446,32.9353333333333
+39,447,24.5956666666667
+39,448,31.1996666666667
+39,449,23.114
+39,450,32.7025
+39,451,27.9823333333333
+39,452,23.3256666666667
+39,453,35.8351666666667
+39,454,32.8083333333333
+39,455,33.9513333333333
+39,456,33.8455
+39,457,29.845
+39,458,39.8145
+39,459,36.1526666666667
+39,460,38.2481666666667
+39,461,28.1728333333333
+39,462,30.9033333333333
+39,463,36.576
+39,464,36.0891666666667
+39,465,33.4856666666667
+39,466,26.2678333333333
+39,467,39.3276666666667
+39,468,29.2735
+39,469,36.1103333333333
+39,470,27.2838333333333
+39,471,24.7015
+39,472,25.654
+39,473,32.3215
+39,474,31.0515
+39,475,28.067
+39,476,33.9301666666667
+39,477,36.2373333333333
+39,478,27.4531666666667
+39,479,33.9301666666667
+39,480,30.988
+39,481,28.4268333333333
+39,482,32.131
+39,483,29.6333333333333
+39,484,29.7391666666667
+39,485,34.8403333333333
+39,486,30.4165
+39,487,28.956
+39,488,27.0086666666667
+39,489,32.0886666666667
+39,490,28.575
+39,491,26.9663333333333
+39,492,26.1831666666667
+39,493,31.2208333333333
+39,494,28.8501666666667
+39,495,32.2791666666667
+39,496,32.1945
+39,497,34.7556666666667
+39,498,25.1883333333333
+39,499,27.8341666666667
+39,500,32.385
+39,501,29.3158333333333
+39,502,26.035
+39,503,26.4583333333333
+39,504,23.9183333333333
+39,505,30.1625
+39,506,28.702
+39,507,30.6705
+39,508,28.8713333333333
+39,509,38.1211666666667
+39,510,29.5275
+39,511,29.6333333333333
+39,512,29.8661666666667
+39,513,33.4645
+39,514,30.607
+39,515,31.5806666666667
+39,516,33.3798333333333
+39,517,28.702
+39,518,31.7288333333333
+39,519,23.9606666666667
+39,520,23.2198333333333
+39,521,32.5331666666667
+39,522,28.6385
+39,523,25.6328333333333
+39,524,29.4851666666667
+39,525,34.4381666666667
+39,526,27.8765
+39,527,36.0045
+39,528,32.1098333333333
+39,529,31.6865
+39,530,26.9451666666667
+39,531,26.1196666666667
+39,532,25.2518333333333
+39,533,32.9353333333333
+39,534,25.8656666666667
+39,535,33.7608333333333
+39,536,28.448
+39,537,27.305
+39,538,27.432
+39,539,33.2105
+39,540,31.8346666666667
+39,541,29.0195
+39,542,35.8986666666667
+39,543,31.0726666666667
+39,544,31.8981666666667
+39,545,25.4423333333333
+39,546,34.2265
+39,547,29.8238333333333
+39,548,33.909
+39,549,31.4748333333333
+39,550,24.6803333333333
+39,551,31.115
+39,552,30.5858333333333
+39,553,34.163
+39,554,26.416
+39,555,29.2735
+39,556,40.9363333333333
+39,557,30.9668333333333
+39,558,30.5011666666667
+39,559,29.7815
+39,560,30.3741666666667
+39,561,34.2688333333333
+39,562,27.0086666666667
+39,563,29.5275
+39,564,36.2373333333333
+39,565,23.5161666666667
+39,566,26.5641666666667
+39,567,31.6441666666667
+39,568,22.6483333333333
+39,569,30.48
+39,570,30.7763333333333
+39,571,29.7391666666667
+39,572,29.9508333333333
+39,573,28.829
+39,574,34.925
+39,575,27.1145
+39,576,30.3318333333333
+39,577,28.956
+39,578,27.6648333333333
+39,579,28.4268333333333
+39,580,30.353
+39,581,27.2626666666667
+39,582,37.9306666666667
+39,583,26.416
+39,584,24.9978333333333
+39,585,27.94
+39,586,33.3586666666667
+39,587,40.3436666666667
+39,588,23.876
+39,589,22.3308333333333
+39,590,29.4216666666667
+39,591,38.1846666666667
+39,592,27.3896666666667
+39,593,29.8238333333333
+39,594,30.0143333333333
+39,595,26.797
+39,596,26.9663333333333
+39,597,28.1516666666667
+39,598,33.5703333333333
+39,599,37.3803333333333
+39,600,25.3153333333333
+39,601,34.0783333333333
+39,602,34.0571666666667
+39,603,40.1955
+39,604,29.5063333333333
+39,605,27.0933333333333
+39,606,33.909
+39,607,31.242
+39,608,27.9823333333333
+39,609,35.2848333333333
+39,610,37.1475
+39,611,41.8253333333333
+39,612,29.5698333333333
+39,613,41.6136666666667
+39,614,25.6963333333333
+39,615,32.4908333333333
+39,616,31.2208333333333
+39,617,24.638
+39,618,24.2358333333333
+39,619,30.0143333333333
+39,620,24.8496666666667
+39,621,21.9075
+39,622,24.4263333333333
+39,623,31.6018333333333
+39,624,33.7185
+39,625,34.163
+39,626,30.48
+39,627,33.7608333333333
+39,628,33.1258333333333
+39,629,34.163
+39,630,29.2735
+39,631,33.9936666666667
+39,632,39.8356666666667
+39,633,37.084
+39,634,33.2528333333333
+39,635,26.7123333333333
+39,636,29.4216666666667
+39,637,34.5863333333333
+39,638,27.8341666666667
+39,639,31.9828333333333
+39,640,30.0778333333333
+39,641,36.1315
+39,642,23.368
+39,643,26.8605
+39,644,32.4273333333333
+39,645,29.1888333333333
+39,646,32.8506666666667
+39,647,30.734
+39,648,27.1356666666667
+39,649,26.1831666666667
+39,650,26.6065
+39,651,23.7701666666667
+39,652,37.211
+39,653,29.9296666666667
+39,654,30.6493333333333
+39,655,28.7443333333333
+39,656,23.876
+39,657,31.2631666666667
+39,658,28.7866666666667
+39,659,32.893
+39,660,29.5486666666667
+39,661,31.5806666666667
+39,662,27.0933333333333
+39,663,30.3953333333333
+39,664,26.6911666666667
+39,665,26.4371666666667
+39,666,28.6173333333333
+39,667,32.3426666666667
+39,668,33.8031666666667
+39,669,30.2895
+39,670,29.5275
+39,671,29.2735
+39,672,30.4165
+39,673,26.3948333333333
+39,674,24.2358333333333
+39,675,35.7293333333333
+39,676,33.6338333333333
+39,677,31.9193333333333
+39,678,29.3581666666667
+39,679,33.8031666666667
+39,680,35.433
+39,681,26.9663333333333
+39,682,31.1785
+39,683,38.0153333333333
+39,684,24.511
+39,685,30.0566666666667
+39,686,27.1991666666667
+39,687,27.9188333333333
+39,688,24.892
+39,689,30.7763333333333
+39,690,32.1733333333333
+39,691,30.607
+39,692,24.7226666666667
+39,693,29.3158333333333
+39,694,29.337
+39,695,26.5006666666667
+39,696,27.8976666666667
+39,697,26.6065
+39,698,28.6173333333333
+39,699,26.416
+39,700,32.1521666666667
+39,701,28.2151666666667
+39,702,37.7401666666667
+39,703,38.2481666666667
+39,704,33.3798333333333
+39,705,35.2213333333333
+39,706,29.3158333333333
+39,707,31.1361666666667
+39,708,20.066
+39,709,32.3215
+39,710,31.5595
+39,711,33.4856666666667
+39,712,28.0035
+39,713,22.3096666666667
+39,714,36.1103333333333
+39,715,35.2425
+39,716,25.9291666666667
+39,717,26.3313333333333
+39,718,26.5006666666667
+39,719,32.004
+39,720,33.0623333333333
+39,721,33.9301666666667
+39,722,31.6018333333333
+39,723,24.5533333333333
+39,724,33.8455
+39,725,24.9766666666667
+39,726,28.4056666666667
+39,727,25.273
+39,728,32.639
+39,729,33.3375
+39,730,33.3163333333333
+39,731,33.2105
+39,732,29.1041666666667
+39,733,31.5595
+39,734,33.0623333333333
+39,735,31.0726666666667
+39,736,27.6013333333333
+39,737,27.2626666666667
+39,738,28.2151666666667
+39,739,33.7185
+39,740,29.7603333333333
+39,741,30.2471666666667
+39,742,28.2575
+39,743,32.5755
+39,744,28.6596666666667
+39,745,34.417
+39,746,24.892
+39,747,30.1836666666667
+39,748,32.8295
+39,749,29.2735
+39,750,35.8986666666667
+39,751,23.1351666666667
+39,752,31.9193333333333
+39,753,27.305
+39,754,32.8506666666667
+39,755,28.5961666666667
+39,756,35.2001666666667
+39,757,31.369
+39,758,26.6276666666667
+39,759,26.035
+39,760,27.2415
+39,761,35.6446666666667
+39,762,28.829
+39,763,26.9875
+39,764,33.5491666666667
+39,765,30.0566666666667
+39,766,25.9291666666667
+39,767,36.449
+39,768,33.1258333333333
+39,769,27.94
+39,770,27.7706666666667
+39,771,26.6065
+39,772,25.8021666666667
+39,773,22.2885
+39,774,24.4263333333333
+39,775,26.7546666666667
+39,776,30.0566666666667
+39,777,37.3591666666667
+39,778,26.543
+39,779,32.4696666666667
+39,780,29.337
+39,781,32.6813333333333
+39,782,27.3896666666667
+39,783,33.0623333333333
+39,784,30.1836666666667
+39,785,31.242
+39,786,28.702
+39,787,33.3586666666667
+39,788,29.464
+39,789,32.5966666666667
+39,790,21.6323333333333
+39,791,39.0525
+39,792,28.6808333333333
+39,793,35.0096666666667
+39,794,28.2363333333333
+39,795,31.0726666666667
+39,796,33.401
+39,797,35.7716666666667
+39,798,34.9038333333333
+39,799,30.5011666666667
+39,800,27.94
+39,801,27.3261666666667
+39,802,30.3106666666667
+39,803,33.3798333333333
+39,804,36.9993333333333
+39,805,23.0081666666667
+39,806,33.9725
+39,807,33.2951666666667
+39,808,26.5006666666667
+39,809,30.5646666666667
+39,810,33.8031666666667
+39,811,26.2678333333333
+39,812,33.655
+39,813,38.4598333333333
+39,814,30.7975
+39,815,31.6865
+39,816,28.4903333333333
+39,817,28.067
+39,818,34.3111666666667
+39,819,28.3421666666667
+39,820,23.749
+39,821,32.1733333333333
+39,822,38.0576666666667
+39,823,34.6921666666667
+39,824,33.782
+39,825,29.6121666666667
+39,826,32.0886666666667
+39,827,31.6865
+39,828,28.2363333333333
+39,829,27.1356666666667
+39,830,30.5646666666667
+39,831,34.544
+39,832,36.0256666666667
+39,833,25.8656666666667
+39,834,32.4908333333333
+39,835,31.5171666666667
+39,836,28.4268333333333
+39,837,32.3215
+39,838,31.75
+39,839,32.893
+39,840,33.8878333333333
+39,841,29.7603333333333
+39,842,31.0515
+39,843,26.6276666666667
+39,844,27.6013333333333
+39,845,31.4113333333333
+39,846,27.1145
+39,847,26.3948333333333
+39,848,30.0566666666667
+39,849,32.9141666666667
+39,850,32.7025
+39,851,32.9988333333333
+39,852,38.1635
+39,853,30.48
+39,854,28.0881666666667
+39,855,35.3271666666667
+39,856,26.416
+39,857,38.0576666666667
+39,858,35.0731666666667
+39,859,25.8233333333333
+39,860,36.4913333333333
+39,861,29.1465
+39,862,30.3741666666667
+39,863,23.9818333333333
+39,864,25.6328333333333
+39,865,36.1103333333333
+39,866,33.1681666666667
+39,867,25.9926666666667
+39,868,42.6085
+39,869,25.2306666666667
+39,870,29.083
+39,871,25.7386666666667
+39,872,29.4851666666667
+39,873,27.7918333333333
+39,874,30.8186666666667
+39,875,33.4221666666667
+39,876,36.7876666666667
+39,877,34.6286666666667
+39,878,28.0246666666667
+39,879,37.2533333333333
+39,880,33.02
+39,881,28.0035
+39,882,36.3431666666667
+39,883,31.6441666666667
+39,884,32.1733333333333
+39,885,35.052
+39,886,32.2791666666667
+39,887,26.9451666666667
+39,888,32.3003333333333
+39,889,25.9926666666667
+39,890,27.559
+39,891,24.1511666666667
+39,892,31.623
+39,893,33.4645
+39,894,33.9301666666667
+39,895,33.4856666666667
+39,896,32.0886666666667
+39,897,36.0256666666667
+39,898,32.5543333333333
+39,899,26.3525
+39,900,30.1836666666667
+39,901,20.8915
+39,902,38.1423333333333
+39,903,31.0726666666667
+39,904,32.2791666666667
+39,905,32.1733333333333
+39,906,31.9405
+39,907,30.0566666666667
+39,908,30.2895
+39,909,35.9621666666667
+39,910,34.7556666666667
+39,911,28.448
+39,912,27.051
+39,913,30.9668333333333
+39,914,27.8553333333333
+39,915,27.2838333333333
+39,916,34.1418333333333
+39,917,39.6875
+39,918,32.258
+39,919,27.9188333333333
+39,920,33.2105
+39,921,24.8285
+39,922,30.6705
+39,923,21.5688333333333
+39,924,27.3896666666667
+39,925,26.6488333333333
+39,926,27.2838333333333
+39,927,29.8873333333333
+39,928,29.8026666666667
+39,929,29.972
+39,930,32.1945
+39,931,28.448
+39,932,24.3628333333333
+39,933,33.3586666666667
+39,934,25.7175
+39,935,30.099
+39,936,25.4211666666667
+39,937,43.6245
+39,938,29.6333333333333
+39,939,31.369
+39,940,26.2466666666667
+39,941,32.7448333333333
+39,942,35.8775
+39,943,29.3793333333333
+39,944,24.892
+39,945,25.2941666666667
+39,946,22.7541666666667
+39,947,29.464
+39,948,22.9446666666667
+39,949,32.893
+39,950,26.416
+39,951,26.8605
+39,952,31.496
+39,953,31.8558333333333
+39,954,28.6596666666667
+39,955,25.8021666666667
+39,956,28.194
+39,957,33.1893333333333
+39,958,34.3958333333333
+39,959,31.1785
+39,960,32.1521666666667
+39,961,28.8078333333333
+39,962,28.3633333333333
+39,963,31.7711666666667
+39,964,30.5858333333333
+39,965,28.829
+39,966,25.0613333333333
+39,967,26.4371666666667
+39,968,33.4856666666667
+39,969,34.6921666666667
+39,970,30.3953333333333
+39,971,28.2575
+39,972,34.0571666666667
+39,973,33.655
+39,974,32.1733333333333
+39,975,36.2373333333333
+39,976,39.5816666666667
+39,977,28.1516666666667
+39,978,24.2781666666667
+39,979,33.5915
+39,980,33.9936666666667
+39,981,37.9941666666667
+39,982,35.2848333333333
+39,983,30.9245
+39,984,35.2213333333333
+39,985,32.4696666666667
+39,986,35.4118333333333
+39,987,36.6818333333333
+39,988,26.0773333333333
+39,989,27.5166666666667
+39,990,25.7175
+39,991,28.702
+39,992,32.639
+39,993,32.1945
+39,994,31.1573333333333
+39,995,37.4438333333333
+39,996,32.0463333333333
+39,997,30.7975
+39,998,27.4743333333333
+39,999,29.5275
+39,1000,29.6121666666667
+40,1,28.1093333333333
+40,2,22.3943333333333
+40,3,27.686
+40,4,27.4743333333333
+40,5,34.5228333333333
+40,6,23.8125
+40,7,24.6168333333333
+40,8,27.4743333333333
+40,9,23.0293333333333
+40,10,21.5688333333333
+40,11,22.6695
+40,12,27.4743333333333
+40,13,28.3845
+40,14,23.3045
+40,15,21.844
+40,16,23.3256666666667
+40,17,22.606
+40,18,21.6958333333333
+40,19,30.5435
+40,20,31.7923333333333
+40,21,20.8915
+40,22,35.6023333333333
+40,23,26.67
+40,24,22.7118333333333
+40,25,24.0453333333333
+40,26,21.7381666666667
+40,27,21.082
+40,28,31.623
+40,29,23.8336666666667
+40,30,18.5843333333333
+40,31,18.4996666666667
+40,32,19.1981666666667
+40,33,30.2471666666667
+40,34,30.988
+40,35,24.4263333333333
+40,36,28.5538333333333
+40,37,24.892
+40,38,24.4898333333333
+40,39,28.6173333333333
+40,40,24.2993333333333
+40,41,22.3308333333333
+40,42,30.5223333333333
+40,43,22.8388333333333
+40,44,22.352
+40,45,23.749
+40,46,19.7696666666667
+40,47,20.066
+40,48,23.8971666666667
+40,49,17.0815
+40,50,26.4795
+40,51,29.4216666666667
+40,52,23.876
+40,53,29.5486666666667
+40,54,28.1728333333333
+40,55,21.7805
+40,56,20.5528333333333
+40,57,21.6746666666667
+40,58,27.051
+40,59,27.8976666666667
+40,60,29.2946666666667
+40,61,27.94
+40,62,22.2038333333333
+40,63,24.2358333333333
+40,64,28.5115
+40,65,21.336
+40,66,23.0293333333333
+40,67,25.4635
+40,68,16.8486666666667
+40,69,28.067
+40,70,27.0721666666667
+40,71,24.4898333333333
+40,72,28.7231666666667
+40,73,27.559
+40,74,20.2776666666667
+40,75,23.9818333333333
+40,76,27.8765
+40,77,19.2616666666667
+40,78,24.7226666666667
+40,79,22.5848333333333
+40,80,22.5425
+40,81,29.972
+40,82,24.3205
+40,83,22.2673333333333
+40,84,22.5425
+40,85,28.2575
+40,86,25.5905
+40,87,24.5533333333333
+40,88,25.2306666666667
+40,89,21.1666666666667
+40,90,24.003
+40,91,28.2786666666667
+40,92,23.8336666666667
+40,93,28.2363333333333
+40,94,20.1083333333333
+40,95,27.1991666666667
+40,96,22.8176666666667
+40,97,27.3896666666667
+40,98,27.9823333333333
+40,99,23.1351666666667
+40,100,17.907
+40,101,29.9296666666667
+40,102,25.2306666666667
+40,103,29.5486666666667
+40,104,20.9338333333333
+40,105,20.4893333333333
+40,106,29.8238333333333
+40,107,22.2038333333333
+40,108,19.812
+40,109,21.6323333333333
+40,110,23.1351666666667
+40,111,23.114
+40,112,22.733
+40,113,32.4273333333333
+40,114,27.3473333333333
+40,115,19.8331666666667
+40,116,20.5951666666667
+40,117,34.417
+40,118,25.4211666666667
+40,119,22.3308333333333
+40,120,22.5001666666667
+40,121,29.845
+40,122,27.6013333333333
+40,123,23.9183333333333
+40,124,28.3633333333333
+40,125,24.511
+40,126,23.0928333333333
+40,127,22.9658333333333
+40,128,20.1718333333333
+40,129,27.3685
+40,130,25.9926666666667
+40,131,31.5383333333333
+40,132,30.353
+40,133,21.082
+40,134,19.2616666666667
+40,135,26.035
+40,136,20.9126666666667
+40,137,30.8186666666667
+40,138,24.5533333333333
+40,139,22.5001666666667
+40,140,25.7598333333333
+40,141,28.5326666666667
+40,142,22.5636666666667
+40,143,23.495
+40,144,19.558
+40,145,20.955
+40,146,30.099
+40,147,22.4366666666667
+40,148,26.9028333333333
+40,149,29.7391666666667
+40,150,23.9606666666667
+40,151,21.336
+40,152,28.067
+40,153,22.1826666666667
+40,154,21.9075
+40,155,24.3416666666667
+40,156,17.6318333333333
+40,157,19.9601666666667
+40,158,21.209
+40,159,23.495
+40,160,24.003
+40,161,24.7015
+40,162,18.2033333333333
+40,163,23.5161666666667
+40,164,25.7175
+40,165,26.5006666666667
+40,166,19.6426666666667
+40,167,29.845
+40,168,22.4155
+40,169,25.8656666666667
+40,170,22.606
+40,171,30.3953333333333
+40,172,19.2616666666667
+40,173,29.9508333333333
+40,174,23.0716666666667
+40,175,25.527
+40,176,22.9446666666667
+40,177,20.447
+40,178,23.368
+40,179,18.7325
+40,180,23.8971666666667
+40,181,21.0396666666667
+40,182,24.9978333333333
+40,183,29.6756666666667
+40,184,28.9983333333333
+40,185,15.7268333333333
+40,186,21.7593333333333
+40,187,23.3045
+40,188,20.3835
+40,189,25.7598333333333
+40,190,27.7071666666667
+40,191,26.6488333333333
+40,192,25.4
+40,193,16.6581666666667
+40,194,28.956
+40,195,23.622
+40,196,25.3788333333333
+40,197,22.4578333333333
+40,198,24.8073333333333
+40,199,24.2146666666667
+40,200,26.9028333333333
+40,201,31.9828333333333
+40,202,25.6328333333333
+40,203,20.5951666666667
+40,204,25.6963333333333
+40,205,24.7015
+40,206,28.9983333333333
+40,207,21.5265
+40,208,20.7856666666667
+40,209,25.6328333333333
+40,210,20.8068333333333
+40,211,28.829
+40,212,24.4263333333333
+40,213,28.1093333333333
+40,214,20.2776666666667
+40,215,24.003
+40,216,24.2993333333333
+40,217,23.9606666666667
+40,218,22.5425
+40,219,26.416
+40,220,22.4155
+40,221,20.7221666666667
+40,222,24.8496666666667
+40,223,25.5905
+40,224,20.0025
+40,225,26.9875
+40,226,25.527
+40,227,22.3096666666667
+40,228,26.9028333333333
+40,229,21.5053333333333
+40,230,25.8233333333333
+40,231,22.352
+40,232,25.4
+40,233,24.8285
+40,234,30.5223333333333
+40,235,26.2678333333333
+40,236,24.7015
+40,237,27.051
+40,238,26.6911666666667
+40,239,18.0128333333333
+40,240,21.0608333333333
+40,241,21.209
+40,242,20.193
+40,243,22.5213333333333
+40,244,19.4521666666667
+40,245,28.1305
+40,246,22.2673333333333
+40,247,21.9075
+40,248,26.162
+40,249,18.5631666666667
+40,250,20.2353333333333
+40,251,22.1826666666667
+40,252,17.6741666666667
+40,253,26.7546666666667
+40,254,25.1036666666667
+40,255,30.099
+40,256,35.7505
+40,257,28.9983333333333
+40,258,28.448
+40,259,33.3798333333333
+40,260,23.495
+40,261,20.9973333333333
+40,262,19.2405
+40,263,26.0773333333333
+40,264,24.511
+40,265,27.8341666666667
+40,266,21.0185
+40,267,24.9343333333333
+40,268,20.7433333333333
+40,269,29.9296666666667
+40,270,25.6963333333333
+40,271,21.2513333333333
+40,272,18.923
+40,273,27.4955
+40,274,21.5265
+40,275,22.225
+40,276,25.273
+40,277,16.9333333333333
+40,278,31.3901666666667
+40,279,22.9658333333333
+40,280,19.6215
+40,281,28.5326666666667
+40,282,18.7113333333333
+40,283,23.0928333333333
+40,284,25.654
+40,285,27.3896666666667
+40,286,25.1036666666667
+40,287,23.241
+40,288,21.1031666666667
+40,289,23.8971666666667
+40,290,22.6906666666667
+40,291,25.6116666666667
+40,292,24.2146666666667
+40,293,21.3995
+40,294,29.0406666666667
+40,295,27.5166666666667
+40,296,21.1243333333333
+40,297,24.9978333333333
+40,298,26.0773333333333
+40,299,26.1196666666667
+40,300,25.273
+40,301,25.7598333333333
+40,302,21.082
+40,303,20.1718333333333
+40,304,26.543
+40,305,20.5105
+40,306,27.9823333333333
+40,307,20.4258333333333
+40,308,25.273
+40,309,22.6695
+40,310,21.3783333333333
+40,311,28.2998333333333
+40,312,18.2033333333333
+40,313,26.3101666666667
+40,314,28.067
+40,315,24.8708333333333
+40,316,26.797
+40,317,27.94
+40,318,23.9395
+40,319,25.1036666666667
+40,320,26.3736666666667
+40,321,18.2668333333333
+40,322,25.527
+40,323,21.59
+40,324,27.3685
+40,325,22.4366666666667
+40,326,24.8496666666667
+40,327,29.4851666666667
+40,328,27.686
+40,329,30.861
+40,330,19.3463333333333
+40,331,21.3995
+40,332,23.5373333333333
+40,333,22.7965
+40,334,22.0133333333333
+40,335,21.3995
+40,336,21.1666666666667
+40,337,20.1506666666667
+40,338,20.9126666666667
+40,339,23.1351666666667
+40,340,21.844
+40,341,21.0185
+40,342,26.3525
+40,343,21.2513333333333
+40,344,27.4531666666667
+40,345,22.5848333333333
+40,346,20.0871666666667
+40,347,22.0345
+40,348,28.6808333333333
+40,349,24.9131666666667
+40,350,20.4046666666667
+40,351,19.0923333333333
+40,352,26.1408333333333
+40,353,24.0241666666667
+40,354,25.4635
+40,355,30.5646666666667
+40,356,22.3096666666667
+40,357,30.1625
+40,358,22.1826666666667
+40,359,30.099
+40,360,22.7118333333333
+40,361,26.5006666666667
+40,362,28.067
+40,363,28.1728333333333
+40,364,28.7655
+40,365,21.4418333333333
+40,366,21.7805
+40,367,24.765
+40,368,26.1408333333333
+40,369,25.273
+40,370,26.0985
+40,371,23.2833333333333
+40,372,26.7546666666667
+40,373,23.0081666666667
+40,374,23.5373333333333
+40,375,26.3313333333333
+40,376,31.1361666666667
+40,377,23.8971666666667
+40,378,22.4155
+40,379,21.1455
+40,380,32.004
+40,381,20.4258333333333
+40,382,15.5786666666667
+40,383,22.987
+40,384,24.4898333333333
+40,385,24.8496666666667
+40,386,21.082
+40,387,25.5905
+40,388,20.0236666666667
+40,389,23.0505
+40,390,23.4103333333333
+40,391,23.4526666666667
+40,392,27.6648333333333
+40,393,23.6431666666667
+40,394,24.4475
+40,395,23.9395
+40,396,25.2095
+40,397,21.2301666666667
+40,398,22.1403333333333
+40,399,25.0401666666667
+40,400,23.876
+40,401,25.1671666666667
+40,402,25.273
+40,403,30.6493333333333
+40,404,21.3148333333333
+40,405,22.3731666666667
+40,406,25.5481666666667
+40,407,27.3473333333333
+40,408,29.8026666666667
+40,409,27.3473333333333
+40,410,27.5166666666667
+40,411,24.5533333333333
+40,412,27.559
+40,413,27.559
+40,414,26.0773333333333
+40,415,24.9343333333333
+40,416,24.2358333333333
+40,417,28.6596666666667
+40,418,26.7546666666667
+40,419,27.178
+40,420,31.1996666666667
+40,421,16.3406666666667
+40,422,24.9343333333333
+40,423,19.4098333333333
+40,424,24.0876666666667
+40,425,29.6333333333333
+40,426,26.6276666666667
+40,427,24.2993333333333
+40,428,17.1873333333333
+40,429,26.797
+40,430,24.8073333333333
+40,431,25.6328333333333
+40,432,28.2786666666667
+40,433,23.5373333333333
+40,434,26.3736666666667
+40,435,31.8558333333333
+40,436,28.194
+40,437,25.4211666666667
+40,438,27.432
+40,439,21.6323333333333
+40,440,19.5368333333333
+40,441,33.5703333333333
+40,442,23.5373333333333
+40,443,28.6596666666667
+40,444,22.3308333333333
+40,445,14.7955
+40,446,28.956
+40,447,26.289
+40,448,25.7386666666667
+40,449,25.3365
+40,450,26.162
+40,451,18.2668333333333
+40,452,19.9601666666667
+40,453,30.2683333333333
+40,454,27.6436666666667
+40,455,21.9921666666667
+40,456,25.0401666666667
+40,457,27.94
+40,458,26.5853333333333
+40,459,26.416
+40,460,20.0871666666667
+40,461,24.4686666666667
+40,462,30.6493333333333
+40,463,17.907
+40,464,26.289
+40,465,19.5368333333333
+40,466,31.0303333333333
+40,467,14.859
+40,468,23.6855
+40,469,24.0241666666667
+40,470,23.9606666666667
+40,471,22.0345
+40,472,19.431
+40,473,22.7753333333333
+40,474,20.7645
+40,475,24.7226666666667
+40,476,30.3318333333333
+40,477,25.146
+40,478,21.336
+40,479,24.384
+40,480,25.2306666666667
+40,481,26.543
+40,482,22.2038333333333
+40,483,27.1568333333333
+40,484,21.336
+40,485,23.7278333333333
+40,486,17.6318333333333
+40,487,26.67
+40,488,23.5373333333333
+40,489,25.1671666666667
+40,490,30.6281666666667
+40,491,19.7696666666667
+40,492,18.9653333333333
+40,493,23.2198333333333
+40,494,22.733
+40,495,24.1088333333333
+40,496,24.0876666666667
+40,497,20.9761666666667
+40,498,25.3365
+40,499,26.7123333333333
+40,500,20.1718333333333
+40,501,18.669
+40,502,21.5476666666667
+40,503,17.8223333333333
+40,504,24.6168333333333
+40,505,22.0556666666667
+40,506,19.9813333333333
+40,507,19.812
+40,508,25.1671666666667
+40,509,23.8971666666667
+40,510,25.2518333333333
+40,511,23.0081666666667
+40,512,26.7335
+40,513,21.844
+40,514,31.7923333333333
+40,515,20.2141666666667
+40,516,25.3153333333333
+40,517,22.3308333333333
+40,518,21.59
+40,519,24.7438333333333
+40,520,18.6478333333333
+40,521,18.0975
+40,522,21.59
+40,523,22.987
+40,524,23.4526666666667
+40,525,20.2776666666667
+40,526,30.734
+40,527,23.9183333333333
+40,528,22.7541666666667
+40,529,22.2885
+40,530,26.3101666666667
+40,531,27.3896666666667
+40,532,21.4841666666667
+40,533,18.7325
+40,534,30.9033333333333
+40,535,26.4371666666667
+40,536,27.813
+40,537,22.2038333333333
+40,538,30.2895
+40,539,21.6323333333333
+40,540,24.3628333333333
+40,541,22.1826666666667
+40,542,24.5533333333333
+40,543,21.336
+40,544,20.1506666666667
+40,545,27.2626666666667
+40,546,26.6488333333333
+40,547,19.0923333333333
+40,548,36.3008333333333
+40,549,32.7871666666667
+40,550,28.8713333333333
+40,551,19.939
+40,552,26.3313333333333
+40,553,24.9978333333333
+40,554,29.5698333333333
+40,555,17.145
+40,556,32.0886666666667
+40,557,23.3045
+40,558,29.21
+40,559,28.829
+40,560,19.05
+40,561,24.13
+40,562,20.32
+40,563,22.2673333333333
+40,564,23.1775
+40,565,19.5156666666667
+40,566,21.1666666666667
+40,567,21.3148333333333
+40,568,20.4258333333333
+40,569,17.8858333333333
+40,570,23.8548333333333
+40,571,22.7541666666667
+40,572,21.4418333333333
+40,573,20.193
+40,574,30.0566666666667
+40,575,33.274
+40,576,20.5105
+40,577,24.5956666666667
+40,578,26.924
+40,579,24.1723333333333
+40,580,26.7758333333333
+40,581,19.7908333333333
+40,582,19.5156666666667
+40,583,20.0025
+40,584,31.4536666666667
+40,585,27.813
+40,586,24.2993333333333
+40,587,23.7278333333333
+40,588,20.828
+40,589,21.2301666666667
+40,590,25.2518333333333
+40,591,21.7381666666667
+40,592,21.971
+40,593,19.939
+40,594,23.8125
+40,595,24.892
+40,596,22.0556666666667
+40,597,28.5115
+40,598,18.4573333333333
+40,599,18.0551666666667
+40,600,29.1465
+40,601,22.4578333333333
+40,602,23.749
+40,603,27.051
+40,604,22.987
+40,605,18.2668333333333
+40,606,23.749
+40,607,27.6648333333333
+40,608,26.7335
+40,609,28.1305
+40,610,18.5843333333333
+40,611,25.1036666666667
+40,612,25.9291666666667
+40,613,21.717
+40,614,26.7758333333333
+40,615,22.8176666666667
+40,616,24.3416666666667
+40,617,19.6003333333333
+40,618,25.8656666666667
+40,619,24.6591666666667
+40,620,30.988
+40,621,25.2518333333333
+40,622,27.8765
+40,623,28.3633333333333
+40,624,19.7908333333333
+40,625,21.2725
+40,626,20.701
+40,627,27.4531666666667
+40,628,30.1413333333333
+40,629,19.7696666666667
+40,630,26.1196666666667
+40,631,26.3101666666667
+40,632,25.1036666666667
+40,633,20.3411666666667
+40,634,19.0288333333333
+40,635,23.241
+40,636,17.9281666666667
+40,637,25.3153333333333
+40,638,28.0881666666667
+40,639,21.463
+40,640,23.622
+40,641,21.8863333333333
+40,642,26.6276666666667
+40,643,18.7325
+40,644,21.8016666666667
+40,645,23.5796666666667
+40,646,29.1676666666667
+40,647,26.6911666666667
+40,648,25.9715
+40,649,24.892
+40,650,29.6968333333333
+40,651,23.4738333333333
+40,652,21.6323333333333
+40,653,27.8765
+40,654,24.257
+40,655,28.6173333333333
+40,656,29.8238333333333
+40,657,16.5946666666667
+40,658,25.5905
+40,659,21.2301666666667
+40,660,24.3628333333333
+40,661,32.131
+40,662,22.8811666666667
+40,663,22.9235
+40,664,27.686
+40,665,20.9338333333333
+40,666,27.2203333333333
+40,667,26.162
+40,668,27.2838333333333
+40,669,26.0773333333333
+40,670,24.1935
+40,671,22.6695
+40,672,22.1826666666667
+40,673,22.2461666666667
+40,674,17.8011666666667
+40,675,24.2358333333333
+40,676,20.1295
+40,677,23.876
+40,678,27.1356666666667
+40,679,22.4578333333333
+40,680,22.1826666666667
+40,681,20.0236666666667
+40,682,21.2513333333333
+40,683,20.193
+40,684,29.2523333333333
+40,685,24.5956666666667
+40,686,20.2141666666667
+40,687,23.6855
+40,688,24.2993333333333
+40,689,16.1078333333333
+40,690,23.4103333333333
+40,691,24.511
+40,692,26.5006666666667
+40,693,25.654
+40,694,19.685
+40,695,26.8181666666667
+40,696,33.7396666666667
+40,697,26.0985
+40,698,23.368
+40,699,22.0133333333333
+40,700,22.0133333333333
+40,701,21.1878333333333
+40,702,27.8341666666667
+40,703,21.6958333333333
+40,704,21.5053333333333
+40,705,23.7278333333333
+40,706,27.178
+40,707,21.971
+40,708,27.432
+40,709,26.0561666666667
+40,710,25.5905
+40,711,21.6958333333333
+40,712,22.6906666666667
+40,713,24.2358333333333
+40,714,19.558
+40,715,25.6751666666667
+40,716,22.479
+40,717,20.066
+40,718,18.796
+40,719,19.685
+40,720,26.6065
+40,721,21.2301666666667
+40,722,25.4635
+40,723,23.6855
+40,724,22.0133333333333
+40,725,25.8021666666667
+40,726,21.3783333333333
+40,727,25.2518333333333
+40,728,19.8755
+40,729,29.7391666666667
+40,730,23.1775
+40,731,25.3365
+40,732,21.59
+40,733,28.2786666666667
+40,734,21.7381666666667
+40,735,27.94
+40,736,26.8605
+40,737,24.1511666666667
+40,738,23.1986666666667
+40,739,19.177
+40,740,25.6751666666667
+40,741,23.7066666666667
+40,742,25.0825
+40,743,24.1935
+40,744,27.7706666666667
+40,745,27.6013333333333
+40,746,21.5476666666667
+40,747,30.353
+40,748,25.273
+40,749,27.5378333333333
+40,750,26.5006666666667
+40,751,25.019
+40,752,19.4733333333333
+40,753,29.845
+40,754,17.9705
+40,755,24.892
+40,756,27.5378333333333
+40,757,19.1346666666667
+40,758,28.6385
+40,759,23.114
+40,760,21.5476666666667
+40,761,24.765
+40,762,20.7856666666667
+40,763,24.9555
+40,764,32.0463333333333
+40,765,23.5796666666667
+40,766,29.5486666666667
+40,767,22.0133333333333
+40,768,28.448
+40,769,27.0721666666667
+40,770,19.9178333333333
+40,771,27.7918333333333
+40,772,30.353
+40,773,20.7645
+40,774,26.6911666666667
+40,775,28.8925
+40,776,25.9503333333333
+40,777,24.8285
+40,778,19.3675
+40,779,31.5595
+40,780,27.94
+40,781,18.669
+40,782,26.9875
+40,783,26.2678333333333
+40,784,19.6215
+40,785,25.654
+40,786,29.8661666666667
+40,787,22.098
+40,788,31.242
+40,789,24.7015
+40,790,23.7278333333333
+40,791,25.0613333333333
+40,792,24.638
+40,793,17.9916666666667
+40,794,26.543
+40,795,22.9235
+40,796,25.781
+40,797,30.5858333333333
+40,798,33.3375
+40,799,21.9075
+40,800,23.2621666666667
+40,801,21.6746666666667
+40,802,22.2038333333333
+40,803,30.6916666666667
+40,804,23.9606666666667
+40,805,23.1986666666667
+40,806,19.7908333333333
+40,807,23.5373333333333
+40,808,24.384
+40,809,26.8816666666667
+40,810,20.8068333333333
+40,811,22.9023333333333
+40,812,25.8233333333333
+40,813,24.1088333333333
+40,814,26.162
+40,815,27.9823333333333
+40,816,30.8186666666667
+40,817,29.9931666666667
+40,818,22.733
+40,819,23.7701666666667
+40,820,27.4108333333333
+40,821,24.6591666666667
+40,822,25.2518333333333
+40,823,22.733
+40,824,17.2931666666667
+40,825,25.4423333333333
+40,826,26.924
+40,827,32.9141666666667
+40,828,23.9606666666667
+40,829,20.8915
+40,830,26.0561666666667
+40,831,24.638
+40,832,24.5533333333333
+40,833,22.3096666666667
+40,834,19.4521666666667
+40,835,24.2146666666667
+40,836,27.6436666666667
+40,837,25.0825
+40,838,19.558
+40,839,28.4056666666667
+40,840,26.2678333333333
+40,841,28.7866666666667
+40,842,29.8238333333333
+40,843,21.2301666666667
+40,844,31.2208333333333
+40,845,25.3576666666667
+40,846,22.6906666666667
+40,847,21.336
+40,848,19.6003333333333
+40,849,23.3891666666667
+40,850,22.7118333333333
+40,851,22.8811666666667
+40,852,28.8925
+40,853,19.3886666666667
+40,854,24.3416666666667
+40,855,18.4573333333333
+40,856,26.3736666666667
+40,857,23.3468333333333
+40,858,25.7598333333333
+40,859,22.1403333333333
+40,860,29.8238333333333
+40,861,25.6751666666667
+40,862,23.5373333333333
+40,863,28.702
+40,864,26.8393333333333
+40,865,23.114
+40,866,21.4206666666667
+40,867,28.956
+40,868,21.8863333333333
+40,869,23.1351666666667
+40,870,23.368
+40,871,23.7913333333333
+40,872,28.4056666666667
+40,873,23.7278333333333
+40,874,26.5853333333333
+40,875,15.7903333333333
+40,876,21.3148333333333
+40,877,25.0613333333333
+40,878,23.6431666666667
+40,879,21.1031666666667
+40,880,28.1516666666667
+40,881,25.1671666666667
+40,882,31.75
+40,883,27.8553333333333
+40,884,24.4263333333333
+40,885,25.7175
+40,886,25.654
+40,887,23.2833333333333
+40,888,29.9508333333333
+40,889,22.2038333333333
+40,890,21.4841666666667
+40,891,25.908
+40,892,22.098
+40,893,32.0886666666667
+40,894,26.797
+40,895,19.1135
+40,896,23.876
+40,897,21.082
+40,898,26.7758333333333
+40,899,26.3736666666667
+40,900,26.4583333333333
+40,901,28.3421666666667
+40,902,22.3096666666667
+40,903,24.4686666666667
+40,904,20.8703333333333
+40,905,21.6958333333333
+40,906,16.4888333333333
+40,907,31.3478333333333
+40,908,23.3045
+40,909,28.956
+40,910,20.3623333333333
+40,911,29.0195
+40,912,22.4366666666667
+40,913,23.368
+40,914,23.114
+40,915,27.7071666666667
+40,916,25.6328333333333
+40,917,28.194
+40,918,28.2786666666667
+40,919,25.2095
+40,920,24.8073333333333
+40,921,24.5745
+40,922,28.0458333333333
+40,923,27.1356666666667
+40,924,25.5058333333333
+40,925,26.7758333333333
+40,926,25.146
+40,927,20.8915
+40,928,20.701
+40,929,23.0505
+40,930,16.8063333333333
+40,931,31.3266666666667
+40,932,21.463
+40,933,20.3623333333333
+40,934,18.415
+40,935,24.0453333333333
+40,936,29.972
+40,937,22.8176666666667
+40,938,23.1563333333333
+40,939,25.4
+40,940,21.59
+40,941,20.7645
+40,942,28.4268333333333
+40,943,18.0975
+40,944,22.5213333333333
+40,945,22.4366666666667
+40,946,22.0345
+40,947,26.9451666666667
+40,948,32.7025
+40,949,18.161
+40,950,27.0721666666667
+40,951,27.0086666666667
+40,952,27.0721666666667
+40,953,20.066
+40,954,25.8656666666667
+40,955,25.908
+40,956,24.5321666666667
+40,957,22.8176666666667
+40,958,25.2518333333333
+40,959,28.829
+40,960,19.1135
+40,961,21.5476666666667
+40,962,30.1836666666667
+40,963,24.3205
+40,964,26.924
+40,965,17.0603333333333
+40,966,24.2781666666667
+40,967,22.0345
+40,968,28.067
+40,969,23.0081666666667
+40,970,19.0076666666667
+40,971,28.1728333333333
+40,972,24.4051666666667
+40,973,29.21
+40,974,23.0716666666667
+40,975,26.2466666666667
+40,976,31.0726666666667
+40,977,26.289
+40,978,25.1671666666667
+40,979,27.1356666666667
+40,980,30.2895
+40,981,22.9658333333333
+40,982,18.7536666666667
+40,983,27.686
+40,984,28.956
+40,985,24.0876666666667
+40,986,25.8868333333333
+40,987,24.384
+40,988,24.892
+40,989,29.4428333333333
+40,990,28.2998333333333
+40,991,27.3473333333333
+40,992,17.78
+40,993,25.8868333333333
+40,994,25.5693333333333
+40,995,19.5156666666667
+40,996,23.241
+40,997,28.4691666666667
+40,998,21.3783333333333
+40,999,24.6803333333333
+40,1000,26.1196666666667
+41,1,27.1229666666667
+41,2,25.3153333333333
+41,3,33.6169
+41,4,25.273
+41,5,26.9282333333333
+41,6,26.3355666666667
+41,7,31.5679666666667
+41,8,28.9983333333333
+41,9,21.3402333333333
+41,10,25.4465666666667
+41,11,27.8765
+41,12,25.7894666666667
+41,13,24.3882333333333
+41,14,30.9287333333333
+41,15,27.4658666666667
+41,16,30.7636333333333
+41,17,29.2989
+41,18,29.2608
+41,19,24.8073333333333
+41,20,22.5044
+41,21,25.5481666666667
+41,22,29.7434
+41,23,24.5152333333333
+41,24,24.5745
+41,25,28.7443333333333
+41,26,27.1399
+41,27,29.8238333333333
+41,28,25.4254
+41,29,29.3454666666667
+41,30,25.8445
+41,31,21.8863333333333
+41,32,27.9442333333333
+41,33,30.0185666666667
+41,34,26.4244666666667
+41,35,29.5359666666667
+41,36,28.2236333333333
+41,37,28.8332333333333
+41,38,28.3633333333333
+41,39,26.2043333333333
+41,40,26.2720666666667
+41,41,23.114
+41,42,26.1323666666667
+41,43,20.5613
+41,44,23.1013
+41,45,25.019
+41,46,26.4922
+41,47,29.3666333333333
+41,48,29.8069
+41,49,24.9766666666667
+41,50,27.5801666666667
+41,51,23.0462666666667
+41,52,31.5002333333333
+41,53,27.2288
+41,54,27.0975666666667
+41,55,21.3614
+41,56,23.3553
+41,57,28.5115
+41,58,30.2979666666667
+41,59,31.2547
+41,60,30.0143333333333
+41,61,23.2240666666667
+41,62,24.6422333333333
+41,63,25.9545666666667
+41,64,23.5034666666667
+41,65,29.7434
+41,66,27.4955
+41,67,22.6568
+41,68,27.4531666666667
+41,69,23.3891666666667
+41,70,23.0970666666667
+41,71,28.7274
+41,72,30.1201666666667
+41,73,20.3411666666667
+41,74,27.7960666666667
+41,75,27.94
+41,76,21.2767333333333
+41,77,30.9245
+41,78,25.7894666666667
+41,79,28.0458333333333
+41,80,27.3304
+41,81,26.1408333333333
+41,82,28.4734
+41,83,20.1337333333333
+41,84,23.0547333333333
+41,85,25.3153333333333
+41,86,31.0091666666667
+41,87,26.8859
+41,88,28.0246666666667
+41,89,31.1192333333333
+41,90,29.1507333333333
+41,91,28.3252333333333
+41,92,25.2560666666667
+41,93,29.9085
+41,94,25.527
+41,95,25.8064
+41,96,27.432
+41,97,26.0223
+41,98,24.3078
+41,99,26.6530666666667
+41,100,33.782
+41,101,27.0340666666667
+41,102,26.543
+41,103,25.7217333333333
+41,104,26.8647333333333
+41,105,19.9220666666667
+41,106,27.5844
+41,107,30.7467
+41,108,27.4997333333333
+41,109,27.9484666666667
+41,110,30.8440666666667
+41,111,25.8868333333333
+41,112,36.2415666666667
+41,113,22.7838
+41,114,24.3120333333333
+41,115,27.9950333333333
+41,116,28.3845
+41,117,28.3845
+41,118,26.9621
+41,119,28.0458333333333
+41,120,24.3416666666667
+41,121,26.0604
+41,122,24.5660333333333
+41,123,25.0232333333333
+41,124,24.1554
+41,125,25.7471333333333
+41,126,25.5735666666667
+41,127,22.6610333333333
+41,128,27.5886333333333
+41,129,31.6441666666667
+41,130,24.7946333333333
+41,131,26.7081
+41,132,26.1662333333333
+41,133,34.29
+41,134,24.9555
+41,135,30.4376666666667
+41,136,26.1450666666667
+41,137,24.9385666666667
+41,138,29.1592
+41,139,27.0086666666667
+41,140,29.1084
+41,141,31.0726666666667
+41,142,26.7631333333333
+41,143,24.9385666666667
+41,144,27.4150666666667
+41,145,22.3308333333333
+41,146,31.2843333333333
+41,147,26.8181666666667
+41,148,27.9061333333333
+41,149,36.6183333333333
+41,150,31.1361666666667
+41,151,24.2993333333333
+41,152,31.1615666666667
+41,153,29.3793333333333
+41,154,27.2203333333333
+41,155,19.9898
+41,156,30.1836666666667
+41,157,19.2193333333333
+41,158,33.9725
+41,159,28.9814
+41,160,26.7546666666667
+41,161,25.4508
+41,162,30.7128333333333
+41,163,24.6972666666667
+41,164,25.9164666666667
+41,165,28.1559
+41,166,27.6098
+41,167,25.7217333333333
+41,168,27.8807333333333
+41,169,19.7739
+41,170,26.8647333333333
+41,171,25.1883333333333
+41,172,27.1610666666667
+41,173,26.1916333333333
+41,174,26.8224
+41,175,21.3698666666667
+41,176,26.0646333333333
+41,177,29.8280666666667
+41,178,24.9555
+41,179,24.9343333333333
+41,180,26.035
+41,181,20.6163333333333
+41,182,24.2781666666667
+41,183,25.5947333333333
+41,184,25.8741333333333
+41,185,28.6850666666667
+41,186,33.401
+41,187,26.9917333333333
+41,188,27.2880666666667
+41,189,24.4136333333333
+41,190,31.877
+41,191,24.6676333333333
+41,192,24.7015
+41,193,26.2974666666667
+41,194,27.2711333333333
+41,195,22.8684666666667
+41,196,29.2777333333333
+41,197,26.5853333333333
+41,198,24.1257666666667
+41,199,24.1384666666667
+41,200,30.6493333333333
+41,201,26.7758333333333
+41,202,23.5458
+41,203,21.2936666666667
+41,204,21.5307333333333
+41,205,25.1883333333333
+41,206,21.1370333333333
+41,207,24.1130666666667
+41,208,25.2984
+41,209,25.146
+41,210,29.2565666666667
+41,211,28.321
+41,212,27.7283333333333
+41,213,23.6643333333333
+41,214,32.5543333333333
+41,215,25.5905
+41,216,17.5302333333333
+41,217,35.1366666666667
+41,218,34.1841666666667
+41,219,34.671
+41,220,31.2674
+41,221,26.5218333333333
+41,222,25.3026333333333
+41,223,22.5467333333333
+41,224,25.2941666666667
+41,225,25.1248333333333
+41,226,24.8708333333333
+41,227,31.5214
+41,228,27.559
+41,229,23.1394
+41,230,22.0599
+41,231,27.8553333333333
+41,232,34.925
+41,233,25.7048
+41,234,26.2932333333333
+41,235,22.1064666666667
+41,236,31.2462333333333
+41,237,24.1850333333333
+41,238,24.3416666666667
+41,239,21.1074
+41,240,26.1196666666667
+41,241,29.4978666666667
+41,242,27.2203333333333
+41,243,28.1559
+41,244,27.7706666666667
+41,245,20.1972333333333
+41,246,24.1173
+41,247,23.7913333333333
+41,248,29.4089666666667
+41,249,30.9245
+41,250,25.6836333333333
+41,251,30.3106666666667
+41,252,23.5839
+41,253,19.7273333333333
+41,254,25.1671666666667
+41,255,30.6747333333333
+41,256,21.6535
+41,257,22.9108
+41,258,17.907
+41,259,22.5044
+41,260,22.6949
+41,261,24.5745
+41,262,24.9343333333333
+41,263,27.7791333333333
+41,264,27.1145
+41,265,26.3313333333333
+41,266,26.0180666666667
+41,267,25.0909666666667
+41,268,22.0641333333333
+41,269,26.7589
+41,270,30.099
+41,271,29.2608
+41,272,29.1253333333333
+41,273,23.2452333333333
+41,274,23.6304666666667
+41,275,27.0086666666667
+41,276,20.5782333333333
+41,277,26.7377333333333
+41,278,26.5006666666667
+41,279,32.8295
+41,280,27.9484666666667
+41,281,26.3525
+41,282,26.9451666666667
+41,283,24.2824
+41,284,35.4753333333333
+41,285,28.3675666666667
+41,286,26.1450666666667
+41,287,31.4790666666667
+41,288,27.9654
+41,289,28.702
+41,290,26.1704666666667
+41,291,22.1869
+41,292,25.4635
+41,293,24.7057333333333
+41,294,25.527
+41,295,25.3619
+41,296,27.94
+41,297,30.8694666666667
+41,298,24.6168333333333
+41,299,35.8775
+41,300,22.4620666666667
+41,301,26.6742333333333
+41,302,26.8266333333333
+41,303,27.3092333333333
+41,304,24.3713
+41,305,21.0396666666667
+41,306,30.6324
+41,307,28.4988
+41,308,27.3685
+41,309,28.3294666666667
+41,310,26.4414
+41,311,26.1027333333333
+41,312,25.0825
+41,313,27.1145
+41,314,29.1888333333333
+41,315,21.971
+41,316,27.3685
+41,317,24.1723333333333
+41,318,33.5534
+41,319,29.0322
+41,320,26.1196666666667
+41,321,24.2612333333333
+41,322,27.6436666666667
+41,323,22.0133333333333
+41,324,32.6898
+41,325,23.0547333333333
+41,326,32.8718333333333
+41,327,21.0058
+41,328,23.1224666666667
+41,329,35.052
+41,330,29.3793333333333
+41,331,24.6210666666667
+41,332,25.5481666666667
+41,333,27.9823333333333
+41,334,32.7025
+41,335,26.7758333333333
+41,336,30.0651333333333
+41,337,28.3252333333333
+41,338,26.9451666666667
+41,339,22.7668666666667
+41,340,23.5881333333333
+41,341,31.7711666666667
+41,342,34.0571666666667
+41,343,25.4211666666667
+41,344,35.2679
+41,345,33.0708
+41,346,24.2993333333333
+41,347,22.9065666666667
+41,348,29.6587333333333
+41,349,28.4945666666667
+41,350,31.3901666666667
+41,351,30.1074666666667
+41,352,27.5082
+41,353,24.6210666666667
+41,354,28.3887333333333
+41,355,25.4889
+41,356,23.6093
+41,357,22.4874666666667
+41,358,23.2325333333333
+41,359,28.4099
+41,360,25.8445
+41,361,26.543
+41,362,26.5049
+41,363,30.8483
+41,364,27.7114
+41,365,25.6624666666667
+41,366,27.1399
+41,367,37.3210666666667
+41,368,26.6319
+41,369,18.3811333333333
+41,370,25.273
+41,371,28.0881666666667
+41,372,22.2758
+41,373,24.8158
+41,374,23.3722333333333
+41,375,30.9710666666667
+41,376,26.0561666666667
+41,377,24.9766666666667
+41,378,18.923
+41,379,29.5486666666667
+41,380,22.7965
+41,381,25.0613333333333
+41,382,30.4419
+41,383,32.6601666666667
+41,384,18.0678666666667
+41,385,25.2137333333333
+41,386,25.5354666666667
+41,387,27.2245666666667
+41,388,28.0246666666667
+41,389,23.7744
+41,390,25.1502333333333
+41,391,23.3341333333333
+41,392,32.0505666666667
+41,393,29.1126333333333
+41,394,23.2452333333333
+41,395,27.9696333333333
+41,396,24.8496666666667
+41,397,25.2137333333333
+41,398,30.3149
+41,399,25.8572
+41,400,23.1563333333333
+41,401,24.0707333333333
+41,402,25.7048
+41,403,23.2833333333333
+41,404,27.4531666666667
+41,405,27.4574
+41,406,26.9748
+41,407,27.0933333333333
+41,408,25.5735666666667
+41,409,29.5275
+41,410,22.9785333333333
+41,411,24.4602
+41,412,27.9315333333333
+41,413,29.0449
+41,414,29.2819666666667
+41,415,26.2466666666667
+41,416,29.1676666666667
+41,417,19.2447333333333
+41,418,26.0815666666667
+41,419,30.5265666666667
+41,420,27.0806333333333
+41,421,23.6643333333333
+41,422,29.9339
+41,423,24.4983
+41,424,25.9969
+41,425,25.8699
+41,426,26.6742333333333
+41,427,24.3459
+41,428,22.9023333333333
+41,429,23.1436333333333
+41,430,23.0335666666667
+41,431,33.2570666666667
+41,432,24.5533333333333
+41,433,21.1243333333333
+41,434,23.0928333333333
+41,435,22.7626333333333
+41,436,27.5209
+41,437,32.0251666666667
+41,438,20.1379666666667
+41,439,33.9344
+41,440,32.2834
+41,441,29.2735
+41,442,24.2358333333333
+41,443,28.2786666666667
+41,444,22.9235
+41,445,19.6088
+41,446,32.3469
+41,447,26.162
+41,448,23.5458
+41,449,26.2255
+41,450,26.6742333333333
+41,451,33.5957333333333
+41,452,25.3153333333333
+41,453,25.6794
+41,454,29.1930666666667
+41,455,28.321
+41,456,33.0073
+41,457,26.4414
+41,458,32.3257333333333
+41,459,25.0401666666667
+41,460,22.2292333333333
+41,461,25.4423333333333
+41,462,27.6055666666667
+41,463,23.4865333333333
+41,464,24.5364
+41,465,21.5519
+41,466,25.1163666666667
+41,467,24.765
+41,468,28.1813
+41,469,21.1455
+41,470,31.3055
+41,471,24.1088333333333
+41,472,22.3139
+41,473,27.9230666666667
+41,474,26.416
+41,475,29.2989
+41,476,27.3515666666667
+41,477,28.2194
+41,478,26.5006666666667
+41,479,23.9479666666667
+41,480,25.527
+41,481,23.5415666666667
+41,482,29.2142333333333
+41,483,33.0665666666667
+41,484,28.5369
+41,485,22.6737333333333
+41,486,25.3619
+41,487,31.0726666666667
+41,488,28.1516666666667
+41,489,26.8647333333333
+41,490,25.7217333333333
+41,491,26.4414
+41,492,30.099
+41,493,25.1925666666667
+41,494,24.5618
+41,495,30.5858333333333
+41,496,20.8745666666667
+41,497,24.0707333333333
+41,498,32.2156666666667
+41,499,20.7179333333333
+41,500,24.0580333333333
+41,501,23.5204
+41,502,29.6206333333333
+41,503,25.5947333333333
+41,504,22.5679
+41,505,19.0076666666667
+41,506,28.3040666666667
+41,507,29.1338
+41,508,24.892
+41,509,31.5383333333333
+41,510,24.8496666666667
+41,511,29.3624
+41,512,18.1948666666667
+41,513,23.8548333333333
+41,514,26.1704666666667
+41,515,31.7965666666667
+41,516,29.2523333333333
+41,517,32.3215
+41,518,23.8167333333333
+41,519,30.8102
+41,520,25.2306666666667
+41,521,28.0881666666667
+41,522,24.3247333333333
+41,523,26.7165666666667
+41,524,30.2895
+41,525,28.2363333333333
+41,526,29.2396333333333
+41,527,28.4945666666667
+41,528,27.8807333333333
+41,529,22.1234
+41,530,28.3929666666667
+41,531,23.5458
+41,532,25.1671666666667
+41,533,26.3398
+41,534,25.7640666666667
+41,535,27.1441333333333
+41,536,30.7170666666667
+41,537,26.2085666666667
+41,538,26.5049
+41,539,24.3035666666667
+41,540,25.8064
+41,541,34.7218
+41,542,27.94
+41,543,29.4894
+41,544,24.1977333333333
+41,545,24.3882333333333
+41,546,32.8549
+41,547,25.8910666666667
+41,548,28.9771666666667
+41,549,21.8313
+41,550,27.8172333333333
+41,551,28.0712333333333
+41,552,23.5288666666667
+41,553,29.1465
+41,554,25.8445
+41,555,31.4325
+41,556,27.0086666666667
+41,557,22.2927333333333
+41,558,30.5900666666667
+41,559,21.6577333333333
+41,560,27.9484666666667
+41,561,26.162
+41,562,25.7217333333333
+41,563,30.1413333333333
+41,564,28.3718
+41,565,30.5773666666667
+41,566,26.3736666666667
+41,567,25.4465666666667
+41,568,29.4047333333333
+41,569,26.1027333333333
+41,570,28.0035
+41,571,23.8548333333333
+41,572,29.4259
+41,573,29.7222333333333
+41,574,24.8327333333333
+41,575,26.3736666666667
+41,576,22.1234
+41,577,20.1295
+41,578,22.2546333333333
+41,579,30.2895
+41,580,26.2466666666667
+41,581,24.6168333333333
+41,582,19.7104
+41,583,30.5223333333333
+41,584,23.0970666666667
+41,585,28.7655
+41,586,28.2659666666667
+41,587,27.7283333333333
+41,588,29.9296666666667
+41,589,24.2612333333333
+41,590,27.5801666666667
+41,591,29.4470666666667
+41,592,26.2170333333333
+41,593,25.1544666666667
+41,594,26.8859
+41,595,24.3289666666667
+41,596,27.9823333333333
+41,597,25.7217333333333
+41,598,24.0665
+41,599,27.2669
+41,600,29.3793333333333
+41,601,23.8971666666667
+41,602,27.2499666666667
+41,603,23.0547333333333
+41,604,34.3111666666667
+41,605,19.5241333333333
+41,606,31.5637333333333
+41,607,23.2240666666667
+41,608,27.9654
+41,609,21.1709
+41,610,28.194
+41,611,31.3520666666667
+41,612,24.4940666666667
+41,613,29.0660666666667
+41,614,25.6370666666667
+41,615,24.5025333333333
+41,616,24.2993333333333
+41,617,27.813
+41,618,28.7104666666667
+41,619,19.1262
+41,620,24.0538
+41,621,22.9954666666667
+41,622,25.4084666666667
+41,623,24.0665
+41,624,23.2875666666667
+41,625,32.4696666666667
+41,626,25.5100666666667
+41,627,25.4465666666667
+41,628,28.2786666666667
+41,629,21.3021333333333
+41,630,29.6121666666667
+41,631,30.8271333333333
+41,632,25.6116666666667
+41,633,25.146
+41,634,28.1982333333333
+41,635,30.5011666666667
+41,636,26.2297333333333
+41,637,21.3614
+41,638,21.4841666666667
+41,639,28.0712333333333
+41,640,22.5086333333333
+41,641,21.1920666666667
+41,642,23.4526666666667
+41,643,24.8708333333333
+41,644,24.8750666666667
+41,645,23.3468333333333
+41,646,29.8704
+41,647,29.1549666666667
+41,648,19.7781333333333
+41,649,24.7057333333333
+41,650,27.3727333333333
+41,651,26.6276666666667
+41,652,19.9474666666667
+41,653,24.8200333333333
+41,654,30.3572333333333
+41,655,22.9235
+41,656,23.8040333333333
+41,657,25.9715
+41,658,28.7951333333333
+41,659,21.7847333333333
+41,660,23.6685666666667
+41,661,25.0528666666667
+41,662,22.8473
+41,663,19.1431333333333
+41,664,30.6747333333333
+41,665,31.9024
+41,666,30.2683333333333
+41,667,24.2400666666667
+41,668,29.5359666666667
+41,669,25.6116666666667
+41,670,26.3736666666667
+41,671,30.5011666666667
+41,672,26.7546666666667
+41,673,30.0016333333333
+41,674,21.8948
+41,675,29.4894
+41,676,24.5533333333333
+41,677,28.1728333333333
+41,678,25.7598333333333
+41,679,30.8948666666667
+41,680,25.2137333333333
+41,681,27.7368
+41,682,30.1625
+41,683,29.2989
+41,684,27.5166666666667
+41,685,25.7005666666667
+41,686,26.3736666666667
+41,687,23.4569
+41,688,26.3144
+41,689,25.2814666666667
+41,690,25.1671666666667
+41,691,23.6474
+41,692,29.0406666666667
+41,693,28.7697333333333
+41,694,30.3868666666667
+41,695,24.9131666666667
+41,696,28.6427333333333
+41,697,25.3661333333333
+41,698,22.4028
+41,699,30.0439666666667
+41,700,24.8158
+41,701,23.2029
+41,702,30.3360666666667
+41,703,27.7071666666667
+41,704,29.0914666666667
+41,705,28.3887333333333
+41,706,26.0434666666667
+41,707,28.5961666666667
+41,708,31.9659
+41,709,29.9212
+41,710,20.7306333333333
+41,711,37.1686666666667
+41,712,30.9287333333333
+41,713,22.9235
+41,714,23.8844666666667
+41,715,30.48
+41,716,23.7109
+41,717,24.6464666666667
+41,718,30.4165
+41,719,21.5307333333333
+41,720,26.9917333333333
+41,721,30.9075666666667
+41,722,23.6728
+41,723,25.3195666666667
+41,724,23.9183333333333
+41,725,28.3506333333333
+41,726,25.9588
+41,727,30.5646666666667
+41,728,29.972
+41,729,22.0175666666667
+41,730,21.2513333333333
+41,731,30.861
+41,732,21.0396666666667
+41,733,22.5425
+41,734,25.3915333333333
+41,735,23.6643333333333
+41,736,23.9437333333333
+41,737,25.3153333333333
+41,738,22.3393
+41,739,28.3083
+41,740,33.9725
+41,741,22.5848333333333
+41,742,21.1539666666667
+41,743,33.2189666666667
+41,744,28.8840333333333
+41,745,27.9823333333333
+41,746,33.2570666666667
+41,747,27.9273
+41,748,29.3666333333333
+41,749,24.3755333333333
+41,750,26.1450666666667
+41,751,27.7325666666667
+41,752,27.178
+41,753,22.7965
+41,754,24.9258666666667
+41,755,30.6705
+41,756,21.7847333333333
+41,757,27.9019
+41,758,23.368
+41,759,25.7090333333333
+41,760,23.3468333333333
+41,761,26.5303
+41,762,25.8529666666667
+41,763,34.7768333333333
+41,764,26.1408333333333
+41,765,27.9019
+41,766,25.5312333333333
+41,767,28.3887333333333
+41,768,22.4620666666667
+41,769,21.3402333333333
+41,770,29.3158333333333
+41,771,19.9855666666667
+41,772,26.0815666666667
+41,773,21.5561333333333
+41,774,25.4423333333333
+41,775,23.4315
+41,776,27.5209
+41,777,26.8224
+41,778,23.8167333333333
+41,779,25.3788333333333
+41,780,30.5054
+41,781,30.2344666666667
+41,782,28.3464
+41,783,19.5241333333333
+41,784,22.3139
+41,785,25.3365
+41,786,27.0764
+41,787,27.8384
+41,788,26.9494
+41,789,20.7094666666667
+41,790,26.4583333333333
+41,791,26.8478
+41,792,21.1031666666667
+41,793,19.5876333333333
+41,794,28.9644666666667
+41,795,27.9484666666667
+41,796,24.7480666666667
+41,797,33.0030666666667
+41,798,27.4997333333333
+41,799,31.8177333333333
+41,800,24.2781666666667
+41,801,24.5025333333333
+41,802,28.7866666666667
+41,803,27.2669
+41,804,24.6422333333333
+41,805,23.0547333333333
+41,806,32.2664666666667
+41,807,26.2509
+41,808,24.3332
+41,809,27.3727333333333
+41,810,24.8115666666667
+41,811,26.289
+41,812,25.1290666666667
+41,813,24.2612333333333
+41,814,23.4357333333333
+41,815,24.2231333333333
+41,816,26.1831666666667
+41,817,31.0345666666667
+41,818,26.5938
+41,819,24.9809
+41,820,23.6897333333333
+41,821,20.9677
+41,822,22.6102333333333
+41,823,24.2146666666667
+41,824,26.9917333333333
+41,825,29.7010666666667
+41,826,24.6253
+41,827,30.0185666666667
+41,828,26.8266333333333
+41,829,24.6464666666667
+41,830,24.8708333333333
+41,831,21.8736333333333
+41,832,28.0331333333333
+41,833,27.9230666666667
+41,834,27.4955
+41,835,23.5669666666667
+41,836,30.226
+41,837,30.3360666666667
+41,838,22.352
+41,839,28.7528
+41,840,30.9668333333333
+41,841,31.9024
+41,842,36.1526666666667
+41,843,27.8384
+41,844,26.2763
+41,845,29.2735
+41,846,27.1356666666667
+41,847,25.0909666666667
+41,848,27.3261666666667
+41,849,23.0124
+41,850,29.6587333333333
+41,851,27.7918333333333
+41,852,34.8191666666667
+41,853,31.0938333333333
+41,854,31.5806666666667
+41,855,25.5058333333333
+41,856,28.7231666666667
+41,857,25.2984
+41,858,26.67
+41,859,29.7391666666667
+41,860,24.2189
+41,861,23.7955666666667
+41,862,31.877
+41,863,21.6323333333333
+41,864,20.9380666666667
+41,865,27.6690666666667
+41,866,23.5204
+41,867,25.654
+41,868,30.6747333333333
+41,869,27.9019
+41,870,27.3939
+41,871,28.1516666666667
+41,872,26.924
+41,873,31.6484
+41,874,25.2349
+41,875,25.7217333333333
+41,876,27.8426333333333
+41,877,28.0924
+41,878,20.1295
+41,879,25.4296333333333
+41,880,25.8487333333333
+41,881,25.5524
+41,882,27.1907
+41,883,24.9639666666667
+41,884,25.4889
+41,885,26.3101666666667
+41,886,29.7010666666667
+41,887,25.4677333333333
+41,888,23.1351666666667
+41,889,32.7744666666667
+41,890,31.1404
+41,891,25.2899333333333
+41,892,25.8021666666667
+41,893,25.7894666666667
+41,894,31.9235666666667
+41,895,28.5157333333333
+41,896,21.5519
+41,897,27.3981333333333
+41,898,24.0453333333333
+41,899,25.0825
+41,900,22.86
+41,901,30.5477333333333
+41,902,28.7655
+41,903,30.2302333333333
+41,904,19.1092666666667
+41,905,32.893
+41,906,29.8873333333333
+41,907,28.0924
+41,908,27.2838333333333
+41,909,25.0867333333333
+41,910,28.0924
+41,911,23.1351666666667
+41,912,20.9253666666667
+41,913,23.6516333333333
+41,914,25.0486333333333
+41,915,29.3243
+41,916,29.5317333333333
+41,917,30.4376666666667
+41,918,24.4475
+41,919,29.9296666666667
+41,920,24.0707333333333
+41,921,23.4103333333333
+41,922,32.0082333333333
+41,923,35.6658333333333
+41,924,30.3106666666667
+41,925,29.0406666666667
+41,926,29.0491333333333
+41,927,25.0401666666667
+41,928,22.9954666666667
+41,929,24.8708333333333
+41,930,26.797
+41,931,23.5585
+41,932,24.4305666666667
+41,933,30.0609
+41,934,25.0147666666667
+41,935,27.305
+41,936,28.5199666666667
+41,937,25.0825
+41,938,28.7443333333333
+41,939,28.6427333333333
+41,940,21.5984666666667
+41,941,25.8487333333333
+41,942,24.5364
+41,943,26.4583333333333
+41,944,35.3525666666667
+41,945,30.2979666666667
+41,946,26.7631333333333
+41,947,35.3483333333333
+41,948,33.5957333333333
+41,949,30.1667333333333
+41,950,23.9818333333333
+41,951,26.6149666666667
+41,952,22.098
+41,953,29.4682333333333
+41,954,25.654
+41,955,32.0548
+41,956,25.3026333333333
+41,957,24.0241666666667
+41,958,24.0284
+41,959,30.5858333333333
+41,960,22.9362
+41,961,24.7438333333333
+41,962,23.5627333333333
+41,963,24.9343333333333
+41,964,22.0599
+41,965,32.8125666666667
+41,966,33.4856666666667
+41,967,26.5049
+41,968,31.0557333333333
+41,969,21.5053333333333
+41,970,31.4536666666667
+41,971,32.2453
+41,972,27.7368
+41,973,24.8708333333333
+41,974,31.1023
+41,975,25.5354666666667
+41,976,28.8374666666667
+41,977,21.8482333333333
+41,978,29.0491333333333
+41,979,32.2156666666667
+41,980,27.3769666666667
+41,981,23.0124
+41,982,24.6803333333333
+41,983,29.5783
+41,984,17.1026666666667
+41,985,26.3736666666667
+41,986,31.3351333333333
+41,987,26.9663333333333
+41,988,28.7274
+41,989,25.654
+41,990,25.5016
+41,991,25.0274666666667
+41,992,26.6488333333333
+41,993,29.7222333333333
+41,994,27.7410333333333
+41,995,24.7480666666667
+41,996,29.9296666666667
+41,997,27.6140333333333
+41,998,32.9565
+41,999,21.9117333333333
+41,1000,24.003
+42,1,29.9550666666667
+42,2,30.2768
+42,3,33.7100333333333
+42,4,26.5557
+42,5,26.9663333333333
+42,6,25.1036666666667
+42,7,30.2344666666667
+42,8,25.4635
+42,9,30.9964666666667
+42,10,29.1465
+42,11,28.4310666666667
+42,12,22.8007333333333
+42,13,29.6756666666667
+42,14,25.7894666666667
+42,15,23.4357333333333
+42,16,30.226
+42,17,36.3897333333333
+42,18,22.8176666666667
+42,19,18.2964666666667
+42,20,26.6319
+42,21,34.4635666666667
+42,22,28.1770666666667
+42,23,30.3572333333333
+42,24,36.4786333333333
+42,25,31.1361666666667
+42,26,26.5895666666667
+42,27,30.3826333333333
+42,28,26.8393333333333
+42,29,30.5435
+42,30,30.8821666666667
+42,31,32.639
+42,32,29.4428333333333
+42,33,31.5087
+42,34,34.6837
+42,35,32.2664666666667
+42,36,28.8798
+42,37,22.6991333333333
+42,38,31.4198
+42,39,28.702
+42,40,31.9235666666667
+42,41,22.6271666666667
+42,42,26.9451666666667
+42,43,23.2621666666667
+42,44,21.0650666666667
+42,45,31.1658
+42,46,24.1977333333333
+42,47,32.2622333333333
+42,48,26.6319
+42,49,28.575
+42,50,31.9278
+42,51,32.0929
+42,52,33.9005333333333
+42,53,27.3896666666667
+42,54,29.9762333333333
+42,55,37.6766666666667
+42,56,26.2128
+42,57,29.7222333333333
+42,58,26.924
+42,59,31.8177333333333
+42,60,20.7899
+42,61,26.8435666666667
+42,62,31.7288333333333
+42,63,36.5125
+42,64,24.7946333333333
+42,65,19.2616666666667
+42,66,21.971
+42,67,32.3215
+42,68,32.7236666666667
+42,69,34.4000666666667
+42,70,29.8534666666667
+42,71,20.4681666666667
+42,72,25.908
+42,73,31.0515
+42,74,20.8999666666667
+42,75,24.4348
+42,76,36.9612333333333
+42,77,35.4795666666667
+42,78,29.2650333333333
+42,79,29.464
+42,80,29.9931666666667
+42,81,28.4945666666667
+42,82,24.3670666666667
+42,83,25.4084666666667
+42,84,27.3261666666667
+42,85,25.4254
+42,86,26.9282333333333
+42,87,26.8901333333333
+42,88,30.7848
+42,89,36.3262333333333
+42,90,33.8751333333333
+42,91,32.4273333333333
+42,92,29.2311666666667
+42,93,29.2946666666667
+42,94,28.0289
+42,95,29.6799
+42,96,33.6719333333333
+42,97,39.6451666666667
+42,98,32.0251666666667
+42,99,24.7692333333333
+42,100,26.9367
+42,101,24.2993333333333
+42,102,27.6436666666667
+42,103,23.8336666666667
+42,104,23.4780666666667
+42,105,22.0472
+42,106,33.5534
+42,107,34.7556666666667
+42,108,34.4212333333333
+42,109,33.9725
+42,110,22.9108
+42,111,34.2942333333333
+42,112,18.9060666666667
+42,113,37.592
+42,114,21.8101333333333
+42,115,26.4202333333333
+42,116,29.4132
+42,117,32.0717333333333
+42,118,27.6479
+42,119,26.797
+42,120,24.3459
+42,121,24.9555
+42,122,30.8652333333333
+42,123,27.6436666666667
+42,124,28.5623
+42,125,36.8511666666667
+42,126,26.7208
+42,127,34.7810666666667
+42,128,25.5905
+42,129,18.034
+42,130,27.8341666666667
+42,131,32.4315666666667
+42,132,34.0402333333333
+42,133,31.9405
+42,134,31.8135
+42,135,27.4955
+42,136,31.6060666666667
+42,137,25.0020666666667
+42,138,30.0566666666667
+42,139,27.6436666666667
+42,140,30.353
+42,141,29.4470666666667
+42,142,27.6055666666667
+42,143,28.0881666666667
+42,144,35.6658333333333
+42,145,22.0133333333333
+42,146,32.4696666666667
+42,147,32.9438
+42,148,31.7330666666667
+42,149,26.4837333333333
+42,150,30.7805666666667
+42,151,32.6898
+42,152,24.511
+42,153,32.8972333333333
+42,154,30.8652333333333
+42,155,27.6013333333333
+42,156,27.3261666666667
+42,157,28.2871333333333
+42,158,25.4465666666667
+42,159,29.6841333333333
+42,160,24.0707333333333
+42,161,34.2519
+42,162,32.5162333333333
+42,163,23.0124
+42,164,31.7754
+42,165,26.0646333333333
+42,166,30.9499
+42,167,22.2800333333333
+42,168,30.7170666666667
+42,169,24.9343333333333
+42,170,27.0933333333333
+42,171,28.4734
+42,172,29.2608
+42,173,39.1710333333333
+42,174,32.8803
+42,175,27.4108333333333
+42,176,27.5801666666667
+42,177,28.3294666666667
+42,178,18.5081333333333
+42,179,24.2358333333333
+42,180,25.7048
+42,181,24.9809
+42,182,28.4734
+42,183,33.8243333333333
+42,184,30.5519666666667
+42,185,30.099
+42,186,23.3045
+42,187,28.5326666666667
+42,188,23.4357333333333
+42,189,21.6154
+42,190,26.7589
+42,191,20.7221666666667
+42,192,41.1734
+42,193,25.4423333333333
+42,194,21.209
+42,195,28.3633333333333
+42,196,31.7965666666667
+42,197,25.3661333333333
+42,198,31.8219666666667
+42,199,27.9654
+42,200,24.0919
+42,201,29.2311666666667
+42,202,21.2301666666667
+42,203,28.575
+42,204,29.9085
+42,205,24.2358333333333
+42,206,26.9282333333333
+42,207,24.7692333333333
+42,208,29.972
+42,209,29.0068
+42,210,29.5994666666667
+42,211,36.1992333333333
+42,212,33.909
+42,213,26.9282333333333
+42,214,26.4583333333333
+42,215,30.1286333333333
+42,216,30.9837666666667
+42,217,27.5378333333333
+42,218,27.8976666666667
+42,219,26.9494
+42,220,25.2179666666667
+42,221,32.9776666666667
+42,222,35.1578333333333
+42,223,33.1681666666667
+42,224,32.3426666666667
+42,225,29.0237333333333
+42,226,20.3877333333333
+42,227,31.4536666666667
+42,228,28.8713333333333
+42,229,23.3341333333333
+42,230,27.1568333333333
+42,231,27.2753666666667
+42,232,21.8270666666667
+42,233,33.6846333333333
+42,234,22.4493666666667
+42,235,33.2570666666667
+42,236,24.7777
+42,237,28.2236333333333
+42,238,26.7165666666667
+42,239,25.0825
+42,240,25.1968
+42,241,24.6210666666667
+42,242,31.9955333333333
+42,243,27.8595666666667
+42,244,32.5628
+42,245,27.8807333333333
+42,246,25.4042333333333
+42,247,24.1511666666667
+42,248,25.9122333333333
+42,249,25.3830666666667
+42,250,25.5354666666667
+42,251,26.4879666666667
+42,252,26.8054666666667
+42,253,31.2504666666667
+42,254,29.2777333333333
+42,255,29.5486666666667
+42,256,24.8793
+42,257,24.7057333333333
+42,258,33.4052333333333
+42,259,28.2575
+42,260,37.6766666666667
+42,261,44.6405
+42,262,23.4992333333333
+42,263,28.5326666666667
+42,264,29.5063333333333
+42,265,26.416
+42,266,19.7696666666667
+42,267,35.0604666666667
+42,268,21.5688333333333
+42,269,25.5524
+42,270,32.7744666666667
+42,271,35.0308333333333
+42,272,22.5213333333333
+42,273,22.4409
+42,274,28.3887333333333
+42,275,28.6173333333333
+42,276,32.8168
+42,277,26.4879666666667
+42,278,32.7067333333333
+42,279,28.8755666666667
+42,280,24.4729
+42,281,22.6695
+42,282,24.9597333333333
+42,283,29.591
+42,284,24.7226666666667
+42,285,32.0802
+42,286,32.3215
+42,287,29.5740666666667
+42,288,33.528
+42,289,22.8811666666667
+42,290,20.8491666666667
+42,291,18.1440666666667
+42,292,25.3576666666667
+42,293,29.7010666666667
+42,294,30.8271333333333
+42,295,30.8864
+42,296,33.1046666666667
+42,297,33.8328
+42,298,33.909
+42,299,37.7825
+42,300,25.8741333333333
+42,301,21.1455
+42,302,22.7753333333333
+42,303,29.9169666666667
+42,304,28.1389666666667
+42,305,27.9019
+42,306,36.7919
+42,307,38.4005666666667
+42,308,27.9230666666667
+42,309,40.6188333333333
+42,310,32.8337333333333
+42,311,26.5853333333333
+42,312,29.7645666666667
+42,313,25.019
+42,314,31.4790666666667
+42,315,23.0124
+42,316,26.1196666666667
+42,317,28.2236333333333
+42,318,25.5143
+42,319,31.1615666666667
+42,320,24.8539
+42,321,38.3328333333333
+42,322,26.2593666666667
+42,323,25.2772333333333
+42,324,26.4202333333333
+42,325,35.56
+42,326,30.1625
+42,327,26.3567333333333
+42,328,29.0237333333333
+42,329,30.1836666666667
+42,330,29.718
+42,331,28.7443333333333
+42,332,24.7226666666667
+42,333,29.8915666666667
+42,334,27.813
+42,335,28.2659666666667
+42,336,27.1610666666667
+42,337,26.5133666666667
+42,338,27.5886333333333
+42,339,24.4094
+42,340,21.1963
+42,341,36.1103333333333
+42,342,33.6804
+42,343,32.512
+42,344,26.8393333333333
+42,345,27.8595666666667
+42,346,31.0176333333333
+42,347,31.6060666666667
+42,348,35.8902
+42,349,32.5543333333333
+42,350,30.0609
+42,351,26.7758333333333
+42,352,26.8181666666667
+42,353,22.8854
+42,354,31.0345666666667
+42,355,27.4574
+42,356,36.8342333333333
+42,357,31.6907333333333
+42,358,32.1564
+42,359,28.1516666666667
+42,360,23.4315
+42,361,26.4244666666667
+42,362,25.8953
+42,363,30.3191333333333
+42,364,28.9644666666667
+42,365,26.3948333333333
+42,366,27.6267333333333
+42,367,29.9804666666667
+42,368,32.3003333333333
+42,369,22.1234
+42,370,36.2458
+42,371,22.2758
+42,372,25.2857
+42,373,30.4038
+42,374,32.0717333333333
+42,375,31.4621333333333
+42,376,27.6267333333333
+42,377,32.9184
+42,378,27.2457333333333
+42,379,26.6742333333333
+42,380,31.8558333333333
+42,381,20.3835
+42,382,24.0453333333333
+42,383,28.2829
+42,384,24.7480666666667
+42,385,30.2344666666667
+42,386,25.8064
+42,387,33.7396666666667
+42,388,23.6685666666667
+42,389,27.6013333333333
+42,390,24.765
+42,391,29.4936333333333
+42,392,24.1723333333333
+42,393,20.2353333333333
+42,394,21.5942333333333
+42,395,30.3191333333333
+42,396,25.4846666666667
+42,397,32.6009
+42,398,27.9908
+42,399,26.9451666666667
+42,400,36.0299
+42,401,33.5068333333333
+42,402,28.0924
+42,403,27.1610666666667
+42,404,29.0703
+42,405,34.3154
+42,406,23.1648
+42,407,34.2942333333333
+42,408,38.4598333333333
+42,409,24.7226666666667
+42,410,28.3421666666667
+42,411,26.289
+42,412,29.0195
+42,413,29.4894
+42,414,29.6629666666667
+42,415,29.9296666666667
+42,416,21.844
+42,417,24.638
+42,418,27.8172333333333
+42,419,25.3661333333333
+42,420,31.3393666666667
+42,421,21.1455
+42,422,27.0171333333333
+42,423,30.8017333333333
+42,424,27.7495
+42,425,26.4244666666667
+42,426,32.9395666666667
+42,427,30.0228
+42,428,23.241
+42,429,24.8327333333333
+42,430,26.9282333333333
+42,431,26.543
+42,432,24.7269
+42,433,23.9649
+42,434,25.0401666666667
+42,435,24.3459
+42,436,34.6498333333333
+42,437,24.0919
+42,438,20.3665666666667
+42,439,30.9922333333333
+42,440,22.9489
+42,441,36.2627333333333
+42,442,27.5463
+42,443,43.1419
+42,444,28.1601333333333
+42,445,34.3746666666667
+42,446,29.9339
+42,447,28.9856333333333
+42,448,29.8915666666667
+42,449,28.2363333333333
+42,450,32.4612
+42,451,27.7410333333333
+42,452,28.6046333333333
+42,453,24.6591666666667
+42,454,26.0138333333333
+42,455,27.94
+42,456,22.225
+42,457,18.5250666666667
+42,458,29.9762333333333
+42,459,31.4579
+42,460,29.7476333333333
+42,461,34.5482333333333
+42,462,25.2306666666667
+42,463,28.5369
+42,464,36.6903
+42,465,24.5152333333333
+42,466,28.829
+42,467,27.6987
+42,468,25.1925666666667
+42,469,28.7655
+42,470,27.4870333333333
+42,471,31.9193333333333
+42,472,36.4109
+42,473,26.6911666666667
+42,474,32.0717333333333
+42,475,27.0594666666667
+42,476,24.0665
+42,477,25.5481666666667
+42,478,22.9277333333333
+42,479,24.9047
+42,480,28.1432
+42,481,36.0468333333333
+42,482,30.2937333333333
+42,483,22.6737333333333
+42,484,24.8581333333333
+42,485,23.2198333333333
+42,486,22.8854
+42,487,22.6102333333333
+42,488,29.0618333333333
+42,489,29.3158333333333
+42,490,28.9263666666667
+42,491,28.4141333333333
+42,492,29.8704
+42,493,31.3097333333333
+42,494,28.1516666666667
+42,495,39.0694333333333
+42,496,29.2862
+42,497,19.1558333333333
+42,498,28.5199666666667
+42,499,35.0308333333333
+42,500,41.2326666666667
+42,501,25.7683
+42,502,35.0308333333333
+42,503,27.6013333333333
+42,504,31.4579
+42,505,26.8012333333333
+42,506,27.2245666666667
+42,507,29.1549666666667
+42,508,34.6329
+42,509,21.8651666666667
+42,510,28.5834666666667
+42,511,26.0180666666667
+42,512,29.0745333333333
+42,513,30.6493333333333
+42,514,26.2720666666667
+42,515,22.86
+42,516,25.4211666666667
+42,517,26.289
+42,518,31.9913
+42,519,28.6300333333333
+42,520,28.6808333333333
+42,521,29.7815
+42,522,23.9437333333333
+42,523,40.0769666666667
+42,524,30.1413333333333
+42,525,32.1987333333333
+42,526,31.0769
+42,527,29.5317333333333
+42,528,28.6427333333333
+42,529,24.9343333333333
+42,530,34.4212333333333
+42,531,33.6338333333333
+42,532,26.6488333333333
+42,533,25.908
+42,534,33.4433333333333
+42,535,39.3107333333333
+42,536,28.321
+42,537,28.1728333333333
+42,538,31.2039
+42,539,29.3878
+42,540,30.3149
+42,541,30.1667333333333
+42,542,22.4620666666667
+42,543,29.9550666666667
+42,544,24.6210666666667
+42,545,34.4424
+42,546,27.051
+42,547,24.5956666666667
+42,548,24.5745
+42,549,25.8021666666667
+42,550,27.559
+42,551,23.4018666666667
+42,552,22.0472
+42,553,28.1093333333333
+42,554,28.8713333333333
+42,555,26.6107333333333
+42,556,30.4376666666667
+42,557,26.9705666666667
+42,558,30.3784
+42,559,22.1276333333333
+42,560,29.8323
+42,561,29.1338
+42,562,27.3473333333333
+42,563,29.1041666666667
+42,564,24.6591666666667
+42,565,18.6520666666667
+42,566,23.5627333333333
+42,567,26.2297333333333
+42,568,31.6992
+42,569,31.7965666666667
+42,570,29.7010666666667
+42,571,33.2359
+42,572,30.607
+42,573,25.0444
+42,574,26.3779
+42,575,29.6968333333333
+42,576,26.0815666666667
+42,577,26.8393333333333
+42,578,18.6732333333333
+42,579,28.8120666666667
+42,580,30.5265666666667
+42,581,23.8125
+42,582,24.7269
+42,583,26.1196666666667
+42,584,29.9042666666667
+42,585,36.5633
+42,586,22.352
+42,587,29.0195
+42,588,26.3906
+42,589,28.3506333333333
+42,590,24.3670666666667
+42,591,28.2829
+42,592,26.7546666666667
+42,593,24.6422333333333
+42,594,29.3200666666667
+42,595,23.5627333333333
+42,596,32.1987333333333
+42,597,26.543
+42,598,25.6413
+42,599,20.9423
+42,600,26.289
+42,601,25.2941666666667
+42,602,42.4434
+42,603,33.5491666666667
+42,604,22.7160666666667
+42,605,24.7226666666667
+42,606,19.3971333333333
+42,607,36.576
+42,608,31.2081333333333
+42,609,29.9635333333333
+42,610,27.0806333333333
+42,611,20.9042
+42,612,24.4940666666667
+42,613,28.4056666666667
+42,614,26.3990666666667
+42,615,28.1347333333333
+42,616,30.5181
+42,617,31.4325
+42,618,22.4197333333333
+42,619,34.9038333333333
+42,620,26.1662333333333
+42,621,36.8765666666667
+42,622,30.3741666666667
+42,623,18.9484
+42,624,33.8497333333333
+42,625,25.9122333333333
+42,626,21.8313
+42,627,30.3572333333333
+42,628,27.3769666666667
+42,629,21.3995
+42,630,31.2716333333333
+42,631,25.8699
+42,632,22.8346
+42,633,32.7109666666667
+42,634,19.4352333333333
+42,635,22.2038333333333
+42,636,28.6596666666667
+42,637,34.3408
+42,638,24.9343333333333
+42,639,40.5426333333333
+42,640,32.1521666666667
+42,641,19.9855666666667
+42,642,32.4908333333333
+42,643,24.7861666666667
+42,644,32.4146333333333
+42,645,29.7222333333333
+42,646,30.6324
+42,647,29.2777333333333
+42,648,33.8074
+42,649,32.9776666666667
+42,650,30.0566666666667
+42,651,21.463
+42,652,26.8478
+42,653,29.6587333333333
+42,654,30.7382333333333
+42,655,24.4940666666667
+42,656,24.9809
+42,657,32.6263
+42,658,28.4522333333333
+42,659,24.9131666666667
+42,660,27.4150666666667
+42,661,27.5420666666667
+42,662,25.2941666666667
+42,663,24.7523
+42,664,31.1827333333333
+42,665,26.924
+42,666,27.2457333333333
+42,667,18.2668333333333
+42,668,34.4000666666667
+42,669,24.6634
+42,670,34.2688333333333
+42,671,26.8393333333333
+42,672,32.6813333333333
+42,673,33.0623333333333
+42,674,24.3078
+42,675,28.6977666666667
+42,676,33.7862333333333
+42,677,29.0660666666667
+42,678,29.2777333333333
+42,679,31.1573333333333
+42,680,25.9630333333333
+42,681,27.4743333333333
+42,682,27.3939
+42,683,41.4443333333333
+42,684,30.9499
+42,685,29.1507333333333
+42,686,25.8148666666667
+42,687,33.6338333333333
+42,688,25.8529666666667
+42,689,29.8196
+42,690,27.6648333333333
+42,691,29.2735
+42,692,26.6530666666667
+42,693,31.9108666666667
+42,694,22.8388333333333
+42,695,34.29
+42,696,29.5317333333333
+42,697,23.5796666666667
+42,698,23.3934
+42,699,27.0933333333333
+42,700,40.132
+42,701,31.6865
+42,702,19.6892333333333
+42,703,30.8398333333333
+42,704,47.9086333333333
+42,705,30.6705
+42,706,33.6126666666667
+42,707,36.7114666666667
+42,708,35.4584
+42,709,36.195
+42,710,28.4734
+42,711,26.1408333333333
+42,712,31.6272333333333
+42,713,19.9263
+42,714,36.8554
+42,715,26.4795
+42,716,28.6385
+42,717,25.3788333333333
+42,718,21.4037333333333
+42,719,31.2928
+42,720,32.2072
+42,721,28.1093333333333
+42,722,29.5783
+42,723,21.5307333333333
+42,724,33.2994
+42,725,28.9771666666667
+42,726,32.2453
+42,727,30.9668333333333
+42,728,31.3309
+42,729,28.5157333333333
+42,730,30.0185666666667
+42,731,27.6733
+42,732,26.2085666666667
+42,733,29.8238333333333
+42,734,24.7777
+42,735,22.7584
+42,736,37.9814666666667
+42,737,27.4235333333333
+42,738,33.6380666666667
+42,739,23.0716666666667
+42,740,28.2913666666667
+42,741,30.9710666666667
+42,742,27.2542
+42,743,40.5765
+42,744,31.3944
+42,745,31.8981666666667
+42,746,29.6756666666667
+42,747,28.829
+42,748,28.9814
+42,749,29.9550666666667
+42,750,23.1648
+42,751,29.8069
+42,752,25.3576666666667
+42,753,26.9282333333333
+42,754,35.7335666666667
+42,755,23.0505
+42,756,33.9386333333333
+42,757,25.8064
+42,758,29.5148
+42,759,36.4066666666667
+42,760,22.6314
+42,761,31.1996666666667
+42,762,28.8544
+42,763,40.4071666666667
+42,764,32.4104
+42,765,24.8708333333333
+42,766,28.4310666666667
+42,767,25.1714
+42,768,25.8233333333333
+42,769,36.5167333333333
+42,770,24.1130666666667
+42,771,25.0020666666667
+42,772,27.6013333333333
+42,773,28.8967333333333
+42,774,25.2391333333333
+42,775,29.4005
+42,776,26.6488333333333
+42,777,22.3562333333333
+42,778,22.3943333333333
+42,779,34.1503
+42,780,22.9065666666667
+42,781,28.7274
+42,782,29.464
+42,783,30.6154666666667
+42,784,32.2664666666667
+42,785,26.0815666666667
+42,786,28.0881666666667
+42,787,21.2344
+42,788,36.0299
+42,789,26.9959666666667
+42,790,25.9376333333333
+42,791,31.5595
+42,792,33.8878333333333
+42,793,41.2792333333333
+42,794,26.9070666666667
+42,795,34.0614
+42,796,24.384
+42,797,26.2974666666667
+42,798,37.8248333333333
+42,799,30.2979666666667
+42,800,30.0185666666667
+42,801,27.3473333333333
+42,802,31.8812333333333
+42,803,32.4104
+42,804,29.3793333333333
+42,805,30.2768
+42,806,28.3675666666667
+42,807,30.9964666666667
+42,808,22.9277333333333
+42,809,28.4734
+42,810,35.2679
+42,811,24.2993333333333
+42,812,30.9033333333333
+42,813,26.289
+42,814,26.7800666666667
+42,815,27.0552333333333
+42,816,21.9964
+42,817,24.3628333333333
+42,818,24.2781666666667
+42,819,29.845
+42,820,27.4997333333333
+42,821,30.4419
+42,822,30.3360666666667
+42,823,23.6304666666667
+42,824,26.7758333333333
+42,825,30.1667333333333
+42,826,30.2344666666667
+42,827,30.0185666666667
+42,828,31.7711666666667
+42,829,27.7537333333333
+42,830,18.9907333333333
+42,831,30.3995666666667
+42,832,34.4635666666667
+42,833,27.3304
+42,834,22.5467333333333
+42,835,18.8849
+42,836,25.0613333333333
+42,837,23.4103333333333
+42,838,27.7283333333333
+42,839,26.2339666666667
+42,840,26.8647333333333
+42,841,21.4841666666667
+42,842,25.3365
+42,843,34.1206666666667
+42,844,35.8563333333333
+42,845,28.0458333333333
+42,846,28.2786666666667
+42,847,35.7166333333333
+42,848,29.7010666666667
+42,849,35.1409
+42,850,22.4832333333333
+42,851,30.0185666666667
+42,852,33.7693
+42,853,28.0246666666667
+42,854,26.5684
+42,855,31.9701333333333
+42,856,23.5881333333333
+42,857,24.3035666666667
+42,858,28.3252333333333
+42,859,29.2142333333333
+42,860,28.6723666666667
+42,861,26.4371666666667
+42,862,28.2786666666667
+42,863,30.6789666666667
+42,864,37.973
+42,865,25.1290666666667
+42,866,27.1568333333333
+42,867,23.9183333333333
+42,868,34.7810666666667
+42,869,25.6709333333333
+42,870,29.3581666666667
+42,871,27.9738666666667
+42,872,25.1502333333333
+42,873,20.4089
+42,874,30.9245
+42,875,25.654
+42,876,26.3609666666667
+42,877,30.0820666666667
+42,878,28.3252333333333
+42,879,28.1601333333333
+42,880,24.5745
+42,881,38.9974666666667
+42,882,28.3887333333333
+42,883,30.5138666666667
+42,884,23.5034666666667
+42,885,26.8012333333333
+42,886,29.9339
+42,887,23.5415666666667
+42,888,22.4409
+42,889,32.3088
+42,890,24.5787333333333
+42,891,25.9969
+42,892,31.6949666666667
+42,893,28.4310666666667
+42,894,34.9885
+42,895,30.1836666666667
+42,896,29.8873333333333
+42,897,28.9348333333333
+42,898,25.4508
+42,899,28.1389666666667
+42,900,19.6257333333333
+42,901,25.1756333333333
+42,902,24.5321666666667
+42,903,34.0656333333333
+42,904,31.9870666666667
+42,905,22.0387333333333
+42,906,20.2649666666667
+42,907,32.3215
+42,908,32.6644
+42,909,26.6530666666667
+42,910,27.1568333333333
+42,911,32.6220666666667
+42,912,26.543
+42,913,30.6535666666667
+42,914,24.2993333333333
+42,915,32.1352333333333
+42,916,28.9390666666667
+42,917,44.0309
+42,918,29.7264666666667
+42,919,31.0134
+42,920,20.1083333333333
+42,921,23.3299
+42,922,29.7476333333333
+42,923,25.5989666666667
+42,924,23.6728
+42,925,23.7955666666667
+42,926,30.1455666666667
+42,927,30.4334333333333
+42,928,32.2368333333333
+42,929,25.7005666666667
+42,930,20.2776666666667
+42,931,30.7594
+42,932,28.1093333333333
+42,933,25.6794
+42,934,23.5585
+42,935,28.2490333333333
+42,936,33.3798333333333
+42,937,28.8544
+42,938,29.0195
+42,939,26.7419666666667
+42,940,28.2871333333333
+42,941,28.6808333333333
+42,942,30.0355
+42,943,23.9818333333333
+42,944,26.0773333333333
+42,945,20.1803
+42,946,28.0289
+42,947,33.3713666666667
+42,948,30.2725666666667
+42,949,24.9809
+42,950,24.8750666666667
+42,951,24.0961333333333
+42,952,19.3929
+42,953,32.3257333333333
+42,954,30.5223333333333
+42,955,30.0820666666667
+42,956,19.5622333333333
+42,957,26.0180666666667
+42,958,25.0444
+42,959,36.2796666666667
+42,960,28.6596666666667
+42,961,25.273
+42,962,34.9885
+42,963,21.9117333333333
+42,964,30.0397333333333
+42,965,22.6949
+42,966,18.9865
+42,967,24.4898333333333
+42,968,31.9235666666667
+42,969,32.1860333333333
+42,970,29.4555333333333
+42,971,29.464
+42,972,27.5801666666667
+42,973,27.3431
+42,974,21.4503
+42,975,26.8435666666667
+42,976,21.8948
+42,977,30.4673
+42,978,30.4884666666667
+42,979,28.9390666666667
+42,980,31.6145333333333
+42,981,28.9179
+42,982,33.7650666666667
+42,983,36.83
+42,984,27.1907
+42,985,25.7217333333333
+42,986,29.2650333333333
+42,987,24.1384666666667
+42,988,27.9611666666667
+42,989,22.6906666666667
+42,990,24.2993333333333
+42,991,32.4739
+42,992,21.0015666666667
+42,993,30.8017333333333
+42,994,35.1832333333333
+42,995,36.2839
+42,996,34.3535
+42,997,34.8826666666667
+42,998,34.2265
+42,999,27.8765
+42,1000,24.5745
+43,1,35.5388333333333
+43,2,36.1526666666667
+43,3,31.2631666666667
+43,4,43.7515
+43,5,39.4123333333333
+43,6,31.369
+43,7,34.2053333333333
+43,8,25.8021666666667
+43,9,49.8051666666667
+43,10,39.5393333333333
+43,11,36.4913333333333
+43,12,41.0421666666667
+43,13,31.8558333333333
+43,14,37.973
+43,15,30.7551666666667
+43,16,37.1475
+43,17,42.1851666666667
+43,18,34.3746666666667
+43,19,42.8836666666667
+43,20,30.8821666666667
+43,21,44.6193333333333
+43,22,33.1046666666667
+43,23,35.8986666666667
+43,24,37.9941666666667
+43,25,36.1526666666667
+43,26,39.7298333333333
+43,27,37.2321666666667
+43,28,34.7133333333333
+43,29,31.7711666666667
+43,30,33.3586666666667
+43,31,42.5873333333333
+43,32,33.5491666666667
+43,33,31.5595
+43,34,38.1211666666667
+43,35,33.274
+43,36,30.2895
+43,37,31.75
+43,38,47.1805
+43,39,32.1945
+43,40,37.2321666666667
+43,41,34.9673333333333
+43,42,35.1155
+43,43,35.7293333333333
+43,44,50.7576666666667
+43,45,41.275
+43,46,37.1686666666667
+43,47,29.4005
+43,48,34.036
+43,49,24.0665
+43,50,44.1748333333333
+43,51,36.83
+43,52,43.5186666666667
+43,53,29.845
+43,54,45.1061666666667
+43,55,36.9781666666667
+43,56,34.6286666666667
+43,57,33.4645
+43,58,31.3478333333333
+43,59,36.9781666666667
+43,60,27.4955
+43,61,37.6555
+43,62,41.9946666666667
+43,63,44.069
+43,64,33.4856666666667
+43,65,35.1366666666667
+43,66,40.767
+43,67,21.4841666666667
+43,68,28.2363333333333
+43,69,30.3318333333333
+43,70,44.3018333333333
+43,71,31.1785
+43,72,28.321
+43,73,32.258
+43,74,34.2053333333333
+43,75,41.5925
+43,76,29.972
+43,77,29.972
+43,78,43.561
+43,79,31.4748333333333
+43,80,28.9348333333333
+43,81,34.5016666666667
+43,82,33.4221666666667
+43,83,30.1201666666667
+43,84,37.9518333333333
+43,85,33.9725
+43,86,36.068
+43,87,39.5393333333333
+43,88,39.9838333333333
+43,89,33.3163333333333
+43,90,32.4485
+43,91,42.418
+43,92,34.9885
+43,93,38.227
+43,94,28.829
+43,95,38.4386666666667
+43,96,40.132
+43,97,42.7566666666667
+43,98,41.8253333333333
+43,99,29.2735
+43,100,32.6178333333333
+43,101,37.6978333333333
+43,102,25.9715
+43,103,39.5816666666667
+43,104,36.4278333333333
+43,105,35.7505
+43,106,23.2833333333333
+43,107,30.5011666666667
+43,108,40.9363333333333
+43,109,42.1428333333333
+43,110,53.2765
+43,111,43.307
+43,112,39.0525
+43,113,27.1568333333333
+43,114,40.1955
+43,115,35.4753333333333
+43,116,37.4861666666667
+43,117,33.655
+43,118,32.3638333333333
+43,119,47.2016666666667
+43,120,38.3751666666667
+43,121,29.8026666666667
+43,122,37.5708333333333
+43,123,37.8036666666667
+43,124,34.7345
+43,125,30.8186666666667
+43,126,35.6446666666667
+43,127,34.3958333333333
+43,128,24.4263333333333
+43,129,22.86
+43,130,29.972
+43,131,48.26
+43,132,32.4696666666667
+43,133,39.8145
+43,134,28.194
+43,135,49.3818333333333
+43,136,34.3323333333333
+43,137,34.925
+43,138,43.815
+43,139,33.4645
+43,140,37.9941666666667
+43,141,30.9456666666667
+43,142,35.8563333333333
+43,143,35.9198333333333
+43,144,40.2801666666667
+43,145,32.893
+43,146,26.7335
+43,147,32.512
+43,148,27.305
+43,149,33.0623333333333
+43,150,29.1888333333333
+43,151,34.3958333333333
+43,152,35.0308333333333
+43,153,35.7081666666667
+43,154,38.7561666666667
+43,155,34.7556666666667
+43,156,29.4428333333333
+43,157,44.1113333333333
+43,158,37.592
+43,159,37.8883333333333
+43,160,39.9838333333333
+43,161,33.6973333333333
+43,162,31.7923333333333
+43,163,33.3586666666667
+43,164,43.8785
+43,165,56.9383333333333
+43,166,34.671
+43,167,24.1511666666667
+43,168,24.5956666666667
+43,169,31.1785
+43,170,41.9946666666667
+43,171,29.9508333333333
+43,172,36.1103333333333
+43,173,37.1475
+43,174,43.9208333333333
+43,175,37.1898333333333
+43,176,28.575
+43,177,37.719
+43,178,26.0985
+43,179,35.8563333333333
+43,180,31.7923333333333
+43,181,37.3803333333333
+43,182,40.4071666666667
+43,183,26.8816666666667
+43,184,31.877
+43,185,27.8341666666667
+43,186,32.4696666666667
+43,187,27.3896666666667
+43,188,39.3065
+43,189,31.6441666666667
+43,190,26.6488333333333
+43,191,44.7675
+43,192,33.5915
+43,193,45.4236666666667
+43,194,41.91
+43,195,36.1103333333333
+43,196,42.545
+43,197,28.9983333333333
+43,198,25.8021666666667
+43,199,28.067
+43,200,32.1733333333333
+43,201,33.9513333333333
+43,202,37.6766666666667
+43,203,25.3365
+43,204,34.4805
+43,205,34.7556666666667
+43,206,29.464
+43,207,29.9931666666667
+43,208,26.2255
+43,209,32.639
+43,210,33.4221666666667
+43,211,43.2011666666667
+43,212,36.3008333333333
+43,213,31.0303333333333
+43,214,27.6013333333333
+43,215,44.958
+43,216,38.5868333333333
+43,217,24.3628333333333
+43,218,32.5543333333333
+43,219,33.5703333333333
+43,220,37.592
+43,221,32.131
+43,222,23.8971666666667
+43,223,32.0675
+43,224,35.0731666666667
+43,225,29.1253333333333
+43,226,34.6498333333333
+43,227,23.0505
+43,228,32.1521666666667
+43,229,44.7251666666667
+43,230,25.1248333333333
+43,231,32.4696666666667
+43,232,29.5063333333333
+43,233,35.6235
+43,234,42.291
+43,235,39.4123333333333
+43,236,35.0308333333333
+43,237,35.2213333333333
+43,238,35.0943333333333
+43,239,35.7928333333333
+43,240,30.8398333333333
+43,241,32.9353333333333
+43,242,34.2476666666667
+43,243,34.3323333333333
+43,244,38.8831666666667
+43,245,40.8093333333333
+43,246,46.5878333333333
+43,247,36.9146666666667
+43,248,27.4955
+43,249,43.7303333333333
+43,250,39.624
+43,251,36.4066666666667
+43,252,36.4278333333333
+43,253,31.5806666666667
+43,254,33.3163333333333
+43,255,27.5378333333333
+43,256,35.9621666666667
+43,257,28.5538333333333
+43,258,42.1851666666667
+43,259,30.861
+43,260,37.719
+43,261,31.7288333333333
+43,262,28.575
+43,263,28.5961666666667
+43,264,34.2476666666667
+43,265,36.4913333333333
+43,266,36.4066666666667
+43,267,43.2223333333333
+43,268,29.718
+43,269,40.005
+43,270,44.196
+43,271,31.2208333333333
+43,272,37.9306666666667
+43,273,25.273
+43,274,24.5533333333333
+43,275,32.4908333333333
+43,276,37.846
+43,277,44.704
+43,278,39.2853333333333
+43,279,31.115
+43,280,35.9198333333333
+43,281,32.8295
+43,282,28.8925
+43,283,38.6715
+43,284,43.9631666666667
+43,285,38.481
+43,286,46.2491666666667
+43,287,37.9306666666667
+43,288,40.259
+43,289,32.5543333333333
+43,290,39.0948333333333
+43,291,38.0365
+43,292,30.5858333333333
+43,293,48.6621666666667
+43,294,27.9823333333333
+43,295,26.1196666666667
+43,296,40.3436666666667
+43,297,31.4536666666667
+43,298,41.4866666666667
+43,299,29.972
+43,300,47.1381666666667
+43,301,28.0035
+43,302,33.8666666666667
+43,303,37.6555
+43,304,37.6978333333333
+43,305,35.687
+43,306,26.6488333333333
+43,307,25.3576666666667
+43,308,25.7175
+43,309,25.7386666666667
+43,310,46.1856666666667
+43,311,40.767
+43,312,38.9678333333333
+43,313,33.9725
+43,314,21.9075
+43,315,30.099
+43,316,35.7293333333333
+43,317,29.7391666666667
+43,318,34.7345
+43,319,34.2265
+43,320,32.0886666666667
+43,321,45.4448333333333
+43,322,32.8718333333333
+43,323,33.1681666666667
+43,324,28.9348333333333
+43,325,31.4325
+43,326,26.2255
+43,327,35.5388333333333
+43,328,39.4335
+43,329,39.624
+43,330,31.4536666666667
+43,331,30.0143333333333
+43,332,38.0153333333333
+43,333,43.1165
+43,334,30.6493333333333
+43,335,23.1563333333333
+43,336,38.8831666666667
+43,337,36.8088333333333
+43,338,39.878
+43,339,31.6865
+43,340,30.226
+43,341,36.8511666666667
+43,342,33.9936666666667
+43,343,35.7505
+43,344,31.2843333333333
+43,345,36.0256666666667
+43,346,35.2213333333333
+43,347,40.2378333333333
+43,348,34.9673333333333
+43,349,42.3756666666667
+43,350,27.6013333333333
+43,351,32.7236666666667
+43,352,34.3958333333333
+43,353,30.9245
+43,354,34.1841666666667
+43,355,35.0943333333333
+43,356,39.6028333333333
+43,357,35.0096666666667
+43,358,31.7923333333333
+43,359,35.56
+43,360,29.7391666666667
+43,361,24.2993333333333
+43,362,34.6921666666667
+43,363,33.0835
+43,364,42.3121666666667
+43,365,33.3375
+43,366,30.4165
+43,367,45.9951666666667
+43,368,39.9415
+43,369,30.0566666666667
+43,370,40.132
+43,371,25.1248333333333
+43,372,38.227
+43,373,32.5966666666667
+43,374,32.9776666666667
+43,375,35.814
+43,376,38.1211666666667
+43,377,41.8041666666667
+43,378,43.3916666666667
+43,379,34.8403333333333
+43,380,35.2636666666667
+43,381,35.941
+43,382,32.4485
+43,383,36.2585
+43,384,35.8775
+43,385,43.4128333333333
+43,386,35.6446666666667
+43,387,40.0896666666667
+43,388,32.0886666666667
+43,389,33.5491666666667
+43,390,33.1258333333333
+43,391,34.4593333333333
+43,392,31.1996666666667
+43,393,34.9885
+43,394,35.941
+43,395,32.639
+43,396,40.2166666666667
+43,397,22.5636666666667
+43,398,36.6818333333333
+43,399,33.1893333333333
+43,400,31.0726666666667
+43,401,37.6766666666667
+43,402,42.5661666666667
+43,403,26.6276666666667
+43,404,23.7278333333333
+43,405,28.1728333333333
+43,406,37.9941666666667
+43,407,42.2486666666667
+43,408,37.9941666666667
+43,409,34.6921666666667
+43,410,50.927
+43,411,27.051
+43,412,39.5393333333333
+43,413,45.9316666666667
+43,414,32.385
+43,415,24.4263333333333
+43,416,34.8615
+43,417,34.5228333333333
+43,418,34.0783333333333
+43,419,38.9678333333333
+43,420,37.7613333333333
+43,421,33.6973333333333
+43,422,26.162
+43,423,28.8078333333333
+43,424,36.703
+43,425,35.4541666666667
+43,426,35.7505
+43,427,32.8083333333333
+43,428,38.0576666666667
+43,429,30.1836666666667
+43,430,33.401
+43,431,41.6348333333333
+43,432,32.6178333333333
+43,433,34.9885
+43,434,33.401
+43,435,40.3648333333333
+43,436,21.6111666666667
+43,437,24.8496666666667
+43,438,36.1526666666667
+43,439,25.0401666666667
+43,440,34.5651666666667
+43,441,34.8191666666667
+43,442,52.5568333333333
+43,443,47.5826666666667
+43,444,32.1098333333333
+43,445,31.9193333333333
+43,446,33.1258333333333
+43,447,34.163
+43,448,35.4753333333333
+43,449,37.1686666666667
+43,450,27.4531666666667
+43,451,38.0576666666667
+43,452,34.3958333333333
+43,453,27.6013333333333
+43,454,33.8031666666667
+43,455,34.2053333333333
+43,456,27.1356666666667
+43,457,41.3808333333333
+43,458,34.7133333333333
+43,459,34.7133333333333
+43,460,37.2956666666667
+43,461,41.6983333333333
+43,462,39.0101666666667
+43,463,34.8191666666667
+43,464,45.5083333333333
+43,465,44.1748333333333
+43,466,29.2311666666667
+43,467,38.9255
+43,468,32.0886666666667
+43,469,36.2373333333333
+43,470,34.925
+43,471,29.8238333333333
+43,472,45.4448333333333
+43,473,39.4758333333333
+43,474,29.9508333333333
+43,475,30.6281666666667
+43,476,36.3431666666667
+43,477,39.9203333333333
+43,478,42.0581666666667
+43,479,26.8816666666667
+43,480,34.1418333333333
+43,481,38.1423333333333
+43,482,28.2786666666667
+43,483,38.3328333333333
+43,484,37.8883333333333
+43,485,25.8445
+43,486,31.3266666666667
+43,487,41.4655
+43,488,38.8408333333333
+43,489,22.0556666666667
+43,490,46.9688333333333
+43,491,30.607
+43,492,25.6751666666667
+43,493,33.5068333333333
+43,494,31.9193333333333
+43,495,27.8976666666667
+43,496,38.862
+43,497,35.941
+43,498,32.512
+43,499,35.4541666666667
+43,500,35.56
+43,501,31.623
+43,502,36.7665
+43,503,29.1253333333333
+43,504,23.3468333333333
+43,505,39.2853333333333
+43,506,35.7081666666667
+43,507,32.4696666666667
+43,508,35.2636666666667
+43,509,41.5078333333333
+43,510,36.0468333333333
+43,511,30.5858333333333
+43,512,25.9715
+43,513,26.6488333333333
+43,514,29.3793333333333
+43,515,35.2213333333333
+43,516,42.0581666666667
+43,517,36.2373333333333
+43,518,32.4908333333333
+43,519,29.5063333333333
+43,520,34.5863333333333
+43,521,25.7598333333333
+43,522,31.2208333333333
+43,523,36.957
+43,524,31.7711666666667
+43,525,39.5181666666667
+43,526,30.4588333333333
+43,527,33.6761666666667
+43,528,44.3018333333333
+43,529,36.4913333333333
+43,530,38.1846666666667
+43,531,31.7923333333333
+43,532,31.9616666666667
+43,533,29.6121666666667
+43,534,43.4975
+43,535,40.7458333333333
+43,536,35.3271666666667
+43,537,39.8991666666667
+43,538,29.4216666666667
+43,539,42.4815
+43,540,31.242
+43,541,27.1356666666667
+43,542,38.8831666666667
+43,543,39.3488333333333
+43,544,40.513
+43,545,34.544
+43,546,31.496
+43,547,31.8346666666667
+43,548,21.6535
+43,549,32.258
+43,550,33.1893333333333
+43,551,39.1583333333333
+43,552,51.2656666666667
+43,553,32.0251666666667
+43,554,32.893
+43,555,38.354
+43,556,33.274
+43,557,23.5373333333333
+43,558,36.5548333333333
+43,559,47.9636666666667
+43,560,39.0313333333333
+43,561,38.5445
+43,562,37.2745
+43,563,34.9038333333333
+43,564,36.322
+43,565,35.6446666666667
+43,566,33.782
+43,567,28.9771666666667
+43,568,28.2998333333333
+43,569,33.9301666666667
+43,570,28.0881666666667
+43,571,36.2373333333333
+43,572,38.735
+43,573,30.226
+43,574,32.258
+43,575,32.4485
+43,576,40.2166666666667
+43,577,40.0896666666667
+43,578,43.3916666666667
+43,579,36.9358333333333
+43,580,24.6803333333333
+43,581,47.4133333333333
+43,582,37.8671666666667
+43,583,33.5068333333333
+43,584,32.639
+43,585,37.1051666666667
+43,586,40.513
+43,587,35.8351666666667
+43,588,40.7246666666667
+43,589,34.1418333333333
+43,590,38.2693333333333
+43,591,31.8135
+43,592,26.7335
+43,593,28.4056666666667
+43,594,35.6658333333333
+43,595,38.0576666666667
+43,596,36.1738333333333
+43,597,29.9931666666667
+43,598,32.5755
+43,599,37.8671666666667
+43,600,39.37
+43,601,38.9255
+43,602,38.6291666666667
+43,603,32.1098333333333
+43,604,29.5063333333333
+43,605,31.0515
+43,606,36.1526666666667
+43,607,35.7505
+43,608,39.878
+43,609,40.513
+43,610,37.5285
+43,611,33.2951666666667
+43,612,41.9311666666667
+43,613,35.7716666666667
+43,614,53.9326666666667
+43,615,41.5501666666667
+43,616,36.1526666666667
+43,617,38.9255
+43,618,29.1888333333333
+43,619,33.3586666666667
+43,620,37.1051666666667
+43,621,37.9941666666667
+43,622,43.5186666666667
+43,623,28.2998333333333
+43,624,41.7618333333333
+43,625,32.3426666666667
+43,626,43.4551666666667
+43,627,29.7815
+43,628,36.6395
+43,629,31.623
+43,630,32.6178333333333
+43,631,26.162
+43,632,33.8455
+43,633,41.5078333333333
+43,634,50.3978333333333
+43,635,27.0721666666667
+43,636,39.2641666666667
+43,637,41.0421666666667
+43,638,43.6033333333333
+43,639,37.846
+43,640,30.6916666666667
+43,641,31.3901666666667
+43,642,41.2115
+43,643,35.7081666666667
+43,644,31.0091666666667
+43,645,42.8201666666667
+43,646,39.0948333333333
+43,647,32.385
+43,648,34.1841666666667
+43,649,36.195
+43,650,23.9818333333333
+43,651,38.1635
+43,652,36.3855
+43,653,33.9725
+43,654,37.4226666666667
+43,655,32.4696666666667
+43,656,31.496
+43,657,43.2646666666667
+43,658,33.4221666666667
+43,659,31.7711666666667
+43,660,32.7025
+43,661,38.1846666666667
+43,662,39.8568333333333
+43,663,42.0581666666667
+43,664,30.2471666666667
+43,665,31.4748333333333
+43,666,23.4738333333333
+43,667,39.5816666666667
+43,668,34.6921666666667
+43,669,24.2146666666667
+43,670,38.3963333333333
+43,671,37.4226666666667
+43,672,30.353
+43,673,38.9678333333333
+43,674,43.9631666666667
+43,675,26.3736666666667
+43,676,38.3751666666667
+43,677,31.1785
+43,678,34.5228333333333
+43,679,31.7711666666667
+43,680,36.0891666666667
+43,681,31.877
+43,682,40.7246666666667
+43,683,32.7236666666667
+43,684,36.7453333333333
+43,685,29.3158333333333
+43,686,34.7768333333333
+43,687,37.6555
+43,688,43.8573333333333
+43,689,31.623
+43,690,33.8666666666667
+43,691,26.3101666666667
+43,692,36.8935
+43,693,40.4495
+43,694,32.8718333333333
+43,695,25.9926666666667
+43,696,25.6751666666667
+43,697,32.893
+43,698,30.0566666666667
+43,699,27.2415
+43,700,32.6601666666667
+43,701,37.7825
+43,702,34.8403333333333
+43,703,29.1465
+43,704,35.9833333333333
+43,705,33.274
+43,706,31.115
+43,707,29.0618333333333
+43,708,27.4743333333333
+43,709,24.8073333333333
+43,710,34.9461666666667
+43,711,40.7458333333333
+43,712,39.0525
+43,713,39.8356666666667
+43,714,26.543
+43,715,30.9033333333333
+43,716,38.4175
+43,717,37.211
+43,718,35.56
+43,719,24.8073333333333
+43,720,27.9188333333333
+43,721,38.0576666666667
+43,722,46.4608333333333
+43,723,29.591
+43,724,26.924
+43,725,42.545
+43,726,28.321
+43,727,29.4005
+43,728,28.2575
+43,729,35.9621666666667
+43,730,45.212
+43,731,42.8201666666667
+43,732,35.3695
+43,733,39.9415
+43,734,41.9523333333333
+43,735,35.3271666666667
+43,736,32.4061666666667
+43,737,34.0783333333333
+43,738,37.1051666666667
+43,739,38.2905
+43,740,34.5863333333333
+43,741,27.3896666666667
+43,742,34.2053333333333
+43,743,31.7711666666667
+43,744,34.798
+43,745,31.1785
+43,746,43.815
+43,747,31.7711666666667
+43,748,23.368
+43,749,34.1418333333333
+43,750,29.845
+43,751,36.0468333333333
+43,752,38.7773333333333
+43,753,38.5021666666667
+43,754,33.4221666666667
+43,755,35.8563333333333
+43,756,32.9565
+43,757,31.1785
+43,758,34.671
+43,759,28.0035
+43,760,34.0783333333333
+43,761,31.4748333333333
+43,762,33.1893333333333
+43,763,36.7453333333333
+43,764,31.3901666666667
+43,765,47.3075
+43,766,27.0298333333333
+43,767,46.355
+43,768,34.5651666666667
+43,769,35.8775
+43,770,53.213
+43,771,42.3121666666667
+43,772,36.3855
+43,773,33.2105
+43,774,37.6978333333333
+43,775,32.639
+43,776,33.3375
+43,777,49.6146666666667
+43,778,33.6973333333333
+43,779,28.321
+43,780,33.02
+43,781,28.9136666666667
+43,782,45.8893333333333
+43,783,39.878
+43,784,32.2156666666667
+43,785,34.2053333333333
+43,786,30.1625
+43,787,31.8346666666667
+43,788,38.481
+43,789,30.4165
+43,790,47.0535
+43,791,33.4221666666667
+43,792,34.3323333333333
+43,793,39.4335
+43,794,22.8811666666667
+43,795,27.6225
+43,796,34.036
+43,797,38.6503333333333
+43,798,30.2048333333333
+43,799,34.7133333333333
+43,800,36.7665
+43,801,46.609
+43,802,38.3963333333333
+43,803,36.4701666666667
+43,804,32.8083333333333
+43,805,24.003
+43,806,27.8341666666667
+43,807,42.799
+43,808,35.6446666666667
+43,809,30.0143333333333
+43,810,31.1361666666667
+43,811,36.3643333333333
+43,812,33.8243333333333
+43,813,31.242
+43,814,33.4645
+43,815,30.9033333333333
+43,816,49.8898333333333
+43,817,23.114
+43,818,27.7071666666667
+43,819,38.0576666666667
+43,820,33.7608333333333
+43,821,51.181
+43,822,33.5491666666667
+43,823,26.289
+43,824,45.2755
+43,825,37.5708333333333
+43,826,36.703
+43,827,29.6756666666667
+43,828,30.5223333333333
+43,829,45.8258333333333
+43,830,30.2471666666667
+43,831,38.5021666666667
+43,832,36.9358333333333
+43,833,28.2575
+43,834,33.9301666666667
+43,835,35.1366666666667
+43,836,35.1578333333333
+43,837,25.3576666666667
+43,838,29.5063333333333
+43,839,31.3266666666667
+43,840,34.4381666666667
+43,841,33.274
+43,842,34.3958333333333
+43,843,34.2053333333333
+43,844,44.3653333333333
+43,845,28.3421666666667
+43,846,29.972
+43,847,32.639
+43,848,48.4293333333333
+43,849,39.5605
+43,850,40.3648333333333
+43,851,40.3436666666667
+43,852,33.2105
+43,853,27.8341666666667
+43,854,36.4913333333333
+43,855,35.8563333333333
+43,856,28.575
+43,857,28.194
+43,858,49.2548333333333
+43,859,36.3643333333333
+43,860,34.925
+43,861,55.2873333333333
+43,862,39.6875
+43,863,35.0308333333333
+43,864,46.101
+43,865,39.8568333333333
+43,866,27.559
+43,867,40.5976666666667
+43,868,35.0096666666667
+43,869,40.3436666666667
+43,870,42.4815
+43,871,39.1371666666667
+43,872,34.1418333333333
+43,873,43.5398333333333
+43,874,38.2481666666667
+43,875,41.5501666666667
+43,876,38.1635
+43,877,32.1945
+43,878,34.3746666666667
+43,879,51.3926666666667
+43,880,24.3628333333333
+43,881,39.6875
+43,882,36.7665
+43,883,32.2791666666667
+43,884,31.1573333333333
+43,885,30.6705
+43,886,48.1965
+43,887,37.6766666666667
+43,888,37.4861666666667
+43,889,39.3276666666667
+43,890,38.5868333333333
+43,891,40.513
+43,892,27.5378333333333
+43,893,51.4773333333333
+43,894,35.5176666666667
+43,895,38.0576666666667
+43,896,44.3441666666667
+43,897,34.7345
+43,898,36.3643333333333
+43,899,40.513
+43,900,30.6705
+43,901,42.926
+43,902,33.8243333333333
+43,903,39.8145
+43,904,36.2161666666667
+43,905,35.0731666666667
+43,906,41.9311666666667
+43,907,38.2905
+43,908,38.227
+43,909,30.6281666666667
+43,910,42.164
+43,911,31.3901666666667
+43,912,26.3313333333333
+43,913,37.5285
+43,914,38.2058333333333
+43,915,42.2063333333333
+43,916,28.4691666666667
+43,917,35.7505
+43,918,30.2048333333333
+43,919,32.5543333333333
+43,920,36.3855
+43,921,27.7495
+43,922,26.5853333333333
+43,923,28.8925
+43,924,31.8981666666667
+43,925,28.067
+43,926,38.989
+43,927,28.7655
+43,928,29.0195
+43,929,34.2265
+43,930,52.6626666666667
+43,931,43.0953333333333
+43,932,25.1036666666667
+43,933,43.9631666666667
+43,934,34.2053333333333
+43,935,42.3968333333333
+43,936,32.8506666666667
+43,937,35.179
+43,938,31.4748333333333
+43,939,30.0778333333333
+43,940,28.0246666666667
+43,941,26.5641666666667
+43,942,26.8605
+43,943,37.1686666666667
+43,944,36.8935
+43,945,25.1883333333333
+43,946,42.037
+43,947,49.657
+43,948,28.4691666666667
+43,949,35.4965
+43,950,30.0566666666667
+43,951,33.4221666666667
+43,952,32.7871666666667
+43,953,32.0675
+43,954,31.0515
+43,955,38.1635
+43,956,43.6456666666667
+43,957,30.8398333333333
+43,958,37.4226666666667
+43,959,35.2425
+43,960,34.9038333333333
+43,961,36.4278333333333
+43,962,39.9626666666667
+43,963,35.8563333333333
+43,964,30.3106666666667
+43,965,34.163
+43,966,47.5191666666667
+43,967,42.6296666666667
+43,968,24.9555
+43,969,47.2228333333333
+43,970,35.4541666666667
+43,971,22.5213333333333
+43,972,44.196
+43,973,28.5326666666667
+43,974,24.5533333333333
+43,975,29.1041666666667
+43,976,18.0975
+43,977,38.989
+43,978,24.4263333333333
+43,979,35.4965
+43,980,42.926
+43,981,21.9498333333333
+43,982,23.3891666666667
+43,983,35.814
+43,984,35.7505
+43,985,45.8893333333333
+43,986,31.0303333333333
+43,987,20.574
+43,988,31.0303333333333
+43,989,30.5435
+43,990,36.0891666666667
+43,991,31.8346666666667
+43,992,31.496
+43,993,24.4686666666667
+43,994,31.3478333333333
+43,995,32.1733333333333
+43,996,41.3173333333333
+43,997,32.1521666666667
+43,998,29.7391666666667
+43,999,33.8878333333333
+43,1000,27.7071666666667
+44,1,31.6865
+44,2,28.2151666666667
+44,3,17.399
+44,4,22.8811666666667
+44,5,24.0876666666667
+44,6,22.86
+44,7,21.844
+44,8,28.4056666666667
+44,9,31.4536666666667
+44,10,30.5435
+44,11,32.1521666666667
+44,12,24.3416666666667
+44,13,27.686
+44,14,23.5161666666667
+44,15,30.2895
+44,16,25.273
+44,17,19.939
+44,18,32.639
+44,19,25.8445
+44,20,24.6168333333333
+44,21,21.9075
+44,22,24.765
+44,23,26.4371666666667
+44,24,32.3638333333333
+44,25,35.179
+44,26,26.5853333333333
+44,27,20.9973333333333
+44,28,27.178
+44,29,21.9075
+44,30,24.7861666666667
+44,31,25.273
+44,32,30.9033333333333
+44,33,22.1191666666667
+44,34,17.9916666666667
+44,35,24.765
+44,36,23.9395
+44,37,25.4846666666667
+44,38,30.2048333333333
+44,39,28.3633333333333
+44,40,30.6281666666667
+44,41,34.5016666666667
+44,42,28.829
+44,43,25.2941666666667
+44,44,27.5378333333333
+44,45,29.1041666666667
+44,46,30.4376666666667
+44,47,41.7195
+44,48,36.3855
+44,49,24.13
+44,50,30.6916666666667
+44,51,29.1888333333333
+44,52,25.7175
+44,53,30.3953333333333
+44,54,28.0035
+44,55,33.8666666666667
+44,56,25.3365
+44,57,29.1888333333333
+44,58,29.2735
+44,59,27.7283333333333
+44,60,16.1501666666667
+44,61,23.4738333333333
+44,62,28.6173333333333
+44,63,30.8821666666667
+44,64,33.5068333333333
+44,65,27.4531666666667
+44,66,24.0665
+44,67,35.1578333333333
+44,68,20.5951666666667
+44,69,29.5063333333333
+44,70,24.4898333333333
+44,71,24.1723333333333
+44,72,32.9988333333333
+44,73,28.956
+44,74,35.7716666666667
+44,75,21.3995
+44,76,30.353
+44,77,24.9978333333333
+44,78,32.1733333333333
+44,79,38.735
+44,80,31.75
+44,81,27.8341666666667
+44,82,25.527
+44,83,27.7918333333333
+44,84,24.638
+44,85,28.0035
+44,86,27.7706666666667
+44,87,36.5125
+44,88,27.7706666666667
+44,89,27.0933333333333
+44,90,27.0086666666667
+44,91,37.6766666666667
+44,92,26.5853333333333
+44,93,30.0566666666667
+44,94,30.099
+44,95,32.7236666666667
+44,96,26.5218333333333
+44,97,25.9291666666667
+44,98,23.0081666666667
+44,99,21.1031666666667
+44,100,34.6498333333333
+44,101,26.924
+44,102,33.2951666666667
+44,103,25.4211666666667
+44,104,29.6545
+44,105,26.9451666666667
+44,106,31.8558333333333
+44,107,29.0618333333333
+44,108,25.4423333333333
+44,109,27.8553333333333
+44,110,29.7603333333333
+44,111,26.3313333333333
+44,112,33.9725
+44,113,31.7923333333333
+44,114,24.2993333333333
+44,115,30.5223333333333
+44,116,21.9075
+44,117,24.5745
+44,118,33.6338333333333
+44,119,20.9126666666667
+44,120,29.1465
+44,121,25.6751666666667
+44,122,27.7706666666667
+44,123,26.3525
+44,124,36.9993333333333
+44,125,27.0086666666667
+44,126,26.7123333333333
+44,127,28.448
+44,128,33.7608333333333
+44,129,22.5636666666667
+44,130,22.4578333333333
+44,131,22.6695
+44,132,18.2456666666667
+44,133,27.813
+44,134,28.4691666666667
+44,135,26.9875
+44,136,26.6911666666667
+44,137,21.9921666666667
+44,138,24.7438333333333
+44,139,28.4268333333333
+44,140,27.2415
+44,141,29.7603333333333
+44,142,36.6606666666667
+44,143,19.7061666666667
+44,144,20.8703333333333
+44,145,29.1253333333333
+44,146,30.226
+44,147,39.9838333333333
+44,148,27.6648333333333
+44,149,32.766
+44,150,28.2363333333333
+44,151,28.4268333333333
+44,152,27.8765
+44,153,29.0618333333333
+44,154,30.5858333333333
+44,155,28.1093333333333
+44,156,37.1898333333333
+44,157,20.1718333333333
+44,158,27.8341666666667
+44,159,27.8553333333333
+44,160,24.003
+44,161,28.5538333333333
+44,162,27.94
+44,163,24.4475
+44,164,23.9818333333333
+44,165,15.4516666666667
+44,166,27.1568333333333
+44,167,30.7128333333333
+44,168,32.9141666666667
+44,169,28.8078333333333
+44,170,34.8403333333333
+44,171,23.3468333333333
+44,172,32.766
+44,173,25.6328333333333
+44,174,26.2255
+44,175,25.0401666666667
+44,176,30.4376666666667
+44,177,30.3953333333333
+44,178,26.4795
+44,179,25.5905
+44,180,23.0716666666667
+44,181,27.3896666666667
+44,182,22.8176666666667
+44,183,33.2528333333333
+44,184,32.2791666666667
+44,185,26.9451666666667
+44,186,28.321
+44,187,24.3628333333333
+44,188,32.3638333333333
+44,189,36.4913333333333
+44,190,34.6075
+44,191,29.7391666666667
+44,192,29.1253333333333
+44,193,26.4795
+44,194,23.3045
+44,195,28.829
+44,196,27.6013333333333
+44,197,25.0401666666667
+44,198,28.6808333333333
+44,199,25.0613333333333
+44,200,20.9761666666667
+44,201,33.8455
+44,202,25.9503333333333
+44,203,29.3793333333333
+44,204,31.7923333333333
+44,205,29.4428333333333
+44,206,20.066
+44,207,28.829
+44,208,24.4051666666667
+44,209,26.8393333333333
+44,210,27.0298333333333
+44,211,33.7396666666667
+44,212,28.9771666666667
+44,213,24.9978333333333
+44,214,26.4371666666667
+44,215,27.9188333333333
+44,216,37.9306666666667
+44,217,28.2575
+44,218,31.9828333333333
+44,219,25.2941666666667
+44,220,27.1991666666667
+44,221,33.655
+44,222,27.94
+44,223,20.9761666666667
+44,224,28.2998333333333
+44,225,28.0881666666667
+44,226,30.2048333333333
+44,227,36.1103333333333
+44,228,27.305
+44,229,25.4846666666667
+44,230,36.0468333333333
+44,231,33.9725
+44,232,27.3896666666667
+44,233,29.6756666666667
+44,234,28.7443333333333
+44,235,35.2425
+44,236,32.9141666666667
+44,237,30.1625
+44,238,35.2636666666667
+44,239,29.1465
+44,240,30.2895
+44,241,27.4743333333333
+44,242,20.574
+44,243,26.6065
+44,244,26.9451666666667
+44,245,26.7123333333333
+44,246,25.6328333333333
+44,247,22.987
+44,248,26.9663333333333
+44,249,26.7546666666667
+44,250,26.035
+44,251,29.8873333333333
+44,252,28.7231666666667
+44,253,16.4465
+44,254,33.2316666666667
+44,255,20.9126666666667
+44,256,24.4686666666667
+44,257,23.4738333333333
+44,258,21.9075
+44,259,32.9776666666667
+44,260,26.035
+44,261,29.0406666666667
+44,262,35.1155
+44,263,25.9291666666667
+44,264,19.8543333333333
+44,265,28.575
+44,266,26.6488333333333
+44,267,24.3628333333333
+44,268,29.7815
+44,269,30.6705
+44,270,25.3576666666667
+44,271,30.6705
+44,272,39.878
+44,273,28.575
+44,274,25.6328333333333
+44,275,27.305
+44,276,28.9348333333333
+44,277,21.8651666666667
+44,278,25.2306666666667
+44,279,28.8501666666667
+44,280,28.575
+44,281,29.6333333333333
+44,282,31.7711666666667
+44,283,32.2156666666667
+44,284,30.9668333333333
+44,285,26.924
+44,286,32.893
+44,287,30.6705
+44,288,32.9353333333333
+44,289,26.1408333333333
+44,290,22.2038333333333
+44,291,28.8925
+44,292,27.8553333333333
+44,293,26.9663333333333
+44,294,25.8021666666667
+44,295,31.1785
+44,296,30.3953333333333
+44,297,30.861
+44,298,21.9075
+44,299,24.511
+44,300,24.765
+44,301,23.7913333333333
+44,302,22.2038333333333
+44,303,25.7386666666667
+44,304,30.8398333333333
+44,305,26.6276666666667
+44,306,32.8718333333333
+44,307,33.8243333333333
+44,308,33.3375
+44,309,32.9988333333333
+44,310,23.2621666666667
+44,311,29.6968333333333
+44,312,25.1036666666667
+44,313,35.6658333333333
+44,314,28.0035
+44,315,29.972
+44,316,26.8605
+44,317,28.9348333333333
+44,318,28.5538333333333
+44,319,25.8868333333333
+44,320,28.956
+44,321,28.6385
+44,322,26.5006666666667
+44,323,26.9028333333333
+44,324,23.5585
+44,325,33.9725
+44,326,30.1413333333333
+44,327,22.1826666666667
+44,328,27.2415
+44,329,34.3958333333333
+44,330,22.606
+44,331,25.2306666666667
+44,332,27.9188333333333
+44,333,27.4531666666667
+44,334,23.114
+44,335,30.6281666666667
+44,336,36.5336666666667
+44,337,31.6865
+44,338,33.02
+44,339,28.0246666666667
+44,340,30.1413333333333
+44,341,31.5383333333333
+44,342,33.5703333333333
+44,343,26.5218333333333
+44,344,31.4113333333333
+44,345,25.5058333333333
+44,346,24.8285
+44,347,31.369
+44,348,28.7231666666667
+44,349,28.0881666666667
+44,350,23.9818333333333
+44,351,26.543
+44,352,22.4578333333333
+44,353,19.7061666666667
+44,354,33.3163333333333
+44,355,34.3746666666667
+44,356,23.4103333333333
+44,357,21.6323333333333
+44,358,24.1723333333333
+44,359,29.2523333333333
+44,360,28.7443333333333
+44,361,30.5435
+44,362,22.8811666666667
+44,363,30.1836666666667
+44,364,32.1945
+44,365,28.5326666666667
+44,366,20.8068333333333
+44,367,25.146
+44,368,26.7335
+44,369,24.2358333333333
+44,370,26.6276666666667
+44,371,34.8403333333333
+44,372,22.6906666666667
+44,373,34.3111666666667
+44,374,34.6075
+44,375,25.3576666666667
+44,376,29.2735
+44,377,19.8755
+44,378,27.8553333333333
+44,379,24.5321666666667
+44,380,25.2941666666667
+44,381,31.3055
+44,382,29.7603333333333
+44,383,37.4861666666667
+44,384,29.6545
+44,385,30.2683333333333
+44,386,23.1775
+44,387,28.8501666666667
+44,388,31.2631666666667
+44,389,23.495
+44,390,27.7706666666667
+44,391,27.178
+44,392,21.1031666666667
+44,393,26.8605
+44,394,19.812
+44,395,27.1356666666667
+44,396,24.5321666666667
+44,397,35.0731666666667
+44,398,33.1046666666667
+44,399,22.2673333333333
+44,400,29.5486666666667
+44,401,29.4851666666667
+44,402,24.4898333333333
+44,403,27.4108333333333
+44,404,28.9348333333333
+44,405,22.6271666666667
+44,406,29.4216666666667
+44,407,25.5693333333333
+44,408,31.5595
+44,409,31.8135
+44,410,26.8181666666667
+44,411,29.1888333333333
+44,412,27.7495
+44,413,27.0721666666667
+44,414,31.6865
+44,415,26.0773333333333
+44,416,29.1676666666667
+44,417,26.416
+44,418,37.8883333333333
+44,419,28.6808333333333
+44,420,28.067
+44,421,29.21
+44,422,32.0886666666667
+44,423,29.1253333333333
+44,424,30.48
+44,425,22.0133333333333
+44,426,21.1243333333333
+44,427,33.3375
+44,428,25.4846666666667
+44,429,29.3581666666667
+44,430,30.7763333333333
+44,431,26.5218333333333
+44,432,27.0086666666667
+44,433,27.8976666666667
+44,434,29.6121666666667
+44,435,23.8336666666667
+44,436,33.1258333333333
+44,437,22.4578333333333
+44,438,26.67
+44,439,34.3958333333333
+44,440,27.686
+44,441,24.8285
+44,442,28.3845
+44,443,33.9936666666667
+44,444,28.2786666666667
+44,445,22.987
+44,446,15.2823333333333
+44,447,33.6761666666667
+44,448,35.941
+44,449,35.052
+44,450,22.7118333333333
+44,451,25.9503333333333
+44,452,22.0133333333333
+44,453,31.4536666666667
+44,454,17.0603333333333
+44,455,30.2471666666667
+44,456,26.8605
+44,457,32.9141666666667
+44,458,22.733
+44,459,21.7593333333333
+44,460,24.4263333333333
+44,461,32.7236666666667
+44,462,33.7396666666667
+44,463,28.9983333333333
+44,464,30.3318333333333
+44,465,25.2941666666667
+44,466,21.1455
+44,467,29.8661666666667
+44,468,28.9136666666667
+44,469,28.6808333333333
+44,470,29.7603333333333
+44,471,31.0938333333333
+44,472,26.162
+44,473,35.56
+44,474,23.9395
+44,475,24.1511666666667
+44,476,29.6968333333333
+44,477,31.7711666666667
+44,478,28.067
+44,479,28.5326666666667
+44,480,35.3271666666667
+44,481,23.3891666666667
+44,482,28.4691666666667
+44,483,33.5703333333333
+44,484,28.4268333333333
+44,485,25.0825
+44,486,31.0726666666667
+44,487,36.0468333333333
+44,488,25.2941666666667
+44,489,34.2053333333333
+44,490,32.258
+44,491,39.5816666666667
+44,492,25.7386666666667
+44,493,24.13
+44,494,27.9188333333333
+44,495,26.1196666666667
+44,496,21.6746666666667
+44,497,29.0618333333333
+44,498,27.6648333333333
+44,499,26.6065
+44,500,25.8445
+44,501,29.9085
+44,502,26.8393333333333
+44,503,29.3581666666667
+44,504,34.1841666666667
+44,505,22.0345
+44,506,29.4005
+44,507,33.3798333333333
+44,508,24.1723333333333
+44,509,23.0716666666667
+44,510,32.6813333333333
+44,511,30.6281666666667
+44,512,23.749
+44,513,24.9343333333333
+44,514,24.8285
+44,515,26.7335
+44,516,22.1615
+44,517,26.543
+44,518,29.6121666666667
+44,519,29.2946666666667
+44,520,29.9508333333333
+44,521,30.9033333333333
+44,522,32.4908333333333
+44,523,24.9343333333333
+44,524,21.8651666666667
+44,525,28.6808333333333
+44,526,31.0091666666667
+44,527,28.9348333333333
+44,528,25.4423333333333
+44,529,24.892
+44,530,32.3638333333333
+44,531,36.1738333333333
+44,532,36.6395
+44,533,25.0825
+44,534,32.6178333333333
+44,535,22.8176666666667
+44,536,28.956
+44,537,34.3535
+44,538,26.1196666666667
+44,539,34.0783333333333
+44,540,24.384
+44,541,26.4371666666667
+44,542,24.1511666666667
+44,543,19.7696666666667
+44,544,30.4376666666667
+44,545,25.8656666666667
+44,546,23.2198333333333
+44,547,26.289
+44,548,29.337
+44,549,37.5073333333333
+44,550,32.8083333333333
+44,551,29.3581666666667
+44,552,26.67
+44,553,26.7758333333333
+44,554,25.6963333333333
+44,555,22.3943333333333
+44,556,30.861
+44,557,28.8078333333333
+44,558,36.1315
+44,559,26.543
+44,560,19.3675
+44,561,34.0571666666667
+44,562,22.987
+44,563,34.0148333333333
+44,564,22.2673333333333
+44,565,22.9658333333333
+44,566,24.8285
+44,567,29.591
+44,568,29.845
+44,569,33.528
+44,570,22.7541666666667
+44,571,28.9983333333333
+44,572,29.591
+44,573,27.1145
+44,574,27.559
+44,575,26.9451666666667
+44,576,25.5905
+44,577,29.4851666666667
+44,578,25.8021666666667
+44,579,25.6963333333333
+44,580,39.6663333333333
+44,581,28.3421666666667
+44,582,27.305
+44,583,29.21
+44,584,27.7918333333333
+44,585,24.8496666666667
+44,586,33.0411666666667
+44,587,26.543
+44,588,24.9766666666667
+44,589,29.1888333333333
+44,590,28.8078333333333
+44,591,33.3586666666667
+44,592,20.6375
+44,593,27.8553333333333
+44,594,24.7015
+44,595,31.9616666666667
+44,596,31.1573333333333
+44,597,29.4216666666667
+44,598,27.6648333333333
+44,599,23.7913333333333
+44,600,27.9823333333333
+44,601,21.971
+44,602,28.6173333333333
+44,603,25.6963333333333
+44,604,28.1516666666667
+44,605,27.1568333333333
+44,606,27.8341666666667
+44,607,26.035
+44,608,34.3111666666667
+44,609,27.1356666666667
+44,610,27.9188333333333
+44,611,24.8496666666667
+44,612,28.2786666666667
+44,613,36.4701666666667
+44,614,27.0721666666667
+44,615,28.1516666666667
+44,616,24.5321666666667
+44,617,28.2998333333333
+44,618,25.3365
+44,619,32.8506666666667
+44,620,24.892
+44,621,31.8346666666667
+44,622,24.892
+44,623,32.0675
+44,624,25.7386666666667
+44,625,31.4748333333333
+44,626,27.1991666666667
+44,627,34.2476666666667
+44,628,26.0985
+44,629,22.9658333333333
+44,630,34.4593333333333
+44,631,26.7758333333333
+44,632,24.7015
+44,633,26.8181666666667
+44,634,35.0943333333333
+44,635,22.6906666666667
+44,636,28.6385
+44,637,31.3901666666667
+44,638,28.448
+44,639,33.5703333333333
+44,640,25.1883333333333
+44,641,33.5491666666667
+44,642,22.1615
+44,643,28.829
+44,644,30.734
+44,645,26.7335
+44,646,30.0143333333333
+44,647,29.8661666666667
+44,648,28.4903333333333
+44,649,27.7495
+44,650,34.5651666666667
+44,651,25.7386666666667
+44,652,33.4856666666667
+44,653,30.9033333333333
+44,654,35.8351666666667
+44,655,22.3096666666667
+44,656,29.2946666666667
+44,657,30.6916666666667
+44,658,28.5326666666667
+44,659,29.8661666666667
+44,660,27.4531666666667
+44,661,30.2048333333333
+44,662,26.2678333333333
+44,663,27.051
+44,664,23.876
+44,665,32.1733333333333
+44,666,22.0133333333333
+44,667,24.7438333333333
+44,668,24.257
+44,669,30.099
+44,670,22.9446666666667
+44,671,31.623
+44,672,25.8021666666667
+44,673,26.1831666666667
+44,674,20.3835
+44,675,28.5326666666667
+44,676,27.6013333333333
+44,677,30.8186666666667
+44,678,33.6126666666667
+44,679,25.273
+44,680,32.3426666666667
+44,681,32.1945
+44,682,27.5378333333333
+44,683,28.8925
+44,684,30.9456666666667
+44,685,35.7928333333333
+44,686,25.2306666666667
+44,687,31.4748333333333
+44,688,20.9338333333333
+44,689,34.3111666666667
+44,690,25.4
+44,691,31.2208333333333
+44,692,26.924
+44,693,30.2048333333333
+44,694,34.5651666666667
+44,695,28.0881666666667
+44,696,28.1516666666667
+44,697,27.2203333333333
+44,698,34.7345
+44,699,25.5058333333333
+44,700,29.7603333333333
+44,701,21.59
+44,702,30.988
+44,703,33.5068333333333
+44,704,26.4371666666667
+44,705,33.1893333333333
+44,706,26.8605
+44,707,24.9978333333333
+44,708,28.4691666666667
+44,709,27.6648333333333
+44,710,28.5961666666667
+44,711,23.0716666666667
+44,712,25.8021666666667
+44,713,32.3215
+44,714,29.5698333333333
+44,715,30.5223333333333
+44,716,28.575
+44,717,19.8966666666667
+44,718,27.813
+44,719,22.7118333333333
+44,720,29.0195
+44,721,34.3746666666667
+44,722,28.2363333333333
+44,723,25.3365
+44,724,30.988
+44,725,28.321
+44,726,27.3896666666667
+44,727,25.908
+44,728,24.9978333333333
+44,729,35.2636666666667
+44,730,27.94
+44,731,30.7128333333333
+44,732,31.9616666666667
+44,733,24.892
+44,734,20.4681666666667
+44,735,30.226
+44,736,23.5373333333333
+44,737,29.9296666666667
+44,738,20.066
+44,739,24.511
+44,740,24.8285
+44,741,34.5228333333333
+44,742,31.6865
+44,743,21.6111666666667
+44,744,27.7495
+44,745,24.7226666666667
+44,746,28.0035
+44,747,24.6591666666667
+44,748,26.4371666666667
+44,749,31.4325
+44,750,26.5006666666667
+44,751,27.559
+44,752,37.1051666666667
+44,753,24.9978333333333
+44,754,25.654
+44,755,28.6173333333333
+44,756,22.2885
+44,757,26.6065
+44,758,31.8135
+44,759,19.8966666666667
+44,760,42.0158333333333
+44,761,22.7118333333333
+44,762,36.5125
+44,763,23.8336666666667
+44,764,31.1573333333333
+44,765,25.654
+44,766,23.8971666666667
+44,767,40.2801666666667
+44,768,28.067
+44,769,27.686
+44,770,31.369
+44,771,27.1356666666667
+44,772,29.7815
+44,773,22.6906666666667
+44,774,29.2946666666667
+44,775,34.3323333333333
+44,776,31.0515
+44,777,26.3313333333333
+44,778,29.3158333333333
+44,779,27.7918333333333
+44,780,24.4686666666667
+44,781,28.9136666666667
+44,782,23.4526666666667
+44,783,29.2311666666667
+44,784,34.0995
+44,785,31.623
+44,786,30.2683333333333
+44,787,34.417
+44,788,32.131
+44,789,25.9926666666667
+44,790,26.3948333333333
+44,791,28.4691666666667
+44,792,30.7763333333333
+44,793,34.5228333333333
+44,794,30.5858333333333
+44,795,32.4061666666667
+44,796,32.4061666666667
+44,797,27.0721666666667
+44,798,33.655
+44,799,27.5801666666667
+44,800,28.4056666666667
+44,801,23.7701666666667
+44,802,26.0985
+44,803,19.8543333333333
+44,804,21.3783333333333
+44,805,22.3731666666667
+44,806,24.3416666666667
+44,807,23.5161666666667
+44,808,32.7448333333333
+44,809,38.4175
+44,810,21.7805
+44,811,31.2631666666667
+44,812,31.9405
+44,813,29.845
+44,814,29.972
+44,815,21.8228333333333
+44,816,19.7696666666667
+44,817,26.0773333333333
+44,818,30.1625
+44,819,31.115
+44,820,25.7386666666667
+44,821,26.0561666666667
+44,822,31.5171666666667
+44,823,29.2311666666667
+44,824,30.0566666666667
+44,825,28.1728333333333
+44,826,27.8553333333333
+44,827,30.226
+44,828,29.718
+44,829,30.099
+44,830,26.2043333333333
+44,831,26.8605
+44,832,33.5068333333333
+44,833,29.21
+44,834,29.5486666666667
+44,835,24.6168333333333
+44,836,27.1145
+44,837,28.829
+44,838,26.289
+44,839,25.5693333333333
+44,840,34.3535
+44,841,23.5373333333333
+44,842,36.4913333333333
+44,843,28.7866666666667
+44,844,34.4593333333333
+44,845,27.1356666666667
+44,846,37.0628333333333
+44,847,27.0933333333333
+44,848,32.1945
+44,849,31.0303333333333
+44,850,29.718
+44,851,21.844
+44,852,21.7805
+44,853,30.3741666666667
+44,854,25.8868333333333
+44,855,26.2466666666667
+44,856,30.8821666666667
+44,857,28.575
+44,858,22.5425
+44,859,32.639
+44,860,31.8135
+44,861,33.9936666666667
+44,862,37.2533333333333
+44,863,22.3308333333333
+44,864,34.163
+44,865,28.321
+44,866,29.1888333333333
+44,867,25.4846666666667
+44,868,27.9823333333333
+44,869,29.4216666666667
+44,870,32.4273333333333
+44,871,26.2043333333333
+44,872,27.94
+44,873,22.352
+44,874,29.7815
+44,875,29.3581666666667
+44,876,25.3576666666667
+44,877,26.2678333333333
+44,878,26.416
+44,879,31.8346666666667
+44,880,29.2311666666667
+44,881,27.0298333333333
+44,882,28.448
+44,883,30.1836666666667
+44,884,29.1676666666667
+44,885,33.0623333333333
+44,886,31.6018333333333
+44,887,27.5801666666667
+44,888,27.4531666666667
+44,889,31.0515
+44,890,29.591
+44,891,27.2203333333333
+44,892,32.6178333333333
+44,893,22.733
+44,894,22.7541666666667
+44,895,24.5533333333333
+44,896,30.6493333333333
+44,897,31.3478333333333
+44,898,28.8925
+44,899,33.0623333333333
+44,900,28.2998333333333
+44,901,31.7923333333333
+44,902,32.766
+44,903,29.6756666666667
+44,904,25.3365
+44,905,31.3266666666667
+44,906,25.6116666666667
+44,907,22.8811666666667
+44,908,28.9348333333333
+44,909,29.3158333333333
+44,910,21.4206666666667
+44,911,35.2425
+44,912,31.2631666666667
+44,913,19.939
+44,914,26.162
+44,915,28.5538333333333
+44,916,28.575
+44,917,24.1511666666667
+44,918,24.5745
+44,919,29.6545
+44,920,29.5486666666667
+44,921,29.7815
+44,922,27.9823333333333
+44,923,28.4691666666667
+44,924,35.941
+44,925,21.7805
+44,926,23.9395
+44,927,20.8068333333333
+44,928,23.6855
+44,929,29.7815
+44,930,19.812
+44,931,19.5156666666667
+44,932,32.512
+44,933,24.7226666666667
+44,934,33.2316666666667
+44,935,29.718
+44,936,34.0148333333333
+44,937,25.6328333333333
+44,938,25.4635
+44,939,31.9405
+44,940,32.131
+44,941,26.3101666666667
+44,942,25.2095
+44,943,20.5316666666667
+44,944,25.0613333333333
+44,945,27.6225
+44,946,29.3158333333333
+44,947,32.131
+44,948,33.1893333333333
+44,949,30.5223333333333
+44,950,32.893
+44,951,20.9338333333333
+44,952,24.6803333333333
+44,953,27.1568333333333
+44,954,24.4898333333333
+44,955,21.8228333333333
+44,956,30.1836666666667
+44,957,36.8935
+44,958,20.193
+44,959,29.718
+44,960,27.5378333333333
+44,961,21.5688333333333
+44,962,23.4738333333333
+44,963,34.417
+44,964,26.797
+44,965,25.273
+44,966,33.1893333333333
+44,967,26.3313333333333
+44,968,24.7226666666667
+44,969,34.3323333333333
+44,970,32.5543333333333
+44,971,25.6116666666667
+44,972,23.5796666666667
+44,973,25.654
+44,974,28.0881666666667
+44,975,38.7561666666667
+44,976,25.4211666666667
+44,977,24.257
+44,978,27.559
+44,979,25.5905
+44,980,26.67
+44,981,27.178
+44,982,27.3685
+44,983,30.8186666666667
+44,984,33.6973333333333
+44,985,29.5063333333333
+44,986,23.0505
+44,987,30.607
+44,988,26.543
+44,989,25.5058333333333
+44,990,23.5373333333333
+44,991,25.4211666666667
+44,992,22.5636666666667
+44,993,25.5693333333333
+44,994,32.766
+44,995,29.6756666666667
+44,996,28.8925
+44,997,30.861
+44,998,31.115
+44,999,28.6173333333333
+44,1000,28.2998333333333
+45,1,19.2701333333333
+45,2,23.0335666666667
+45,3,19.0923333333333
+45,4,21.9202
+45,5,24.0622666666667
+45,6,23.1986666666667
+45,7,21.8228333333333
+45,8,17.3482
+45,9,21.1793666666667
+45,10,24.2104333333333
+45,11,18.6478333333333
+45,12,19.7231
+45,13,20.4851
+45,14,20.3157666666667
+45,15,18.5166
+45,16,20.9507666666667
+45,17,24.0199333333333
+45,18,21.4587666666667
+45,19,15.3246666666667
+45,20,22.9235
+45,21,16.9968333333333
+45,22,21.59
+45,23,24.9047
+45,24,20.9126666666667
+45,25,22.3266
+45,26,24.4221
+45,27,22.4155
+45,28,21.8228333333333
+45,29,22.1149333333333
+45,30,21.7551
+45,31,19.7231
+45,32,25.5439333333333
+45,33,24.8708333333333
+45,34,22.2673333333333
+45,35,23.6431666666667
+45,36,20.1506666666667
+45,37,16.2263666666667
+45,38,19.3124666666667
+45,39,17.9408666666667
+45,40,17.3693666666667
+45,41,19.4606333333333
+45,42,24.13
+45,43,21.8355333333333
+45,44,25.7090333333333
+45,45,23.1351666666667
+45,46,21.4206666666667
+45,47,19.6596
+45,48,26.7546666666667
+45,49,19.4056
+45,50,21.6916
+45,51,21.6704333333333
+45,52,20.1591333333333
+45,53,20.9719333333333
+45,54,20.0829333333333
+45,55,18.5547
+45,56,17.6911
+45,57,22.9700666666667
+45,58,20.2734333333333
+45,59,21.5434333333333
+45,60,14.0038666666667
+45,61,18.5801
+45,62,24.6549333333333
+45,63,18.9949666666667
+45,64,20.5528333333333
+45,65,20.3115333333333
+45,66,26.3101666666667
+45,67,17.2254333333333
+45,68,18.3176333333333
+45,69,21.717
+45,70,19.939
+45,71,18.9187666666667
+45,72,19.7654333333333
+45,73,15.1426333333333
+45,74,20.9677
+45,75,22.3266
+45,76,20.9719333333333
+45,77,22.8557666666667
+45,78,22.3731666666667
+45,79,21.1539666666667
+45,80,19.558
+45,81,19.0457666666667
+45,82,19.9517
+45,83,17.2677666666667
+45,84,20.1295
+45,85,19.7527333333333
+45,86,20.7602666666667
+45,87,21.3317666666667
+45,88,19.4818
+45,89,21.9244333333333
+45,90,22.6441
+45,91,21.9625333333333
+45,92,11.8956666666667
+45,93,22.5001666666667
+45,94,22.9023333333333
+45,95,19.2955333333333
+45,96,23.8506
+45,97,16.9037
+45,98,21.2047666666667
+45,99,21.1370333333333
+45,100,17.9874333333333
+45,101,19.2320333333333
+45,102,22.5213333333333
+45,103,18.1779333333333
+45,104,22.0302666666667
+45,105,24.6083666666667
+45,106,20.0617666666667
+45,107,17.2508333333333
+45,108,22.8811666666667
+45,109,21.4884
+45,110,25.0359333333333
+45,111,21.4841666666667
+45,112,19.6172666666667
+45,113,21.1582
+45,114,21.8821
+45,115,19.685
+45,116,17.2254333333333
+45,117,14.5753666666667
+45,118,19.4267666666667
+45,119,19.4225333333333
+45,120,25.1248333333333
+45,121,16.4338
+45,122,18.2160333333333
+45,123,21.5053333333333
+45,124,16.9079333333333
+45,125,20.2353333333333
+45,126,24.8412
+45,127,21.2471
+45,128,18.7536666666667
+45,129,22.2631
+45,130,15.8326666666667
+45,131,20.5105
+45,132,18.8722
+45,133,18.4234666666667
+45,134,16.637
+45,135,18.8341
+45,136,18.3642
+45,137,24.0241666666667
+45,138,21.1793666666667
+45,139,18.7071
+45,140,18.0509333333333
+45,141,17.526
+45,142,18.3896
+45,143,22.7076
+45,144,19.2193333333333
+45,145,22.7457
+45,146,20.8449333333333
+45,147,21.3698666666667
+45,148,21.1031666666667
+45,149,21.5053333333333
+45,150,15.7649333333333
+45,151,17.5217666666667
+45,152,24.7353666666667
+45,153,18.4319333333333
+45,154,15.7226
+45,155,16.2348333333333
+45,156,21.9286666666667
+45,157,18.923
+45,158,19.4691
+45,159,21.7127666666667
+45,160,22.5636666666667
+45,161,18.542
+45,162,22.4747666666667
+45,163,19.7061666666667
+45,164,17.5768
+45,165,22.1318666666667
+45,166,24.2146666666667
+45,167,17.3947666666667
+45,168,17.5217666666667
+45,169,18.7325
+45,170,20.3919666666667
+45,171,19.0584666666667
+45,172,16.6793333333333
+45,173,22.3731666666667
+45,174,17.6487666666667
+45,175,22.5340333333333
+45,176,23.6177666666667
+45,177,15.4686
+45,178,23.0208666666667
+45,179,20.3411666666667
+45,180,20.1422
+45,181,24.0241666666667
+45,182,15.2908
+45,183,14.0546666666667
+45,184,19.9517
+45,185,16.3533666666667
+45,186,17.2931666666667
+45,187,17.1238333333333
+45,188,18.3684333333333
+45,189,18.5377666666667
+45,190,19.2828333333333
+45,191,18.7621333333333
+45,192,22.6483333333333
+45,193,21.2174666666667
+45,194,23.8294333333333
+45,195,19.8331666666667
+45,196,21.9244333333333
+45,197,19.1939333333333
+45,198,13.1233333333333
+45,199,24.0622666666667
+45,200,24.1638666666667
+45,201,15.2357666666667
+45,202,23.5373333333333
+45,203,22.9827666666667
+45,204,22.8811666666667
+45,205,20.5189666666667
+45,206,20.8026
+45,207,26.5853333333333
+45,208,16.0782
+45,209,22.86
+45,210,16.3957
+45,211,19.9347666666667
+45,212,20.1210333333333
+45,213,20.4216
+45,214,17.7927
+45,215,20.6756
+45,216,22.7753333333333
+45,217,21.5688333333333
+45,218,20.4597
+45,219,22.2123
+45,220,19.8670333333333
+45,221,19.4267666666667
+45,222,27.5166666666667
+45,223,19.3167
+45,224,17.0730333333333
+45,225,20.5232
+45,226,19.431
+45,227,15.7903333333333
+45,228,21.8016666666667
+45,229,20.066
+45,230,20.1464333333333
+45,231,19.7866
+45,232,18.6859333333333
+45,233,20.0279
+45,234,21.9667666666667
+45,235,19.4902666666667
+45,236,18.2033333333333
+45,237,20.2522666666667
+45,238,18.6224333333333
+45,239,17.3524333333333
+45,240,20.4216
+45,241,20.1464333333333
+45,242,18.8129333333333
+45,243,18.0932666666667
+45,244,18.5208333333333
+45,245,19.9728666666667
+45,246,23.0801333333333
+45,247,21.0312
+45,248,19.8755
+45,249,21.0947
+45,250,18.5631666666667
+45,251,19.8924333333333
+45,252,22.7753333333333
+45,253,22.3266
+45,254,19.1473666666667
+45,255,20.5443666666667
+45,256,26.3101666666667
+45,257,19.1135
+45,258,20.8872666666667
+45,259,21.6704333333333
+45,260,16.1459333333333
+45,261,19.9136
+45,262,24.7396
+45,263,22.5806
+45,264,17.8604333333333
+45,265,23.2621666666667
+45,266,20.0236666666667
+45,267,22.2419333333333
+45,268,25.8445
+45,269,21.9879333333333
+45,270,21.1158666666667
+45,271,18.3938333333333
+45,272,17.9620333333333
+45,273,21.5646
+45,274,19.4479333333333
+45,275,20.4216
+45,276,20.7433333333333
+45,277,22.3689333333333
+45,278,15.4051
+45,279,28.2786666666667
+45,280,18.9568666666667
+45,281,21.2217
+45,282,17.0815
+45,283,22.3266
+45,284,19.685
+45,285,25.1883333333333
+45,286,18.7282666666667
+45,287,19.3378666666667
+45,288,21.717
+45,289,22.7118333333333
+45,290,19.2532
+45,291,20.1252666666667
+45,292,18.6986333333333
+45,293,17.8604333333333
+45,294,25.6963333333333
+45,295,20.5316666666667
+45,296,20.7856666666667
+45,297,18.6859333333333
+45,298,17.6741666666667
+45,299,25.9461
+45,300,21.0608333333333
+45,301,24.5491
+45,302,23.2621666666667
+45,303,22.7118333333333
+45,304,20.7348666666667
+45,305,26.289
+45,306,18.3938333333333
+45,307,23.495
+45,308,23.4907666666667
+45,309,19.4479333333333
+45,310,22.9827666666667
+45,311,21.2259333333333
+45,312,19.5749333333333
+45,313,23.3891666666667
+45,314,21.3529333333333
+45,315,14.8928666666667
+45,316,28.2702
+45,317,16.6497
+45,318,18.4023
+45,319,17.9281666666667
+45,320,20.8999666666667
+45,321,22.86
+45,322,23.5373333333333
+45,323,22.606
+45,324,18.4065333333333
+45,325,23.9987666666667
+45,326,14.8759333333333
+45,327,25.4211666666667
+45,328,21.717
+45,329,21.2471
+45,330,18.1102
+45,331,21.2301666666667
+45,332,19.2193333333333
+45,333,20.7348666666667
+45,334,21.5392
+45,335,23.1732666666667
+45,336,21.2301666666667
+45,337,17.9197
+45,338,17.5217666666667
+45,339,22.5001666666667
+45,340,21.1201
+45,341,24.6168333333333
+45,342,19.8501
+45,343,21.1624333333333
+45,344,15.4093333333333
+45,345,18.4234666666667
+45,346,17.3143333333333
+45,347,22.5340333333333
+45,348,22.5171
+45,349,22.3477666666667
+45,350,24.0622666666667
+45,351,19.5156666666667
+45,352,25.9672666666667
+45,353,20.5486
+45,354,18.0509333333333
+45,355,20.4808666666667
+45,356,22.9658333333333
+45,357,25.527
+45,358,21.5265
+45,359,22.1361
+45,360,18.1144333333333
+45,361,22.0683666666667
+45,362,23.5077
+45,363,22.5975333333333
+45,364,19.304
+45,365,22.5848333333333
+45,366,23.2621666666667
+45,367,17.5429333333333
+45,368,20.2268666666667
+45,369,22.5171
+45,370,15.9385
+45,371,15.4051
+45,372,24.8073333333333
+45,373,19.6680666666667
+45,374,18.7748333333333
+45,375,18.7494333333333
+45,376,13.6948333333333
+45,377,21.9921666666667
+45,378,15.9173333333333
+45,379,19.1939333333333
+45,380,21.5857666666667
+45,381,21.0142666666667
+45,382,19.3421
+45,383,21.8313
+45,384,21.3529333333333
+45,385,24.8835333333333
+45,386,21.5180333333333
+45,387,22.3731666666667
+45,388,19.431
+45,389,18.3896
+45,390,19.9093666666667
+45,391,24.5533333333333
+45,392,20.9931
+45,393,23.4103333333333
+45,394,18.5843333333333
+45,395,20.9084333333333
+45,396,18.5208333333333
+45,397,22.0345
+45,398,20.9973333333333
+45,399,21.6704333333333
+45,400,21.7085333333333
+45,401,19.8289333333333
+45,402,22.4959333333333
+45,403,22.1488
+45,404,22.3943333333333
+45,405,26.6657666666667
+45,406,22.7541666666667
+45,407,22.1488
+45,408,23.5585
+45,409,20.4893333333333
+45,410,19.9178333333333
+45,411,22.7499333333333
+45,412,19.3167
+45,413,12.0565333333333
+45,414,21.5815333333333
+45,415,20.9719333333333
+45,416,20.4597
+45,417,20.7856666666667
+45,418,22.4747666666667
+45,419,18.3896
+45,420,16.9883666666667
+45,421,21.5857666666667
+45,422,13.2503333333333
+45,423,18.6859333333333
+45,424,16.1501666666667
+45,425,20.955
+45,426,17.4752
+45,427,22.352
+45,428,26.0942666666667
+45,429,21.0608333333333
+45,430,20.2480333333333
+45,431,20.1464333333333
+45,432,17.526
+45,433,20.0448333333333
+45,434,21.3233
+45,435,24.1935
+45,436,24.638
+45,437,21.8821
+45,438,24.257
+45,439,20.8026
+45,440,24.0622666666667
+45,441,17.1196
+45,442,15.0452666666667
+45,443,24.5321666666667
+45,444,20.0152
+45,445,21.6069333333333
+45,446,16.3745333333333
+45,447,17.1153666666667
+45,448,22.4282
+45,449,20.3750333333333
+45,450,18.4361666666667
+45,451,21.9413666666667
+45,452,26.0477
+45,453,23.8929333333333
+45,454,19.8077666666667
+45,455,20.5105
+45,456,27.4701
+45,457,19.9771
+45,458,24.3755333333333
+45,459,21.7127666666667
+45,460,21.6873666666667
+45,461,21.1878333333333
+45,462,21.9879333333333
+45,463,20.6290333333333
+45,464,19.1092666666667
+45,465,20.8026
+45,466,24.4686666666667
+45,467,19.0203666666667
+45,468,21.6662
+45,469,23.1944333333333
+45,470,15.2781
+45,471,22.2038333333333
+45,472,18.8298666666667
+45,473,22.0937666666667
+45,474,17.1196
+45,475,29.2057666666667
+45,476,22.3054333333333
+45,477,21.5053333333333
+45,478,18.8891333333333
+45,479,18.5631666666667
+45,480,30.0439666666667
+45,481,21.5603666666667
+45,482,21.5688333333333
+45,483,26.4752666666667
+45,484,21.7889666666667
+45,485,19.6638333333333
+45,486,16.2136666666667
+45,487,18.8552666666667
+45,488,19.8458666666667
+45,489,21.844
+45,490,20.6290333333333
+45,491,20.5105
+45,492,18.7917666666667
+45,493,21.2047666666667
+45,494,29.2862
+45,495,27.0256
+45,496,20.2565
+45,497,20.3623333333333
+45,498,23.7193666666667
+45,499,15.4897666666667
+45,500,22.7287666666667
+45,501,19.4056
+45,502,21.2852
+45,503,26.035
+45,504,18.2753
+45,505,19.4691
+45,506,15.8707666666667
+45,507,26.1366
+45,508,18.0043666666667
+45,509,20.9338333333333
+45,510,19.1050333333333
+45,511,22.352
+45,512,25.019
+45,513,17.0222333333333
+45,514,17.7080333333333
+45,515,25.1036666666667
+45,516,16.4422666666667
+45,517,21.3952666666667
+45,518,20.5274333333333
+45,519,20.5274333333333
+45,520,21.3063666666667
+45,521,17.2762333333333
+45,522,19.558
+45,523,15.8072666666667
+45,524,21.5603666666667
+45,525,18.1144333333333
+45,526,22.2038333333333
+45,527,19.5791666666667
+45,528,19.3590333333333
+45,529,19.6977
+45,530,20.9719333333333
+45,531,22.225
+45,532,20.4343
+45,533,21.0608333333333
+45,534,19.1431333333333
+45,535,25.5016
+45,536,24.3205
+45,537,22.0514333333333
+45,538,23.2579333333333
+45,539,25.5439333333333
+45,540,22.0937666666667
+45,541,21.8778666666667
+45,542,22.7457
+45,543,20.1337333333333
+45,544,23.5500333333333
+45,545,19.4056
+45,546,18.4023
+45,547,18.4954333333333
+45,548,15.5194
+45,549,28.8925
+45,550,21.5053333333333
+45,551,20.9126666666667
+45,552,23.6601
+45,553,25.9461
+45,554,17.9705
+45,555,19.05
+45,556,15.5490333333333
+45,557,21.9667666666667
+45,558,13.7541
+45,559,13.7075333333333
+45,560,18.1991
+45,561,19.0246
+45,562,21.844
+45,563,20.8407
+45,564,26.4583333333333
+45,565,21.8228333333333
+45,566,20.1168
+45,567,21.7593333333333
+45,568,18.9568666666667
+45,569,14.7531666666667
+45,570,15.8326666666667
+45,571,22.2419333333333
+45,572,21.1074
+45,573,22.5975333333333
+45,574,14.9606
+45,575,20.1633666666667
+45,576,29.464
+45,577,25.1375333333333
+45,578,18.6393666666667
+45,579,22.4366666666667
+45,580,18.796
+45,581,18.1059666666667
+45,582,20.3157666666667
+45,583,18.3091666666667
+45,584,22.5975333333333
+45,585,22.3943333333333
+45,586,20.9084333333333
+45,587,22.4747666666667
+45,588,22.1615
+45,589,20.4681666666667
+45,590,16.8063333333333
+45,591,19.8712666666667
+45,592,21.4968666666667
+45,593,20.5443666666667
+45,594,22.2842666666667
+45,595,24.7438333333333
+45,596,27.1991666666667
+45,597,19.1685333333333
+45,598,22.7753333333333
+45,599,19.4691
+45,600,20.1506666666667
+45,601,23.1732666666667
+45,602,20.5697666666667
+45,603,21.0142666666667
+45,604,20.1676
+45,605,19.7908333333333
+45,606,20.9296
+45,607,23.9183333333333
+45,608,19.2151
+45,609,17.5810333333333
+45,610,21.8651666666667
+45,611,18.2668333333333
+45,612,18.1991
+45,613,21.8609333333333
+45,614,21.4376
+45,615,24.9047
+45,616,19.7019333333333
+45,617,22.6441
+45,618,20.2311
+45,619,22.3689333333333
+45,620,16.6581666666667
+45,621,16.2306
+45,622,22.3181333333333
+45,623,20.2565
+45,624,21.1624333333333
+45,625,20.3623333333333
+45,626,17.8816
+45,627,16.5692666666667
+45,628,16.3745333333333
+45,629,22.4112666666667
+45,630,20.0363666666667
+45,631,28.7358666666667
+45,632,23.0886
+45,633,24.0453333333333
+45,634,20.4851
+45,635,22.1615
+45,636,18.8129333333333
+45,637,18.1102
+45,638,18.6012666666667
+45,639,24.2358333333333
+45,640,21.1666666666667
+45,641,16.5057666666667
+45,642,20.1295
+45,643,24.0622666666667
+45,644,20.7645
+45,645,18.7536666666667
+45,646,23.4696
+45,647,26.3017
+45,648,17.6487666666667
+45,649,25.6878666666667
+45,650,22.2207666666667
+45,651,29.1888333333333
+45,652,20.2988333333333
+45,653,22.1953666666667
+45,654,18.6859333333333
+45,655,19.7019333333333
+45,656,22.6271666666667
+45,657,17.7503666666667
+45,658,21.3910333333333
+45,659,29.2311666666667
+45,660,21.3741
+45,661,24.9512666666667
+45,662,18.4954333333333
+45,663,22.8176666666667
+45,664,21.7381666666667
+45,665,21.4333666666667
+45,666,18.1779333333333
+45,667,22.8938666666667
+45,668,20.8661
+45,669,14.6473333333333
+45,670,15.0198666666667
+45,671,16.4211
+45,672,20.0025
+45,673,20.3835
+45,674,18.6097333333333
+45,675,21.3106
+45,676,17.5048333333333
+45,677,25.0825
+45,678,25.0486333333333
+45,679,21.8228333333333
+45,680,20.5613
+45,681,23.9395
+45,682,17.9451
+45,683,15.6167666666667
+45,684,18.8595
+45,685,16.8402
+45,686,24.9470333333333
+45,687,18.3218666666667
+45,688,24.5279333333333
+45,689,19.2108666666667
+45,690,19.3463333333333
+45,691,19.4648666666667
+45,692,24.257
+45,693,13.5424333333333
+45,694,20.0490666666667
+45,695,22.0768333333333
+45,696,23.6770333333333
+45,697,22.1107
+45,698,26.7462
+45,699,24.4898333333333
+45,700,17.7927
+45,701,18.4361666666667
+45,702,17.145
+45,703,20.0829333333333
+45,704,20.955
+45,705,19.3844333333333
+45,706,18.4954333333333
+45,707,25.0401666666667
+45,708,21.0608333333333
+45,709,19.6130333333333
+45,710,20.2522666666667
+45,711,22.1149333333333
+45,712,16.764
+45,713,20.9126666666667
+45,714,23.749
+45,715,22.9658333333333
+45,716,23.6855
+45,717,17.2847
+45,718,19.8712666666667
+45,719,20.9719333333333
+45,720,25.1587
+45,721,25.5608666666667
+45,722,16.1417
+45,723,22.1572666666667
+45,724,23.1309333333333
+45,725,26.1366
+45,726,19.3336333333333
+45,727,24.4009333333333
+45,728,20.4173666666667
+45,729,17.6318333333333
+45,730,18.7113333333333
+45,731,19.4902666666667
+45,732,20.8915
+45,733,18.4869666666667
+45,734,19.1262
+45,735,18.7071
+45,736,14.7743333333333
+45,737,18.6266666666667
+45,738,18.4954333333333
+45,739,24.5491
+45,740,21.5434333333333
+45,741,20.4935666666667
+45,742,20.0152
+45,743,16.9756666666667
+45,744,21.2767333333333
+45,745,20.5443666666667
+45,746,15.1087666666667
+45,747,17.7588333333333
+45,748,20.6713666666667
+45,749,20.9888666666667
+45,750,19.8924333333333
+45,751,19.0288333333333
+45,752,19.4945
+45,753,22.4324333333333
+45,754,25.8783666666667
+45,755,24.1723333333333
+45,756,22.7711
+45,757,14.7277666666667
+45,758,17.6911
+45,759,22.2461666666667
+45,760,24.8285
+45,761,22.1953666666667
+45,762,19.8712666666667
+45,763,16.5608
+45,764,15.7564666666667
+45,765,20.0025
+45,766,19.0881
+45,767,17.1365333333333
+45,768,24.0622666666667
+45,769,23.0886
+45,770,13.8557
+45,771,18.5335333333333
+45,772,27.7495
+45,773,17.3355
+45,774,17.2677666666667
+45,775,19.0034333333333
+45,776,21.9286666666667
+45,777,25.8953
+45,778,21.1920666666667
+45,779,22.6695
+45,780,23.7405333333333
+45,781,21.5222666666667
+45,782,20.2734333333333
+45,783,20.2988333333333
+45,784,21.5857666666667
+45,785,23.7278333333333
+45,786,26.9832666666667
+45,787,18.9399333333333
+45,788,25.1417666666667
+45,789,20.7137
+45,790,18.8552666666667
+45,791,23.0462666666667
+45,792,24.13
+45,793,22.9785333333333
+45,794,20.1379666666667
+45,795,22.1615
+45,796,17.8858333333333
+45,797,20.9677
+45,798,20.0363666666667
+45,799,23.2875666666667
+45,800,20.5909333333333
+45,801,19.6172666666667
+45,802,24.5321666666667
+45,803,19.7866
+45,804,21.1201
+45,805,19.8755
+45,806,21.1455
+45,807,20.3792666666667
+45,808,19.8966666666667
+45,809,19.4648666666667
+45,810,24.5533333333333
+45,811,21.2428666666667
+45,812,21.5265
+45,813,16.2729333333333
+45,814,20.7094666666667
+45,815,20.0617666666667
+45,816,21.6916
+45,817,21.2217
+45,818,19.3167
+45,819,20.2099333333333
+45,820,22.2419333333333
+45,821,24.5491
+45,822,19.7231
+45,823,18.2202666666667
+45,824,19.2997666666667
+45,825,22.0091
+45,826,21.7297
+45,827,19.8966666666667
+45,828,21.1497333333333
+45,829,21.5815333333333
+45,830,25.4973666666667
+45,831,24.6337666666667
+45,832,23.7701666666667
+45,833,23.2960333333333
+45,834,19.5114333333333
+45,835,16.51
+45,836,18.1779333333333
+45,837,18.5335333333333
+45,838,21.463
+45,839,17.7165
+45,840,21.8482333333333
+45,841,23.3468333333333
+45,842,19.1558333333333
+45,843,25.1671666666667
+45,844,22.9827666666667
+45,845,18.8468
+45,846,19.3886666666667
+45,847,22.3647
+45,848,24.384
+45,849,26.1366
+45,850,20.8026
+45,851,18.9738
+45,852,27.9823333333333
+45,853,18.4573333333333
+45,854,22.3054333333333
+45,855,19.1981666666667
+45,856,21.0142666666667
+45,857,20.5867
+45,858,20.4808666666667
+45,859,21.9202
+45,860,20.1464333333333
+45,861,21.9921666666667
+45,862,14.0081
+45,863,18.5970333333333
+45,864,24.2104333333333
+45,865,20.8237666666667
+45,866,20.4216
+45,867,22.9658333333333
+45,868,25.654
+45,869,22.9616
+45,870,20.2099333333333
+45,871,22.3477666666667
+45,872,18.3430333333333
+45,873,22.4112666666667
+45,874,16.3322
+45,875,19.2743666666667
+45,876,21.2936666666667
+45,877,19.0034333333333
+45,878,19.1939333333333
+45,879,19.1516
+45,880,21.6958333333333
+45,881,24.003
+45,882,22.9404333333333
+45,883,25.0401666666667
+45,884,19.1050333333333
+45,885,21.336
+45,886,16.7428333333333
+45,887,22.7922666666667
+45,888,17.9493333333333
+45,889,20.1887666666667
+45,890,18.2710666666667
+45,891,25.8402666666667
+45,892,15.6760333333333
+45,893,17.9916666666667
+45,894,19.8416333333333
+45,895,25.4127
+45,896,18.2160333333333
+45,897,19.7400333333333
+45,898,13.9192
+45,899,15.9977666666667
+45,900,19.9601666666667
+45,901,15.2061333333333
+45,902,19.3463333333333
+45,903,20.2734333333333
+45,904,23.2833333333333
+45,905,18.2414333333333
+45,906,19.7188666666667
+45,907,19.2955333333333
+45,908,17.5768
+45,909,23.3172
+45,910,23.9818333333333
+45,911,14.1181666666667
+45,912,19.4479333333333
+45,913,19.8755
+45,914,17.2677666666667
+45,915,21.2936666666667
+45,916,24.6168333333333
+45,917,20.574
+45,918,25.0782666666667
+45,919,21.6492666666667
+45,920,26.9409333333333
+45,921,24.6337666666667
+45,922,21.4376
+45,923,20.5105
+45,924,25.0147666666667
+45,925,21.5646
+45,926,18.7240333333333
+45,927,21.209
+45,928,16.9545
+45,929,18.4319333333333
+45,930,26.9451666666667
+45,931,21.9244333333333
+45,932,23.749
+45,933,22.6652666666667
+45,934,27.9992666666667
+45,935,22.0302666666667
+45,936,19.0881
+45,937,15.8242
+45,938,18.4954333333333
+45,939,18.3303333333333
+45,940,24.1511666666667
+45,941,16.2094333333333
+45,942,21.8567
+45,943,22.5594333333333
+45,944,22.6652666666667
+45,945,25.2687666666667
+45,946,18.0721
+45,947,17.9916666666667
+45,948,26.543
+45,949,26.1196666666667
+45,950,21.3021333333333
+45,951,18.9780333333333
+45,952,21.8016666666667
+45,953,23.4103333333333
+45,954,23.5966
+45,955,24.1681
+45,956,16.002
+45,957,20.066
+45,958,20.1083333333333
+45,959,21.5603666666667
+45,960,26.0900333333333
+45,961,17.0307
+45,962,18.7282666666667
+45,963,19.4098333333333
+45,964,20.6798333333333
+45,965,20.2946
+45,966,23.9945333333333
+45,967,18.0255333333333
+45,968,16.1417
+45,969,17.1196
+45,970,17.0391666666667
+45,971,23.7066666666667
+45,972,23.4653666666667
+45,973,21.6069333333333
+45,974,20.6925333333333
+45,975,20.8703333333333
+45,976,19.9771
+45,977,22.479
+45,978,23.4907666666667
+45,979,18.7113333333333
+45,980,19.1727666666667
+45,981,24.4475
+45,982,26.5345333333333
+45,983,23.0716666666667
+45,984,22.7118333333333
+45,985,22.7118333333333
+45,986,17.3143333333333
+45,987,22.2673333333333
+45,988,19.6130333333333
+45,989,22.4366666666667
+45,990,22.7499333333333
+45,991,23.7024333333333
+45,992,24.8496666666667
+45,993,16.6327666666667
+45,994,24.2358333333333
+45,995,20.4216
+45,996,21.0015666666667
+45,997,19.3463333333333
+45,998,17.7546
+45,999,22.0937666666667
+45,1000,16.2306
+46,1,25.6963333333333
+46,2,28.5326666666667
+46,3,26.4371666666667
+46,4,22.8811666666667
+46,5,25.1671666666667
+46,6,19.939
+46,7,20.955
+46,8,29.3793333333333
+46,9,31.6653333333333
+46,10,31.6653333333333
+46,11,31.1361666666667
+46,12,26.162
+46,13,26.1196666666667
+46,14,28.8078333333333
+46,15,27.5378333333333
+46,16,30.5011666666667
+46,17,27.305
+46,18,30.3318333333333
+46,19,26.3736666666667
+46,20,24.511
+46,21,24.8073333333333
+46,22,35.4965
+46,23,30.6281666666667
+46,24,28.6808333333333
+46,25,28.5538333333333
+46,26,34.9461666666667
+46,27,26.4583333333333
+46,28,26.8605
+46,29,28.4268333333333
+46,30,24.13
+46,31,31.8346666666667
+46,32,28.321
+46,33,31.8558333333333
+46,34,23.6008333333333
+46,35,31.5383333333333
+46,36,28.5326666666667
+46,37,23.4738333333333
+46,38,31.7288333333333
+46,39,30.5223333333333
+46,40,28.0246666666667
+46,41,26.4583333333333
+46,42,31.1996666666667
+46,43,23.8336666666667
+46,44,34.4593333333333
+46,45,30.5435
+46,46,26.162
+46,47,25.5905
+46,48,26.8605
+46,49,29.5698333333333
+46,50,30.6493333333333
+46,51,21.4206666666667
+46,52,31.1785
+46,53,26.543
+46,54,25.781
+46,55,28.6596666666667
+46,56,28.2151666666667
+46,57,35.3271666666667
+46,58,28.4056666666667
+46,59,29.21
+46,60,28.9983333333333
+46,61,34.5016666666667
+46,62,30.5858333333333
+46,63,28.067
+46,64,30.6916666666667
+46,65,27.4531666666667
+46,66,31.115
+46,67,30.6705
+46,68,30.9668333333333
+46,69,26.1408333333333
+46,70,27.4531666666667
+46,71,33.3375
+46,72,27.5166666666667
+46,73,26.1196666666667
+46,74,32.1521666666667
+46,75,33.3798333333333
+46,76,27.4743333333333
+46,77,28.321
+46,78,28.0246666666667
+46,79,33.2105
+46,80,25.4
+46,81,28.7866666666667
+46,82,24.0665
+46,83,33.9725
+46,84,28.4056666666667
+46,85,29.9508333333333
+46,86,21.3783333333333
+46,87,25.8656666666667
+46,88,27.7706666666667
+46,89,29.845
+46,90,30.4165
+46,91,27.686
+46,92,30.0143333333333
+46,93,23.6855
+46,94,28.9983333333333
+46,95,27.559
+46,96,30.9245
+46,97,32.0463333333333
+46,98,28.321
+46,99,26.162
+46,100,30.2048333333333
+46,101,29.2523333333333
+46,102,32.5966666666667
+46,103,31.8558333333333
+46,104,31.9405
+46,105,24.0453333333333
+46,106,29.6545
+46,107,31.4536666666667
+46,108,24.8073333333333
+46,109,30.988
+46,110,26.0773333333333
+46,111,29.7603333333333
+46,112,28.4903333333333
+46,113,31.877
+46,114,30.1413333333333
+46,115,33.1893333333333
+46,116,27.9188333333333
+46,117,26.8605
+46,118,26.3736666666667
+46,119,28.2363333333333
+46,120,28.4903333333333
+46,121,29.845
+46,122,27.1145
+46,123,30.7975
+46,124,33.4645
+46,125,24.1935
+46,126,29.1676666666667
+46,127,32.0675
+46,128,24.511
+46,129,29.464
+46,130,31.9616666666667
+46,131,32.385
+46,132,32.0675
+46,133,31.496
+46,134,32.766
+46,135,32.0675
+46,136,25.6328333333333
+46,137,24.4263333333333
+46,138,28.0458333333333
+46,139,30.0355
+46,140,33.1681666666667
+46,141,26.797
+46,142,29.2946666666667
+46,143,30.6281666666667
+46,144,25.9926666666667
+46,145,27.432
+46,146,26.9451666666667
+46,147,26.8816666666667
+46,148,29.3793333333333
+46,149,34.417
+46,150,33.6126666666667
+46,151,31.3901666666667
+46,152,27.686
+46,153,26.7335
+46,154,28.9136666666667
+46,155,30.607
+46,156,29.5275
+46,157,36.8511666666667
+46,158,35.7928333333333
+46,159,29.845
+46,160,27.5378333333333
+46,161,27.5166666666667
+46,162,28.1305
+46,163,33.2105
+46,164,32.5543333333333
+46,165,28.702
+46,166,26.7546666666667
+46,167,27.5166666666667
+46,168,30.5858333333333
+46,169,32.3426666666667
+46,170,35.1366666666667
+46,171,20.9338333333333
+46,172,32.004
+46,173,24.6803333333333
+46,174,27.94
+46,175,29.0618333333333
+46,176,32.9776666666667
+46,177,33.147
+46,178,25.6328333333333
+46,179,27.0086666666667
+46,180,28.7443333333333
+46,181,26.162
+46,182,32.8718333333333
+46,183,28.8713333333333
+46,184,32.766
+46,185,32.5755
+46,186,32.9141666666667
+46,187,23.5161666666667
+46,188,30.9245
+46,189,30.0566666666667
+46,190,29.1888333333333
+46,191,21.717
+46,192,29.0618333333333
+46,193,26.8816666666667
+46,194,26.8816666666667
+46,195,30.8398333333333
+46,196,28.6173333333333
+46,197,26.8181666666667
+46,198,22.4155
+46,199,36.5548333333333
+46,200,24.6803333333333
+46,201,27.0933333333333
+46,202,26.2678333333333
+46,203,24.5745
+46,204,27.9188333333333
+46,205,28.5326666666667
+46,206,30.4588333333333
+46,207,29.1676666666667
+46,208,35.3695
+46,209,32.0251666666667
+46,210,27.3261666666667
+46,211,29.718
+46,212,21.717
+46,213,27.2415
+46,214,23.9818333333333
+46,215,29.6545
+46,216,30.5646666666667
+46,217,28.5538333333333
+46,218,26.2255
+46,219,31.5383333333333
+46,220,32.7871666666667
+46,221,29.2311666666667
+46,222,22.1403333333333
+46,223,34.163
+46,224,29.1253333333333
+46,225,27.7283333333333
+46,226,27.7706666666667
+46,227,28.1516666666667
+46,228,26.7123333333333
+46,229,29.0406666666667
+46,230,37.1475
+46,231,29.4851666666667
+46,232,24.4686666666667
+46,233,35.052
+46,234,24.511
+46,235,35.2001666666667
+46,236,26.0985
+46,237,26.924
+46,238,27.6648333333333
+46,239,30.0778333333333
+46,240,25.3788333333333
+46,241,28.4691666666667
+46,242,34.2053333333333
+46,243,28.4056666666667
+46,244,27.3896666666667
+46,245,33.1681666666667
+46,246,29.337
+46,247,27.4743333333333
+46,248,26.289
+46,249,23.4738333333333
+46,250,30.7763333333333
+46,251,27.2203333333333
+46,252,27.432
+46,253,30.9033333333333
+46,254,27.3685
+46,255,26.3525
+46,256,28.2786666666667
+46,257,34.8191666666667
+46,258,35.433
+46,259,30.3741666666667
+46,260,29.591
+46,261,23.876
+46,262,31.1996666666667
+46,263,31.369
+46,264,31.2843333333333
+46,265,30.2683333333333
+46,266,32.9353333333333
+46,267,26.9451666666667
+46,268,31.8981666666667
+46,269,29.0195
+46,270,27.2838333333333
+46,271,28.8713333333333
+46,272,34.925
+46,273,29.8873333333333
+46,274,29.2311666666667
+46,275,25.5693333333333
+46,276,34.9038333333333
+46,277,31.5806666666667
+46,278,25.781
+46,279,27.6013333333333
+46,280,30.353
+46,281,27.0298333333333
+46,282,23.7278333333333
+46,283,25.4635
+46,284,27.6436666666667
+46,285,23.3045
+46,286,25.4846666666667
+46,287,30.5858333333333
+46,288,33.4856666666667
+46,289,21.6323333333333
+46,290,29.3793333333333
+46,291,30.3106666666667
+46,292,29.5698333333333
+46,293,31.7923333333333
+46,294,26.9875
+46,295,29.21
+46,296,27.3896666666667
+46,297,26.0773333333333
+46,298,28.5115
+46,299,22.5636666666667
+46,300,28.7655
+46,301,30.1413333333333
+46,302,28.448
+46,303,26.543
+46,304,27.6225
+46,305,31.877
+46,306,25.019
+46,307,26.4583333333333
+46,308,27.2626666666667
+46,309,33.5915
+46,310,29.4005
+46,311,29.7815
+46,312,32.5755
+46,313,25.0825
+46,314,24.4263333333333
+46,315,26.543
+46,316,28.7655
+46,317,28.4268333333333
+46,318,25.527
+46,319,31.1573333333333
+46,320,29.3581666666667
+46,321,32.0886666666667
+46,322,27.6013333333333
+46,323,24.0453333333333
+46,324,24.5533333333333
+46,325,28.7443333333333
+46,326,31.242
+46,327,24.2781666666667
+46,328,33.782
+46,329,27.5166666666667
+46,330,24.4263333333333
+46,331,35.2425
+46,332,32.9353333333333
+46,333,29.718
+46,334,25.4211666666667
+46,335,28.4903333333333
+46,336,27.305
+46,337,25.8233333333333
+46,338,35.306
+46,339,30.0778333333333
+46,340,30.2683333333333
+46,341,25.8656666666667
+46,342,29.0195
+46,343,28.0881666666667
+46,344,26.3101666666667
+46,345,24.7226666666667
+46,346,32.9988333333333
+46,347,28.2363333333333
+46,348,29.5275
+46,349,26.6065
+46,350,29.6121666666667
+46,351,28.3421666666667
+46,352,23.2621666666667
+46,353,25.8021666666667
+46,354,27.3896666666667
+46,355,24.9131666666667
+46,356,27.1356666666667
+46,357,29.1041666666667
+46,358,23.8125
+46,359,32.5755
+46,360,27.1145
+46,361,26.4583333333333
+46,362,25.2306666666667
+46,363,28.5115
+46,364,25.1883333333333
+46,365,32.3638333333333
+46,366,27.5801666666667
+46,367,30.1413333333333
+46,368,28.5961666666667
+46,369,31.5171666666667
+46,370,30.353
+46,371,27.8553333333333
+46,372,29.2735
+46,373,21.209
+46,374,26.8393333333333
+46,375,30.5223333333333
+46,376,23.241
+46,377,28.6385
+46,378,33.0623333333333
+46,379,30.6916666666667
+46,380,30.4376666666667
+46,381,24.1511666666667
+46,382,30.353
+46,383,32.1733333333333
+46,384,25.273
+46,385,25.273
+46,386,34.0995
+46,387,27.8341666666667
+46,388,29.1888333333333
+46,389,29.337
+46,390,23.3256666666667
+46,391,29.0406666666667
+46,392,27.2203333333333
+46,393,28.194
+46,394,31.9828333333333
+46,395,30.0566666666667
+46,396,30.734
+46,397,27.305
+46,398,28.4056666666667
+46,399,29.8873333333333
+46,400,24.2993333333333
+46,401,32.5755
+46,402,29.4216666666667
+46,403,35.6023333333333
+46,404,27.2626666666667
+46,405,32.7025
+46,406,24.4475
+46,407,30.9456666666667
+46,408,28.8078333333333
+46,409,26.2255
+46,410,28.194
+46,411,25.9503333333333
+46,412,34.4805
+46,413,32.3426666666667
+46,414,24.2993333333333
+46,415,31.4325
+46,416,30.3106666666667
+46,417,29.6545
+46,418,25.5693333333333
+46,419,32.7236666666667
+46,420,27.2626666666667
+46,421,32.385
+46,422,26.5641666666667
+46,423,26.67
+46,424,28.1728333333333
+46,425,31.6865
+46,426,31.5171666666667
+46,427,30.5223333333333
+46,428,29.1888333333333
+46,429,24.384
+46,430,29.5063333333333
+46,431,29.4851666666667
+46,432,27.5801666666667
+46,433,28.5115
+46,434,27.3261666666667
+46,435,32.4696666666667
+46,436,29.4005
+46,437,30.734
+46,438,24.765
+46,439,24.5533333333333
+46,440,34.3535
+46,441,26.4583333333333
+46,442,20.4258333333333
+46,443,34.1206666666667
+46,444,25.7386666666667
+46,445,30.2471666666667
+46,446,28.6173333333333
+46,447,37.6131666666667
+46,448,29.8661666666667
+46,449,32.1521666666667
+46,450,26.289
+46,451,26.0985
+46,452,32.893
+46,453,26.924
+46,454,30.0778333333333
+46,455,26.0773333333333
+46,456,32.9776666666667
+46,457,28.8925
+46,458,26.5641666666667
+46,459,27.7071666666667
+46,460,23.6855
+46,461,34.2265
+46,462,29.6756666666667
+46,463,24.2146666666667
+46,464,30.607
+46,465,35.179
+46,466,31.1996666666667
+46,467,32.1945
+46,468,28.2998333333333
+46,469,33.0623333333333
+46,470,33.6973333333333
+46,471,25.908
+46,472,27.686
+46,473,30.7975
+46,474,30.9033333333333
+46,475,27.3473333333333
+46,476,28.5115
+46,477,27.0086666666667
+46,478,28.5538333333333
+46,479,31.6441666666667
+46,480,26.9875
+46,481,26.8605
+46,482,26.8605
+46,483,32.9776666666667
+46,484,26.9663333333333
+46,485,26.9663333333333
+46,486,27.0933333333333
+46,487,28.5961666666667
+46,488,22.733
+46,489,31.4325
+46,490,30.734
+46,491,26.3101666666667
+46,492,29.718
+46,493,34.417
+46,494,26.035
+46,495,28.956
+46,496,37.0416666666667
+46,497,26.2678333333333
+46,498,33.02
+46,499,36.1526666666667
+46,500,26.7123333333333
+46,501,35.6023333333333
+46,502,28.5326666666667
+46,503,37.6131666666667
+46,504,27.432
+46,505,31.0091666666667
+46,506,28.5961666666667
+46,507,27.051
+46,508,25.9291666666667
+46,509,25.2518333333333
+46,510,28.2998333333333
+46,511,29.591
+46,512,27.9611666666667
+46,513,27.178
+46,514,24.257
+46,515,29.3581666666667
+46,516,26.0138333333333
+46,517,28.702
+46,518,30.2471666666667
+46,519,29.8661666666667
+46,520,30.2471666666667
+46,521,32.0463333333333
+46,522,22.1615
+46,523,32.1945
+46,524,29.464
+46,525,27.2415
+46,526,28.8501666666667
+46,527,29.5063333333333
+46,528,30.7763333333333
+46,529,31.0515
+46,530,28.8501666666667
+46,531,32.8506666666667
+46,532,24.4898333333333
+46,533,28.7866666666667
+46,534,31.7076666666667
+46,535,27.813
+46,536,24.511
+46,537,27.8553333333333
+46,538,30.1413333333333
+46,539,28.0035
+46,540,28.0246666666667
+46,541,26.543
+46,542,31.0726666666667
+46,543,25.6963333333333
+46,544,26.924
+46,545,28.829
+46,546,31.3901666666667
+46,547,26.3525
+46,548,31.496
+46,549,28.8078333333333
+46,550,28.321
+46,551,25.019
+46,552,28.5326666666667
+46,553,31.0938333333333
+46,554,25.908
+46,555,32.0886666666667
+46,556,37.2321666666667
+46,557,21.844
+46,558,37.4438333333333
+46,559,31.0303333333333
+46,560,24.9131666666667
+46,561,24.2993333333333
+46,562,28.9983333333333
+46,563,28.1093333333333
+46,564,23.241
+46,565,26.8393333333333
+46,566,35.3271666666667
+46,567,28.5961666666667
+46,568,31.8981666666667
+46,569,30.9668333333333
+46,570,27.0086666666667
+46,571,32.8506666666667
+46,572,27.5801666666667
+46,573,27.2415
+46,574,31.3055
+46,575,25.6751666666667
+46,576,30.2471666666667
+46,577,28.2786666666667
+46,578,34.9461666666667
+46,579,28.8078333333333
+46,580,29.8873333333333
+46,581,33.8243333333333
+46,582,32.0886666666667
+46,583,29.718
+46,584,27.0086666666667
+46,585,32.004
+46,586,32.3003333333333
+46,587,31.369
+46,588,23.9606666666667
+46,589,28.9983333333333
+46,590,29.083
+46,591,28.9136666666667
+46,592,28.5326666666667
+46,593,27.3685
+46,594,28.4903333333333
+46,595,24.6803333333333
+46,596,22.7118333333333
+46,597,30.9668333333333
+46,598,27.1991666666667
+46,599,27.0086666666667
+46,600,25.1883333333333
+46,601,29.0406666666667
+46,602,27.3685
+46,603,33.2951666666667
+46,604,32.6601666666667
+46,605,30.7763333333333
+46,606,34.4805
+46,607,28.8078333333333
+46,608,25.146
+46,609,25.908
+46,610,29.6968333333333
+46,611,27.813
+46,612,28.3845
+46,613,27.4955
+46,614,32.9565
+46,615,32.2791666666667
+46,616,33.4856666666667
+46,617,29.845
+46,618,31.2631666666667
+46,619,31.5595
+46,620,33.147
+46,621,20.2776666666667
+46,622,33.909
+46,623,24.4686666666667
+46,624,30.6281666666667
+46,625,27.7706666666667
+46,626,30.9456666666667
+46,627,31.369
+46,628,29.7603333333333
+46,629,25.0613333333333
+46,630,31.0091666666667
+46,631,26.8393333333333
+46,632,28.6385
+46,633,28.8925
+46,634,24.4686666666667
+46,635,24.2993333333333
+46,636,25.0825
+46,637,21.336
+46,638,28.067
+46,639,33.02
+46,640,28.4903333333333
+46,641,23.1563333333333
+46,642,31.115
+46,643,25.5693333333333
+46,644,34.163
+46,645,28.8501666666667
+46,646,23.5796666666667
+46,647,27.5166666666667
+46,648,26.6488333333333
+46,649,26.4583333333333
+46,650,27.813
+46,651,26.6276666666667
+46,652,30.861
+46,653,25.2306666666667
+46,654,26.8393333333333
+46,655,30.3318333333333
+46,656,30.099
+46,657,29.7391666666667
+46,658,27.6225
+46,659,22.7541666666667
+46,660,29.1676666666667
+46,661,28.1728333333333
+46,662,24.0453333333333
+46,663,31.1573333333333
+46,664,27.7071666666667
+46,665,27.8553333333333
+46,666,32.2156666666667
+46,667,31.1996666666667
+46,668,36.6818333333333
+46,669,34.9673333333333
+46,670,30.9668333333333
+46,671,28.2786666666667
+46,672,32.4273333333333
+46,673,25.5693333333333
+46,674,25.4846666666667
+46,675,35.0096666666667
+46,676,26.3736666666667
+46,677,29.3158333333333
+46,678,30.0355
+46,679,30.2895
+46,680,29.9508333333333
+46,681,28.0246666666667
+46,682,37.1051666666667
+46,683,29.337
+46,684,26.797
+46,685,29.6756666666667
+46,686,26.797
+46,687,25.7386666666667
+46,688,31.5595
+46,689,26.4371666666667
+46,690,30.6705
+46,691,28.3845
+46,692,25.6963333333333
+46,693,32.7448333333333
+46,694,35.433
+46,695,31.115
+46,696,27.686
+46,697,31.5595
+46,698,27.813
+46,699,22.6483333333333
+46,700,30.9245
+46,701,32.9776666666667
+46,702,29.1253333333333
+46,703,25.019
+46,704,25.3153333333333
+46,705,28.2151666666667
+46,706,26.7546666666667
+46,707,30.0143333333333
+46,708,28.829
+46,709,30.7551666666667
+46,710,25.2518333333333
+46,711,24.5745
+46,712,27.0721666666667
+46,713,33.274
+46,714,34.163
+46,715,26.7546666666667
+46,716,34.0571666666667
+46,717,31.9616666666667
+46,718,32.0886666666667
+46,719,30.4376666666667
+46,720,29.1041666666667
+46,721,25.3576666666667
+46,722,30.2471666666667
+46,723,23.749
+46,724,27.8553333333333
+46,725,25.0825
+46,726,27.4108333333333
+46,727,32.9565
+46,728,22.6695
+46,729,28.5538333333333
+46,730,28.956
+46,731,29.5698333333333
+46,732,25.527
+46,733,29.8873333333333
+46,734,26.3948333333333
+46,735,27.5378333333333
+46,736,26.9875
+46,737,35.56
+46,738,27.2203333333333
+46,739,26.4583333333333
+46,740,39.4546666666667
+46,741,33.7608333333333
+46,742,26.8816666666667
+46,743,25.6116666666667
+46,744,28.194
+46,745,31.4748333333333
+46,746,33.6126666666667
+46,747,24.8496666666667
+46,748,38.481
+46,749,26.9663333333333
+46,750,28.448
+46,751,27.7495
+46,752,26.035
+46,753,26.1831666666667
+46,754,24.5533333333333
+46,755,25.9926666666667
+46,756,27.0933333333333
+46,757,29.5275
+46,758,30.4588333333333
+46,759,26.3101666666667
+46,760,24.892
+46,761,31.3266666666667
+46,762,29.083
+46,763,34.8191666666667
+46,764,28.1728333333333
+46,765,25.908
+46,766,28.7866666666667
+46,767,31.115
+46,768,27.0298333333333
+46,769,24.2781666666667
+46,770,27.3261666666667
+46,771,30.6705
+46,772,31.0091666666667
+46,773,27.1568333333333
+46,774,31.1996666666667
+46,775,27.4743333333333
+46,776,27.7283333333333
+46,777,30.0355
+46,778,32.3215
+46,779,20.9973333333333
+46,780,24.8285
+46,781,26.4795
+46,782,29.21
+46,783,30.3953333333333
+46,784,29.2946666666667
+46,785,27.6225
+46,786,29.5698333333333
+46,787,23.0293333333333
+46,788,24.638
+46,789,30.7551666666667
+46,790,27.7918333333333
+46,791,29.8873333333333
+46,792,28.7443333333333
+46,793,26.7758333333333
+46,794,32.4696666666667
+46,795,26.6488333333333
+46,796,30.0778333333333
+46,797,33.6126666666667
+46,798,33.2316666666667
+46,799,39.4758333333333
+46,800,27.1145
+46,801,27.4531666666667
+46,802,27.7283333333333
+46,803,26.5853333333333
+46,804,29.8238333333333
+46,805,27.5378333333333
+46,806,25.3153333333333
+46,807,28.4903333333333
+46,808,29.5063333333333
+46,809,28.2151666666667
+46,810,36.957
+46,811,29.845
+46,812,26.3525
+46,813,25.4846666666667
+46,814,28.9983333333333
+46,815,33.0835
+46,816,25.273
+46,817,27.9823333333333
+46,818,28.2786666666667
+46,819,28.1305
+46,820,23.4103333333333
+46,821,29.6756666666667
+46,822,32.2156666666667
+46,823,31.2208333333333
+46,824,25.5693333333333
+46,825,27.7706666666667
+46,826,35.6446666666667
+46,827,33.9936666666667
+46,828,31.0726666666667
+46,829,24.4263333333333
+46,830,29.718
+46,831,30.0143333333333
+46,832,28.3633333333333
+46,833,28.702
+46,834,28.0458333333333
+46,835,31.4325
+46,836,34.925
+46,837,31.7288333333333
+46,838,27.178
+46,839,27.7918333333333
+46,840,26.3313333333333
+46,841,29.591
+46,842,30.4376666666667
+46,843,23.4103333333333
+46,844,29.972
+46,845,26.5853333333333
+46,846,29.1888333333333
+46,847,30.48
+46,848,21.5053333333333
+46,849,31.877
+46,850,30.2048333333333
+46,851,30.9033333333333
+46,852,28.3421666666667
+46,853,33.3798333333333
+46,854,25.8868333333333
+46,855,26.6276666666667
+46,856,27.1991666666667
+46,857,29.845
+46,858,25.5905
+46,859,27.9188333333333
+46,860,26.3101666666667
+46,861,27.9823333333333
+46,862,35.941
+46,863,27.6225
+46,864,27.2415
+46,865,31.6441666666667
+46,866,29.8661666666667
+46,867,34.2265
+46,868,29.7391666666667
+46,869,29.6756666666667
+46,870,28.1305
+46,871,21.7593333333333
+46,872,25.6116666666667
+46,873,25.6963333333333
+46,874,27.8765
+46,875,25.1036666666667
+46,876,29.7391666666667
+46,877,33.6338333333333
+46,878,27.1991666666667
+46,879,33.5068333333333
+46,880,25.2518333333333
+46,881,25.019
+46,882,28.448
+46,883,28.8925
+46,884,27.686
+46,885,31.8558333333333
+46,886,27.9823333333333
+46,887,31.0303333333333
+46,888,26.4795
+46,889,27.1145
+46,890,30.099
+46,891,24.003
+46,892,25.781
+46,893,29.0618333333333
+46,894,27.7706666666667
+46,895,28.4691666666667
+46,896,28.6173333333333
+46,897,25.4846666666667
+46,898,34.5651666666667
+46,899,31.75
+46,900,27.3896666666667
+46,901,28.6385
+46,902,29.1676666666667
+46,903,24.638
+46,904,31.4113333333333
+46,905,33.4221666666667
+46,906,33.7185
+46,907,34.3111666666667
+46,908,26.8816666666667
+46,909,28.6808333333333
+46,910,27.2415
+46,911,27.2626666666667
+46,912,29.4005
+46,913,27.5166666666667
+46,914,28.2151666666667
+46,915,24.9978333333333
+46,916,29.5486666666667
+46,917,28.7231666666667
+46,918,31.0726666666667
+46,919,26.0985
+46,920,27.3473333333333
+46,921,29.7603333333333
+46,922,33.7396666666667
+46,923,29.9508333333333
+46,924,34.4381666666667
+46,925,31.623
+46,926,31.0303333333333
+46,927,26.035
+46,928,28.5961666666667
+46,929,29.4428333333333
+46,930,26.9663333333333
+46,931,24.3416666666667
+46,932,32.5543333333333
+46,933,26.416
+46,934,28.3845
+46,935,28.0035
+46,936,25.1036666666667
+46,937,33.7396666666667
+46,938,31.8135
+46,939,28.1516666666667
+46,940,27.051
+46,941,26.924
+46,942,26.4795
+46,943,35.2848333333333
+46,944,29.3793333333333
+46,945,25.4846666666667
+46,946,24.7226666666667
+46,947,34.163
+46,948,31.8558333333333
+46,949,27.9188333333333
+46,950,21.7805
+46,951,31.6653333333333
+46,952,27.686
+46,953,27.9188333333333
+46,954,28.2363333333333
+46,955,27.2838333333333
+46,956,28.5326666666667
+46,957,28.9771666666667
+46,958,32.893
+46,959,30.6916666666667
+46,960,35.5176666666667
+46,961,26.2678333333333
+46,962,28.7443333333333
+46,963,26.5641666666667
+46,964,30.734
+46,965,21.0608333333333
+46,966,28.8925
+46,967,28.5115
+46,968,30.099
+46,969,30.607
+46,970,30.6493333333333
+46,971,34.544
+46,972,30.4588333333333
+46,973,25.4423333333333
+46,974,27.2838333333333
+46,975,32.8083333333333
+46,976,31.1573333333333
+46,977,26.3101666666667
+46,978,29.3581666666667
+46,979,30.607
+46,980,27.3896666666667
+46,981,25.6328333333333
+46,982,26.2678333333333
+46,983,29.0195
+46,984,20.9126666666667
+46,985,26.1196666666667
+46,986,25.2306666666667
+46,987,24.1935
+46,988,28.3421666666667
+46,989,25.6116666666667
+46,990,25.1671666666667
+46,991,31.7288333333333
+46,992,25.7386666666667
+46,993,27.2626666666667
+46,994,27.1568333333333
+46,995,27.7706666666667
+46,996,24.1723333333333
+46,997,28.2575
+46,998,32.4908333333333
+46,999,30.3953333333333
+46,1000,33.4856666666667
+47,1,29.7603333333333
+47,2,31.3901666666667
+47,3,26.3736666666667
+47,4,28.0881666666667
+47,5,27.559
+47,6,30.7975
+47,7,26.3948333333333
+47,8,30.5435
+47,9,27.2415
+47,10,32.5755
+47,11,28.7866666666667
+47,12,27.3261666666667
+47,13,28.1516666666667
+47,14,29.845
+47,15,24.8708333333333
+47,16,29.1041666666667
+47,17,26.4371666666667
+47,18,25.3365
+47,19,27.305
+47,20,27.2203333333333
+47,21,28.5326666666667
+47,22,34.2688333333333
+47,23,27.8341666666667
+47,24,30.0143333333333
+47,25,32.1098333333333
+47,26,26.0773333333333
+47,27,30.2471666666667
+47,28,26.3101666666667
+47,29,33.5068333333333
+47,30,31.1785
+47,31,28.1728333333333
+47,32,27.0086666666667
+47,33,26.4371666666667
+47,34,25.8868333333333
+47,35,26.4795
+47,36,25.9503333333333
+47,37,32.258
+47,38,31.4748333333333
+47,39,34.3111666666667
+47,40,26.2043333333333
+47,41,26.162
+47,42,28.702
+47,43,30.7128333333333
+47,44,29.4005
+47,45,22.4366666666667
+47,46,25.5905
+47,47,29.21
+47,48,25.1248333333333
+47,49,22.86
+47,50,31.1361666666667
+47,51,20.5951666666667
+47,52,30.5858333333333
+47,53,22.8176666666667
+47,54,21.1455
+47,55,25.0825
+47,56,28.4268333333333
+47,57,28.2575
+47,58,20.9338333333333
+47,59,33.274
+47,60,21.5053333333333
+47,61,33.274
+47,62,21.7805
+47,63,33.4433333333333
+47,64,26.8393333333333
+47,65,27.94
+47,66,24.9343333333333
+47,67,26.8816666666667
+47,68,33.9936666666667
+47,69,28.194
+47,70,32.385
+47,71,26.8393333333333
+47,72,23.9395
+47,73,29.2735
+47,74,26.5853333333333
+47,75,19.7485
+47,76,29.7391666666667
+47,77,27.2626666666667
+47,78,34.9673333333333
+47,79,24.384
+47,80,34.9461666666667
+47,81,34.036
+47,82,29.464
+47,83,26.7546666666667
+47,84,29.8026666666667
+47,85,26.67
+47,86,28.0881666666667
+47,87,31.0091666666667
+47,88,33.8666666666667
+47,89,30.1625
+47,90,29.7603333333333
+47,91,30.9456666666667
+47,92,29.2311666666667
+47,93,35.433
+47,94,29.972
+47,95,31.4325
+47,96,32.5331666666667
+47,97,25.5481666666667
+47,98,25.4846666666667
+47,99,29.3793333333333
+47,100,28.3633333333333
+47,101,28.3421666666667
+47,102,30.8398333333333
+47,103,21.5053333333333
+47,104,21.1243333333333
+47,105,28.4903333333333
+47,106,26.5853333333333
+47,107,27.0721666666667
+47,108,25.9291666666667
+47,109,27.7283333333333
+47,110,29.8873333333333
+47,111,27.8553333333333
+47,112,27.4108333333333
+47,113,22.1615
+47,114,22.5636666666667
+47,115,31.9193333333333
+47,116,33.3798333333333
+47,117,26.5853333333333
+47,118,28.4268333333333
+47,119,26.5006666666667
+47,120,29.2523333333333
+47,121,23.622
+47,122,28.8078333333333
+47,123,33.7608333333333
+47,124,27.0933333333333
+47,125,22.7965
+47,126,27.7918333333333
+47,127,29.337
+47,128,26.1408333333333
+47,129,24.6168333333333
+47,130,25.6116666666667
+47,131,26.7335
+47,132,30.1413333333333
+47,133,22.5213333333333
+47,134,23.3045
+47,135,31.9828333333333
+47,136,22.4578333333333
+47,137,24.8285
+47,138,29.1888333333333
+47,139,25.9926666666667
+47,140,27.6648333333333
+47,141,28.6596666666667
+47,142,30.2471666666667
+47,143,25.8233333333333
+47,144,27.3685
+47,145,24.6591666666667
+47,146,30.2048333333333
+47,147,29.4005
+47,148,26.8181666666667
+47,149,24.7438333333333
+47,150,28.6173333333333
+47,151,25.3153333333333
+47,152,27.7918333333333
+47,153,24.6591666666667
+47,154,23.6431666666667
+47,155,23.0928333333333
+47,156,27.0933333333333
+47,157,23.876
+47,158,26.9028333333333
+47,159,23.8336666666667
+47,160,28.067
+47,161,28.6173333333333
+47,162,30.3106666666667
+47,163,26.6276666666667
+47,164,33.3375
+47,165,22.9658333333333
+47,166,19.0288333333333
+47,167,30.3318333333333
+47,168,27.432
+47,169,29.718
+47,170,25.7175
+47,171,28.2151666666667
+47,172,28.8501666666667
+47,173,25.3788333333333
+47,174,28.7231666666667
+47,175,25.2941666666667
+47,176,22.6906666666667
+47,177,29.337
+47,178,21.9498333333333
+47,179,27.4531666666667
+47,180,26.7546666666667
+47,181,21.59
+47,182,35.7293333333333
+47,183,23.5796666666667
+47,184,27.8553333333333
+47,185,32.4061666666667
+47,186,25.1036666666667
+47,187,30.6281666666667
+47,188,31.3478333333333
+47,189,28.2575
+47,190,33.1893333333333
+47,191,31.6018333333333
+47,192,28.448
+47,193,22.5848333333333
+47,194,27.051
+47,195,26.289
+47,196,24.7226666666667
+47,197,27.4743333333333
+47,198,27.178
+47,199,30.7551666666667
+47,200,27.559
+47,201,31.8981666666667
+47,202,28.1093333333333
+47,203,25.7598333333333
+47,204,33.1681666666667
+47,205,24.2993333333333
+47,206,27.8553333333333
+47,207,27.6013333333333
+47,208,31.0938333333333
+47,209,29.8873333333333
+47,210,24.3205
+47,211,30.3741666666667
+47,212,24.7015
+47,213,25.1248333333333
+47,214,27.4108333333333
+47,215,25.8233333333333
+47,216,27.3261666666667
+47,217,27.432
+47,218,33.5915
+47,219,31.0938333333333
+47,220,25.9503333333333
+47,221,26.5218333333333
+47,222,31.3055
+47,223,26.8816666666667
+47,224,26.5641666666667
+47,225,25.9503333333333
+47,226,26.9663333333333
+47,227,26.9451666666667
+47,228,31.5171666666667
+47,229,27.4531666666667
+47,230,21.7593333333333
+47,231,31.6865
+47,232,23.1775
+47,233,23.8125
+47,234,29.337
+47,235,26.6065
+47,236,25.4
+47,237,30.1625
+47,238,30.2048333333333
+47,239,33.3375
+47,240,28.5326666666667
+47,241,27.3473333333333
+47,242,28.448
+47,243,20.1083333333333
+47,244,32.7871666666667
+47,245,28.321
+47,246,27.1991666666667
+47,247,29.0195
+47,248,20.955
+47,249,24.1935
+47,250,28.9348333333333
+47,251,26.8393333333333
+47,252,27.0721666666667
+47,253,36.1738333333333
+47,254,25.9715
+47,255,25.8021666666667
+47,256,24.3416666666667
+47,257,32.5543333333333
+47,258,28.829
+47,259,26.4371666666667
+47,260,26.0773333333333
+47,261,33.3798333333333
+47,262,28.6808333333333
+47,263,30.353
+47,264,20.574
+47,265,24.6591666666667
+47,266,18.9018333333333
+47,267,32.893
+47,268,20.955
+47,269,22.352
+47,270,27.6013333333333
+47,271,30.4376666666667
+47,272,24.3628333333333
+47,273,35.179
+47,274,23.4103333333333
+47,275,25.5905
+47,276,26.4371666666667
+47,277,29.1888333333333
+47,278,23.7278333333333
+47,279,22.3096666666667
+47,280,29.4216666666667
+47,281,29.6333333333333
+47,282,26.7758333333333
+47,283,27.5166666666667
+47,284,25.7386666666667
+47,285,29.0406666666667
+47,286,31.2208333333333
+47,287,27.9823333333333
+47,288,34.0571666666667
+47,289,34.9461666666667
+47,290,29.3158333333333
+47,291,25.6963333333333
+47,292,31.0091666666667
+47,293,30.4376666666667
+47,294,29.6333333333333
+47,295,31.6865
+47,296,27.8976666666667
+47,297,26.0138333333333
+47,298,25.273
+47,299,32.5331666666667
+47,300,33.2316666666667
+47,301,32.258
+47,302,26.9028333333333
+47,303,31.0303333333333
+47,304,30.8821666666667
+47,305,27.1145
+47,306,27.9611666666667
+47,307,27.4108333333333
+47,308,30.1201666666667
+47,309,25.3576666666667
+47,310,27.6648333333333
+47,311,34.036
+47,312,28.8925
+47,313,28.9348333333333
+47,314,29.1465
+47,315,23.1351666666667
+47,316,28.8925
+47,317,28.7443333333333
+47,318,24.1935
+47,319,27.8553333333333
+47,320,26.0561666666667
+47,321,24.9766666666667
+47,322,26.67
+47,323,24.7438333333333
+47,324,33.5491666666667
+47,325,24.5321666666667
+47,326,25.4635
+47,327,24.5533333333333
+47,328,30.9033333333333
+47,329,26.1408333333333
+47,330,28.5538333333333
+47,331,28.448
+47,332,32.0463333333333
+47,333,31.6018333333333
+47,334,32.4696666666667
+47,335,32.2791666666667
+47,336,29.1041666666667
+47,337,31.0515
+47,338,21.5053333333333
+47,339,28.4903333333333
+47,340,28.2786666666667
+47,341,23.4738333333333
+47,342,32.7025
+47,343,27.0298333333333
+47,344,31.496
+47,345,25.654
+47,346,24.4051666666667
+47,347,27.2203333333333
+47,348,24.13
+47,349,25.9291666666667
+47,350,25.7175
+47,351,27.178
+47,352,24.9131666666667
+47,353,26.3313333333333
+47,354,25.8656666666667
+47,355,22.1826666666667
+47,356,23.1351666666667
+47,357,29.0195
+47,358,26.9875
+47,359,27.8976666666667
+47,360,28.9983333333333
+47,361,25.1036666666667
+47,362,35.4753333333333
+47,363,34.2053333333333
+47,364,26.5218333333333
+47,365,21.1666666666667
+47,366,29.1888333333333
+47,367,30.3741666666667
+47,368,27.3261666666667
+47,369,31.0938333333333
+47,370,26.8605
+47,371,36.8088333333333
+47,372,22.7541666666667
+47,373,22.2673333333333
+47,374,28.1305
+47,375,27.8553333333333
+47,376,28.7443333333333
+47,377,29.1888333333333
+47,378,29.464
+47,379,22.9658333333333
+47,380,27.305
+47,381,26.543
+47,382,27.6648333333333
+47,383,26.7123333333333
+47,384,26.4371666666667
+47,385,29.2311666666667
+47,386,27.6225
+47,387,27.813
+47,388,22.9446666666667
+47,389,32.1521666666667
+47,390,25.7175
+47,391,27.2626666666667
+47,392,27.3896666666667
+47,393,27.1145
+47,394,26.8393333333333
+47,395,30.8186666666667
+47,396,23.1563333333333
+47,397,30.0566666666667
+47,398,21.59
+47,399,28.5326666666667
+47,400,30.2048333333333
+47,401,26.8393333333333
+47,402,22.7541666666667
+47,403,25.3153333333333
+47,404,27.2415
+47,405,23.1775
+47,406,30.6705
+47,407,30.0778333333333
+47,408,32.9565
+47,409,33.0623333333333
+47,410,34.3746666666667
+47,411,23.495
+47,412,30.8186666666667
+47,413,22.3731666666667
+47,414,22.7753333333333
+47,415,26.1831666666667
+47,416,20.0448333333333
+47,417,26.2043333333333
+47,418,29.9296666666667
+47,419,30.6705
+47,420,30.9456666666667
+47,421,21.2725
+47,422,29.6756666666667
+47,423,30.5223333333333
+47,424,34.9673333333333
+47,425,34.0148333333333
+47,426,33.4645
+47,427,29.2523333333333
+47,428,26.3736666666667
+47,429,31.7923333333333
+47,430,28.8501666666667
+47,431,28.8713333333333
+47,432,28.6385
+47,433,29.2735
+47,434,22.9658333333333
+47,435,27.813
+47,436,21.3783333333333
+47,437,20.7433333333333
+47,438,32.8718333333333
+47,439,25.9291666666667
+47,440,33.147
+47,441,27.2626666666667
+47,442,23.5796666666667
+47,443,27.1991666666667
+47,444,30.5011666666667
+47,445,28.8925
+47,446,30.2683333333333
+47,447,24.8073333333333
+47,448,31.0515
+47,449,26.0561666666667
+47,450,24.8496666666667
+47,451,25.4211666666667
+47,452,27.1356666666667
+47,453,27.4743333333333
+47,454,25.6751666666667
+47,455,25.8656666666667
+47,456,28.4691666666667
+47,457,22.3308333333333
+47,458,27.1991666666667
+47,459,26.797
+47,460,26.2678333333333
+47,461,21.8016666666667
+47,462,32.8506666666667
+47,463,25.7386666666667
+47,464,32.9988333333333
+47,465,30.4588333333333
+47,466,32.5543333333333
+47,467,26.2678333333333
+47,468,23.6855
+47,469,25.8233333333333
+47,470,24.6168333333333
+47,471,28.6596666666667
+47,472,26.7335
+47,473,24.9343333333333
+47,474,27.305
+47,475,28.0458333333333
+47,476,25.7175
+47,477,25.1036666666667
+47,478,31.0091666666667
+47,479,33.8455
+47,480,22.8811666666667
+47,481,25.6963333333333
+47,482,31.5806666666667
+47,483,21.6323333333333
+47,484,25.6751666666667
+47,485,27.6225
+47,486,23.3468333333333
+47,487,24.6168333333333
+47,488,33.2528333333333
+47,489,26.3313333333333
+47,490,27.2203333333333
+47,491,29.0195
+47,492,26.9663333333333
+47,493,33.0411666666667
+47,494,25.9503333333333
+47,495,30.5858333333333
+47,496,26.5641666666667
+47,497,28.3421666666667
+47,498,24.9766666666667
+47,499,28.8713333333333
+47,500,33.5703333333333
+47,501,23.622
+47,502,20.6163333333333
+47,503,29.0195
+47,504,30.6705
+47,505,21.1878333333333
+47,506,20.3623333333333
+47,507,30.5435
+47,508,22.5001666666667
+47,509,28.1728333333333
+47,510,30.4588333333333
+47,511,35.5811666666667
+47,512,27.8553333333333
+47,513,34.7133333333333
+47,514,30.9033333333333
+47,515,22.9658333333333
+47,516,24.257
+47,517,31.4748333333333
+47,518,38.9466666666667
+47,519,28.4903333333333
+47,520,28.321
+47,521,30.4588333333333
+47,522,29.4216666666667
+47,523,23.9818333333333
+47,524,33.0411666666667
+47,525,30.2683333333333
+47,526,26.6488333333333
+47,527,29.8026666666667
+47,528,22.9658333333333
+47,529,26.8181666666667
+47,530,22.7541666666667
+47,531,25.781
+47,532,26.5218333333333
+47,533,30.0355
+47,534,28.6596666666667
+47,535,23.114
+47,536,31.8558333333333
+47,537,22.8176666666667
+47,538,21.6323333333333
+47,539,24.2146666666667
+47,540,36.449
+47,541,19.5368333333333
+47,542,20.701
+47,543,27.2838333333333
+47,544,33.6126666666667
+47,545,29.0618333333333
+47,546,25.1671666666667
+47,547,32.9565
+47,548,28.575
+47,549,30.5646666666667
+47,550,27.1568333333333
+47,551,25.5481666666667
+47,552,30.1201666666667
+47,553,22.5848333333333
+47,554,30.4588333333333
+47,555,28.0246666666667
+47,556,29.1888333333333
+47,557,27.6436666666667
+47,558,28.8925
+47,559,31.369
+47,560,27.7706666666667
+47,561,30.5858333333333
+47,562,24.8496666666667
+47,563,27.0933333333333
+47,564,23.9395
+47,565,26.5218333333333
+47,566,20.9973333333333
+47,567,32.1098333333333
+47,568,33.909
+47,569,27.0298333333333
+47,570,21.8228333333333
+47,571,28.2575
+47,572,30.226
+47,573,31.4748333333333
+47,574,23.3045
+47,575,25.8868333333333
+47,576,26.162
+47,577,26.4795
+47,578,31.1785
+47,579,28.2786666666667
+47,580,32.2368333333333
+47,581,31.7076666666667
+47,582,36.1526666666667
+47,583,25.7598333333333
+47,584,27.7071666666667
+47,585,26.5853333333333
+47,586,27.0721666666667
+47,587,33.4856666666667
+47,588,23.8125
+47,589,34.8615
+47,590,24.0453333333333
+47,591,26.4371666666667
+47,592,27.0721666666667
+47,593,29.4851666666667
+47,594,27.6225
+47,595,30.8186666666667
+47,596,21.4418333333333
+47,597,28.448
+47,598,27.9823333333333
+47,599,27.9823333333333
+47,600,30.988
+47,601,28.6173333333333
+47,602,28.8713333333333
+47,603,32.4696666666667
+47,604,26.2678333333333
+47,605,33.909
+47,606,24.892
+47,607,31.4113333333333
+47,608,23.368
+47,609,23.8971666666667
+47,610,28.9348333333333
+47,611,24.5533333333333
+47,612,35.2001666666667
+47,613,26.924
+47,614,31.2631666666667
+47,615,24.6803333333333
+47,616,25.6116666666667
+47,617,28.7231666666667
+47,618,31.8558333333333
+47,619,22.4366666666667
+47,620,25.6328333333333
+47,621,32.6813333333333
+47,622,24.7015
+47,623,22.987
+47,624,29.6756666666667
+47,625,24.7438333333333
+47,626,28.8078333333333
+47,627,25.5693333333333
+47,628,28.448
+47,629,25.654
+47,630,30.4376666666667
+47,631,29.337
+47,632,24.9131666666667
+47,633,30.226
+47,634,30.7128333333333
+47,635,31.9616666666667
+47,636,29.2311666666667
+47,637,26.2255
+47,638,37.5496666666667
+47,639,29.6121666666667
+47,640,29.2311666666667
+47,641,31.2208333333333
+47,642,25.5058333333333
+47,643,32.7236666666667
+47,644,30.099
+47,645,27.5801666666667
+47,646,33.3798333333333
+47,647,16.5946666666667
+47,648,25.146
+47,649,28.9983333333333
+47,650,26.797
+47,651,31.8558333333333
+47,652,28.6385
+47,653,30.2471666666667
+47,654,34.3535
+47,655,32.5966666666667
+47,656,31.3478333333333
+47,657,27.3896666666667
+47,658,22.4155
+47,659,27.6225
+47,660,25.2941666666667
+47,661,29.1041666666667
+47,662,23.1351666666667
+47,663,31.8346666666667
+47,664,26.9875
+47,665,25.8868333333333
+47,666,23.749
+47,667,32.8718333333333
+47,668,37.5073333333333
+47,669,34.7768333333333
+47,670,28.5115
+47,671,29.0195
+47,672,32.004
+47,673,19.0076666666667
+47,674,31.2631666666667
+47,675,36.6818333333333
+47,676,30.5858333333333
+47,677,31.3266666666667
+47,678,26.8181666666667
+47,679,27.2626666666667
+47,680,26.162
+47,681,27.3473333333333
+47,682,29.083
+47,683,29.9296666666667
+47,684,23.0505
+47,685,22.86
+47,686,27.2838333333333
+47,687,23.4526666666667
+47,688,24.892
+47,689,25.5693333333333
+47,690,30.0778333333333
+47,691,26.5006666666667
+47,692,26.4371666666667
+47,693,25.9291666666667
+47,694,29.4216666666667
+47,695,32.512
+47,696,27.178
+47,697,31.75
+47,698,22.733
+47,699,31.5171666666667
+47,700,32.9776666666667
+47,701,26.8181666666667
+47,702,28.1728333333333
+47,703,28.0458333333333
+47,704,24.511
+47,705,29.845
+47,706,28.2151666666667
+47,707,28.4268333333333
+47,708,28.702
+47,709,29.0618333333333
+47,710,29.5275
+47,711,26.67
+47,712,29.6756666666667
+47,713,31.1996666666667
+47,714,29.4005
+47,715,27.7071666666667
+47,716,31.7711666666667
+47,717,30.5646666666667
+47,718,24.257
+47,719,25.146
+47,720,26.3736666666667
+47,721,30.7975
+47,722,22.0133333333333
+47,723,28.702
+47,724,27.1145
+47,725,26.0773333333333
+47,726,30.1201666666667
+47,727,23.4103333333333
+47,728,25.9503333333333
+47,729,21.336
+47,730,32.7871666666667
+47,731,21.7805
+47,732,26.6065
+47,733,31.1361666666667
+47,734,25.273
+47,735,27.8765
+47,736,19.4521666666667
+47,737,24.7226666666667
+47,738,28.448
+47,739,28.7231666666667
+47,740,22.4578333333333
+47,741,35.2425
+47,742,29.9085
+47,743,28.0035
+47,744,23.3468333333333
+47,745,27.5801666666667
+47,746,24.003
+47,747,27.8765
+47,748,24.7438333333333
+47,749,27.6648333333333
+47,750,23.6008333333333
+47,751,30.3318333333333
+47,752,25.3788333333333
+47,753,26.3313333333333
+47,754,27.3896666666667
+47,755,28.6385
+47,756,30.4588333333333
+47,757,22.2038333333333
+47,758,25.273
+47,759,32.7025
+47,760,26.2466666666667
+47,761,28.8713333333333
+47,762,29.0618333333333
+47,763,28.5961666666667
+47,764,31.369
+47,765,30.734
+47,766,28.2786666666667
+47,767,25.1036666666667
+47,768,20.7856666666667
+47,769,24.7438333333333
+47,770,25.7175
+47,771,28.6385
+47,772,25.6328333333333
+47,773,22.5425
+47,774,29.8026666666667
+47,775,18.0763333333333
+47,776,27.2838333333333
+47,777,26.2043333333333
+47,778,27.3685
+47,779,23.2198333333333
+47,780,29.718
+47,781,32.4061666666667
+47,782,27.4743333333333
+47,783,30.861
+47,784,25.8868333333333
+47,785,26.5006666666667
+47,786,20.193
+47,787,32.1733333333333
+47,788,31.242
+47,789,27.2838333333333
+47,790,30.4588333333333
+47,791,22.4366666666667
+47,792,32.9141666666667
+47,793,31.1996666666667
+47,794,28.321
+47,795,27.432
+47,796,27.4955
+47,797,24.7438333333333
+47,798,31.8558333333333
+47,799,29.8026666666667
+47,800,25.4635
+47,801,22.8388333333333
+47,802,25.8868333333333
+47,803,27.6436666666667
+47,804,27.2203333333333
+47,805,29.9085
+47,806,23.8336666666667
+47,807,31.75
+47,808,26.0561666666667
+47,809,28.575
+47,810,25.8445
+47,811,28.0246666666667
+47,812,25.0825
+47,813,28.1305
+47,814,29.6121666666667
+47,815,26.797
+47,816,30.7975
+47,817,23.0293333333333
+47,818,25.3365
+47,819,25.8868333333333
+47,820,26.67
+47,821,22.352
+47,822,28.6596666666667
+47,823,26.1196666666667
+47,824,27.0721666666667
+47,825,27.3261666666667
+47,826,26.1196666666667
+47,827,28.6173333333333
+47,828,28.5961666666667
+47,829,26.4795
+47,830,26.6488333333333
+47,831,29.1676666666667
+47,832,21.463
+47,833,22.4155
+47,834,27.3685
+47,835,27.4743333333333
+47,836,28.956
+47,837,24.3416666666667
+47,838,21.0608333333333
+47,839,21.9921666666667
+47,840,29.8238333333333
+47,841,24.8708333333333
+47,842,26.2466666666667
+47,843,31.5595
+47,844,28.2363333333333
+47,845,26.2255
+47,846,20.1295
+47,847,26.9028333333333
+47,848,28.9771666666667
+47,849,25.1036666666667
+47,850,25.3153333333333
+47,851,27.432
+47,852,24.5745
+47,853,29.1253333333333
+47,854,27.7706666666667
+47,855,33.4221666666667
+47,856,33.1893333333333
+47,857,24.5533333333333
+47,858,26.4583333333333
+47,859,27.0086666666667
+47,860,25.273
+47,861,29.4216666666667
+47,862,29.9085
+47,863,30.4165
+47,864,30.0355
+47,865,22.733
+47,866,23.0293333333333
+47,867,27.2626666666667
+47,868,28.8925
+47,869,30.607
+47,870,32.893
+47,871,30.7975
+47,872,27.6436666666667
+47,873,29.337
+47,874,32.2791666666667
+47,875,29.972
+47,876,25.4846666666667
+47,877,25.0401666666667
+47,878,24.384
+47,879,28.1305
+47,880,27.432
+47,881,28.702
+47,882,31.3901666666667
+47,883,28.448
+47,884,25.908
+47,885,27.6648333333333
+47,886,31.9828333333333
+47,887,24.384
+47,888,25.6328333333333
+47,889,23.6431666666667
+47,890,28.6808333333333
+47,891,30.3953333333333
+47,892,25.8445
+47,893,22.8176666666667
+47,894,25.5693333333333
+47,895,24.8708333333333
+47,896,23.2198333333333
+47,897,26.2255
+47,898,25.0825
+47,899,35.1155
+47,900,33.0835
+47,901,24.2146666666667
+47,902,26.797
+47,903,30.7551666666667
+47,904,21.7593333333333
+47,905,32.0886666666667
+47,906,29.4851666666667
+47,907,25.3576666666667
+47,908,32.2791666666667
+47,909,30.3106666666667
+47,910,19.9813333333333
+47,911,25.4423333333333
+47,912,21.7593333333333
+47,913,27.7495
+47,914,31.877
+47,915,20.3623333333333
+47,916,31.0938333333333
+47,917,25.4423333333333
+47,918,28.2575
+47,919,30.9033333333333
+47,920,23.5585
+47,921,29.845
+47,922,28.4268333333333
+47,923,29.0618333333333
+47,924,26.9451666666667
+47,925,30.8398333333333
+47,926,20.8068333333333
+47,927,25.8233333333333
+47,928,29.8238333333333
+47,929,28.3633333333333
+47,930,24.7861666666667
+47,931,21.209
+47,932,27.6225
+47,933,29.6545
+47,934,18.7748333333333
+47,935,28.9136666666667
+47,936,28.3421666666667
+47,937,28.448
+47,938,31.3055
+47,939,25.7386666666667
+47,940,24.257
+47,941,31.4748333333333
+47,942,31.5171666666667
+47,943,24.6591666666667
+47,944,30.2048333333333
+47,945,36.5125
+47,946,28.5326666666667
+47,947,38.354
+47,948,26.7758333333333
+47,949,28.829
+47,950,28.2998333333333
+47,951,27.2838333333333
+47,952,35.8563333333333
+47,953,32.5331666666667
+47,954,26.5853333333333
+47,955,29.2523333333333
+47,956,20.1506666666667
+47,957,27.6013333333333
+47,958,27.9823333333333
+47,959,22.1403333333333
+47,960,25.6116666666667
+47,961,27.2203333333333
+47,962,27.2838333333333
+47,963,29.1888333333333
+47,964,28.5538333333333
+47,965,24.8708333333333
+47,966,25.8868333333333
+47,967,30.3318333333333
+47,968,20.447
+47,969,26.2678333333333
+47,970,21.2301666666667
+47,971,31.8346666666667
+47,972,29.2735
+47,973,25.9503333333333
+47,974,31.3901666666667
+47,975,28.3845
+47,976,29.591
+47,977,26.6065
+47,978,23.9818333333333
+47,979,25.2095
+47,980,29.9085
+47,981,24.5956666666667
+47,982,25.8656666666667
+47,983,27.6648333333333
+47,984,31.4113333333333
+47,985,28.6808333333333
+47,986,30.5223333333333
+47,987,30.5858333333333
+47,988,26.67
+47,989,31.369
+47,990,21.3571666666667
+47,991,27.0298333333333
+47,992,25.4
+47,993,23.114
+47,994,29.1888333333333
+47,995,27.1991666666667
+47,996,28.8078333333333
+47,997,27.3896666666667
+47,998,30.5011666666667
+47,999,29.1465
+47,1000,29.2946666666667
+48,1,26.8224
+48,2,27.8849666666667
+48,3,25.7217333333333
+48,4,22.8219
+48,5,30.5477333333333
+48,6,32.8760666666667
+48,7,28.1135666666667
+48,8,25.1756333333333
+48,9,26.4371666666667
+48,10,22.8854
+48,11,30.6535666666667
+48,12,26.9028333333333
+48,13,25.0444
+48,14,24.9216333333333
+48,15,22.7880333333333
+48,16,33.274
+48,17,25.9715
+48,18,28.702
+48,19,28.0119666666667
+48,20,30.6747333333333
+48,21,34.7556666666667
+48,22,25.527
+48,23,22.2123
+48,24,27.4193
+48,25,30.2090666666667
+48,26,22.5425
+48,27,34.4974333333333
+48,28,23.5839
+48,29,18.8806666666667
+48,30,39.0186333333333
+48,31,22.8261333333333
+48,32,24.8327333333333
+48,33,28.3421666666667
+48,34,30.5731333333333
+48,35,27.5420666666667
+48,36,28.8332333333333
+48,37,26.9028333333333
+48,38,27.7114
+48,39,29.9296666666667
+48,40,26.4795
+48,41,21.8228333333333
+48,42,30.1836666666667
+48,43,27.9230666666667
+48,44,24.0072333333333
+48,45,32.4146333333333
+48,46,28.0924
+48,47,19.4183
+48,48,32.4315666666667
+48,49,23.6982
+48,50,24.13
+48,51,16.3025666666667
+48,52,24.0241666666667
+48,53,37.7571
+48,54,21.4672333333333
+48,55,32.4950666666667
+48,56,24.1977333333333
+48,57,30.7213
+48,58,36.6818333333333
+48,59,23.9437333333333
+48,60,32.258
+48,61,24.8327333333333
+48,62,27.6267333333333
+48,63,24.1511666666667
+48,64,25.7640666666667
+48,65,21.6111666666667
+48,66,20.066
+48,67,30.5223333333333
+48,68,26.7546666666667
+48,69,27.0764
+48,70,27.2034
+48,71,27.8384
+48,72,24.6422333333333
+48,73,23.5246333333333
+48,74,25.5397
+48,75,37.7655666666667
+48,76,26.3313333333333
+48,77,29.8153666666667
+48,78,28.5115
+48,79,27.2669
+48,80,28.3040666666667
+48,81,28.6004
+48,82,27.2753666666667
+48,83,25.2095
+48,84,31.9278
+48,85,20.0236666666667
+48,86,21.9117333333333
+48,87,30.3360666666667
+48,88,25.7852333333333
+48,89,26.0138333333333
+48,90,32.4146333333333
+48,91,29.4174333333333
+48,92,29.3793333333333
+48,93,27.4785666666667
+48,94,27.5166666666667
+48,95,31.8135
+48,96,37.1517333333333
+48,97,26.7377333333333
+48,98,32.3469
+48,99,21.717
+48,100,27.1356666666667
+48,101,35.6065666666667
+48,102,35.5388333333333
+48,103,23.4526666666667
+48,104,23.1859666666667
+48,105,35.3906666666667
+48,106,33.9344
+48,107,25.5947333333333
+48,108,30.3784
+48,109,23.3891666666667
+48,110,23.0589666666667
+48,111,21.3614
+48,112,30.9075666666667
+48,113,23.0928333333333
+48,114,30.4715333333333
+48,115,26.7546666666667
+48,116,20.2734333333333
+48,117,25.2222
+48,118,23.0124
+48,119,30.7551666666667
+48,120,36.0722333333333
+48,121,23.1351666666667
+48,122,24.638
+48,123,28.9433
+48,124,20.574
+48,125,24.3459
+48,126,34.2053333333333
+48,127,28.3464
+48,128,30.2683333333333
+48,129,34.0825666666667
+48,130,21.6746666666667
+48,131,26.1069666666667
+48,132,23.2325333333333
+48,133,31.7711666666667
+48,134,28.1305
+48,135,28.8374666666667
+48,136,22.352
+48,137,27.1864666666667
+48,138,23.6516333333333
+48,139,28.4734
+48,140,41.3469666666667
+48,141,29.6841333333333
+48,142,22.6991333333333
+48,143,38.0407333333333
+48,144,25.019
+48,145,23.1817333333333
+48,146,27.1145
+48,147,29.6460333333333
+48,148,24.1723333333333
+48,149,27.3134666666667
+48,150,32.6855666666667
+48,151,27.5463
+48,152,23.8802333333333
+48,153,26.8181666666667
+48,154,26.1239
+48,155,21.7889666666667
+48,156,38.2524
+48,157,22.7541666666667
+48,158,30.353
+48,159,29.3835666666667
+48,160,32.8379666666667
+48,161,37.0035666666667
+48,162,25.9884333333333
+48,163,27.1653
+48,164,38.5656666666667
+48,165,26.8054666666667
+48,166,24.9131666666667
+48,167,28.7231666666667
+48,168,27.7071666666667
+48,169,24.8327333333333
+48,170,26.9494
+48,171,28.321
+48,172,31.0345666666667
+48,173,25.5693333333333
+48,174,16.9121666666667
+48,175,27.178
+48,176,22.6906666666667
+48,177,39.7129
+48,178,31.9193333333333
+48,179,40.2844
+48,180,32.2368333333333
+48,181,25.1714
+48,182,29.8111333333333
+48,183,26.5260666666667
+48,184,27.8214666666667
+48,185,22.7753333333333
+48,186,25.4296333333333
+48,187,33.3840666666667
+48,188,34.6752333333333
+48,189,31.242
+48,190,27.7791333333333
+48,191,33.8074
+48,192,33.1724
+48,193,23.5415666666667
+48,194,27.1441333333333
+48,195,25.8910666666667
+48,196,28.4310666666667
+48,197,23.6008333333333
+48,198,24.4686666666667
+48,199,25.5143
+48,200,31.9108666666667
+48,201,27.3558
+48,202,32.0463333333333
+48,203,32.0463333333333
+48,204,26.3144
+48,205,22.3435333333333
+48,206,25.9291666666667
+48,207,27.3685
+48,208,19.3971333333333
+48,209,26.7165666666667
+48,210,30.7805666666667
+48,211,23.3299
+48,212,23.0928333333333
+48,213,28.5326666666667
+48,214,23.9691333333333
+48,215,26.5218333333333
+48,216,31.0091666666667
+48,217,33.0877333333333
+48,218,23.1817333333333
+48,219,28.2998333333333
+48,220,29.7688
+48,221,25.1925666666667
+48,222,36.5590666666667
+48,223,26.8732
+48,224,26.4795
+48,225,26.4033
+48,226,32.3469
+48,227,25.9164666666667
+48,228,29.0237333333333
+48,229,29.0364333333333
+48,230,23.9437333333333
+48,231,26.0858
+48,232,25.7429
+48,233,30.7975
+48,234,32.6813333333333
+48,235,29.6121666666667
+48,236,34.3111666666667
+48,237,28.5877
+48,238,32.5416333333333
+48,239,25.1375333333333
+48,240,26.5006666666667
+48,241,32.6474666666667
+48,242,23.4611333333333
+48,243,27.7114
+48,244,31.2885666666667
+48,245,23.9606666666667
+48,246,24.6845666666667
+48,247,35.179
+48,248,27.3685
+48,249,38.1
+48,250,39.7129
+48,251,31.4155666666667
+48,252,31.7161333333333
+48,253,28.2575
+48,254,32.0124666666667
+48,255,29.7645666666667
+48,256,24.765
+48,257,27.0637
+48,258,33.9301666666667
+48,259,23.2452333333333
+48,260,27.3092333333333
+48,261,22.8854
+48,262,30.6578
+48,263,24.1765666666667
+48,264,24.6845666666667
+48,265,24.7057333333333
+48,266,26.8478
+48,267,27.9908
+48,268,32.7956333333333
+48,269,28.9136666666667
+48,270,25.9715
+48,271,29.3031333333333
+48,272,26.2466666666667
+48,273,33.0030666666667
+48,274,31.0938333333333
+48,275,31.9235666666667
+48,276,21.9752333333333
+48,277,22.1445666666667
+48,278,30.3318333333333
+48,279,25.1121333333333
+48,280,29.5148
+48,281,29.0195
+48,282,31.1996666666667
+48,283,24.6295333333333
+48,284,31.2293
+48,285,24.5321666666667
+48,286,25.9926666666667
+48,287,26.2720666666667
+48,288,27.9442333333333
+48,289,32.1564
+48,290,30.2768
+48,291,28.7274
+48,292,29.5190333333333
+48,293,28.194
+48,294,26.1747
+48,295,35.5049666666667
+48,296,31.0938333333333
+48,297,22.8176666666667
+48,298,23.9225666666667
+48,299,28.8501666666667
+48,300,29.1846
+48,301,32.3469
+48,302,21.0947
+48,303,30.6535666666667
+48,304,35.3356333333333
+48,305,33.7904666666667
+48,306,33.8539666666667
+48,307,38.0788333333333
+48,308,29.0745333333333
+48,309,29.2523333333333
+48,310,30.4630666666667
+48,311,24.9597333333333
+48,312,25.019
+48,313,23.1224666666667
+48,314,29.7688
+48,315,32.2368333333333
+48,316,26.9536333333333
+48,317,33.7185
+48,318,20.6417333333333
+48,319,25.7175
+48,320,27.7283333333333
+48,321,34.8488
+48,322,21.8482333333333
+48,323,23.495
+48,324,27.0933333333333
+48,325,29.7391666666667
+48,326,19.8416333333333
+48,327,27.2076333333333
+48,328,25.7640666666667
+48,329,31.9405
+48,330,25.1121333333333
+48,331,25.4719666666667
+48,332,23.8802333333333
+48,333,16.4338
+48,334,27.0129
+48,335,22.1699666666667
+48,336,38.2693333333333
+48,337,30.0566666666667
+48,338,24.1596333333333
+48,339,17.7376666666667
+48,340,23.3468333333333
+48,341,29.6375666666667
+48,342,27.5209
+48,343,32.2664666666667
+48,344,24.9766666666667
+48,345,19.4564
+48,346,29.3200666666667
+48,347,32.1733333333333
+48,348,31.9870666666667
+48,349,23.6897333333333
+48,350,31.7288333333333
+48,351,27.6902333333333
+48,352,29.0533666666667
+48,353,21.9921666666667
+48,354,32.4739
+48,355,42.4010666666667
+48,356,28.2405666666667
+48,357,27.9442333333333
+48,358,32.0886666666667
+48,359,26.3144
+48,360,26.2297333333333
+48,361,33.2147333333333
+48,362,28.8544
+48,363,35.1451333333333
+48,364,32.9014666666667
+48,365,31.7119
+48,366,30.7763333333333
+48,367,21.7254666666667
+48,368,35.4203
+48,369,26.6954
+48,370,24.4475
+48,371,28.1516666666667
+48,372,32.5035333333333
+48,373,26.8816666666667
+48,374,28.8925
+48,375,28.2744333333333
+48,376,30.3360666666667
+48,377,28.5115
+48,378,30.607
+48,379,33.9344
+48,380,31.1573333333333
+48,381,26.9070666666667
+48,382,25.5693333333333
+48,383,28.956
+48,384,29.0660666666667
+48,385,24.3882333333333
+48,386,28.7909
+48,387,31.3309
+48,388,27.178
+48,389,31.2674
+48,390,29.2989
+48,391,32.6432333333333
+48,392,25.3830666666667
+48,393,33.4433333333333
+48,394,24.5575666666667
+48,395,24.13
+48,396,30.1709666666667
+48,397,27.1441333333333
+48,398,27.1991666666667
+48,399,21.9498333333333
+48,400,28.067
+48,401,31.0557333333333
+48,402,34.3365666666667
+48,403,33.02
+48,404,34.2730666666667
+48,405,21.8482333333333
+48,406,21.6535
+48,407,30.7763333333333
+48,408,30.1879
+48,409,24.2358333333333
+48,410,33.3798333333333
+48,411,24.3924666666667
+48,412,27.6013333333333
+48,413,26.1450666666667
+48,414,24.3501333333333
+48,415,32.9649666666667
+48,416,37.7740333333333
+48,417,29.2142333333333
+48,418,29.3835666666667
+48,419,26.8647333333333
+48,420,26.2255
+48,421,23.2918
+48,422,26.6065
+48,423,19.7485
+48,424,26.924
+48,425,30.9753
+48,426,26.797
+48,427,34.6921666666667
+48,428,20.6840666666667
+48,429,24.4263333333333
+48,430,23.1351666666667
+48,431,32.8760666666667
+48,432,31.0091666666667
+48,433,28.1389666666667
+48,434,32.9184
+48,435,27.3092333333333
+48,436,24.3247333333333
+48,437,27.2880666666667
+48,438,29.6841333333333
+48,439,19.4945
+48,440,34.3577333333333
+48,441,22.2038333333333
+48,442,21.5265
+48,443,31.0515
+48,444,20.574
+48,445,26.4202333333333
+48,446,33.6973333333333
+48,447,28.8925
+48,448,29.464
+48,449,26.7589
+48,450,19.5664666666667
+48,451,21.6958333333333
+48,452,32.9395666666667
+48,453,34.2307333333333
+48,454,26.8478
+48,455,26.2763
+48,456,33.9217
+48,457,21.8694
+48,458,31.5256333333333
+48,459,33.1724
+48,460,22.5340333333333
+48,461,29.4047333333333
+48,462,36.1611333333333
+48,463,28.3675666666667
+48,464,27.7833666666667
+48,465,25.1079
+48,466,25.8021666666667
+48,467,35.5515333333333
+48,468,33.274
+48,469,26.5641666666667
+48,470,32.4908333333333
+48,471,26.3736666666667
+48,472,21.8270666666667
+48,473,34.6921666666667
+48,474,27.9654
+48,475,30.7594
+48,476,24.5321666666667
+48,477,32.9819
+48,478,29.6121666666667
+48,479,30.1455666666667
+48,480,23.4653666666667
+48,481,28.2575
+48,482,33.3586666666667
+48,483,29.8492333333333
+48,484,19.6892333333333
+48,485,28.448
+48,486,26.4033
+48,487,22.7584
+48,488,26.7335
+48,489,30.9329666666667
+48,490,23.6304666666667
+48,491,29.3878
+48,492,23.1182333333333
+48,493,27.5082
+48,494,25.4635
+48,495,32.3680666666667
+48,496,45.593
+48,497,27.4531666666667
+48,498,25.2984
+48,499,25.4423333333333
+48,500,26.6742333333333
+48,501,23.8675333333333
+48,502,23.6008333333333
+48,503,32.131
+48,504,25.5100666666667
+48,505,23.5415666666667
+48,506,39.9415
+48,507,32.1860333333333
+48,508,31.7584666666667
+48,509,28.9221333333333
+48,510,36.2839
+48,511,30.5858333333333
+48,512,30.0609
+48,513,43.9631666666667
+48,514,30.48
+48,515,27.7706666666667
+48,516,35.4965
+48,517,30.2979666666667
+48,518,31.0345666666667
+48,519,32.7914
+48,520,30.0736
+48,521,25.8783666666667
+48,522,36.3262333333333
+48,523,21.5603666666667
+48,524,30.7170666666667
+48,525,31.1573333333333
+48,526,24.5618
+48,527,28.0458333333333
+48,528,25.146
+48,529,22.0853
+48,530,27.1145
+48,531,31.7796333333333
+48,532,37.7655666666667
+48,533,30.3106666666667
+48,534,27.2711333333333
+48,535,26.9705666666667
+48,536,28.7147
+48,537,20.6417333333333
+48,538,19.2066333333333
+48,539,30.8906333333333
+48,540,32.004
+48,541,35.6065666666667
+48,542,30.099
+48,543,34.3577333333333
+48,544,28.1135666666667
+48,545,31.1615666666667
+48,546,37.7401666666667
+48,547,34.1884
+48,548,31.2631666666667
+48,549,28.7739666666667
+48,550,26.2255
+48,551,26.8435666666667
+48,552,25.5735666666667
+48,553,25.2179666666667
+48,554,29.4936333333333
+48,555,31.0769
+48,556,25.7048
+48,557,26.8012333333333
+48,558,25.4508
+48,559,25.5100666666667
+48,560,23.4315
+48,561,34.163
+48,562,39.9626666666667
+48,563,27.9654
+48,564,27.9442333333333
+48,565,25.6794
+48,566,27.3261666666667
+48,567,29.1465
+48,568,24.2062
+48,569,28.2024666666667
+48,570,30.734
+48,571,24.6845666666667
+48,572,28.9136666666667
+48,573,32.4739
+48,574,28.2194
+48,575,27.1610666666667
+48,576,19.1177333333333
+48,577,23.0970666666667
+48,578,26.6784666666667
+48,579,26.3990666666667
+48,580,28.3675666666667
+48,581,23.9522
+48,582,27.3092333333333
+48,583,30.6281666666667
+48,584,32.3003333333333
+48,585,26.7631333333333
+48,586,31.7754
+48,587,25.1756333333333
+48,588,37.6809
+48,589,18.1398333333333
+48,590,24.892
+48,591,36.4574666666667
+48,592,27.7960666666667
+48,593,27.7325666666667
+48,594,28.6512
+48,595,26.035
+48,596,21.9371333333333
+48,597,22.5890666666667
+48,598,26.7335
+48,599,31.2208333333333
+48,600,22.9277333333333
+48,601,29.5317333333333
+48,602,20.0279
+48,603,25.1925666666667
+48,604,29.4089666666667
+48,605,27.432
+48,606,22.7668666666667
+48,607,22.7795666666667
+48,608,29.9550666666667
+48,609,23.9225666666667
+48,610,27.6648333333333
+48,611,22.3562333333333
+48,612,27.0848666666667
+48,613,33.909
+48,614,24.0072333333333
+48,615,26.9324666666667
+48,616,37.8502333333333
+48,617,28.829
+48,618,29.8704
+48,619,26.6488333333333
+48,620,27.7706666666667
+48,621,27.4404666666667
+48,622,29.3793333333333
+48,623,19.3294
+48,624,30.4927
+48,625,35.4965
+48,626,29.2184666666667
+48,627,36.0976333333333
+48,628,26.2466666666667
+48,629,22.4366666666667
+48,630,25.0909666666667
+48,631,27.3812
+48,632,24.0453333333333
+48,633,27.5420666666667
+48,634,22.4620666666667
+48,635,24.7692333333333
+48,636,32.7236666666667
+48,637,28.5961666666667
+48,638,30.7975
+48,639,25.0232333333333
+48,640,33.1512333333333
+48,641,25.1121333333333
+48,642,39.7129
+48,643,23.0759
+48,644,25.2306666666667
+48,645,16.8994666666667
+48,646,24.5575666666667
+48,647,22.0768333333333
+48,648,35.8775
+48,649,26.2297333333333
+48,650,18.3599666666667
+48,651,32.0675
+48,652,30.3360666666667
+48,653,35.2128666666667
+48,654,21.5773
+48,655,23.2029
+48,656,27.5166666666667
+48,657,29.845
+48,658,29.5740666666667
+48,659,27.5674666666667
+48,660,36.7495666666667
+48,661,37.0247333333333
+48,662,24.1342333333333
+48,663,23.1351666666667
+48,664,27.0975666666667
+48,665,25.4
+48,666,27.7537333333333
+48,667,31.5383333333333
+48,668,26.8181666666667
+48,669,33.3840666666667
+48,670,27.0594666666667
+48,671,26.8816666666667
+48,672,25.0909666666667
+48,673,29.7264666666667
+48,674,31.8389
+48,675,29.2438666666667
+48,676,37.9603
+48,677,28.6427333333333
+48,678,20.3835
+48,679,27.8765
+48,680,20.9338333333333
+48,681,28.9814
+48,682,28.1982333333333
+48,683,24.8581333333333
+48,684,33.8074
+48,685,20.2903666666667
+48,686,33.0030666666667
+48,687,30.7424666666667
+48,688,34.9758
+48,689,19.2405
+48,690,24.7523
+48,691,25.9334
+48,692,19.9601666666667
+48,693,27.6225
+48,694,27.7960666666667
+48,695,27.5039666666667
+48,696,19.9813333333333
+48,697,31.2081333333333
+48,698,22.1445666666667
+48,699,26.4879666666667
+48,700,28.8586333333333
+48,701,24.765
+48,702,34.4593333333333
+48,703,29.6968333333333
+48,704,23.4103333333333
+48,705,28.7401
+48,706,21.5942333333333
+48,707,18.6901666666667
+48,708,31.9024
+48,709,24.3882333333333
+48,710,25.4423333333333
+48,711,30.7594
+48,712,24.8327333333333
+48,713,23.0124
+48,714,29.2989
+48,715,23.9606666666667
+48,716,33.8031666666667
+48,717,31.4748333333333
+48,718,39.9203333333333
+48,719,36.3643333333333
+48,720,29.4428333333333
+48,721,26.4837333333333
+48,722,28.067
+48,723,25.1671666666667
+48,724,26.3736666666667
+48,725,35.9240666666667
+48,726,34.2095666666667
+48,727,31.2631666666667
+48,728,28.5538333333333
+48,729,27.6013333333333
+48,730,28.2575
+48,731,26.1069666666667
+48,732,28.0797
+48,733,28.956
+48,734,24.0326333333333
+48,735,31.0388
+48,736,23.5373333333333
+48,737,23.7701666666667
+48,738,30.3233666666667
+48,739,28.4691666666667
+48,740,20.5359
+48,741,28.6004
+48,742,23.9818333333333
+48,743,22.8007333333333
+48,744,25.8445
+48,745,33.1131333333333
+48,746,30.7128333333333
+48,747,33.4221666666667
+48,748,30.6578
+48,749,37.4692333333333
+48,750,27.2330333333333
+48,751,25.9122333333333
+48,752,33.4475666666667
+48,753,22.9023333333333
+48,754,21.5265
+48,755,31.1827333333333
+48,756,31.1996666666667
+48,757,26.3355666666667
+48,758,24.4475
+48,759,30.5646666666667
+48,760,24.1723333333333
+48,761,28.2998333333333
+48,762,34.5059
+48,763,26.4033
+48,764,20.2353333333333
+48,765,23.1224666666667
+48,766,33.0454
+48,767,20.2141666666667
+48,768,31.4325
+48,769,22.7118333333333
+48,770,23.2833333333333
+48,771,29.8069
+48,772,26.924
+48,773,27.305
+48,774,23.7363
+48,775,24.9385666666667
+48,776,33.2994
+48,777,25.5947333333333
+48,778,24.4729
+48,779,29.4851666666667
+48,780,26.9367
+48,781,30.3614666666667
+48,782,32.3342
+48,783,27.0340666666667
+48,784,36.0934
+48,785,29.1295666666667
+48,786,34.29
+48,787,33.2613
+48,788,30.1201666666667
+48,789,29.2523333333333
+48,790,30.3149
+48,791,23.1690333333333
+48,792,25.6794
+48,793,28.7485666666667
+48,794,30.1667333333333
+48,795,29.3878
+48,796,26.7208
+48,797,31.2208333333333
+48,798,27.7706666666667
+48,799,26.6827
+48,800,36.4744
+48,801,26.2932333333333
+48,802,26.6911666666667
+48,803,32.3638333333333
+48,804,28.702
+48,805,23.1986666666667
+48,806,26.8181666666667
+48,807,29.8026666666667
+48,808,29.2184666666667
+48,809,27.6648333333333
+48,810,31.6907333333333
+48,811,33.5745666666667
+48,812,30.3149
+48,813,30.6705
+48,814,28.6681333333333
+48,815,30.0566666666667
+48,816,25.7217333333333
+48,817,29.0406666666667
+48,818,18.0594
+48,819,35.2086333333333
+48,820,33.7693
+48,821,28.9602333333333
+48,822,28.067
+48,823,24.6210666666667
+48,824,34.3111666666667
+48,825,31.8558333333333
+48,826,23.368
+48,827,35.7928333333333
+48,828,27.3685
+48,829,30.9710666666667
+48,830,32.2156666666667
+48,831,32.0929
+48,832,23.0547333333333
+48,833,31.9616666666667
+48,834,21.2767333333333
+48,835,20.3538666666667
+48,836,26.67
+48,837,22.1869
+48,838,22.5086333333333
+48,839,20.8322333333333
+48,840,28.0458333333333
+48,841,32.8506666666667
+48,842,31.4663666666667
+48,843,28.9009666666667
+48,844,25.5312333333333
+48,845,34.2561333333333
+48,846,23.0081666666667
+48,847,25.5312333333333
+48,848,33.6761666666667
+48,849,29.7095333333333
+48,850,22.1445666666667
+48,851,27.4743333333333
+48,852,29.6968333333333
+48,853,24.3670666666667
+48,854,22.9277333333333
+48,855,29.4682333333333
+48,856,23.2621666666667
+48,857,26.1196666666667
+48,858,28.2913666666667
+48,859,21.3402333333333
+48,860,36.7580333333333
+48,861,21.3402333333333
+48,862,29.4089666666667
+48,863,36.3474
+48,864,26.7419666666667
+48,865,26.2170333333333
+48,866,26.8605
+48,867,28.9983333333333
+48,868,28.5961666666667
+48,869,32.0886666666667
+48,870,30.6959
+48,871,19.05
+48,872,28.7909
+48,873,24.0241666666667
+48,874,26.2720666666667
+48,875,26.4625666666667
+48,876,22.8811666666667
+48,877,24.9597333333333
+48,878,35.3398666666667
+48,879,27.8976666666667
+48,880,32.2368333333333
+48,881,36.068
+48,882,24.4940666666667
+48,883,27.9865666666667
+48,884,23.8802333333333
+48,885,28.6596666666667
+48,886,31.6653333333333
+48,887,25.6243666666667
+48,888,29.6333333333333
+48,889,25.1248333333333
+48,890,17.7588333333333
+48,891,23.5034666666667
+48,892,27.8172333333333
+48,893,17.9747333333333
+48,894,25.0063
+48,895,28.9348333333333
+48,896,31.5383333333333
+48,897,26.4795
+48,898,34.6075
+48,899,26.3948333333333
+48,900,32.3215
+48,901,27.559
+48,902,27.6436666666667
+48,903,19.3929
+48,904,34.7006333333333
+48,905,28.7655
+48,906,28.9390666666667
+48,907,30.5562
+48,908,27.4150666666667
+48,909,27.4574
+48,910,27.3896666666667
+48,911,30.988
+48,912,20.6798333333333
+48,913,25.2560666666667
+48,914,24.892
+48,915,24.2400666666667
+48,916,26.6742333333333
+48,917,38.7561666666667
+48,918,31.0091666666667
+48,919,33.8328
+48,920,32.1352333333333
+48,921,28.3887333333333
+48,922,29.4851666666667
+48,923,23.1563333333333
+48,924,30.4207333333333
+48,925,38.4005666666667
+48,926,26.6742333333333
+48,927,29.5105666666667
+48,928,34.6964
+48,929,25.2222
+48,930,23.4992333333333
+48,931,30.0397333333333
+48,932,27.0425333333333
+48,933,31.4790666666667
+48,934,28.2575
+48,935,23.9649
+48,936,28.7909
+48,937,18.4404
+48,938,36.7495666666667
+48,939,29.0491333333333
+48,940,29.845
+48,941,25.6159
+48,942,31.5214
+48,943,26.3355666666667
+48,944,24.3628333333333
+48,945,33.6126666666667
+48,946,26.2509
+48,947,33.3586666666667
+48,948,26.5218333333333
+48,949,24.1173
+48,950,33.4264
+48,951,21.5265
+48,952,29.464
+48,953,27.3473333333333
+48,954,28.3506333333333
+48,955,26.7843
+48,956,32.4527333333333
+48,957,33.7185
+48,958,25.4
+48,959,24.7269
+48,960,26.7123333333333
+48,961,22.3096666666667
+48,962,24.9597333333333
+48,963,40.7458333333333
+48,964,29.8280666666667
+48,965,31.6103
+48,966,32.3045666666667
+48,967,36.4278333333333
+48,968,24.6591666666667
+48,969,34.4805
+48,970,17.2042666666667
+48,971,30.3784
+48,972,30.8229
+48,973,21.2767333333333
+48,974,26.3990666666667
+48,975,34.3154
+48,976,29.4301333333333
+48,977,29.6968333333333
+48,978,33.2359
+48,979,29.4259
+48,980,26.8435666666667
+48,981,31.6018333333333
+48,982,24.0284
+48,983,40.1743333333333
+48,984,27.2923
+48,985,33.2105
+48,986,32.4696666666667
+48,987,36.7453333333333
+48,988,19.2235666666667
+48,989,30.9245
+48,990,31.8643
+48,991,32.0294
+48,992,28.8332333333333
+48,993,25.4931333333333
+48,994,27.1145
+48,995,28.0331333333333
+48,996,39.1202333333333
+48,997,26.7546666666667
+48,998,28.7443333333333
+48,999,32.1733333333333
+48,1000,36.9824
+49,1,21.9921666666667
+49,2,26.924
+49,3,23.4315
+49,4,23.8971666666667
+49,5,24.3416666666667
+49,6,27.813
+49,7,24.8708333333333
+49,8,29.9085
+49,9,25.019
+49,10,25.4423333333333
+49,11,22.7541666666667
+49,12,23.1563333333333
+49,13,23.6855
+49,14,30.8821666666667
+49,15,30.3953333333333
+49,16,27.4955
+49,17,22.2461666666667
+49,18,26.9875
+49,19,26.2466666666667
+49,20,18.3303333333333
+49,21,26.3525
+49,22,30.861
+49,23,25.9291666666667
+49,24,23.2621666666667
+49,25,22.9446666666667
+49,26,22.606
+49,27,20.32
+49,28,24.9555
+49,29,25.9715
+49,30,25.1671666666667
+49,31,22.1615
+49,32,22.4155
+49,33,26.7123333333333
+49,34,26.7123333333333
+49,35,26.6065
+49,36,28.5326666666667
+49,37,28.6173333333333
+49,38,24.7015
+49,39,24.5533333333333
+49,40,27.2415
+49,41,28.5115
+49,42,22.3096666666667
+49,43,24.13
+49,44,26.0138333333333
+49,45,25.527
+49,46,20.5951666666667
+49,47,23.9818333333333
+49,48,27.1145
+49,49,20.9126666666667
+49,50,23.2621666666667
+49,51,24.4475
+49,52,29.845
+49,53,25.4846666666667
+49,54,22.8811666666667
+49,55,24.2146666666667
+49,56,22.8388333333333
+49,57,21.7593333333333
+49,58,24.2993333333333
+49,59,25.908
+49,60,21.0608333333333
+49,61,23.1351666666667
+49,62,26.8181666666667
+49,63,16.51
+49,64,23.6008333333333
+49,65,25.6751666666667
+49,66,22.6483333333333
+49,67,23.876
+49,68,20.6586666666667
+49,69,28.067
+49,70,23.3468333333333
+49,71,22.6483333333333
+49,72,20.193
+49,73,25.527
+49,74,22.7118333333333
+49,75,25.0613333333333
+49,76,26.3736666666667
+49,77,26.6911666666667
+49,78,27.0086666666667
+49,79,19.9813333333333
+49,80,23.1351666666667
+49,81,21.6535
+49,82,26.3313333333333
+49,83,27.9823333333333
+49,84,21.7381666666667
+49,85,21.336
+49,86,24.4686666666667
+49,87,28.0035
+49,88,29.4005
+49,89,22.6906666666667
+49,90,24.9343333333333
+49,91,24.384
+49,92,25.3788333333333
+49,93,27.5166666666667
+49,94,27.2838333333333
+49,95,28.1093333333333
+49,96,25.9715
+49,97,29.8026666666667
+49,98,24.8708333333333
+49,99,23.2198333333333
+49,100,28.3421666666667
+49,101,25.3365
+49,102,22.4155
+49,103,20.066
+49,104,24.638
+49,105,21.7381666666667
+49,106,24.7226666666667
+49,107,25.7386666666667
+49,108,27.2415
+49,109,26.6276666666667
+49,110,26.2255
+49,111,23.1775
+49,112,24.9978333333333
+49,113,23.1986666666667
+49,114,22.9023333333333
+49,115,25.781
+49,116,26.9451666666667
+49,117,22.4366666666667
+49,118,25.5481666666667
+49,119,20.6375
+49,120,20.701
+49,121,22.8811666666667
+49,122,23.368
+49,123,23.0293333333333
+49,124,21.9921666666667
+49,125,23.5796666666667
+49,126,25.019
+49,127,18.4785
+49,128,27.5801666666667
+49,129,30.9668333333333
+49,130,17.8435
+49,131,26.3313333333333
+49,132,26.5853333333333
+49,133,28.6173333333333
+49,134,26.6065
+49,135,22.0556666666667
+49,136,24.892
+49,137,25.4423333333333
+49,138,24.257
+49,139,27.0086666666667
+49,140,25.7598333333333
+49,141,18.4361666666667
+49,142,23.2621666666667
+49,143,21.2301666666667
+49,144,21.3571666666667
+49,145,30.6493333333333
+49,146,26.3313333333333
+49,147,29.337
+49,148,23.876
+49,149,26.9028333333333
+49,150,32.9988333333333
+49,151,24.892
+49,152,22.9235
+49,153,31.9616666666667
+49,154,21.5476666666667
+49,155,25.1671666666667
+49,156,26.416
+49,157,26.6911666666667
+49,158,27.5166666666667
+49,159,28.8501666666667
+49,160,22.9235
+49,161,21.3995
+49,162,20.5316666666667
+49,163,25.4423333333333
+49,164,21.4841666666667
+49,165,28.0035
+49,166,24.6168333333333
+49,167,16.7216666666667
+49,168,29.2735
+49,169,25.6116666666667
+49,170,22.5213333333333
+49,171,21.7805
+49,172,19.9813333333333
+49,173,23.495
+49,174,28.829
+49,175,22.7118333333333
+49,176,24.9766666666667
+49,177,25.4846666666667
+49,178,17.399
+49,179,28.9136666666667
+49,180,24.1511666666667
+49,181,28.2575
+49,182,23.114
+49,183,26.3525
+49,184,26.9028333333333
+49,185,16.9121666666667
+49,186,22.0556666666667
+49,187,27.9188333333333
+49,188,26.3525
+49,189,28.9348333333333
+49,190,22.7541666666667
+49,191,22.733
+49,192,27.1991666666667
+49,193,24.4686666666667
+49,194,28.9771666666667
+49,195,24.257
+49,196,28.8501666666667
+49,197,23.7278333333333
+49,198,20.955
+49,199,23.8548333333333
+49,200,25.2518333333333
+49,201,24.384
+49,202,25.0825
+49,203,23.7913333333333
+49,204,23.1351666666667
+49,205,23.5161666666667
+49,206,28.9136666666667
+49,207,24.6803333333333
+49,208,26.3525
+49,209,23.1775
+49,210,21.5265
+49,211,25.6116666666667
+49,212,24.511
+49,213,30.8186666666667
+49,214,23.6855
+49,215,23.4103333333333
+49,216,23.6855
+49,217,23.9183333333333
+49,218,22.3731666666667
+49,219,19.7273333333333
+49,220,26.4795
+49,221,24.384
+49,222,26.0773333333333
+49,223,23.4315
+49,224,27.4531666666667
+49,225,29.3158333333333
+49,226,28.0035
+49,227,24.7226666666667
+49,228,27.8765
+49,229,24.4051666666667
+49,230,27.0298333333333
+49,231,25.5905
+49,232,22.352
+49,233,28.194
+49,234,21.4418333333333
+49,235,31.496
+49,236,22.225
+49,237,26.5853333333333
+49,238,25.1671666666667
+49,239,21.971
+49,240,24.13
+49,241,28.321
+49,242,23.5796666666667
+49,243,22.606
+49,244,27.2626666666667
+49,245,23.7913333333333
+49,246,24.0876666666667
+49,247,20.955
+49,248,28.2998333333333
+49,249,23.0293333333333
+49,250,17.4836666666667
+49,251,25.8656666666667
+49,252,25.9503333333333
+49,253,30.48
+49,254,26.2043333333333
+49,255,23.1775
+49,256,23.7913333333333
+49,257,22.479
+49,258,20.6375
+49,259,24.4263333333333
+49,260,25.8656666666667
+49,261,24.1088333333333
+49,262,23.8125
+49,263,24.5956666666667
+49,264,22.6906666666667
+49,265,26.2466666666667
+49,266,20.7856666666667
+49,267,20.955
+49,268,28.7231666666667
+49,269,22.352
+49,270,26.2255
+49,271,24.9343333333333
+49,272,30.0143333333333
+49,273,25.3153333333333
+49,274,22.9023333333333
+49,275,29.0406666666667
+49,276,19.812
+49,277,26.3948333333333
+49,278,24.8073333333333
+49,279,25.908
+49,280,25.908
+49,281,24.2781666666667
+49,282,24.3416666666667
+49,283,23.6008333333333
+49,284,27.0298333333333
+49,285,28.6385
+49,286,29.3158333333333
+49,287,24.9766666666667
+49,288,26.289
+49,289,25.1671666666667
+49,290,21.1243333333333
+49,291,27.4743333333333
+49,292,19.304
+49,293,24.892
+49,294,21.1878333333333
+49,295,25.7386666666667
+49,296,22.225
+49,297,23.4103333333333
+49,298,26.1196666666667
+49,299,23.0505
+49,300,23.4526666666667
+49,301,22.1615
+49,302,20.8703333333333
+49,303,25.2941666666667
+49,304,24.8073333333333
+49,305,25.6328333333333
+49,306,24.9978333333333
+49,307,25.7386666666667
+49,308,19.8755
+49,309,29.9296666666667
+49,310,28.0246666666667
+49,311,30.226
+49,312,18.8171666666667
+49,313,25.9715
+49,314,25.6116666666667
+49,315,23.241
+49,316,25.7175
+49,317,18.9653333333333
+49,318,24.003
+49,319,23.9395
+49,320,24.0241666666667
+49,321,25.4846666666667
+49,322,25.3365
+49,323,22.3943333333333
+49,324,25.1036666666667
+49,325,29.3158333333333
+49,326,26.543
+49,327,24.8073333333333
+49,328,24.2781666666667
+49,329,22.8388333333333
+49,330,24.892
+49,331,24.7438333333333
+49,332,20.1295
+49,333,19.558
+49,334,24.13
+49,335,24.1935
+49,336,22.7965
+49,337,24.4686666666667
+49,338,24.2358333333333
+49,339,27.0721666666667
+49,340,21.4841666666667
+49,341,24.3205
+49,342,26.289
+49,343,30.099
+49,344,26.67
+49,345,22.1191666666667
+49,346,23.114
+49,347,25.9503333333333
+49,348,25.2518333333333
+49,349,23.2621666666667
+49,350,23.5585
+49,351,26.162
+49,352,25.5058333333333
+49,353,26.1196666666667
+49,354,23.0081666666667
+49,355,21.2513333333333
+49,356,27.4108333333333
+49,357,22.987
+49,358,26.7546666666667
+49,359,26.3313333333333
+49,360,25.1671666666667
+49,361,27.305
+49,362,24.8285
+49,363,28.5538333333333
+49,364,22.606
+49,365,19.8543333333333
+49,366,31.4536666666667
+49,367,26.3736666666667
+49,368,20.0871666666667
+49,369,26.9663333333333
+49,370,26.2043333333333
+49,371,22.0556666666667
+49,372,31.3266666666667
+49,373,28.9348333333333
+49,374,22.7753333333333
+49,375,24.5956666666667
+49,376,26.4795
+49,377,21.6958333333333
+49,378,22.86
+49,379,26.3525
+49,380,20.8703333333333
+49,381,19.5156666666667
+49,382,27.8765
+49,383,26.3948333333333
+49,384,25.6328333333333
+49,385,23.2833333333333
+49,386,24.2146666666667
+49,387,23.4103333333333
+49,388,28.702
+49,389,24.0453333333333
+49,390,25.8656666666667
+49,391,22.4366666666667
+49,392,19.8966666666667
+49,393,21.9286666666667
+49,394,22.4155
+49,395,22.9235
+49,396,22.5213333333333
+49,397,26.7335
+49,398,23.9183333333333
+49,399,27.1991666666667
+49,400,22.9446666666667
+49,401,23.876
+49,402,25.4
+49,403,25.8656666666667
+49,404,21.9921666666667
+49,405,21.9286666666667
+49,406,20.447
+49,407,23.3468333333333
+49,408,26.797
+49,409,25.3788333333333
+49,410,23.4738333333333
+49,411,24.3205
+49,412,25.146
+49,413,21.5688333333333
+49,414,21.844
+49,415,28.0458333333333
+49,416,24.1088333333333
+49,417,22.7118333333333
+49,418,25.2941666666667
+49,419,28.6385
+49,420,28.6808333333333
+49,421,27.051
+49,422,26.797
+49,423,20.1506666666667
+49,424,24.13
+49,425,27.686
+49,426,18.5631666666667
+49,427,25.273
+49,428,24.2781666666667
+49,429,23.7913333333333
+49,430,26.7123333333333
+49,431,27.3261666666667
+49,432,22.5425
+49,433,26.6911666666667
+49,434,21.2301666666667
+49,435,25.3788333333333
+49,436,26.67
+49,437,20.9338333333333
+49,438,24.892
+49,439,24.0665
+49,440,25.781
+49,441,23.749
+49,442,25.8445
+49,443,25.4
+49,444,30.0355
+49,445,27.3473333333333
+49,446,23.4738333333333
+49,447,25.2306666666667
+49,448,27.6436666666667
+49,449,26.6276666666667
+49,450,21.0396666666667
+49,451,21.9921666666667
+49,452,25.6116666666667
+49,453,24.8073333333333
+49,454,24.4475
+49,455,28.9348333333333
+49,456,21.3995
+49,457,20.8915
+49,458,23.4315
+49,459,26.5006666666667
+49,460,32.0675
+49,461,22.1615
+49,462,30.3741666666667
+49,463,29.7603333333333
+49,464,27.1991666666667
+49,465,30.0355
+49,466,19.3886666666667
+49,467,24.4686666666667
+49,468,27.0933333333333
+49,469,20.5105
+49,470,21.7381666666667
+49,471,24.4686666666667
+49,472,24.0876666666667
+49,473,26.8393333333333
+49,474,18.3091666666667
+49,475,22.0556666666667
+49,476,28.829
+49,477,23.6855
+49,478,28.1516666666667
+49,479,23.495
+49,480,26.1408333333333
+49,481,27.3685
+49,482,24.7438333333333
+49,483,24.6168333333333
+49,484,24.0453333333333
+49,485,22.6271666666667
+49,486,24.257
+49,487,26.5853333333333
+49,488,20.5105
+49,489,27.0086666666667
+49,490,24.7226666666667
+49,491,25.781
+49,492,23.9818333333333
+49,493,23.9606666666667
+49,494,26.0773333333333
+49,495,25.3788333333333
+49,496,25.9926666666667
+49,497,23.2621666666667
+49,498,27.051
+49,499,28.7655
+49,500,21.1455
+49,501,27.6436666666667
+49,502,28.8925
+49,503,25.4
+49,504,25.5693333333333
+49,505,30.3953333333333
+49,506,27.2415
+49,507,20.701
+49,508,29.0618333333333
+49,509,25.5481666666667
+49,510,29.5486666666667
+49,511,30.6916666666667
+49,512,27.5801666666667
+49,513,19.8755
+49,514,25.781
+49,515,29.8873333333333
+49,516,24.6591666666667
+49,517,20.2988333333333
+49,518,25.9503333333333
+49,519,26.3101666666667
+49,520,21.463
+49,521,23.3468333333333
+49,522,23.495
+49,523,22.6483333333333
+49,524,22.1615
+49,525,19.9813333333333
+49,526,22.9446666666667
+49,527,22.4155
+49,528,23.2621666666667
+49,529,19.1135
+49,530,26.162
+49,531,25.9291666666667
+49,532,27.2838333333333
+49,533,21.3783333333333
+49,534,23.1775
+49,535,25.781
+49,536,26.0561666666667
+49,537,29.9296666666667
+49,538,23.3256666666667
+49,539,28.702
+49,540,24.5533333333333
+49,541,23.622
+49,542,20.7856666666667
+49,543,25.3365
+49,544,27.0933333333333
+49,545,27.432
+49,546,26.6276666666667
+49,547,21.9075
+49,548,24.0665
+49,549,27.813
+49,550,21.7381666666667
+49,551,22.5213333333333
+49,552,29.8873333333333
+49,553,23.2621666666667
+49,554,23.9818333333333
+49,555,26.035
+49,556,21.6958333333333
+49,557,19.7908333333333
+49,558,24.9131666666667
+49,559,28.5961666666667
+49,560,25.4635
+49,561,26.3313333333333
+49,562,21.5688333333333
+49,563,22.0768333333333
+49,564,25.1671666666667
+49,565,26.1831666666667
+49,566,25.5058333333333
+49,567,20.1718333333333
+49,568,28.1516666666667
+49,569,23.9818333333333
+49,570,24.4898333333333
+49,571,22.0556666666667
+49,572,25.1671666666667
+49,573,26.9028333333333
+49,574,26.9028333333333
+49,575,25.8445
+49,576,26.924
+49,577,20.4681666666667
+49,578,26.035
+49,579,21.9498333333333
+49,580,27.8765
+49,581,18.6266666666667
+49,582,19.9601666666667
+49,583,25.3576666666667
+49,584,24.6803333333333
+49,585,22.098
+49,586,23.1563333333333
+49,587,24.8073333333333
+49,588,23.7701666666667
+49,589,27.0086666666667
+49,590,29.4851666666667
+49,591,28.2998333333333
+49,592,22.733
+49,593,21.6323333333333
+49,594,23.0928333333333
+49,595,22.3308333333333
+49,596,26.1196666666667
+49,597,23.0716666666667
+49,598,24.0665
+49,599,26.9663333333333
+49,600,23.8548333333333
+49,601,24.7226666666667
+49,602,27.8976666666667
+49,603,21.2513333333333
+49,604,25.5905
+49,605,26.5006666666667
+49,606,20.193
+49,607,24.9766666666667
+49,608,26.797
+49,609,23.0081666666667
+49,610,22.3731666666667
+49,611,26.3736666666667
+49,612,21.4841666666667
+49,613,27.2415
+49,614,24.8708333333333
+49,615,28.5326666666667
+49,616,28.6173333333333
+49,617,27.432
+49,618,26.8605
+49,619,22.9658333333333
+49,620,25.7598333333333
+49,621,25.4
+49,622,23.5796666666667
+49,623,25.9503333333333
+49,624,26.2678333333333
+49,625,24.0453333333333
+49,626,19.177
+49,627,28.6173333333333
+49,628,23.4526666666667
+49,629,17.9281666666667
+49,630,20.9761666666667
+49,631,26.2043333333333
+49,632,24.8496666666667
+49,633,28.575
+49,634,27.3473333333333
+49,635,22.5425
+49,636,30.099
+49,637,23.6008333333333
+49,638,23.2833333333333
+49,639,19.2828333333333
+49,640,25.9926666666667
+49,641,22.987
+49,642,24.384
+49,643,21.2301666666667
+49,644,27.2838333333333
+49,645,23.4103333333333
+49,646,21.7381666666667
+49,647,24.6168333333333
+49,648,20.2565
+49,649,21.1243333333333
+49,650,26.289
+49,651,25.8021666666667
+49,652,21.844
+49,653,28.2363333333333
+49,654,24.2358333333333
+49,655,22.7541666666667
+49,656,23.0081666666667
+49,657,22.9235
+49,658,24.1723333333333
+49,659,23.9183333333333
+49,660,22.4578333333333
+49,661,15.621
+49,662,28.956
+49,663,23.4526666666667
+49,664,22.7118333333333
+49,665,22.4578333333333
+49,666,26.2678333333333
+49,667,28.2575
+49,668,20.0236666666667
+49,669,30.9456666666667
+49,670,23.114
+49,671,26.416
+49,672,23.0293333333333
+49,673,30.1413333333333
+49,674,19.8543333333333
+49,675,24.3628333333333
+49,676,28.448
+49,677,27.8765
+49,678,29.0618333333333
+49,679,25.0401666666667
+49,680,19.0288333333333
+49,681,30.8186666666667
+49,682,25.019
+49,683,21.9286666666667
+49,684,27.3896666666667
+49,685,24.9343333333333
+49,686,23.5585
+49,687,21.5476666666667
+49,688,23.3256666666667
+49,689,20.9126666666667
+49,690,25.8233333333333
+49,691,17.8646666666667
+49,692,20.5528333333333
+49,693,21.8863333333333
+49,694,21.2725
+49,695,21.2936666666667
+49,696,21.9286666666667
+49,697,21.9286666666667
+49,698,19.6426666666667
+49,699,31.75
+49,700,22.479
+49,701,22.479
+49,702,25.8233333333333
+49,703,23.0716666666667
+49,704,23.9818333333333
+49,705,17.6318333333333
+49,706,25.1883333333333
+49,707,24.0241666666667
+49,708,25.6116666666667
+49,709,26.5218333333333
+49,710,25.6751666666667
+49,711,24.1723333333333
+49,712,25.654
+49,713,28.5961666666667
+49,714,22.4578333333333
+49,715,26.67
+49,716,27.1568333333333
+49,717,28.829
+49,718,25.6963333333333
+49,719,26.6065
+49,720,21.6323333333333
+49,721,23.114
+49,722,25.3788333333333
+49,723,20.4681666666667
+49,724,27.3473333333333
+49,725,25.908
+49,726,25.4635
+49,727,26.7335
+49,728,23.0081666666667
+49,729,22.352
+49,730,32.6178333333333
+49,731,28.6385
+49,732,29.8238333333333
+49,733,22.1826666666667
+49,734,26.0561666666667
+49,735,24.5745
+49,736,26.4795
+49,737,25.4423333333333
+49,738,24.9978333333333
+49,739,19.6426666666667
+49,740,19.812
+49,741,27.2626666666667
+49,742,27.4743333333333
+49,743,31.9405
+49,744,29.718
+49,745,18.796
+49,746,26.6911666666667
+49,747,21.6746666666667
+49,748,25.9291666666667
+49,749,28.956
+49,750,22.5213333333333
+49,751,26.9663333333333
+49,752,28.8925
+49,753,19.9813333333333
+49,754,27.3896666666667
+49,755,21.8228333333333
+49,756,24.5956666666667
+49,757,25.4846666666667
+49,758,23.6431666666667
+49,759,25.3788333333333
+49,760,26.543
+49,761,23.0505
+49,762,26.7758333333333
+49,763,25.019
+49,764,26.797
+49,765,22.606
+49,766,28.2575
+49,767,27.559
+49,768,23.6008333333333
+49,769,28.4903333333333
+49,770,23.7701666666667
+49,771,21.844
+49,772,22.9235
+49,773,21.6111666666667
+49,774,26.8181666666667
+49,775,28.0881666666667
+49,776,27.6436666666667
+49,777,22.1403333333333
+49,778,26.7335
+49,779,22.86
+49,780,22.1403333333333
+49,781,27.6436666666667
+49,782,21.1243333333333
+49,783,28.6596666666667
+49,784,21.2301666666667
+49,785,26.0985
+49,786,22.6906666666667
+49,787,22.5213333333333
+49,788,25.654
+49,789,23.1563333333333
+49,790,21.7381666666667
+49,791,26.0561666666667
+49,792,22.9446666666667
+49,793,26.797
+49,794,24.765
+49,795,23.495
+49,796,19.0711666666667
+49,797,21.6323333333333
+49,798,25.4635
+49,799,26.5006666666667
+49,800,24.4686666666667
+49,801,24.384
+49,802,25.7175
+49,803,24.8708333333333
+49,804,25.9926666666667
+49,805,24.7438333333333
+49,806,21.0396666666667
+49,807,24.9766666666667
+49,808,20.0236666666667
+49,809,23.5796666666667
+49,810,20.9761666666667
+49,811,26.9028333333333
+49,812,21.6746666666667
+49,813,28.956
+49,814,23.1986666666667
+49,815,25.0825
+49,816,22.1826666666667
+49,817,27.051
+49,818,26.924
+49,819,29.8873333333333
+49,820,24.7861666666667
+49,821,22.0345
+49,822,29.3581666666667
+49,823,28.0035
+49,824,22.225
+49,825,24.1088333333333
+49,826,24.13
+49,827,25.4211666666667
+49,828,20.4893333333333
+49,829,26.67
+49,830,27.7283333333333
+49,831,23.9395
+49,832,23.0505
+49,833,27.2838333333333
+49,834,24.0453333333333
+49,835,28.194
+49,836,27.8553333333333
+49,837,19.6003333333333
+49,838,25.4846666666667
+49,839,27.686
+49,840,20.828
+49,841,24.2781666666667
+49,842,23.3045
+49,843,24.765
+49,844,19.1981666666667
+49,845,20.5105
+49,846,27.8341666666667
+49,847,27.051
+49,848,22.6695
+49,849,26.3948333333333
+49,850,20.6586666666667
+49,851,27.4531666666667
+49,852,25.146
+49,853,24.8496666666667
+49,854,19.8755
+49,855,27.7918333333333
+49,856,22.5213333333333
+49,857,25.2095
+49,858,26.6276666666667
+49,859,24.8285
+49,860,28.7443333333333
+49,861,25.019
+49,862,25.6751666666667
+49,863,30.4588333333333
+49,864,28.321
+49,865,25.6751666666667
+49,866,28.3421666666667
+49,867,25.5693333333333
+49,868,26.3101666666667
+49,869,24.8073333333333
+49,870,26.6065
+49,871,28.2786666666667
+49,872,25.6751666666667
+49,873,21.717
+49,874,22.3308333333333
+49,875,24.5745
+49,876,27.0086666666667
+49,877,30.2683333333333
+49,878,28.6173333333333
+49,879,28.1093333333333
+49,880,24.6168333333333
+49,881,28.9136666666667
+49,882,22.8176666666667
+49,883,23.1351666666667
+49,884,25.908
+49,885,26.9451666666667
+49,886,21.9921666666667
+49,887,21.3148333333333
+49,888,22.9446666666667
+49,889,25.0825
+49,890,27.0721666666667
+49,891,21.3783333333333
+49,892,27.2626666666667
+49,893,26.4371666666667
+49,894,27.8976666666667
+49,895,26.6276666666667
+49,896,24.384
+49,897,29.1676666666667
+49,898,22.8388333333333
+49,899,22.1826666666667
+49,900,26.0773333333333
+49,901,26.3948333333333
+49,902,30.5011666666667
+49,903,23.495
+49,904,27.3473333333333
+49,905,23.9606666666667
+49,906,24.257
+49,907,29.083
+49,908,22.987
+49,909,23.1563333333333
+49,910,25.273
+49,911,23.9818333333333
+49,912,23.241
+49,913,27.7918333333333
+49,914,24.2358333333333
+49,915,23.8548333333333
+49,916,24.511
+49,917,23.0293333333333
+49,918,23.368
+49,919,22.7753333333333
+49,920,24.3416666666667
+49,921,31.7288333333333
+49,922,25.4635
+49,923,24.638
+49,924,19.939
+49,925,26.1831666666667
+49,926,23.241
+49,927,27.2838333333333
+49,928,24.5533333333333
+49,929,29.4216666666667
+49,930,21.8016666666667
+49,931,22.7541666666667
+49,932,23.8971666666667
+49,933,24.5533333333333
+49,934,24.5956666666667
+49,935,25.7175
+49,936,20.2141666666667
+49,937,21.9921666666667
+49,938,23.9606666666667
+49,939,22.9446666666667
+49,940,24.765
+49,941,31.1361666666667
+49,942,24.2146666666667
+49,943,16.6581666666667
+49,944,27.0298333333333
+49,945,28.4903333333333
+49,946,24.6168333333333
+49,947,26.4583333333333
+49,948,19.685
+49,949,23.6855
+49,950,24.2781666666667
+49,951,24.7861666666667
+49,952,23.9606666666667
+49,953,26.2466666666667
+49,954,23.876
+49,955,25.3576666666667
+49,956,24.8708333333333
+49,957,22.352
+49,958,25.4
+49,959,30.1836666666667
+49,960,28.3421666666667
+49,961,24.8708333333333
+49,962,27.3685
+49,963,25.9503333333333
+49,964,23.1986666666667
+49,965,24.5956666666667
+49,966,20.1506666666667
+49,967,27.051
+49,968,26.5006666666667
+49,969,23.9818333333333
+49,970,26.6488333333333
+49,971,24.0665
+49,972,28.9136666666667
+49,973,26.1196666666667
+49,974,23.9183333333333
+49,975,23.6855
+49,976,27.3261666666667
+49,977,22.3096666666667
+49,978,21.5265
+49,979,25.2306666666667
+49,980,24.2993333333333
+49,981,26.924
+49,982,19.6638333333333
+49,983,25.1883333333333
+49,984,26.6276666666667
+49,985,18.6901666666667
+49,986,23.9818333333333
+49,987,27.7283333333333
+49,988,28.1728333333333
+49,989,23.6431666666667
+49,990,21.082
+49,991,23.4103333333333
+49,992,22.7541666666667
+49,993,28.1516666666667
+49,994,23.6855
+49,995,25.0613333333333
+49,996,23.3468333333333
+49,997,20.7856666666667
+49,998,28.5326666666667
+49,999,27.178
+49,1000,23.8336666666667
+50,1,26.3144
+50,2,25.2560666666667
+50,3,24.9682
+50,4,31.3351333333333
+50,5,25.8064
+50,6,19.8331666666667
+50,7,27.8976666666667
+50,8,21.7593333333333
+50,9,20.9169
+50,10,27.4531666666667
+50,11,22.5848333333333
+50,12,28.6512
+50,13,22.7753333333333
+50,14,24.6634
+50,15,24.8750666666667
+50,16,21.6958333333333
+50,17,20.8491666666667
+50,18,25.2560666666667
+50,19,23.114
+50,20,26.7843
+50,21,29.0660666666667
+50,22,26.2805333333333
+50,23,26.924
+50,24,25.9969
+50,25,23.6431666666667
+50,26,26.3948333333333
+50,27,27.8976666666667
+50,28,24.8115666666667
+50,29,23.3722333333333
+50,30,26.2001
+50,31,22.3774
+50,32,24.1596333333333
+50,33,21.1455
+50,34,29.5783
+50,35,30.5519666666667
+50,36,30.607
+50,37,26.9282333333333
+50,38,22.2546333333333
+50,39,24.9597333333333
+50,40,26.6488333333333
+50,41,20.0448333333333
+50,42,24.3247333333333
+50,43,21.5688333333333
+50,44,25.2560666666667
+50,45,25.9545666666667
+50,46,22.6737333333333
+50,47,26.4287
+50,48,25.1121333333333
+50,49,27.0552333333333
+50,50,25.0613333333333
+50,51,23.6897333333333
+50,52,24.1088333333333
+50,53,24.0919
+50,54,22.7541666666667
+50,55,24.6253
+50,56,20.4385333333333
+50,57,25.9545666666667
+50,58,31.3309
+50,59,24.3289666666667
+50,60,33.3163333333333
+50,61,24.4051666666667
+50,62,22.9489
+50,63,26.8054666666667
+50,64,27.1145
+50,65,20.7687333333333
+50,66,26.3313333333333
+50,67,24.1850333333333
+50,68,31.1573333333333
+50,69,26.1662333333333
+50,70,23.2833333333333
+50,71,27.4362333333333
+50,72,21.5053333333333
+50,73,28.8628666666667
+50,74,25.0401666666667
+50,75,26.924
+50,76,22.7795666666667
+50,77,22.3774
+50,78,22.0810666666667
+50,79,25.3153333333333
+50,80,22.7118333333333
+50,81,27.3473333333333
+50,82,24.8708333333333
+50,83,27.5420666666667
+50,84,27.0171333333333
+50,85,25.8275666666667
+50,86,27.6055666666667
+50,87,29.8746333333333
+50,88,28.8798
+50,89,21.8524666666667
+50,90,32.9184
+50,91,26.5684
+50,92,25.7852333333333
+50,93,23.1436333333333
+50,94,24.5025333333333
+50,95,22.1234
+50,96,21.9371333333333
+50,97,22.4239666666667
+50,98,31.4325
+50,99,25.2433666666667
+50,100,30.4207333333333
+50,101,24.8708333333333
+50,102,22.9319666666667
+50,103,22.3604666666667
+50,104,22.098
+50,105,26.4752666666667
+50,106,28.3548666666667
+50,107,24.6634
+50,108,23.9225666666667
+50,109,22.2504
+50,110,28.0712333333333
+50,111,25.7640666666667
+50,112,27.7537333333333
+50,113,30.4588333333333
+50,114,25.7386666666667
+50,115,21.6535
+50,116,26.9875
+50,117,19.8585666666667
+50,118,22.4832333333333
+50,119,23.1986666666667
+50,120,21.5053333333333
+50,121,26.6742333333333
+50,122,24.5321666666667
+50,123,27.6267333333333
+50,124,28.1305
+50,125,24.8073333333333
+50,126,22.5298
+50,127,21.1497333333333
+50,128,25.9884333333333
+50,129,32.7575333333333
+50,130,22.5721333333333
+50,131,18.034
+50,132,24.1511666666667
+50,133,26.0773333333333
+50,134,26.8393333333333
+50,135,28.9644666666667
+50,136,25.2137333333333
+50,137,21.2301666666667
+50,138,27.9611666666667
+50,139,25.4
+50,140,29.2565666666667
+50,141,27.5463
+50,142,26.0180666666667
+50,143,25.7852333333333
+50,144,27.3685
+50,145,22.4028
+50,146,22.7372333333333
+50,147,26.9663333333333
+50,148,30.1963666666667
+50,149,17.6106666666667
+50,150,25.6328333333333
+50,151,23.4103333333333
+50,152,26.2932333333333
+50,153,24.7861666666667
+50,154,26.1027333333333
+50,155,28.3972
+50,156,29.8915666666667
+50,157,23.4315
+50,158,25.2306666666667
+50,159,27.2669
+50,160,21.2132333333333
+50,161,26.8943666666667
+50,162,23.9818333333333
+50,163,27.6944666666667
+50,164,26.4625666666667
+50,165,19.4140666666667
+50,166,22.4070333333333
+50,167,22.0641333333333
+50,168,19.7908333333333
+50,169,23.7744
+50,170,25.8021666666667
+50,171,27.7495
+50,172,22.5086333333333
+50,173,25.4677333333333
+50,174,25.0825
+50,175,22.9108
+50,176,23.9183333333333
+50,177,20.7221666666667
+50,178,24.0919
+50,179,27.5251333333333
+50,180,24.4051666666667
+50,181,23.7744
+50,182,24.8750666666667
+50,183,27.432
+50,184,32.9565
+50,185,25.3830666666667
+50,186,20.3030666666667
+50,187,24.1935
+50,188,25.8445
+50,189,24.9428
+50,190,24.3670666666667
+50,191,29.2396333333333
+50,192,21.7805
+50,193,26.1027333333333
+50,194,23.4526666666667
+50,195,21.4291333333333
+50,196,24.4686666666667
+50,197,24.5745
+50,198,30.5435
+50,199,29.9593
+50,200,25.019
+50,201,27.7706666666667
+50,202,21.7889666666667
+50,203,23.2452333333333
+50,204,23.3087333333333
+50,205,25.0909666666667
+50,206,26.9028333333333
+50,207,30.9245
+50,208,27.4108333333333
+50,209,21.463
+50,210,28.2363333333333
+50,211,23.8548333333333
+50,212,26.1493
+50,213,25.2137333333333
+50,214,24.3628333333333
+50,215,28.7782
+50,216,24.1384666666667
+50,217,26.6065
+50,218,26.1408333333333
+50,219,26.0477
+50,220,28.7993666666667
+50,221,24.6803333333333
+50,222,27.2034
+50,223,21.6789
+50,224,23.9056333333333
+50,225,23.2283
+50,226,25.7429
+50,227,23.7913333333333
+50,228,24.5152333333333
+50,229,25.6370666666667
+50,230,28.1728333333333
+50,231,19.1981666666667
+50,232,22.2080666666667
+50,233,22.4197333333333
+50,234,23.6897333333333
+50,235,23.6474
+50,236,24.257
+50,237,25.2560666666667
+50,238,25.3576666666667
+50,239,25.1671666666667
+50,240,24.4305666666667
+50,241,20.2184
+50,242,21.3190666666667
+50,243,19.8162333333333
+50,244,32.0294
+50,245,22.3774
+50,246,24.3416666666667
+50,247,24.2612333333333
+50,248,32.131
+50,249,23.5627333333333
+50,250,23.7066666666667
+50,251,23.3045
+50,252,26.9324666666667
+50,253,29.5486666666667
+50,254,25.4042333333333
+50,255,25.5905
+50,256,24.9724333333333
+50,257,28.1601333333333
+50,258,24.6803333333333
+50,259,30.5096333333333
+50,260,21.5053333333333
+50,261,25.3365
+50,262,25.2603
+50,263,27.6267333333333
+50,264,18.4192333333333
+50,265,23.3468333333333
+50,266,29.8746333333333
+50,267,25.2814666666667
+50,268,17.6149
+50,269,24.8285
+50,270,23.2664
+50,271,27.8595666666667
+50,272,27.8384
+50,273,23.4823
+50,274,27.0171333333333
+50,275,19.3463333333333
+50,276,23.5712
+50,277,25.1925666666667
+50,278,25.4381
+50,279,28.4691666666667
+50,280,28.9179
+50,281,26.2297333333333
+50,282,34.0571666666667
+50,283,21.8270666666667
+50,284,25.4677333333333
+50,285,24.9978333333333
+50,286,29.591
+50,287,26.6065
+50,288,25.7217333333333
+50,289,26.1408333333333
+50,290,24.384
+50,291,26.6065
+50,292,28.0331333333333
+50,293,22.3096666666667
+50,294,21.8905666666667
+50,295,19.5791666666667
+50,296,30.1752
+50,297,25.0528666666667
+50,298,24.3416666666667
+50,299,24.0538
+50,300,24.2993333333333
+50,301,26.4625666666667
+50,302,25.9334
+50,303,21.4418333333333
+50,304,24.13
+50,305,24.5025333333333
+50,306,26.5938
+50,307,28.1305
+50,308,24.3078
+50,309,24.4305666666667
+50,310,24.9216333333333
+50,311,24.9639666666667
+50,312,23.495
+50,313,26.8435666666667
+50,314,26.0985
+50,315,24.2146666666667
+50,316,22.7372333333333
+50,317,25.7386666666667
+50,318,22.4620666666667
+50,319,31.2335333333333
+50,320,27.3134666666667
+50,321,24.0072333333333
+50,322,24.5321666666667
+50,323,24.5745
+50,324,21.5688333333333
+50,325,26.6065
+50,326,23.2833333333333
+50,327,26.3863666666667
+50,328,27.0721666666667
+50,329,26.9663333333333
+50,330,26.7419666666667
+50,331,27.3896666666667
+50,332,23.6050666666667
+50,333,19.4945
+50,334,28.6850666666667
+50,335,24.0072333333333
+50,336,27.9611666666667
+50,337,25.6582333333333
+50,338,26.924
+50,339,23.3341333333333
+50,340,25.9503333333333
+50,341,30.6705
+50,342,25.019
+50,343,26.7208
+50,344,23.2452333333333
+50,345,24.0495666666667
+50,346,25.3195666666667
+50,347,28.575
+50,348,26.3779
+50,349,25.4677333333333
+50,350,26.4202333333333
+50,351,22.5425
+50,352,25.3365
+50,353,24.5745
+50,354,21.4418333333333
+50,355,23.3045
+50,356,22.8007333333333
+50,357,22.1191666666667
+50,358,26.7589
+50,359,28.7274
+50,360,27.5420666666667
+50,361,20.2649666666667
+50,362,19.1812333333333
+50,363,23.0124
+50,364,26.0392333333333
+50,365,24.3628333333333
+50,366,26.4710333333333
+50,367,27.8468666666667
+50,368,23.7109
+50,369,28.0924
+50,370,30.734
+50,371,25.7175
+50,372,23.1563333333333
+50,373,21.3487
+50,374,28.7697333333333
+50,375,24.6337666666667
+50,376,29.8111333333333
+50,377,27.4150666666667
+50,378,26.6996333333333
+50,379,28.702
+50,380,26.8012333333333
+50,381,24.8073333333333
+50,382,20.2141666666667
+50,383,26.0604
+50,384,24.7396
+50,385,27.9992666666667
+50,386,20.1972333333333
+50,387,29.8704
+50,388,22.3943333333333
+50,389,24.9639666666667
+50,390,27.6648333333333
+50,391,20.8745666666667
+50,392,25.1248333333333
+50,393,26.0180666666667
+50,394,21.5773
+50,395,24.4094
+50,396,27.2288
+50,397,23.6728
+50,398,23.6897333333333
+50,399,26.0815666666667
+50,400,31.8177333333333
+50,401,28.194
+50,402,28.1982333333333
+50,403,22.5425
+50,404,24.1723333333333
+50,405,25.0655666666667
+50,406,21.9921666666667
+50,407,26.543
+50,408,27.4150666666667
+50,409,37.1898333333333
+50,410,23.4357333333333
+50,411,25.3153333333333
+50,412,26.6319
+50,413,22.098
+50,414,25.6413
+50,415,27.2288
+50,416,27.1610666666667
+50,417,23.9014
+50,418,27.0383
+50,419,28.0246666666667
+50,420,23.4357333333333
+50,421,20.8491666666667
+50,422,31.242
+50,423,19.8755
+50,424,20.5105
+50,425,18.8383333333333
+50,426,25.9122333333333
+50,427,26.1027333333333
+50,428,23.0759
+50,429,26.6827
+50,430,28.4268333333333
+50,431,27.94
+50,432,30.4376666666667
+50,433,22.3139
+50,434,27.0171333333333
+50,435,28.5580666666667
+50,436,28.0246666666667
+50,437,25.7429
+50,438,23.5077
+50,439,21.2767333333333
+50,440,25.3830666666667
+50,441,23.8590666666667
+50,442,24.7226666666667
+50,443,28.5199666666667
+50,444,23.6770333333333
+50,445,25.0825
+50,446,24.9385666666667
+50,447,26.1323666666667
+50,448,21.1751333333333
+50,449,26.2974666666667
+50,450,21.2344
+50,451,21.2767333333333
+50,452,33.3798333333333
+50,453,23.1859666666667
+50,454,29.3581666666667
+50,455,21.2344
+50,456,23.1605666666667
+50,457,22.606
+50,458,27.2838333333333
+50,459,29.5740666666667
+50,460,24.0453333333333
+50,461,25.2391333333333
+50,462,24.1088333333333
+50,463,27.1187333333333
+50,464,25.2518333333333
+50,465,28.0712333333333
+50,466,19.5199
+50,467,24.9216333333333
+50,468,25.2391333333333
+50,469,22.0556666666667
+50,470,30.4376666666667
+50,471,26.4202333333333
+50,472,22.6187
+50,473,28.0035
+50,474,22.5509666666667
+50,475,24.3670666666667
+50,476,29.2142333333333
+50,477,26.4583333333333
+50,478,23.3087333333333
+50,479,26.4456333333333
+50,480,25.0952
+50,481,26.5260666666667
+50,482,23.8167333333333
+50,483,23.8421333333333
+50,484,23.6516333333333
+50,485,34.3323333333333
+50,486,22.0302666666667
+50,487,22.3731666666667
+50,488,29.972
+50,489,21.1497333333333
+50,490,21.9286666666667
+50,491,22.9954666666667
+50,492,28.6808333333333
+50,493,22.3308333333333
+50,494,25.0698
+50,495,24.0876666666667
+50,496,21.1878333333333
+50,497,26.8859
+50,498,25.2095
+50,499,22.9023333333333
+50,500,21.2344
+50,501,25.4550333333333
+50,502,19.1346666666667
+50,503,25.4719666666667
+50,504,25.0655666666667
+50,505,25.3703666666667
+50,506,26.3948333333333
+50,507,27.4150666666667
+50,508,19.0796333333333
+50,509,26.035
+50,510,26.6911666666667
+50,511,31.7119
+50,512,22.5679
+50,513,27.1991666666667
+50,514,29.2777333333333
+50,515,27.6013333333333
+50,516,23.6431666666667
+50,517,22.3774
+50,518,24.5702666666667
+50,519,22.3308333333333
+50,520,24.6422333333333
+50,521,20.6205666666667
+50,522,22.1276333333333
+50,523,25.019
+50,524,22.733
+50,525,20.9169
+50,526,22.0387333333333
+50,527,19.8839666666667
+50,528,23.3383666666667
+50,529,22.4620666666667
+50,530,23.9014
+50,531,23.1605666666667
+50,532,23.3722333333333
+50,533,25.0232333333333
+50,534,33.2782333333333
+50,535,17.0391666666667
+50,536,25.3788333333333
+50,537,23.6516333333333
+50,538,27.7283333333333
+50,539,29.5783
+50,540,24.3755333333333
+50,541,27.7114
+50,542,20.7264
+50,543,27.5378333333333
+50,544,26.0858
+50,545,23.1309333333333
+50,546,24.3713
+50,547,23.5415666666667
+50,548,26.2128
+50,549,18.6478333333333
+50,550,23.8336666666667
+50,551,23.8336666666667
+50,552,27.7579666666667
+50,553,22.4663
+50,554,29.2354
+50,555,24.2358333333333
+50,556,29.8915666666667
+50,557,22.6949
+50,558,19.0796333333333
+50,559,28.3464
+50,560,28.4734
+50,561,27.9908
+50,562,25.2772333333333
+50,563,22.5509666666667
+50,564,26.8647333333333
+50,565,24.3628333333333
+50,566,24.1469333333333
+50,567,25.3830666666667
+50,568,28.8544
+50,569,24.8412
+50,570,25.1544666666667
+50,571,25.3788333333333
+50,572,23.5881333333333
+50,573,27.3515666666667
+50,574,24.9639666666667
+50,575,25.7175
+50,576,25.1544666666667
+50,577,27.8214666666667
+50,578,24.4686666666667
+50,579,22.3943333333333
+50,580,27.5632333333333
+50,581,21.8651666666667
+50,582,28.0712333333333
+50,583,28.4818666666667
+50,584,26.6911666666667
+50,585,27.4193
+50,586,27.9103666666667
+50,587,27.2076333333333
+50,588,26.2466666666667
+50,589,24.3882333333333
+50,590,23.9395
+50,591,25.5820333333333
+50,592,25.9757333333333
+50,593,25.5481666666667
+50,594,27.4150666666667
+50,595,29.0660666666667
+50,596,26.5049
+50,597,26.6107333333333
+50,598,24.638
+50,599,21.1243333333333
+50,600,32.7871666666667
+50,601,26.0392333333333
+50,602,26.2043333333333
+50,603,31.5256333333333
+50,604,20.0490666666667
+50,605,26.1704666666667
+50,606,26.6319
+50,607,32.1775666666667
+50,608,25.0401666666667
+50,609,26.7758333333333
+50,610,25.8021666666667
+50,611,25.2391333333333
+50,612,25.9799666666667
+50,613,22.0599
+50,614,23.2071333333333
+50,615,25.4508
+50,616,28.1178
+50,617,25.7005666666667
+50,618,23.4569
+50,619,26.2678333333333
+50,620,23.8844666666667
+50,621,27.0806333333333
+50,622,20.7856666666667
+50,623,22.3731666666667
+50,624,25.5058333333333
+50,625,35.1155
+50,626,23.9395
+50,627,23.3510666666667
+50,628,24.5618
+50,629,28.1305
+50,630,24.2824
+50,631,26.6784666666667
+50,632,24.3670666666667
+50,633,27.051
+50,634,28.7231666666667
+50,635,21.5265
+50,636,29.5359666666667
+50,637,30.4207333333333
+50,638,26.543
+50,639,21.9752333333333
+50,640,27.5209
+50,641,24.1935
+50,642,22.1488
+50,643,20.7264
+50,644,28.1855333333333
+50,645,23.3256666666667
+50,646,19.4521666666667
+50,647,30.5646666666667
+50,648,24.3713
+50,649,25.7598333333333
+50,650,25.3830666666667
+50,651,28.6173333333333
+50,652,30.0397333333333
+50,653,23.5246333333333
+50,654,29.4089666666667
+50,655,22.8473
+50,656,25.6370666666667
+50,657,21.3868
+50,658,26.1916333333333
+50,659,24.6168333333333
+50,660,22.7160666666667
+50,661,19.7358
+50,662,22.8854
+50,663,25.1502333333333
+50,664,25.8275666666667
+50,665,26.9663333333333
+50,666,23.5161666666667
+50,667,27.8172333333333
+50,668,29.1084
+50,669,22.2461666666667
+50,670,20.9804
+50,671,22.7965
+50,672,25.3449666666667
+50,673,24.7311333333333
+50,674,22.3139
+50,675,25.6794
+50,676,21.6577333333333
+50,677,33.9809666666667
+50,678,23.9649
+50,679,21.7000666666667
+50,680,23.5627333333333
+50,681,27.1187333333333
+50,682,27.0256
+50,683,26.5006666666667
+50,684,25.0613333333333
+50,685,27.178
+50,686,25.0020666666667
+50,687,24.3459
+50,688,24.5618
+50,689,23.5373333333333
+50,690,25.6751666666667
+50,691,31.3732333333333
+50,692,26.0604
+50,693,25.8656666666667
+50,694,26.7165666666667
+50,695,28.2617333333333
+50,696,35.5219
+50,697,30.6493333333333
+50,698,21.6154
+50,699,27.4193
+50,700,25.9969
+50,701,29.6418
+50,702,27.6225
+50,703,20.3030666666667
+50,704,27.6013333333333
+50,705,22.3943333333333
+50,706,21.6746666666667
+50,707,21.3190666666667
+50,708,25.2306666666667
+50,709,27.3939
+50,710,22.9573666666667
+50,711,28.7062333333333
+50,712,26.6573
+50,713,25.3619
+50,714,26.797
+50,715,22.9023333333333
+50,716,19.2870666666667
+50,717,24.4094
+50,718,26.8647333333333
+50,719,23.4145666666667
+50,720,28.9602333333333
+50,721,23.1817333333333
+50,722,23.3468333333333
+50,723,25.5778
+50,724,26.1408333333333
+50,725,20.1379666666667
+50,726,23.7109
+50,727,30.3741666666667
+50,728,25.2306666666667
+50,729,28.1305
+50,730,24.3289666666667
+50,731,19.4352333333333
+50,732,26.5726333333333
+50,733,30.3149
+50,734,21.7466333333333
+50,735,23.5796666666667
+50,736,24.5575666666667
+50,737,21.9837
+50,738,21.8482333333333
+50,739,26.2382
+50,740,26.6361333333333
+50,741,24.3247333333333
+50,742,24.9385666666667
+50,743,22.1488
+50,744,24.0707333333333
+50,745,25.019
+50,746,21.0650666666667
+50,747,25.3026333333333
+50,748,25.6751666666667
+50,749,22.2715666666667
+50,750,22.6144666666667
+50,751,26.6996333333333
+50,752,24.0876666666667
+50,753,23.9437333333333
+50,754,24.2612333333333
+50,755,26.7123333333333
+50,756,22.352
+50,757,17.6106666666667
+50,758,23.7066666666667
+50,759,20.7052333333333
+50,760,26.3186333333333
+50,761,29.3412333333333
+50,762,26.5006666666667
+50,763,24.9131666666667
+50,764,29.8069
+50,765,23.9860666666667
+50,766,27.8807333333333
+50,767,26.2297333333333
+50,768,26.3525
+50,769,26.9494
+50,770,23.4103333333333
+50,771,27.6479
+50,772,25.7175
+50,773,19.7485
+50,774,23.4315
+50,775,22.5001666666667
+50,776,27.8976666666667
+50,777,24.3035666666667
+50,778,22.4917
+50,779,21.4672333333333
+50,780,23.5627333333333
+50,781,21.5519
+50,782,22.3604666666667
+50,783,23.8590666666667
+50,784,28.0246666666667
+50,785,28.0500666666667
+50,786,24.6676333333333
+50,787,23.6939666666667
+50,788,28.4734
+50,789,26.0561666666667
+50,790,22.2461666666667
+50,791,18.2118
+50,792,26.6022666666667
+50,793,26.4583333333333
+50,794,22.8684666666667
+50,795,30.3149
+50,796,23.8379
+50,797,25.0867333333333
+50,798,25.5693333333333
+50,799,27.3685
+50,800,24.6676333333333
+50,801,26.8012333333333
+50,802,28.6173333333333
+50,803,29.9085
+50,804,23.2833333333333
+50,805,25.9334
+50,806,28.5115
+50,807,24.4771333333333
+50,808,24.1765666666667
+50,809,28.4268333333333
+50,810,29.972
+50,811,28.0712333333333
+50,812,27.1568333333333
+50,813,24.0792
+50,814,24.5152333333333
+50,815,22.9489
+50,816,23.3722333333333
+50,817,30.5223333333333
+50,818,21.9540666666667
+50,819,24.4094
+50,820,27.3727333333333
+50,821,22.6906666666667
+50,822,23.7617
+50,823,21.209
+50,824,27.5632333333333
+50,825,25.0232333333333
+50,826,24.7523
+50,827,21.2936666666667
+50,828,27.7749
+50,829,24.0749666666667
+50,830,24.2358333333333
+50,831,26.0561666666667
+50,832,21.844
+50,833,24.5364
+50,834,27.0129
+50,835,25.4931333333333
+50,836,33.5957333333333
+50,837,24.5787333333333
+50,838,20.5147333333333
+50,839,26.1916333333333
+50,840,26.6742333333333
+50,841,25.8148666666667
+50,842,28.8713333333333
+50,843,25.8106333333333
+50,844,28.3421666666667
+50,845,26.1069666666667
+50,846,24.6507
+50,847,26.9663333333333
+50,848,26.3567333333333
+50,849,25.2772333333333
+50,850,26.7631333333333
+50,851,25.8445
+50,852,25.3026333333333
+50,853,32.1140666666667
+50,854,18.2456666666667
+50,855,26.8012333333333
+50,856,29.0449
+50,857,26.2128
+50,858,25.1671666666667
+50,859,24.9555
+50,860,30.1244
+50,861,21.2344
+50,862,26.797
+50,863,25.5693333333333
+50,864,23.1478666666667
+50,865,21.2725
+50,866,25.3915333333333
+50,867,25.1290666666667
+50,868,23.7955666666667
+50,869,24.4517333333333
+50,870,27.3685
+50,871,27.2965333333333
+50,872,28.6427333333333
+50,873,26.4625666666667
+50,874,30.2471666666667
+50,875,23.6982
+50,876,24.5787333333333
+50,877,24.4559666666667
+50,878,23.3637666666667
+50,879,22.6991333333333
+50,880,23.9437333333333
+50,881,27.2626666666667
+50,882,25.6667
+50,883,24.0495666666667
+50,884,25.2814666666667
+50,885,24.6168333333333
+50,886,18.9145333333333
+50,887,27.2626666666667
+50,888,23.1351666666667
+50,889,26.2678333333333
+50,890,22.8176666666667
+50,891,32.7575333333333
+50,892,22.9446666666667
+50,893,25.4846666666667
+50,894,21.1031666666667
+50,895,23.3087333333333
+50,896,24.8623666666667
+50,897,19.8247
+50,898,21.1709
+50,899,25.4719666666667
+50,900,24.765
+50,901,26.0985
+50,902,26.3567333333333
+50,903,22.9531333333333
+50,904,26.7335
+50,905,19.0923333333333
+50,906,27.2457333333333
+50,907,26.0773333333333
+50,908,24.4686666666667
+50,909,23.6008333333333
+50,910,26.7462
+50,911,26.6319
+50,912,25.9799666666667
+50,913,29.0279666666667
+50,914,25.4254
+50,915,23.0166333333333
+50,916,23.4230333333333
+50,917,28.5792333333333
+50,918,22.6314
+50,919,24.9428
+50,920,29.4005
+50,921,20.0025
+50,922,26.2043333333333
+50,923,26.4795
+50,924,22.4451333333333
+50,925,22.8176666666667
+50,926,22.6737333333333
+50,927,21.2979
+50,928,25.6582333333333
+50,929,22.8176666666667
+50,930,26.2466666666667
+50,931,21.1497333333333
+50,932,25.3407333333333
+50,933,22.2673333333333
+50,934,28.4691666666667
+50,935,21.7254666666667
+50,936,23.9437333333333
+50,937,22.479
+50,938,27.6479
+50,939,29.4894
+50,940,23.2029
+50,941,25.8064
+50,942,25.9715
+50,943,30.0185666666667
+50,944,21.3233
+50,945,29.9127333333333
+50,946,20.6840666666667
+50,947,22.3308333333333
+50,948,27.5378333333333
+50,949,23.6093
+50,950,27.8003
+50,951,26.4668
+50,952,28.4903333333333
+50,953,26.6954
+50,954,28.1813
+50,955,24.9597333333333
+50,956,24.9555
+50,957,25.8064
+50,958,20.3073
+50,959,27.7918333333333
+50,960,25.4762
+50,961,26.5895666666667
+50,962,23.0547333333333
+50,963,24.9047
+50,964,23.5500333333333
+50,965,23.114
+50,966,26.4583333333333
+50,967,24.1088333333333
+50,968,25.3492
+50,969,25.8656666666667
+50,970,27.5674666666667
+50,971,26.6573
+50,972,37.3634
+50,973,30.6916666666667
+50,974,21.1116333333333
+50,975,27.5420666666667
+50,976,24.638
+50,977,26.9875
+50,978,24.1977333333333
+50,979,27.9019
+50,980,26.8393333333333
+50,981,23.5839
+50,982,27.0721666666667
+50,983,28.4310666666667
+50,984,32.1098333333333
+50,985,22.0810666666667
+50,986,24.4517333333333
+50,987,29.1719
+50,988,23.4315
+50,989,22.6314
+50,990,29.464
+50,991,21.7805
+50,992,24.8750666666667
+50,993,23.4992333333333
+50,994,26.1239
+50,995,23.6474
+50,996,22.2504
+50,997,23.241
+50,998,23.5034666666667
+50,999,30.353
+50,1000,20.8915
+51,1,33.8666666666667
+51,2,36.7453333333333
+51,3,38.2058333333333
+51,4,28.8925
+51,5,36.8723333333333
+51,6,46.99
+51,7,33.8243333333333
+51,8,40.4495
+51,9,33.9936666666667
+51,10,37.7401666666667
+51,11,30.734
+51,12,40.6611666666667
+51,13,42.6085
+51,14,36.576
+51,15,34.0783333333333
+51,16,31.8135
+51,17,35.0731666666667
+51,18,32.2156666666667
+51,19,35.2636666666667
+51,20,35.4541666666667
+51,21,42.6931666666667
+51,22,38.4175
+51,23,34.5651666666667
+51,24,34.163
+51,25,35.9198333333333
+51,26,35.5388333333333
+51,27,40.7881666666667
+51,28,35.7293333333333
+51,29,37.6978333333333
+51,30,40.0473333333333
+51,31,35.179
+51,32,38.6926666666667
+51,33,41.6348333333333
+51,34,37.7613333333333
+51,35,43.2858333333333
+51,36,43.434
+51,37,35.8986666666667
+51,38,36.2796666666667
+51,39,30.4376666666667
+51,40,39.3065
+51,41,39.4546666666667
+51,42,34.1418333333333
+51,43,31.242
+51,44,38.3751666666667
+51,45,32.4273333333333
+51,46,32.1945
+51,47,31.4536666666667
+51,48,38.8408333333333
+51,49,30.861
+51,50,35.9833333333333
+51,51,36.1526666666667
+51,52,31.0091666666667
+51,53,29.8238333333333
+51,54,33.3798333333333
+51,55,31.242
+51,56,33.2528333333333
+51,57,36.0045
+51,58,39.1371666666667
+51,59,38.5868333333333
+51,60,34.7556666666667
+51,61,30.5011666666667
+51,62,41.1268333333333
+51,63,36.3431666666667
+51,64,32.9776666666667
+51,65,27.305
+51,66,36.195
+51,67,31.9616666666667
+51,68,33.5915
+51,69,35.687
+51,70,31.4325
+51,71,27.305
+51,72,31.496
+51,73,32.131
+51,74,28.702
+51,75,40.9575
+51,76,36.9146666666667
+51,77,35.5811666666667
+51,78,40.0261666666667
+51,79,27.8976666666667
+51,80,35.6658333333333
+51,81,36.068
+51,82,35.3271666666667
+51,83,42.9895
+51,84,37.084
+51,85,42.164
+51,86,33.8455
+51,87,39.0736666666667
+51,88,35.0731666666667
+51,89,35.2425
+51,90,29.0195
+51,91,38.1211666666667
+51,92,41.402
+51,93,30.0566666666667
+51,94,34.9038333333333
+51,95,34.7345
+51,96,36.0891666666667
+51,97,36.4278333333333
+51,98,33.5915
+51,99,33.1258333333333
+51,100,32.2156666666667
+51,101,41.9523333333333
+51,102,31.9616666666667
+51,103,28.7231666666667
+51,104,33.8878333333333
+51,105,37.973
+51,106,42.6508333333333
+51,107,42.8413333333333
+51,108,44.0055
+51,109,35.9621666666667
+51,110,32.3638333333333
+51,111,40.4918333333333
+51,112,30.4588333333333
+51,113,33.9513333333333
+51,114,32.9565
+51,115,36.7453333333333
+51,116,31.369
+51,117,33.8666666666667
+51,118,34.0995
+51,119,34.1418333333333
+51,120,28.9771666666667
+51,121,34.9885
+51,122,31.2843333333333
+51,123,30.8186666666667
+51,124,34.5651666666667
+51,125,27.7071666666667
+51,126,29.8238333333333
+51,127,34.3746666666667
+51,128,39.751
+51,129,37.5708333333333
+51,130,35.0308333333333
+51,131,35.4753333333333
+51,132,34.9038333333333
+51,133,35.941
+51,134,27.432
+51,135,34.8403333333333
+51,136,34.5863333333333
+51,137,46.1433333333333
+51,138,34.3111666666667
+51,139,34.6286666666667
+51,140,26.5853333333333
+51,141,36.7453333333333
+51,142,30.607
+51,143,39.1583333333333
+51,144,35.1366666666667
+51,145,35.2213333333333
+51,146,40.9786666666667
+51,147,34.3323333333333
+51,148,32.8506666666667
+51,149,32.2368333333333
+51,150,36.7876666666667
+51,151,34.0783333333333
+51,152,34.9885
+51,153,35.6023333333333
+51,154,35.9198333333333
+51,155,37.8248333333333
+51,156,41.6348333333333
+51,157,31.2208333333333
+51,158,38.4175
+51,159,40.2801666666667
+51,160,37.2321666666667
+51,161,43.815
+51,162,41.7406666666667
+51,163,41.1268333333333
+51,164,28.8713333333333
+51,165,36.195
+51,166,42.1005
+51,167,31.9828333333333
+51,168,34.0148333333333
+51,169,33.6126666666667
+51,170,38.608
+51,171,39.2006666666667
+51,172,34.9038333333333
+51,173,38.8831666666667
+51,174,35.8563333333333
+51,175,38.2905
+51,176,27.7071666666667
+51,177,35.4118333333333
+51,178,27.5378333333333
+51,179,32.5331666666667
+51,180,34.036
+51,181,32.9353333333333
+51,182,37.5285
+51,183,36.6183333333333
+51,184,36.0891666666667
+51,185,28.5538333333333
+51,186,31.9405
+51,187,31.8135
+51,188,35.6023333333333
+51,189,33.1046666666667
+51,190,36.0256666666667
+51,191,34.9038333333333
+51,192,40.513
+51,193,30.353
+51,194,30.2683333333333
+51,195,33.4221666666667
+51,196,37.592
+51,197,29.4851666666667
+51,198,37.592
+51,199,31.3266666666667
+51,200,30.3741666666667
+51,201,30.8398333333333
+51,202,28.9136666666667
+51,203,33.9936666666667
+51,204,31.3055
+51,205,38.0788333333333
+51,206,38.6715
+51,207,29.9508333333333
+51,208,34.3111666666667
+51,209,35.7505
+51,210,42.6085
+51,211,36.5336666666667
+51,212,45.1908333333333
+51,213,41.7406666666667
+51,214,36.957
+51,215,34.4805
+51,216,28.321
+51,217,38.0365
+51,218,32.3003333333333
+51,219,32.4061666666667
+51,220,36.5336666666667
+51,221,36.8935
+51,222,37.0416666666667
+51,223,41.656
+51,224,34.671
+51,225,39.8145
+51,226,37.1475
+51,227,34.8615
+51,228,39.8568333333333
+51,229,39.6663333333333
+51,230,37.3168333333333
+51,231,44.4288333333333
+51,232,30.353
+51,233,32.7025
+51,234,39.9415
+51,235,38.2058333333333
+51,236,40.9998333333333
+51,237,34.0148333333333
+51,238,35.2848333333333
+51,239,28.5961666666667
+51,240,31.7076666666667
+51,241,38.4598333333333
+51,242,40.8728333333333
+51,243,36.957
+51,244,36.9146666666667
+51,245,36.3643333333333
+51,246,29.1041666666667
+51,247,42.0581666666667
+51,248,36.195
+51,249,38.4598333333333
+51,250,32.4061666666667
+51,251,29.0618333333333
+51,252,37.1686666666667
+51,253,29.2523333333333
+51,254,40.0473333333333
+51,255,33.0835
+51,256,43.0106666666667
+51,257,41.7406666666667
+51,258,32.0675
+51,259,42.7566666666667
+51,260,25.6116666666667
+51,261,31.623
+51,262,30.8398333333333
+51,263,35.2001666666667
+51,264,38.7773333333333
+51,265,31.0726666666667
+51,266,30.8398333333333
+51,267,35.0096666666667
+51,268,33.5491666666667
+51,269,33.5491666666667
+51,270,35.8986666666667
+51,271,41.5501666666667
+51,272,36.322
+51,273,33.782
+51,274,28.194
+51,275,31.3055
+51,276,39.0313333333333
+51,277,43.8361666666667
+51,278,35.7081666666667
+51,279,30.226
+51,280,31.115
+51,281,29.9085
+51,282,36.8088333333333
+51,283,40.5976666666667
+51,284,37.6343333333333
+51,285,29.2735
+51,286,35.0731666666667
+51,287,40.0685
+51,288,47.6461666666667
+51,289,41.1268333333333
+51,290,29.5486666666667
+51,291,34.7345
+51,292,32.5966666666667
+51,293,36.1315
+51,294,34.4805
+51,295,30.8398333333333
+51,296,37.1898333333333
+51,297,37.8883333333333
+51,298,36.7665
+51,299,32.9141666666667
+51,300,33.9725
+51,301,35.0308333333333
+51,302,37.6555
+51,303,30.2048333333333
+51,304,37.846
+51,305,34.2053333333333
+51,306,27.5378333333333
+51,307,27.432
+51,308,36.5336666666667
+51,309,28.4691666666667
+51,310,43.6456666666667
+51,311,29.5486666666667
+51,312,36.322
+51,313,33.6761666666667
+51,314,35.687
+51,315,39.6663333333333
+51,316,33.9936666666667
+51,317,35.6235
+51,318,35.5388333333333
+51,319,44.4923333333333
+51,320,38.5233333333333
+51,321,30.0778333333333
+51,322,38.3328333333333
+51,323,39.3911666666667
+51,324,42.4391666666667
+51,325,41.5925
+51,326,31.5595
+51,327,39.878
+51,328,35.052
+51,329,35.7716666666667
+51,330,30.353
+51,331,37.2745
+51,332,40.9363333333333
+51,333,31.496
+51,334,34.4381666666667
+51,335,33.3798333333333
+51,336,36.9993333333333
+51,337,36.449
+51,338,36.6818333333333
+51,339,36.2161666666667
+51,340,38.1635
+51,341,33.274
+51,342,34.2688333333333
+51,343,32.2368333333333
+51,344,34.1418333333333
+51,345,40.8728333333333
+51,346,40.3013333333333
+51,347,38.4598333333333
+51,348,36.957
+51,349,30.1836666666667
+51,350,38.1635
+51,351,32.8295
+51,352,41.9735
+51,353,41.4443333333333
+51,354,34.036
+51,355,33.4221666666667
+51,356,32.9141666666667
+51,357,33.4433333333333
+51,358,26.1408333333333
+51,359,37.4226666666667
+51,360,35.4541666666667
+51,361,30.2683333333333
+51,362,38.862
+51,363,33.4645
+51,364,39.8145
+51,365,33.655
+51,366,35.8351666666667
+51,367,32.6178333333333
+51,368,34.6921666666667
+51,369,30.8821666666667
+51,370,41.275
+51,371,38.9043333333333
+51,372,41.4443333333333
+51,373,30.8821666666667
+51,374,31.115
+51,375,36.2796666666667
+51,376,44.5346666666667
+51,377,39.8568333333333
+51,378,41.0421666666667
+51,379,33.9725
+51,380,35.814
+51,381,37.973
+51,382,40.9998333333333
+51,383,35.2213333333333
+51,384,30.5223333333333
+51,385,46.1645
+51,386,36.6606666666667
+51,387,42.3333333333333
+51,388,33.6973333333333
+51,389,34.0995
+51,390,41.0633333333333
+51,391,36.9146666666667
+51,392,30.5435
+51,393,39.8356666666667
+51,394,30.3741666666667
+51,395,42.0581666666667
+51,396,32.8718333333333
+51,397,30.9456666666667
+51,398,27.3685
+51,399,40.2378333333333
+51,400,34.6075
+51,401,40.005
+51,402,27.6225
+51,403,34.925
+51,404,46.0375
+51,405,33.782
+51,406,34.7768333333333
+51,407,44.5346666666667
+51,408,39.243
+51,409,30.353
+51,410,35.7293333333333
+51,411,28.2786666666667
+51,412,38.354
+51,413,37.084
+51,414,40.894
+51,415,32.7025
+51,416,35.306
+51,417,35.4753333333333
+51,418,35.0308333333333
+51,419,34.6921666666667
+51,420,31.2208333333333
+51,421,37.7613333333333
+51,422,37.6555
+51,423,29.4851666666667
+51,424,30.607
+51,425,42.8625
+51,426,30.9456666666667
+51,427,36.7241666666667
+51,428,33.9936666666667
+51,429,38.5868333333333
+51,430,40.0473333333333
+51,431,35.2213333333333
+51,432,37.6978333333333
+51,433,39.624
+51,434,36.6606666666667
+51,435,32.0463333333333
+51,436,36.0045
+51,437,41.275
+51,438,39.37
+51,439,28.2786666666667
+51,440,29.972
+51,441,32.1733333333333
+51,442,33.3798333333333
+51,443,38.6926666666667
+51,444,39.4546666666667
+51,445,36.957
+51,446,36.9993333333333
+51,447,35.8986666666667
+51,448,31.75
+51,449,38.7561666666667
+51,450,30.8398333333333
+51,451,52.3451666666667
+51,452,40.3648333333333
+51,453,40.7035
+51,454,33.0411666666667
+51,455,24.892
+51,456,39.0313333333333
+51,457,31.8346666666667
+51,458,37.5708333333333
+51,459,33.147
+51,460,31.9616666666667
+51,461,35.3906666666667
+51,462,36.6395
+51,463,39.2006666666667
+51,464,34.7345
+51,465,36.4066666666667
+51,466,35.052
+51,467,38.1211666666667
+51,468,31.75
+51,469,32.7448333333333
+51,470,35.7716666666667
+51,471,36.1738333333333
+51,472,35.3906666666667
+51,473,35.6446666666667
+51,474,33.8666666666667
+51,475,38.862
+51,476,43.8785
+51,477,39.6028333333333
+51,478,30.988
+51,479,30.3741666666667
+51,480,34.8826666666667
+51,481,32.9776666666667
+51,482,33.401
+51,483,33.0835
+51,484,38.0153333333333
+51,485,42.8625
+51,486,40.8516666666667
+51,487,33.909
+51,488,32.6178333333333
+51,489,30.8821666666667
+51,490,43.3705
+51,491,36.8723333333333
+51,492,35.2213333333333
+51,493,35.3483333333333
+51,494,33.2951666666667
+51,495,34.2688333333333
+51,496,32.3215
+51,497,39.3276666666667
+51,498,40.4918333333333
+51,499,36.1738333333333
+51,500,33.0411666666667
+51,501,37.973
+51,502,43.561
+51,503,33.0835
+51,504,33.274
+51,505,37.592
+51,506,42.8625
+51,507,33.3163333333333
+51,508,32.9988333333333
+51,509,31.7076666666667
+51,510,32.3215
+51,511,29.9508333333333
+51,512,39.3911666666667
+51,513,29.9085
+51,514,34.671
+51,515,31.4113333333333
+51,516,39.3488333333333
+51,517,35.052
+51,518,42.1005
+51,519,38.0576666666667
+51,520,33.5068333333333
+51,521,41.8465
+51,522,29.1888333333333
+51,523,33.4856666666667
+51,524,46.9476666666667
+51,525,28.4268333333333
+51,526,36.957
+51,527,34.3746666666667
+51,528,34.6921666666667
+51,529,36.7876666666667
+51,530,36.6183333333333
+51,531,35.2001666666667
+51,532,34.2476666666667
+51,533,36.83
+51,534,33.9301666666667
+51,535,30.3106666666667
+51,536,42.6508333333333
+51,537,34.0783333333333
+51,538,29.4851666666667
+51,539,29.1041666666667
+51,540,34.798
+51,541,38.227
+51,542,35.1578333333333
+51,543,42.5238333333333
+51,544,43.0106666666667
+51,545,40.6188333333333
+51,546,33.6973333333333
+51,547,33.8243333333333
+51,548,37.6343333333333
+51,549,34.0148333333333
+51,550,33.9513333333333
+51,551,40.5553333333333
+51,552,38.862
+51,553,42.9471666666667
+51,554,25.7175
+51,555,36.2585
+51,556,33.1258333333333
+51,557,39.0736666666667
+51,558,39.751
+51,559,36.2585
+51,560,39.0525
+51,561,33.1681666666667
+51,562,41.529
+51,563,39.878
+51,564,41.8888333333333
+51,565,37.719
+51,566,33.7396666666667
+51,567,35.6023333333333
+51,568,33.6973333333333
+51,569,37.2745
+51,570,38.3963333333333
+51,571,38.4386666666667
+51,572,38.0153333333333
+51,573,47.1381666666667
+51,574,36.3431666666667
+51,575,37.7401666666667
+51,576,34.7345
+51,577,41.4655
+51,578,32.4485
+51,579,26.7758333333333
+51,580,39.9626666666667
+51,581,39.7086666666667
+51,582,30.5435
+51,583,37.3591666666667
+51,584,28.956
+51,585,35.5811666666667
+51,586,26.8393333333333
+51,587,42.926
+51,588,38.3116666666667
+51,589,37.8883333333333
+51,590,40.3225
+51,591,39.6663333333333
+51,592,27.0086666666667
+51,593,36.7241666666667
+51,594,27.8976666666667
+51,595,45.0638333333333
+51,596,33.6973333333333
+51,597,37.2956666666667
+51,598,29.7815
+51,599,35.7928333333333
+51,600,40.386
+51,601,34.1418333333333
+51,602,37.9518333333333
+51,603,40.2801666666667
+51,604,36.1526666666667
+51,605,32.3426666666667
+51,606,36.2161666666667
+51,607,38.2905
+51,608,38.227
+51,609,36.7453333333333
+51,610,42.8625
+51,611,32.8295
+51,612,41.5501666666667
+51,613,21.5053333333333
+51,614,36.4913333333333
+51,615,39.5181666666667
+51,616,34.2265
+51,617,34.2476666666667
+51,618,36.3643333333333
+51,619,38.5445
+51,620,38.0365
+51,621,34.7345
+51,622,31.7711666666667
+51,623,28.1093333333333
+51,624,34.7556666666667
+51,625,32.9988333333333
+51,626,38.862
+51,627,35.4118333333333
+51,628,30.2471666666667
+51,629,41.2538333333333
+51,630,35.7505
+51,631,35.5811666666667
+51,632,36.8088333333333
+51,633,43.4551666666667
+51,634,40.2801666666667
+51,635,33.7185
+51,636,39.0525
+51,637,32.3215
+51,638,36.068
+51,639,38.4175
+51,640,35.4118333333333
+51,641,35.1578333333333
+51,642,34.3535
+51,643,38.8408333333333
+51,644,36.0256666666667
+51,645,33.3586666666667
+51,646,36.0045
+51,647,27.432
+51,648,39.37
+51,649,34.925
+51,650,28.7231666666667
+51,651,35.941
+51,652,34.5651666666667
+51,653,37.7401666666667
+51,654,33.6973333333333
+51,655,33.0623333333333
+51,656,38.2905
+51,657,33.274
+51,658,35.7081666666667
+51,659,42.3545
+51,660,35.4118333333333
+51,661,31.4748333333333
+51,662,42.9471666666667
+51,663,36.2796666666667
+51,664,37.4015
+51,665,27.9188333333333
+51,666,35.0308333333333
+51,667,33.02
+51,668,37.3803333333333
+51,669,38.5445
+51,670,30.9456666666667
+51,671,29.337
+51,672,35.052
+51,673,35.1578333333333
+51,674,36.3643333333333
+51,675,36.1103333333333
+51,676,39.7721666666667
+51,677,35.941
+51,678,31.5171666666667
+51,679,35.052
+51,680,22.0133333333333
+51,681,31.7076666666667
+51,682,47.0958333333333
+51,683,40.8728333333333
+51,684,33.274
+51,685,31.1573333333333
+51,686,26.2043333333333
+51,687,39.2641666666667
+51,688,38.3751666666667
+51,689,34.29
+51,690,38.1635
+51,691,28.7866666666667
+51,692,32.0463333333333
+51,693,39.2641666666667
+51,694,34.2688333333333
+51,695,32.6601666666667
+51,696,41.6983333333333
+51,697,44.8733333333333
+51,698,39.497
+51,699,26.7546666666667
+51,700,44.1536666666667
+51,701,37.5708333333333
+51,702,30.4376666666667
+51,703,38.9255
+51,704,37.7613333333333
+51,705,33.274
+51,706,42.2275
+51,707,38.4175
+51,708,39.2006666666667
+51,709,31.3055
+51,710,34.9461666666667
+51,711,33.8243333333333
+51,712,27.4108333333333
+51,713,45.72
+51,714,37.9306666666667
+51,715,27.9823333333333
+51,716,37.6555
+51,717,36.7876666666667
+51,718,37.5285
+51,719,37.8248333333333
+51,720,43.815
+51,721,37.338
+51,722,30.226
+51,723,39.4758333333333
+51,724,36.8935
+51,725,29.464
+51,726,36.1103333333333
+51,727,37.2745
+51,728,41.0421666666667
+51,729,35.7928333333333
+51,730,36.6818333333333
+51,731,32.8718333333333
+51,732,35.2213333333333
+51,733,36.5125
+51,734,34.8826666666667
+51,735,37.719
+51,736,44.4923333333333
+51,737,35.1155
+51,738,33.5703333333333
+51,739,39.3276666666667
+51,740,32.3003333333333
+51,741,38.5021666666667
+51,742,24.2781666666667
+51,743,45.339
+51,744,29.8026666666667
+51,745,39.4335
+51,746,36.0468333333333
+51,747,32.1521666666667
+51,748,32.7448333333333
+51,749,40.0473333333333
+51,750,40.4283333333333
+51,751,34.0148333333333
+51,752,41.6983333333333
+51,753,36.7241666666667
+51,754,35.2425
+51,755,36.7876666666667
+51,756,39.6875
+51,757,38.9043333333333
+51,758,37.1051666666667
+51,759,34.5863333333333
+51,760,38.3328333333333
+51,761,32.6601666666667
+51,762,32.9353333333333
+51,763,26.7546666666667
+51,764,26.543
+51,765,39.9626666666667
+51,766,33.2105
+51,767,39.497
+51,768,38.1635
+51,769,38.989
+51,770,32.3003333333333
+51,771,34.9673333333333
+51,772,41.783
+51,773,31.0938333333333
+51,774,34.1841666666667
+51,775,33.9301666666667
+51,776,23.6855
+51,777,35.687
+51,778,35.7505
+51,779,32.6601666666667
+51,780,32.4273333333333
+51,781,44.7886666666667
+51,782,35.6446666666667
+51,783,31.5383333333333
+51,784,35.2425
+51,785,42.4815
+51,786,29.7603333333333
+51,787,33.9301666666667
+51,788,33.7396666666667
+51,789,38.9466666666667
+51,790,36.5548333333333
+51,791,37.846
+51,792,36.7453333333333
+51,793,28.4268333333333
+51,794,35.7293333333333
+51,795,25.9503333333333
+51,796,35.3271666666667
+51,797,40.513
+51,798,40.8305
+51,799,33.5703333333333
+51,800,31.7288333333333
+51,801,38.227
+51,802,34.9673333333333
+51,803,37.592
+51,804,34.036
+51,805,36.4278333333333
+51,806,37.6131666666667
+51,807,25.9715
+51,808,31.4113333333333
+51,809,27.7918333333333
+51,810,38.5868333333333
+51,811,35.2425
+51,812,32.6178333333333
+51,813,38.1
+51,814,34.671
+51,815,37.9941666666667
+51,816,28.0246666666667
+51,817,32.7236666666667
+51,818,39.0101666666667
+51,819,40.1955
+51,820,42.2698333333333
+51,821,32.8083333333333
+51,822,40.386
+51,823,34.1841666666667
+51,824,37.8036666666667
+51,825,32.4696666666667
+51,826,32.0886666666667
+51,827,40.7035
+51,828,25.8868333333333
+51,829,39.5181666666667
+51,830,32.1733333333333
+51,831,35.0731666666667
+51,832,28.2363333333333
+51,833,36.8723333333333
+51,834,37.5073333333333
+51,835,30.7128333333333
+51,836,32.3003333333333
+51,837,41.6348333333333
+51,838,37.2745
+51,839,29.9931666666667
+51,840,34.9038333333333
+51,841,40.6823333333333
+51,842,34.4593333333333
+51,843,29.3158333333333
+51,844,27.0933333333333
+51,845,32.512
+51,846,34.3111666666667
+51,847,34.3746666666667
+51,848,30.2895
+51,849,33.3798333333333
+51,850,40.6611666666667
+51,851,34.0995
+51,852,41.1056666666667
+51,853,37.9095
+51,854,38.5445
+51,855,31.4325
+51,856,33.3163333333333
+51,857,39.3911666666667
+51,858,41.8253333333333
+51,859,33.8878333333333
+51,860,31.8981666666667
+51,861,39.3276666666667
+51,862,27.178
+51,863,32.2156666666667
+51,864,33.0623333333333
+51,865,30.8398333333333
+51,866,33.9301666666667
+51,867,34.4381666666667
+51,868,28.575
+51,869,43.8785
+51,870,31.623
+51,871,36.957
+51,872,32.7025
+51,873,39.0313333333333
+51,874,29.1465
+51,875,36.3008333333333
+51,876,31.7711666666667
+51,877,29.4005
+51,878,38.1846666666667
+51,879,32.4696666666667
+51,880,31.5383333333333
+51,881,34.8191666666667
+51,882,32.7025
+51,883,34.8191666666667
+51,884,33.909
+51,885,31.6441666666667
+51,886,39.8145
+51,887,41.2326666666667
+51,888,32.5966666666667
+51,889,34.2053333333333
+51,890,35.9198333333333
+51,891,47.1381666666667
+51,892,36.1526666666667
+51,893,40.3648333333333
+51,894,37.0628333333333
+51,895,27.6648333333333
+51,896,37.8248333333333
+51,897,35.6023333333333
+51,898,38.4598333333333
+51,899,32.0463333333333
+51,900,31.6865
+51,901,27.813
+51,902,33.9725
+51,903,36.0468333333333
+51,904,42.8625
+51,905,35.0731666666667
+51,906,34.2688333333333
+51,907,34.9885
+51,908,30.7128333333333
+51,909,39.2641666666667
+51,910,38.9678333333333
+51,911,35.56
+51,912,39.7086666666667
+51,913,33.1681666666667
+51,914,31.9405
+51,915,33.274
+51,916,43.3493333333333
+51,917,31.8558333333333
+51,918,26.8605
+51,919,41.5713333333333
+51,920,34.4381666666667
+51,921,38.9255
+51,922,42.2486666666667
+51,923,33.5068333333333
+51,924,33.4645
+51,925,35.433
+51,926,30.5435
+51,927,37.8671666666667
+51,928,36.5971666666667
+51,929,31.2631666666667
+51,930,34.3111666666667
+51,931,31.6865
+51,932,34.3111666666667
+51,933,29.9296666666667
+51,934,32.5755
+51,935,35.8775
+51,936,34.6075
+51,937,35.2001666666667
+51,938,39.497
+51,939,35.2636666666667
+51,940,30.8398333333333
+51,941,38.6926666666667
+51,942,31.4748333333333
+51,943,36.2796666666667
+51,944,26.4795
+51,945,40.4706666666667
+51,946,32.9141666666667
+51,947,35.8775
+51,948,31.7923333333333
+51,949,31.8346666666667
+51,950,28.956
+51,951,38.7985
+51,952,44.704
+51,953,36.1738333333333
+51,954,35.3906666666667
+51,955,34.8191666666667
+51,956,36.0468333333333
+51,957,32.4485
+51,958,36.6818333333333
+51,959,32.7236666666667
+51,960,33.8455
+51,961,32.7025
+51,962,35.3695
+51,963,40.6823333333333
+51,964,30.734
+51,965,39.2218333333333
+51,966,38.862
+51,967,32.1945
+51,968,30.1201666666667
+51,969,37.2533333333333
+51,970,37.1051666666667
+51,971,30.734
+51,972,30.1201666666667
+51,973,38.3328333333333
+51,974,38.4386666666667
+51,975,34.1418333333333
+51,976,35.5388333333333
+51,977,31.1785
+51,978,44.196
+51,979,37.8883333333333
+51,980,34.9461666666667
+51,981,38.1423333333333
+51,982,30.2471666666667
+51,983,29.7391666666667
+51,984,36.83
+51,985,38.1
+51,986,28.4691666666667
+51,987,34.2265
+51,988,32.6601666666667
+51,989,34.8826666666667
+51,990,37.7401666666667
+51,991,40.0261666666667
+51,992,35.4965
+51,993,34.1206666666667
+51,994,37.4438333333333
+51,995,41.2115
+51,996,44.1325
+51,997,34.5863333333333
+51,998,35.0943333333333
+51,999,31.2843333333333
+51,1000,34.5228333333333
+52,1,35.941
+52,2,36.068
+52,3,22.8811666666667
+52,4,27.5378333333333
+52,5,32.2156666666667
+52,6,26.67
+52,7,26.6488333333333
+52,8,24.2993333333333
+52,9,27.051
+52,10,29.7391666666667
+52,11,26.6488333333333
+52,12,29.6756666666667
+52,13,26.289
+52,14,29.0406666666667
+52,15,31.496
+52,16,31.369
+52,17,27.3685
+52,18,29.2946666666667
+52,19,25.4846666666667
+52,20,27.3685
+52,21,23.1986666666667
+52,22,20.701
+52,23,24.7015
+52,24,25.4211666666667
+52,25,27.3473333333333
+52,26,23.5161666666667
+52,27,32.0886666666667
+52,28,35.4541666666667
+52,29,28.1093333333333
+52,30,29.2523333333333
+52,31,24.3628333333333
+52,32,21.8863333333333
+52,33,28.0458333333333
+52,34,32.1733333333333
+52,35,25.6751666666667
+52,36,31.6441666666667
+52,37,27.686
+52,38,30.6705
+52,39,34.6921666666667
+52,40,26.7546666666667
+52,41,22.2885
+52,42,28.5115
+52,43,24.1723333333333
+52,44,28.6173333333333
+52,45,24.638
+52,46,24.6803333333333
+52,47,19.0923333333333
+52,48,37.0416666666667
+52,49,24.5321666666667
+52,50,39.878
+52,51,35.0308333333333
+52,52,28.4268333333333
+52,53,24.0241666666667
+52,54,29.9085
+52,55,28.5961666666667
+52,56,25.3788333333333
+52,57,21.5053333333333
+52,58,30.0778333333333
+52,59,28.5961666666667
+52,60,30.2048333333333
+52,61,27.8553333333333
+52,62,30.9668333333333
+52,63,23.0928333333333
+52,64,26.797
+52,65,27.1356666666667
+52,66,30.607
+52,67,27.4531666666667
+52,68,28.575
+52,69,27.559
+52,70,30.988
+52,71,30.9668333333333
+52,72,31.496
+52,73,24.7861666666667
+52,74,26.5641666666667
+52,75,30.2683333333333
+52,76,28.7866666666667
+52,77,31.3478333333333
+52,78,29.8026666666667
+52,79,28.5538333333333
+52,80,28.0458333333333
+52,81,31.623
+52,82,29.6968333333333
+52,83,32.8295
+52,84,31.115
+52,85,27.2415
+52,86,25.9926666666667
+52,87,29.0618333333333
+52,88,34.8826666666667
+52,89,29.5486666666667
+52,90,33.3798333333333
+52,91,34.1206666666667
+52,92,30.4588333333333
+52,93,30.7128333333333
+52,94,35.2001666666667
+52,95,18.6901666666667
+52,96,24.638
+52,97,36.3855
+52,98,21.6958333333333
+52,99,32.1733333333333
+52,100,34.163
+52,101,26.6488333333333
+52,102,28.702
+52,103,28.0035
+52,104,29.4428333333333
+52,105,26.8816666666667
+52,106,23.241
+52,107,28.5538333333333
+52,108,35.3906666666667
+52,109,24.1088333333333
+52,110,28.7655
+52,111,28.1305
+52,112,29.591
+52,113,32.385
+52,114,29.1041666666667
+52,115,32.0463333333333
+52,116,22.225
+52,117,33.4221666666667
+52,118,27.3261666666667
+52,119,28.956
+52,120,28.702
+52,121,24.9343333333333
+52,122,26.9663333333333
+52,123,25.0401666666667
+52,124,21.3783333333333
+52,125,30.3106666666667
+52,126,26.1831666666667
+52,127,27.0298333333333
+52,128,29.5275
+52,129,26.924
+52,130,41.2538333333333
+52,131,22.7541666666667
+52,132,26.5006666666667
+52,133,26.0138333333333
+52,134,29.9085
+52,135,28.5115
+52,136,35.9198333333333
+52,137,25.8656666666667
+52,138,29.8873333333333
+52,139,34.0995
+52,140,31.4748333333333
+52,141,30.5858333333333
+52,142,23.9606666666667
+52,143,30.353
+52,144,28.7443333333333
+52,145,30.2895
+52,146,21.5265
+52,147,28.702
+52,148,27.2415
+52,149,26.924
+52,150,28.8713333333333
+52,151,29.8873333333333
+52,152,23.7278333333333
+52,153,27.5801666666667
+52,154,34.7345
+52,155,26.3948333333333
+52,156,28.0881666666667
+52,157,32.3215
+52,158,31.7076666666667
+52,159,24.0453333333333
+52,160,31.2208333333333
+52,161,32.3215
+52,162,35.3695
+52,163,32.7236666666667
+52,164,30.2048333333333
+52,165,25.0401666666667
+52,166,30.7551666666667
+52,167,24.0453333333333
+52,168,27.2626666666667
+52,169,25.9926666666667
+52,170,32.6813333333333
+52,171,29.2735
+52,172,28.956
+52,173,30.9456666666667
+52,174,30.734
+52,175,25.7386666666667
+52,176,33.3163333333333
+52,177,30.3741666666667
+52,178,26.4583333333333
+52,179,23.3891666666667
+52,180,28.2575
+52,181,24.9131666666667
+52,182,28.4268333333333
+52,183,26.3101666666667
+52,184,25.2095
+52,185,24.8496666666667
+52,186,27.8765
+52,187,31.9616666666667
+52,188,32.4485
+52,189,29.972
+52,190,24.9343333333333
+52,191,30.3953333333333
+52,192,30.0143333333333
+52,193,33.3798333333333
+52,194,39.8356666666667
+52,195,28.6596666666667
+52,196,23.8971666666667
+52,197,28.7655
+52,198,25.7386666666667
+52,199,24.9131666666667
+52,200,28.4691666666667
+52,201,30.2048333333333
+52,202,27.559
+52,203,28.5326666666667
+52,204,24.9343333333333
+52,205,29.1465
+52,206,30.3741666666667
+52,207,29.2311666666667
+52,208,28.6808333333333
+52,209,25.0825
+52,210,31.9828333333333
+52,211,25.8233333333333
+52,212,28.4268333333333
+52,213,23.8971666666667
+52,214,28.2786666666667
+52,215,28.1728333333333
+52,216,27.4955
+52,217,27.1568333333333
+52,218,26.4371666666667
+52,219,26.8393333333333
+52,220,28.0035
+52,221,29.972
+52,222,32.5543333333333
+52,223,25.146
+52,224,29.972
+52,225,30.9456666666667
+52,226,34.3111666666667
+52,227,26.797
+52,228,29.5275
+52,229,23.0928333333333
+52,230,29.5486666666667
+52,231,29.5486666666667
+52,232,25.8656666666667
+52,233,35.687
+52,234,28.0881666666667
+52,235,31.6865
+52,236,26.3736666666667
+52,237,25.4
+52,238,34.1206666666667
+52,239,26.1831666666667
+52,240,22.4578333333333
+52,241,29.6756666666667
+52,242,26.8816666666667
+52,243,28.956
+52,244,28.5326666666667
+52,245,33.274
+52,246,28.702
+52,247,29.083
+52,248,26.3948333333333
+52,249,25.8868333333333
+52,250,32.766
+52,251,26.1831666666667
+52,252,28.6596666666667
+52,253,27.2838333333333
+52,254,26.8816666666667
+52,255,25.1671666666667
+52,256,25.527
+52,257,30.226
+52,258,23.7701666666667
+52,259,30.8186666666667
+52,260,30.353
+52,261,31.0303333333333
+52,262,27.4743333333333
+52,263,28.2363333333333
+52,264,27.2415
+52,265,33.7608333333333
+52,266,30.6493333333333
+52,267,24.9978333333333
+52,268,27.1356666666667
+52,269,30.607
+52,270,23.4526666666667
+52,271,25.781
+52,272,26.9875
+52,273,31.6653333333333
+52,274,24.9766666666667
+52,275,28.3633333333333
+52,276,29.8026666666667
+52,277,27.4743333333333
+52,278,35.6658333333333
+52,279,29.0195
+52,280,35.687
+52,281,27.305
+52,282,25.3788333333333
+52,283,25.6116666666667
+52,284,28.2998333333333
+52,285,24.1088333333333
+52,286,28.0246666666667
+52,287,32.1733333333333
+52,288,25.908
+52,289,41.7195
+52,290,37.1898333333333
+52,291,25.1036666666667
+52,292,23.9606666666667
+52,293,32.2791666666667
+52,294,24.4898333333333
+52,295,23.3891666666667
+52,296,27.8765
+52,297,28.7866666666667
+52,298,27.7283333333333
+52,299,26.035
+52,300,22.606
+52,301,24.5533333333333
+52,302,28.3845
+52,303,23.7913333333333
+52,304,26.1831666666667
+52,305,24.4263333333333
+52,306,22.6906666666667
+52,307,30.0566666666667
+52,308,22.733
+52,309,27.8553333333333
+52,310,26.6911666666667
+52,311,31.7711666666667
+52,312,32.4696666666667
+52,313,25.7175
+52,314,28.3845
+52,315,36.1526666666667
+52,316,21.2301666666667
+52,317,28.0246666666667
+52,318,19.05
+52,319,30.6916666666667
+52,320,31.3055
+52,321,28.8713333333333
+52,322,35.0943333333333
+52,323,30.4376666666667
+52,324,28.575
+52,325,25.908
+52,326,34.3535
+52,327,29.2311666666667
+52,328,33.1893333333333
+52,329,28.2363333333333
+52,330,26.4583333333333
+52,331,30.9456666666667
+52,332,30.0778333333333
+52,333,23.5373333333333
+52,334,23.3045
+52,335,25.781
+52,336,24.2781666666667
+52,337,23.0293333333333
+52,338,27.7071666666667
+52,339,22.7965
+52,340,28.4903333333333
+52,341,29.7391666666667
+52,342,33.4433333333333
+52,343,29.6968333333333
+52,344,23.4526666666667
+52,345,24.6591666666667
+52,346,27.2626666666667
+52,347,25.9291666666667
+52,348,29.4428333333333
+52,349,25.6963333333333
+52,350,31.3266666666667
+52,351,24.765
+52,352,27.3473333333333
+52,353,29.5486666666667
+52,354,28.0246666666667
+52,355,24.511
+52,356,29.7603333333333
+52,357,27.305
+52,358,32.0251666666667
+52,359,35.306
+52,360,26.7123333333333
+52,361,30.5646666666667
+52,362,32.7871666666667
+52,363,33.147
+52,364,28.6173333333333
+52,365,25.7598333333333
+52,366,28.5115
+52,367,27.7495
+52,368,27.686
+52,369,25.6751666666667
+52,370,25.4635
+52,371,25.2518333333333
+52,372,21.1455
+52,373,29.2523333333333
+52,374,28.8501666666667
+52,375,31.8346666666667
+52,376,30.1413333333333
+52,377,29.4216666666667
+52,378,27.3685
+52,379,29.0618333333333
+52,380,24.8285
+52,381,27.5801666666667
+52,382,34.2053333333333
+52,383,27.6225
+52,384,37.0416666666667
+52,385,28.5326666666667
+52,386,29.6968333333333
+52,387,32.7236666666667
+52,388,23.5796666666667
+52,389,27.2415
+52,390,23.6431666666667
+52,391,26.4371666666667
+52,392,31.4748333333333
+52,393,27.5166666666667
+52,394,30.7975
+52,395,31.0515
+52,396,28.829
+52,397,25.9715
+52,398,30.7128333333333
+52,399,30.2048333333333
+52,400,24.765
+52,401,28.2998333333333
+52,402,33.1893333333333
+52,403,30.6493333333333
+52,404,28.9983333333333
+52,405,25.0825
+52,406,32.3003333333333
+52,407,27.1568333333333
+52,408,27.2838333333333
+52,409,30.8398333333333
+52,410,22.9023333333333
+52,411,29.6968333333333
+52,412,26.9875
+52,413,38.2693333333333
+52,414,26.9663333333333
+52,415,34.6498333333333
+52,416,33.4221666666667
+52,417,27.051
+52,418,34.4805
+52,419,26.0773333333333
+52,420,28.8078333333333
+52,421,26.416
+52,422,35.5388333333333
+52,423,29.8238333333333
+52,424,24.0453333333333
+52,425,23.5585
+52,426,21.717
+52,427,22.1403333333333
+52,428,27.6225
+52,429,23.9395
+52,430,30.7763333333333
+52,431,27.2838333333333
+52,432,25.7598333333333
+52,433,28.0035
+52,434,26.67
+52,435,22.2673333333333
+52,436,28.7231666666667
+52,437,21.6535
+52,438,25.6116666666667
+52,439,34.7768333333333
+52,440,29.8873333333333
+52,441,28.1516666666667
+52,442,23.0081666666667
+52,443,26.0773333333333
+52,444,33.1893333333333
+52,445,25.908
+52,446,28.702
+52,447,28.4903333333333
+52,448,23.9606666666667
+52,449,25.3153333333333
+52,450,31.8981666666667
+52,451,25.2306666666667
+52,452,33.7185
+52,453,28.9771666666667
+52,454,31.8346666666667
+52,455,36.3008333333333
+52,456,27.4743333333333
+52,457,31.0303333333333
+52,458,33.9936666666667
+52,459,22.733
+52,460,25.8233333333333
+52,461,27.1145
+52,462,24.8496666666667
+52,463,24.0876666666667
+52,464,25.1248333333333
+52,465,25.8445
+52,466,25.6963333333333
+52,467,32.6813333333333
+52,468,27.8553333333333
+52,469,35.7081666666667
+52,470,21.5053333333333
+52,471,27.0933333333333
+52,472,34.1841666666667
+52,473,32.1733333333333
+52,474,29.1465
+52,475,33.5491666666667
+52,476,23.8336666666667
+52,477,29.3581666666667
+52,478,35.7928333333333
+52,479,31.369
+52,480,31.5383333333333
+52,481,26.5006666666667
+52,482,41.021
+52,483,27.7495
+52,484,28.0881666666667
+52,485,26.8816666666667
+52,486,26.3736666666667
+52,487,24.9766666666667
+52,488,32.0251666666667
+52,489,26.9663333333333
+52,490,32.3215
+52,491,27.6436666666667
+52,492,23.5161666666667
+52,493,27.3473333333333
+52,494,26.6276666666667
+52,495,30.2683333333333
+52,496,30.7763333333333
+52,497,32.3426666666667
+52,498,31.0303333333333
+52,499,27.432
+52,500,24.6591666666667
+52,501,27.3685
+52,502,29.8026666666667
+52,503,32.6601666666667
+52,504,26.7335
+52,505,33.782
+52,506,23.8336666666667
+52,507,27.2838333333333
+52,508,27.6013333333333
+52,509,26.7335
+52,510,24.892
+52,511,35.6023333333333
+52,512,29.1676666666667
+52,513,27.8976666666667
+52,514,22.606
+52,515,26.7546666666667
+52,516,33.7396666666667
+52,517,28.3633333333333
+52,518,34.925
+52,519,28.8925
+52,520,30.226
+52,521,31.3901666666667
+52,522,26.0138333333333
+52,523,26.2466666666667
+52,524,23.5373333333333
+52,525,27.0933333333333
+52,526,30.3106666666667
+52,527,23.9606666666667
+52,528,29.7815
+52,529,30.6705
+52,530,25.9926666666667
+52,531,28.575
+52,532,32.4696666666667
+52,533,26.4583333333333
+52,534,30.9033333333333
+52,535,28.067
+52,536,21.9498333333333
+52,537,34.5016666666667
+52,538,30.8398333333333
+52,539,25.6116666666667
+52,540,40.3436666666667
+52,541,33.5068333333333
+52,542,28.2575
+52,543,26.4795
+52,544,37.8248333333333
+52,545,30.6916666666667
+52,546,24.6168333333333
+52,547,29.083
+52,548,21.0185
+52,549,27.4955
+52,550,34.3111666666667
+52,551,35.306
+52,552,33.3798333333333
+52,553,20.3411666666667
+52,554,27.3685
+52,555,29.4428333333333
+52,556,35.2425
+52,557,27.432
+52,558,25.9715
+52,559,21.7805
+52,560,35.1578333333333
+52,561,27.3261666666667
+52,562,26.9028333333333
+52,563,30.5858333333333
+52,564,25.8021666666667
+52,565,26.5006666666667
+52,566,27.178
+52,567,34.925
+52,568,23.495
+52,569,28.7866666666667
+52,570,28.5538333333333
+52,571,33.3163333333333
+52,572,32.3426666666667
+52,573,16.7216666666667
+52,574,24.5956666666667
+52,575,36.1315
+52,576,24.7226666666667
+52,577,34.0783333333333
+52,578,26.9875
+52,579,31.2843333333333
+52,580,32.258
+52,581,31.5595
+52,582,29.4005
+52,583,33.4433333333333
+52,584,31.75
+52,585,33.147
+52,586,30.353
+52,587,24.2781666666667
+52,588,31.115
+52,589,26.9875
+52,590,32.3638333333333
+52,591,28.8925
+52,592,33.9301666666667
+52,593,32.6813333333333
+52,594,25.1036666666667
+52,595,31.0726666666667
+52,596,22.6695
+52,597,25.4
+52,598,31.369
+52,599,25.8445
+52,600,25.273
+52,601,28.8078333333333
+52,602,26.035
+52,603,26.3101666666667
+52,604,30.4588333333333
+52,605,28.575
+52,606,28.3633333333333
+52,607,25.6751666666667
+52,608,27.0721666666667
+52,609,28.448
+52,610,25.781
+52,611,31.6018333333333
+52,612,24.257
+52,613,27.9611666666667
+52,614,36.957
+52,615,26.9028333333333
+52,616,30.0355
+52,617,35.1578333333333
+52,618,34.7133333333333
+52,619,22.733
+52,620,30.4165
+52,621,26.3101666666667
+52,622,26.0985
+52,623,31.9193333333333
+52,624,31.4748333333333
+52,625,20.574
+52,626,20.6375
+52,627,20.9761666666667
+52,628,24.638
+52,629,27.0086666666667
+52,630,31.7288333333333
+52,631,29.5063333333333
+52,632,25.019
+52,633,23.9818333333333
+52,634,29.1041666666667
+52,635,33.8666666666667
+52,636,29.5063333333333
+52,637,26.924
+52,638,25.7175
+52,639,29.1465
+52,640,22.2038333333333
+52,641,31.5595
+52,642,31.8135
+52,643,23.5796666666667
+52,644,24.1511666666667
+52,645,23.6643333333333
+52,646,29.5275
+52,647,35.7081666666667
+52,648,28.1093333333333
+52,649,25.8445
+52,650,27.5801666666667
+52,651,22.8176666666667
+52,652,40.0685
+52,653,29.7391666666667
+52,654,21.8863333333333
+52,655,25.7386666666667
+52,656,31.4748333333333
+52,657,25.527
+52,658,31.496
+52,659,30.0566666666667
+52,660,22.1826666666667
+52,661,28.448
+52,662,37.846
+52,663,25.5905
+52,664,23.3045
+52,665,27.1568333333333
+52,666,43.2858333333333
+52,667,25.8656666666667
+52,668,29.1465
+52,669,30.5435
+52,670,31.1361666666667
+52,671,26.6065
+52,672,26.035
+52,673,28.8713333333333
+52,674,25.3365
+52,675,30.1836666666667
+52,676,30.7763333333333
+52,677,30.3741666666667
+52,678,34.417
+52,679,30.1836666666667
+52,680,26.6911666666667
+52,681,32.1521666666667
+52,682,35.0096666666667
+52,683,28.6173333333333
+52,684,31.6441666666667
+52,685,30.0778333333333
+52,686,29.845
+52,687,31.0938333333333
+52,688,25.3153333333333
+52,689,30.6916666666667
+52,690,24.1088333333333
+52,691,36.1738333333333
+52,692,25.0825
+52,693,29.0195
+52,694,27.6648333333333
+52,695,22.8176666666667
+52,696,20.3411666666667
+52,697,25.654
+52,698,28.1516666666667
+52,699,23.2198333333333
+52,700,29.337
+52,701,21.1878333333333
+52,702,27.686
+52,703,32.1098333333333
+52,704,24.7438333333333
+52,705,29.5486666666667
+52,706,37.3803333333333
+52,707,31.0091666666667
+52,708,24.384
+52,709,36.322
+52,710,22.0345
+52,711,31.0091666666667
+52,712,25.6328333333333
+52,713,29.4851666666667
+52,714,29.5486666666667
+52,715,30.8186666666667
+52,716,29.337
+52,717,32.9565
+52,718,22.9446666666667
+52,719,27.813
+52,720,24.5745
+52,721,29.972
+52,722,22.4155
+52,723,32.6601666666667
+52,724,21.5053333333333
+52,725,26.4583333333333
+52,726,27.7283333333333
+52,727,33.7185
+52,728,23.114
+52,729,24.7015
+52,730,27.4531666666667
+52,731,21.4418333333333
+52,732,22.3943333333333
+52,733,23.7066666666667
+52,734,25.3788333333333
+52,735,28.2151666666667
+52,736,26.5006666666667
+52,737,32.1521666666667
+52,738,29.9931666666667
+52,739,35.4965
+52,740,28.0035
+52,741,35.4541666666667
+52,742,34.8615
+52,743,21.6535
+52,744,27.7918333333333
+52,745,34.4805
+52,746,22.479
+52,747,28.4268333333333
+52,748,37.592
+52,749,23.7066666666667
+52,750,26.4795
+52,751,32.4061666666667
+52,752,26.2466666666667
+52,753,27.0298333333333
+52,754,32.9353333333333
+52,755,30.734
+52,756,33.8666666666667
+52,757,29.2946666666667
+52,758,24.638
+52,759,32.1945
+52,760,21.9075
+52,761,22.6695
+52,762,34.6075
+52,763,28.2998333333333
+52,764,37.9306666666667
+52,765,28.0881666666667
+52,766,25.5693333333333
+52,767,27.2838333333333
+52,768,25.1248333333333
+52,769,33.3798333333333
+52,770,23.3256666666667
+52,771,26.1408333333333
+52,772,27.686
+52,773,29.3793333333333
+52,774,26.9875
+52,775,31.242
+52,776,30.1201666666667
+52,777,26.0561666666667
+52,778,26.7546666666667
+52,779,21.3995
+52,780,30.099
+52,781,29.5486666666667
+52,782,27.4108333333333
+52,783,24.4686666666667
+52,784,27.3685
+52,785,20.0236666666667
+52,786,22.1403333333333
+52,787,32.766
+52,788,28.5115
+52,789,23.0081666666667
+52,790,21.5476666666667
+52,791,23.2621666666667
+52,792,24.2781666666667
+52,793,26.924
+52,794,22.479
+52,795,27.305
+52,796,21.3783333333333
+52,797,28.5961666666667
+52,798,24.4263333333333
+52,799,24.8496666666667
+52,800,26.8181666666667
+52,801,33.401
+52,802,26.289
+52,803,30.988
+52,804,28.9348333333333
+52,805,29.2946666666667
+52,806,24.4263333333333
+52,807,30.5223333333333
+52,808,28.1516666666667
+52,809,24.6591666666667
+52,810,31.7923333333333
+52,811,30.1836666666667
+52,812,25.6116666666667
+52,813,24.0453333333333
+52,814,27.051
+52,815,23.6008333333333
+52,816,21.2513333333333
+52,817,27.7918333333333
+52,818,24.7226666666667
+52,819,31.3478333333333
+52,820,27.6648333333333
+52,821,26.1408333333333
+52,822,31.4113333333333
+52,823,21.59
+52,824,24.1723333333333
+52,825,26.797
+52,826,31.3901666666667
+52,827,31.242
+52,828,23.7701666666667
+52,829,29.1041666666667
+52,830,25.781
+52,831,23.2198333333333
+52,832,34.9673333333333
+52,833,34.2053333333333
+52,834,26.6276666666667
+52,835,24.8496666666667
+52,836,29.0195
+52,837,24.6168333333333
+52,838,33.6761666666667
+52,839,36.2585
+52,840,24.6591666666667
+52,841,28.0035
+52,842,26.797
+52,843,27.432
+52,844,32.1733333333333
+52,845,27.8341666666667
+52,846,30.7128333333333
+52,847,27.3261666666667
+52,848,21.2936666666667
+52,849,32.4696666666667
+52,850,22.1403333333333
+52,851,26.924
+52,852,27.5378333333333
+52,853,32.1521666666667
+52,854,26.9451666666667
+52,855,31.3055
+52,856,28.2363333333333
+52,857,28.8925
+52,858,30.5435
+52,859,25.9291666666667
+52,860,31.5595
+52,861,27.9188333333333
+52,862,25.9715
+52,863,34.29
+52,864,29.1465
+52,865,25.6116666666667
+52,866,22.8176666666667
+52,867,32.7871666666667
+52,868,31.6441666666667
+52,869,33.3798333333333
+52,870,23.7278333333333
+52,871,25.6328333333333
+52,872,30.4376666666667
+52,873,27.7706666666667
+52,874,28.8501666666667
+52,875,33.9513333333333
+52,876,31.115
+52,877,22.5425
+52,878,25.0401666666667
+52,879,24.9978333333333
+52,880,25.8021666666667
+52,881,26.162
+52,882,26.2043333333333
+52,883,32.258
+52,884,29.4216666666667
+52,885,29.9085
+52,886,27.9823333333333
+52,887,38.735
+52,888,25.6116666666667
+52,889,26.0773333333333
+52,890,27.305
+52,891,28.5538333333333
+52,892,30.6281666666667
+52,893,27.1991666666667
+52,894,29.9508333333333
+52,895,28.9136666666667
+52,896,30.8821666666667
+52,897,22.5001666666667
+52,898,30.1413333333333
+52,899,30.8398333333333
+52,900,19.8331666666667
+52,901,32.7025
+52,902,29.3581666666667
+52,903,31.5595
+52,904,24.257
+52,905,29.464
+52,906,28.6173333333333
+52,907,34.5863333333333
+52,908,27.178
+52,909,28.4903333333333
+52,910,29.1676666666667
+52,911,25.5693333333333
+52,912,25.7598333333333
+52,913,24.9766666666667
+52,914,26.6488333333333
+52,915,27.9188333333333
+52,916,26.8393333333333
+52,917,31.0515
+52,918,23.3045
+52,919,27.1991666666667
+52,920,37.7613333333333
+52,921,27.6436666666667
+52,922,28.2151666666667
+52,923,27.8553333333333
+52,924,28.5961666666667
+52,925,26.035
+52,926,27.6225
+52,927,39.3065
+52,928,34.2053333333333
+52,929,24.2781666666667
+52,930,30.48
+52,931,29.7815
+52,932,27.432
+52,933,27.5166666666667
+52,934,22.5848333333333
+52,935,32.3426666666667
+52,936,27.4743333333333
+52,937,26.8816666666667
+52,938,24.638
+52,939,28.1728333333333
+52,940,25.8868333333333
+52,941,24.1088333333333
+52,942,24.1088333333333
+52,943,25.9715
+52,944,24.0453333333333
+52,945,33.2316666666667
+52,946,35.4118333333333
+52,947,26.67
+52,948,27.0298333333333
+52,949,29.0406666666667
+52,950,29.337
+52,951,28.1305
+52,952,20.5316666666667
+52,953,26.5641666666667
+52,954,34.4805
+52,955,31.5383333333333
+52,956,30.6705
+52,957,27.051
+52,958,29.6333333333333
+52,959,31.0303333333333
+52,960,36.703
+52,961,27.1568333333333
+52,962,28.0246666666667
+52,963,31.2631666666667
+52,964,34.5651666666667
+52,965,24.638
+52,966,25.9503333333333
+52,967,35.7081666666667
+52,968,23.495
+52,969,19.4733333333333
+52,970,25.654
+52,971,22.1615
+52,972,34.163
+52,973,29.2523333333333
+52,974,25.6116666666667
+52,975,31.4536666666667
+52,976,31.4325
+52,977,29.0195
+52,978,32.512
+52,979,23.6643333333333
+52,980,27.6436666666667
+52,981,28.9771666666667
+52,982,28.3421666666667
+52,983,28.1305
+52,984,27.6225
+52,985,34.036
+52,986,23.3256666666667
+52,987,31.0726666666667
+52,988,23.3891666666667
+52,989,27.5166666666667
+52,990,26.7546666666667
+52,991,28.5961666666667
+52,992,25.8021666666667
+52,993,24.003
+52,994,32.3638333333333
+52,995,24.5321666666667
+52,996,35.9621666666667
+52,997,30.0143333333333
+52,998,29.9296666666667
+52,999,27.8341666666667
+52,1000,23.6855
+53,1,28.5115
+53,2,29.4851666666667
+53,3,22.4578333333333
+53,4,27.2626666666667
+53,5,31.496
+53,6,23.4526666666667
+53,7,26.5006666666667
+53,8,22.606
+53,9,28.0881666666667
+53,10,22.6695
+53,11,26.924
+53,12,21.8863333333333
+53,13,28.067
+53,14,31.0303333333333
+53,15,23.5585
+53,16,28.1305
+53,17,25.9503333333333
+53,18,25.6328333333333
+53,19,25.4635
+53,20,24.1935
+53,21,26.3736666666667
+53,22,25.4
+53,23,23.9395
+53,24,25.273
+53,25,25.5481666666667
+53,26,25.5693333333333
+53,27,23.1351666666667
+53,28,26.2466666666667
+53,29,26.6488333333333
+53,30,25.5481666666667
+53,31,25.781
+53,32,24.9343333333333
+53,33,21.0396666666667
+53,34,27.8765
+53,35,24.1935
+53,36,26.162
+53,37,24.7015
+53,38,23.1563333333333
+53,39,27.5801666666667
+53,40,25.908
+53,41,26.0773333333333
+53,42,23.1986666666667
+53,43,32.1098333333333
+53,44,33.2951666666667
+53,45,29.6121666666667
+53,46,26.2466666666667
+53,47,26.7335
+53,48,22.9023333333333
+53,49,24.9766666666667
+53,50,25.2941666666667
+53,51,27.4531666666667
+53,52,26.2466666666667
+53,53,25.2518333333333
+53,54,24.6591666666667
+53,55,24.4263333333333
+53,56,25.4211666666667
+53,57,29.3793333333333
+53,58,31.9405
+53,59,27.6013333333333
+53,60,27.5166666666667
+53,61,22.733
+53,62,27.7918333333333
+53,63,26.8605
+53,64,27.305
+53,65,26.0138333333333
+53,66,31.2843333333333
+53,67,27.686
+53,68,21.4418333333333
+53,69,22.9658333333333
+53,70,29.8238333333333
+53,71,24.2146666666667
+53,72,25.6116666666667
+53,73,24.4686666666667
+53,74,24.9555
+53,75,27.432
+53,76,24.8496666666667
+53,77,28.2786666666667
+53,78,25.8445
+53,79,22.0133333333333
+53,80,26.2466666666667
+53,81,24.511
+53,82,27.432
+53,83,26.0773333333333
+53,84,27.8341666666667
+53,85,23.0293333333333
+53,86,26.6065
+53,87,28.2151666666667
+53,88,26.8181666666667
+53,89,25.4
+53,90,24.4686666666667
+53,91,28.6173333333333
+53,92,24.9131666666667
+53,93,26.7758333333333
+53,94,24.8708333333333
+53,95,25.2941666666667
+53,96,25.8021666666667
+53,97,22.2673333333333
+53,98,24.384
+53,99,23.495
+53,100,24.1723333333333
+53,101,26.0138333333333
+53,102,26.035
+53,103,26.035
+53,104,23.3256666666667
+53,105,18.8595
+53,106,32.8506666666667
+53,107,26.8393333333333
+53,108,29.2523333333333
+53,109,21.971
+53,110,25.0825
+53,111,26.289
+53,112,24.765
+53,113,27.2203333333333
+53,114,23.7066666666667
+53,115,30.1413333333333
+53,116,25.5058333333333
+53,117,24.638
+53,118,24.7226666666667
+53,119,26.3101666666667
+53,120,30.353
+53,121,25.1671666666667
+53,122,24.892
+53,123,29.9931666666667
+53,124,22.5848333333333
+53,125,28.1093333333333
+53,126,27.0721666666667
+53,127,23.4526666666667
+53,128,24.8073333333333
+53,129,22.1826666666667
+53,130,28.2998333333333
+53,131,26.8393333333333
+53,132,25.146
+53,133,29.8661666666667
+53,134,25.2306666666667
+53,135,28.2575
+53,136,28.0246666666667
+53,137,24.9978333333333
+53,138,25.3153333333333
+53,139,25.7175
+53,140,26.8393333333333
+53,141,26.7758333333333
+53,142,25.4846666666667
+53,143,27.6013333333333
+53,144,30.1836666666667
+53,145,24.0453333333333
+53,146,25.9926666666667
+53,147,31.8558333333333
+53,148,30.2683333333333
+53,149,24.2781666666667
+53,150,23.4738333333333
+53,151,29.7815
+53,152,25.6328333333333
+53,153,24.4686666666667
+53,154,25.3153333333333
+53,155,27.3473333333333
+53,156,28.9136666666667
+53,157,26.3313333333333
+53,158,27.051
+53,159,24.2146666666667
+53,160,27.2626666666667
+53,161,27.7706666666667
+53,162,24.638
+53,163,24.2781666666667
+53,164,26.2255
+53,165,25.0401666666667
+53,166,25.8445
+53,167,29.1465
+53,168,21.5053333333333
+53,169,32.7025
+53,170,21.5053333333333
+53,171,24.1088333333333
+53,172,24.4686666666667
+53,173,27.0086666666667
+53,174,25.6963333333333
+53,175,24.13
+53,176,24.9131666666667
+53,177,23.7278333333333
+53,178,23.0928333333333
+53,179,23.876
+53,180,23.114
+53,181,27.305
+53,182,27.813
+53,183,33.9936666666667
+53,184,29.9085
+53,185,24.9978333333333
+53,186,24.0876666666667
+53,187,29.5063333333333
+53,188,28.8501666666667
+53,189,24.0453333333333
+53,190,22.8388333333333
+53,191,23.2833333333333
+53,192,21.5688333333333
+53,193,25.273
+53,194,27.0933333333333
+53,195,21.2513333333333
+53,196,24.8073333333333
+53,197,26.8816666666667
+53,198,27.7918333333333
+53,199,19.7908333333333
+53,200,24.1723333333333
+53,201,24.638
+53,202,23.9606666666667
+53,203,23.876
+53,204,21.4841666666667
+53,205,28.1093333333333
+53,206,29.337
+53,207,31.623
+53,208,24.6168333333333
+53,209,30.1625
+53,210,22.5213333333333
+53,211,22.1615
+53,212,22.2673333333333
+53,213,25.781
+53,214,26.2043333333333
+53,215,28.6173333333333
+53,216,28.4056666666667
+53,217,27.5801666666667
+53,218,28.3421666666667
+53,219,24.5745
+53,220,28.7866666666667
+53,221,27.686
+53,222,22.4578333333333
+53,223,25.6328333333333
+53,224,25.1671666666667
+53,225,25.5481666666667
+53,226,25.908
+53,227,24.2781666666667
+53,228,24.2781666666667
+53,229,27.3685
+53,230,28.829
+53,231,27.9823333333333
+53,232,25.5481666666667
+53,233,21.1666666666667
+53,234,25.781
+53,235,24.8708333333333
+53,236,28.9348333333333
+53,237,23.4526666666667
+53,238,20.3411666666667
+53,239,30.3106666666667
+53,240,26.2255
+53,241,23.5373333333333
+53,242,28.7655
+53,243,24.7226666666667
+53,244,25.7175
+53,245,26.289
+53,246,23.876
+53,247,25.6963333333333
+53,248,25.5693333333333
+53,249,28.4903333333333
+53,250,25.5058333333333
+53,251,23.9183333333333
+53,252,21.7805
+53,253,24.0876666666667
+53,254,27.5801666666667
+53,255,22.1403333333333
+53,256,27.3473333333333
+53,257,30.3953333333333
+53,258,27.2838333333333
+53,259,24.9555
+53,260,26.9663333333333
+53,261,27.7918333333333
+53,262,25.4
+53,263,32.6813333333333
+53,264,24.9131666666667
+53,265,26.2255
+53,266,27.7495
+53,267,25.0613333333333
+53,268,25.9291666666667
+53,269,28.1516666666667
+53,270,26.0138333333333
+53,271,25.8021666666667
+53,272,28.9348333333333
+53,273,26.8605
+53,274,32.5755
+53,275,27.9823333333333
+53,276,17.6953333333333
+53,277,26.7335
+53,278,23.9183333333333
+53,279,26.5218333333333
+53,280,26.543
+53,281,24.9131666666667
+53,282,30.7128333333333
+53,283,26.9451666666667
+53,284,21.1243333333333
+53,285,24.9978333333333
+53,286,23.5585
+53,287,22.3943333333333
+53,288,31.1996666666667
+53,289,26.416
+53,290,24.5956666666667
+53,291,26.6911666666667
+53,292,26.1196666666667
+53,293,24.4686666666667
+53,294,26.0773333333333
+53,295,24.003
+53,296,25.8233333333333
+53,297,28.702
+53,298,27.4743333333333
+53,299,30.6705
+53,300,22.3731666666667
+53,301,28.0881666666667
+53,302,27.94
+53,303,23.6008333333333
+53,304,22.5001666666667
+53,305,27.8553333333333
+53,306,32.7236666666667
+53,307,21.7593333333333
+53,308,26.543
+53,309,24.765
+53,310,32.7871666666667
+53,311,24.7015
+53,312,28.7655
+53,313,28.6173333333333
+53,314,25.8868333333333
+53,315,24.9131666666667
+53,316,25.9715
+53,317,22.7118333333333
+53,318,26.1831666666667
+53,319,26.9663333333333
+53,320,23.2833333333333
+53,321,32.004
+53,322,25.7175
+53,323,24.765
+53,324,23.0716666666667
+53,325,26.4371666666667
+53,326,25.8233333333333
+53,327,24.8285
+53,328,24.9978333333333
+53,329,26.2466666666667
+53,330,27.7283333333333
+53,331,21.8651666666667
+53,332,31.0726666666667
+53,333,26.543
+53,334,26.8181666666667
+53,335,31.0515
+53,336,28.9983333333333
+53,337,25.0613333333333
+53,338,30.1413333333333
+53,339,27.3896666666667
+53,340,24.8285
+53,341,23.5373333333333
+53,342,22.7541666666667
+53,343,22.6695
+53,344,26.5006666666667
+53,345,23.9606666666667
+53,346,26.5006666666667
+53,347,28.067
+53,348,25.8233333333333
+53,349,26.3313333333333
+53,350,30.099
+53,351,26.162
+53,352,27.8341666666667
+53,353,24.003
+53,354,27.051
+53,355,31.1573333333333
+53,356,26.6065
+53,357,30.3318333333333
+53,358,24.7861666666667
+53,359,24.2993333333333
+53,360,30.9456666666667
+53,361,25.5058333333333
+53,362,28.7443333333333
+53,363,21.5053333333333
+53,364,27.2838333333333
+53,365,22.5001666666667
+53,366,26.6911666666667
+53,367,22.9658333333333
+53,368,29.8873333333333
+53,369,29.4005
+53,370,25.273
+53,371,28.194
+53,372,23.5585
+53,373,22.6271666666667
+53,374,29.972
+53,375,26.8816666666667
+53,376,26.8605
+53,377,27.0933333333333
+53,378,27.4955
+53,379,24.13
+53,380,28.4056666666667
+53,381,28.321
+53,382,27.305
+53,383,30.0778333333333
+53,384,25.9291666666667
+53,385,26.4795
+53,386,33.3163333333333
+53,387,30.6705
+53,388,31.4536666666667
+53,389,23.4738333333333
+53,390,27.4108333333333
+53,391,25.8233333333333
+53,392,30.607
+53,393,24.2993333333333
+53,394,30.3318333333333
+53,395,31.2208333333333
+53,396,21.4206666666667
+53,397,31.0938333333333
+53,398,30.2683333333333
+53,399,29.083
+53,400,30.8821666666667
+53,401,26.8181666666667
+53,402,26.5218333333333
+53,403,24.638
+53,404,23.3256666666667
+53,405,26.5853333333333
+53,406,26.8393333333333
+53,407,26.3525
+53,408,24.8496666666667
+53,409,28.8501666666667
+53,410,31.4113333333333
+53,411,26.5218333333333
+53,412,24.7226666666667
+53,413,27.2415
+53,414,29.845
+53,415,27.432
+53,416,23.6855
+53,417,24.765
+53,418,26.3948333333333
+53,419,29.718
+53,420,23.6855
+53,421,27.3473333333333
+53,422,22.86
+53,423,22.3943333333333
+53,424,24.8285
+53,425,26.1408333333333
+53,426,24.4686666666667
+53,427,27.305
+53,428,22.0556666666667
+53,429,25.9291666666667
+53,430,24.5321666666667
+53,431,23.4103333333333
+53,432,26.3736666666667
+53,433,25.2095
+53,434,24.13
+53,435,21.9921666666667
+53,436,27.559
+53,437,22.3943333333333
+53,438,23.9818333333333
+53,439,24.4898333333333
+53,440,24.892
+53,441,28.702
+53,442,25.4846666666667
+53,443,24.9978333333333
+53,444,18.6478333333333
+53,445,25.4423333333333
+53,446,28.6596666666667
+53,447,24.0453333333333
+53,448,29.1676666666667
+53,449,25.019
+53,450,25.2306666666667
+53,451,27.2203333333333
+53,452,24.892
+53,453,22.2673333333333
+53,454,26.1196666666667
+53,455,24.384
+53,456,28.5961666666667
+53,457,24.2781666666667
+53,458,30.9456666666667
+53,459,29.0195
+53,460,26.6276666666667
+53,461,21.463
+53,462,29.591
+53,463,21.6535
+53,464,26.5006666666667
+53,465,32.3426666666667
+53,466,27.6436666666667
+53,467,25.0401666666667
+53,468,26.0138333333333
+53,469,20.5105
+53,470,22.225
+53,471,26.2466666666667
+53,472,23.7066666666667
+53,473,26.5006666666667
+53,474,24.0453333333333
+53,475,25.5693333333333
+53,476,22.7118333333333
+53,477,30.2683333333333
+53,478,28.829
+53,479,24.003
+53,480,26.6276666666667
+53,481,21.7593333333333
+53,482,28.194
+53,483,27.1568333333333
+53,484,23.9818333333333
+53,485,25.527
+53,486,25.6328333333333
+53,487,22.8811666666667
+53,488,29.1676666666667
+53,489,24.13
+53,490,25.1036666666667
+53,491,25.3788333333333
+53,492,25.4423333333333
+53,493,26.3101666666667
+53,494,25.4846666666667
+53,495,23.622
+53,496,25.7175
+53,497,29.2523333333333
+53,498,27.7495
+53,499,24.1723333333333
+53,500,25.0401666666667
+53,501,28.5115
+53,502,24.5533333333333
+53,503,27.305
+53,504,30.607
+53,505,24.6803333333333
+53,506,26.7123333333333
+53,507,23.3256666666667
+53,508,24.6803333333333
+53,509,24.9978333333333
+53,510,31.0938333333333
+53,511,24.4686666666667
+53,512,27.3896666666667
+53,513,23.241
+53,514,29.591
+53,515,23.876
+53,516,29.0406666666667
+53,517,26.0561666666667
+53,518,24.6803333333333
+53,519,28.4268333333333
+53,520,28.1516666666667
+53,521,28.5961666666667
+53,522,26.289
+53,523,28.3421666666667
+53,524,28.575
+53,525,26.9451666666667
+53,526,27.3685
+53,527,28.6173333333333
+53,528,29.1676666666667
+53,529,24.511
+53,530,33.1893333333333
+53,531,21.7593333333333
+53,532,29.2523333333333
+53,533,29.0618333333333
+53,534,24.4263333333333
+53,535,25.9503333333333
+53,536,25.2941666666667
+53,537,22.3943333333333
+53,538,22.0556666666667
+53,539,29.2946666666667
+53,540,23.6431666666667
+53,541,29.337
+53,542,25.0613333333333
+53,543,26.0138333333333
+53,544,24.511
+53,545,32.8083333333333
+53,546,25.8656666666667
+53,547,24.765
+53,548,23.3468333333333
+53,549,26.2255
+53,550,28.5538333333333
+53,551,24.5956666666667
+53,552,25.6751666666667
+53,553,28.0458333333333
+53,554,25.5693333333333
+53,555,21.0396666666667
+53,556,26.7546666666667
+53,557,29.2946666666667
+53,558,26.8393333333333
+53,559,28.3421666666667
+53,560,27.6013333333333
+53,561,24.9766666666667
+53,562,22.1191666666667
+53,563,24.0453333333333
+53,564,28.7866666666667
+53,565,25.6328333333333
+53,566,29.2946666666667
+53,567,23.4738333333333
+53,568,22.4578333333333
+53,569,28.1093333333333
+53,570,22.6906666666667
+53,571,28.2363333333333
+53,572,25.1036666666667
+53,573,25.8021666666667
+53,574,26.3525
+53,575,21.209
+53,576,25.4635
+53,577,24.384
+53,578,23.1351666666667
+53,579,27.432
+53,580,29.6333333333333
+53,581,27.0086666666667
+53,582,26.6488333333333
+53,583,29.3158333333333
+53,584,22.3096666666667
+53,585,24.3205
+53,586,23.5161666666667
+53,587,33.8031666666667
+53,588,27.305
+53,589,34.29
+53,590,28.4268333333333
+53,591,28.8713333333333
+53,592,23.5585
+53,593,23.0293333333333
+53,594,31.9828333333333
+53,595,24.8496666666667
+53,596,24.9343333333333
+53,597,28.2786666666667
+53,598,22.3731666666667
+53,599,24.1935
+53,600,30.1625
+53,601,24.8285
+53,602,28.5961666666667
+53,603,27.686
+53,604,26.0138333333333
+53,605,28.1516666666667
+53,606,28.3633333333333
+53,607,27.0933333333333
+53,608,23.8336666666667
+53,609,29.972
+53,610,30.3953333333333
+53,611,25.4211666666667
+53,612,22.86
+53,613,24.1935
+53,614,25.3576666666667
+53,615,26.0985
+53,616,26.5006666666667
+53,617,22.0556666666667
+53,618,23.5373333333333
+53,619,29.1676666666667
+53,620,30.4588333333333
+53,621,24.4475
+53,622,26.6276666666667
+53,623,26.2466666666667
+53,624,24.257
+53,625,27.6648333333333
+53,626,26.543
+53,627,28.1516666666667
+53,628,21.8228333333333
+53,629,27.3261666666667
+53,630,25.2095
+53,631,23.3468333333333
+53,632,26.3101666666667
+53,633,24.1511666666667
+53,634,27.94
+53,635,21.0608333333333
+53,636,24.6591666666667
+53,637,28.5115
+53,638,29.8873333333333
+53,639,20.828
+53,640,25.9926666666667
+53,641,27.559
+53,642,24.765
+53,643,29.464
+53,644,32.8718333333333
+53,645,25.8656666666667
+53,646,24.638
+53,647,24.3416666666667
+53,648,28.4056666666667
+53,649,21.0396666666667
+53,650,30.4588333333333
+53,651,24.638
+53,652,27.5166666666667
+53,653,26.1408333333333
+53,654,24.0876666666667
+53,655,27.6436666666667
+53,656,21.8863333333333
+53,657,30.3106666666667
+53,658,28.702
+53,659,26.5641666666667
+53,660,31.1996666666667
+53,661,29.3158333333333
+53,662,23.8125
+53,663,24.4051666666667
+53,664,28.0035
+53,665,23.876
+53,666,28.6596666666667
+53,667,26.5218333333333
+53,668,28.2363333333333
+53,669,21.082
+53,670,26.8605
+53,671,26.7546666666667
+53,672,21.9921666666667
+53,673,30.9245
+53,674,25.7175
+53,675,28.5326666666667
+53,676,21.1666666666667
+53,677,25.146
+53,678,24.7861666666667
+53,679,25.8233333333333
+53,680,30.353
+53,681,25.8868333333333
+53,682,24.384
+53,683,21.209
+53,684,26.8393333333333
+53,685,25.4211666666667
+53,686,26.6911666666667
+53,687,29.5063333333333
+53,688,26.8816666666667
+53,689,20.7433333333333
+53,690,29.0406666666667
+53,691,28.8501666666667
+53,692,28.5115
+53,693,26.035
+53,694,30.1413333333333
+53,695,26.4795
+53,696,26.416
+53,697,28.448
+53,698,27.2626666666667
+53,699,27.3896666666667
+53,700,25.9291666666667
+53,701,23.3468333333333
+53,702,23.114
+53,703,27.4955
+53,704,27.4108333333333
+53,705,30.9033333333333
+53,706,27.2203333333333
+53,707,18.4996666666667
+53,708,27.7283333333333
+53,709,29.4428333333333
+53,710,26.9028333333333
+53,711,26.9875
+53,712,27.686
+53,713,26.8816666666667
+53,714,22.6271666666667
+53,715,23.9606666666667
+53,716,28.3633333333333
+53,717,23.6643333333333
+53,718,23.4103333333333
+53,719,22.733
+53,720,25.2095
+53,721,25.6328333333333
+53,722,29.9296666666667
+53,723,29.5698333333333
+53,724,30.1201666666667
+53,725,25.654
+53,726,28.6385
+53,727,25.8233333333333
+53,728,28.4691666666667
+53,729,29.972
+53,730,27.1356666666667
+53,731,25.2306666666667
+53,732,22.9235
+53,733,20.5528333333333
+53,734,25.4635
+53,735,24.1723333333333
+53,736,22.2673333333333
+53,737,24.0241666666667
+53,738,26.035
+53,739,27.305
+53,740,32.258
+53,741,25.5058333333333
+53,742,24.9131666666667
+53,743,28.6385
+53,744,23.0505
+53,745,23.7066666666667
+53,746,24.4898333333333
+53,747,25.3153333333333
+53,748,32.5966666666667
+53,749,29.8873333333333
+53,750,24.6168333333333
+53,751,31.1996666666667
+53,752,26.3525
+53,753,28.0881666666667
+53,754,29.3158333333333
+53,755,27.5378333333333
+53,756,27.6013333333333
+53,757,25.6116666666667
+53,758,23.7278333333333
+53,759,28.7866666666667
+53,760,28.829
+53,761,27.2203333333333
+53,762,26.9663333333333
+53,763,27.1145
+53,764,22.7753333333333
+53,765,27.0086666666667
+53,766,22.8176666666667
+53,767,26.797
+53,768,28.321
+53,769,27.9823333333333
+53,770,22.1615
+53,771,26.0985
+53,772,29.2311666666667
+53,773,30.9456666666667
+53,774,27.7706666666667
+53,775,26.7546666666667
+53,776,27.8765
+53,777,28.321
+53,778,27.7706666666667
+53,779,26.6488333333333
+53,780,25.7175
+53,781,27.3896666666667
+53,782,22.6271666666667
+53,783,31.4113333333333
+53,784,26.924
+53,785,26.162
+53,786,24.2146666666667
+53,787,22.1403333333333
+53,788,21.9075
+53,789,26.289
+53,790,24.4263333333333
+53,791,19.4098333333333
+53,792,22.9023333333333
+53,793,23.4526666666667
+53,794,24.9766666666667
+53,795,22.3943333333333
+53,796,23.622
+53,797,26.035
+53,798,23.3891666666667
+53,799,26.9663333333333
+53,800,24.8285
+53,801,28.1728333333333
+53,802,29.2311666666667
+53,803,28.0458333333333
+53,804,22.3308333333333
+53,805,24.13
+53,806,25.908
+53,807,24.9766666666667
+53,808,24.7226666666667
+53,809,24.5321666666667
+53,810,27.8976666666667
+53,811,23.749
+53,812,27.2838333333333
+53,813,25.2306666666667
+53,814,24.0665
+53,815,30.0778333333333
+53,816,24.9555
+53,817,19.685
+53,818,26.3313333333333
+53,819,25.6328333333333
+53,820,22.8811666666667
+53,821,21.717
+53,822,23.9395
+53,823,23.2833333333333
+53,824,26.416
+53,825,26.9663333333333
+53,826,22.2461666666667
+53,827,24.4686666666667
+53,828,29.4005
+53,829,27.2415
+53,830,28.5326666666667
+53,831,28.194
+53,832,27.3473333333333
+53,833,27.6013333333333
+53,834,27.1991666666667
+53,835,22.5425
+53,836,26.2043333333333
+53,837,30.7551666666667
+53,838,25.5905
+53,839,24.9978333333333
+53,840,24.003
+53,841,30.2048333333333
+53,842,26.4371666666667
+53,843,23.8548333333333
+53,844,25.7598333333333
+53,845,21.9286666666667
+53,846,29.21
+53,847,20.6375
+53,848,20.8491666666667
+53,849,24.2781666666667
+53,850,25.0401666666667
+53,851,27.1356666666667
+53,852,24.1088333333333
+53,853,32.4273333333333
+53,854,25.8868333333333
+53,855,25.8233333333333
+53,856,22.9446666666667
+53,857,26.8816666666667
+53,858,23.7701666666667
+53,859,27.8553333333333
+53,860,22.1826666666667
+53,861,26.3525
+53,862,22.3731666666667
+53,863,27.178
+53,864,28.2575
+53,865,22.7541666666667
+53,866,26.0561666666667
+53,867,24.257
+53,868,26.5641666666667
+53,869,22.4366666666667
+53,870,23.9183333333333
+53,871,27.3261666666667
+53,872,24.6168333333333
+53,873,29.8873333333333
+53,874,22.6271666666667
+53,875,21.0185
+53,876,23.1351666666667
+53,877,26.9451666666667
+53,878,28.829
+53,879,20.2776666666667
+53,880,27.1356666666667
+53,881,30.7551666666667
+53,882,27.94
+53,883,24.2358333333333
+53,884,28.8713333333333
+53,885,26.3313333333333
+53,886,26.3101666666667
+53,887,23.6431666666667
+53,888,24.4898333333333
+53,889,29.4005
+53,890,25.5058333333333
+53,891,29.6545
+53,892,26.5218333333333
+53,893,30.9456666666667
+53,894,25.7386666666667
+53,895,24.2358333333333
+53,896,23.1563333333333
+53,897,29.972
+53,898,26.7123333333333
+53,899,25.908
+53,900,27.3685
+53,901,23.3256666666667
+53,902,33.3586666666667
+53,903,22.5213333333333
+53,904,28.0881666666667
+53,905,27.1356666666667
+53,906,30.1625
+53,907,27.8553333333333
+53,908,22.098
+53,909,25.6116666666667
+53,910,24.9343333333333
+53,911,27.3261666666667
+53,912,24.8708333333333
+53,913,31.0726666666667
+53,914,24.6591666666667
+53,915,27.2626666666667
+53,916,26.7335
+53,917,29.1465
+53,918,21.5476666666667
+53,919,28.4268333333333
+53,920,27.8976666666667
+53,921,20.0025
+53,922,27.7283333333333
+53,923,27.4743333333333
+53,924,21.1031666666667
+53,925,29.4216666666667
+53,926,24.8073333333333
+53,927,27.1991666666667
+53,928,25.8233333333333
+53,929,27.9823333333333
+53,930,23.3256666666667
+53,931,23.5796666666667
+53,932,25.7386666666667
+53,933,27.178
+53,934,26.67
+53,935,30.9668333333333
+53,936,31.3901666666667
+53,937,25.2095
+53,938,27.051
+53,939,26.543
+53,940,20.8915
+53,941,28.575
+53,942,27.6648333333333
+53,943,33.0623333333333
+53,944,26.5641666666667
+53,945,26.3313333333333
+53,946,22.8176666666667
+53,947,26.0985
+53,948,22.8176666666667
+53,949,26.3313333333333
+53,950,28.8925
+53,951,25.5481666666667
+53,952,26.035
+53,953,28.9771666666667
+53,954,27.3473333333333
+53,955,22.5213333333333
+53,956,24.638
+53,957,26.543
+53,958,21.8651666666667
+53,959,22.0133333333333
+53,960,26.1408333333333
+53,961,20.828
+53,962,22.7118333333333
+53,963,26.7335
+53,964,20.574
+53,965,23.6855
+53,966,26.9663333333333
+53,967,27.7706666666667
+53,968,20.7856666666667
+53,969,27.9611666666667
+53,970,27.3261666666667
+53,971,26.1196666666667
+53,972,27.94
+53,973,27.1145
+53,974,27.559
+53,975,22.9446666666667
+53,976,27.2415
+53,977,24.003
+53,978,19.558
+53,979,19.8966666666667
+53,980,26.162
+53,981,24.765
+53,982,26.3101666666667
+53,983,24.257
+53,984,29.7391666666667
+53,985,28.7866666666667
+53,986,22.7965
+53,987,20.701
+53,988,24.4051666666667
+53,989,24.6591666666667
+53,990,23.4315
+53,991,22.9023333333333
+53,992,28.9983333333333
+53,993,32.9353333333333
+53,994,25.5481666666667
+53,995,23.7278333333333
+53,996,30.734
+53,997,26.543
+53,998,27.0933333333333
+53,999,27.8553333333333
+53,1000,28.3845
+54,1,36.1315
+54,2,26.3525
+54,3,30.7128333333333
+54,4,33.2528333333333
+54,5,32.8506666666667
+54,6,28.1305
+54,7,33.1046666666667
+54,8,30.2683333333333
+54,9,32.4696666666667
+54,10,31.8981666666667
+54,11,27.0298333333333
+54,12,27.6013333333333
+54,13,26.67
+54,14,33.8243333333333
+54,15,24.8073333333333
+54,16,29.6968333333333
+54,17,26.7758333333333
+54,18,26.7546666666667
+54,19,31.9616666666667
+54,20,30.6705
+54,21,24.8073333333333
+54,22,29.4216666666667
+54,23,32.9565
+54,24,29.2946666666667
+54,25,26.1831666666667
+54,26,28.5538333333333
+54,27,31.242
+54,28,30.6281666666667
+54,29,25.6751666666667
+54,30,28.9136666666667
+54,31,32.6813333333333
+54,32,32.3003333333333
+54,33,30.607
+54,34,26.4583333333333
+54,35,26.0773333333333
+54,36,25.9503333333333
+54,37,27.7918333333333
+54,38,25.7386666666667
+54,39,29.7391666666667
+54,40,22.8176666666667
+54,41,27.432
+54,42,32.1733333333333
+54,43,27.1356666666667
+54,44,24.003
+54,45,23.1563333333333
+54,46,27.051
+54,47,32.7025
+54,48,29.8873333333333
+54,49,34.3958333333333
+54,50,33.8031666666667
+54,51,33.6126666666667
+54,52,31.7288333333333
+54,53,29.4005
+54,54,31.7923333333333
+54,55,32.4696666666667
+54,56,32.5331666666667
+54,57,24.765
+54,58,25.527
+54,59,25.9503333333333
+54,60,32.5543333333333
+54,61,29.4851666666667
+54,62,28.2363333333333
+54,63,28.6596666666667
+54,64,26.6488333333333
+54,65,30.2048333333333
+54,66,25.019
+54,67,25.5693333333333
+54,68,21.6535
+54,69,34.3535
+54,70,21.4418333333333
+54,71,29.6756666666667
+54,72,22.5425
+54,73,34.5016666666667
+54,74,30.9245
+54,75,27.7918333333333
+54,76,29.4216666666667
+54,77,34.3958333333333
+54,78,29.5486666666667
+54,79,29.6968333333333
+54,80,26.035
+54,81,26.6911666666667
+54,82,28.702
+54,83,25.654
+54,84,23.7913333333333
+54,85,29.3581666666667
+54,86,28.3633333333333
+54,87,34.2053333333333
+54,88,34.417
+54,89,26.5218333333333
+54,90,22.9023333333333
+54,91,22.9446666666667
+54,92,26.7758333333333
+54,93,32.7025
+54,94,25.4211666666667
+54,95,35.6658333333333
+54,96,31.2843333333333
+54,97,24.9555
+54,98,29.7815
+54,99,34.0783333333333
+54,100,24.638
+54,101,25.527
+54,102,32.4908333333333
+54,103,26.1831666666667
+54,104,29.464
+54,105,27.6648333333333
+54,106,27.4108333333333
+54,107,30.1625
+54,108,27.3473333333333
+54,109,32.9565
+54,110,25.781
+54,111,30.2048333333333
+54,112,23.7278333333333
+54,113,32.6601666666667
+54,114,29.1888333333333
+54,115,32.5966666666667
+54,116,24.5321666666667
+54,117,27.4108333333333
+54,118,32.3638333333333
+54,119,29.5063333333333
+54,120,28.0881666666667
+54,121,30.4165
+54,122,30.9033333333333
+54,123,30.3741666666667
+54,124,29.4216666666667
+54,125,26.2678333333333
+54,126,35.2848333333333
+54,127,28.3633333333333
+54,128,34.1841666666667
+54,129,27.8341666666667
+54,130,26.3948333333333
+54,131,26.3736666666667
+54,132,32.8718333333333
+54,133,25.9503333333333
+54,134,24.3416666666667
+54,135,28.3845
+54,136,24.8285
+54,137,29.5486666666667
+54,138,34.1841666666667
+54,139,29.1465
+54,140,31.6653333333333
+54,141,29.1041666666667
+54,142,25.2941666666667
+54,143,25.5693333333333
+54,144,24.1723333333333
+54,145,29.5486666666667
+54,146,28.2575
+54,147,26.2466666666667
+54,148,31.8135
+54,149,28.067
+54,150,33.5915
+54,151,24.3205
+54,152,31.623
+54,153,30.607
+54,154,26.0561666666667
+54,155,35.4965
+54,156,30.734
+54,157,32.8718333333333
+54,158,31.9193333333333
+54,159,26.9875
+54,160,28.9983333333333
+54,161,35.6023333333333
+54,162,33.2316666666667
+54,163,32.766
+54,164,30.9668333333333
+54,165,28.6173333333333
+54,166,29.591
+54,167,30.0355
+54,168,29.718
+54,169,22.7541666666667
+54,170,28.9771666666667
+54,171,31.5595
+54,172,29.1041666666667
+54,173,27.1568333333333
+54,174,19.9813333333333
+54,175,26.7335
+54,176,30.353
+54,177,25.6328333333333
+54,178,33.147
+54,179,29.464
+54,180,28.9983333333333
+54,181,32.639
+54,182,25.2941666666667
+54,183,24.7861666666667
+54,184,22.2461666666667
+54,185,32.6178333333333
+54,186,32.0463333333333
+54,187,28.067
+54,188,29.2523333333333
+54,189,25.654
+54,190,30.0778333333333
+54,191,25.9291666666667
+54,192,26.5218333333333
+54,193,32.5543333333333
+54,194,25.6963333333333
+54,195,31.877
+54,196,24.384
+54,197,30.1201666666667
+54,198,25.1248333333333
+54,199,28.4691666666667
+54,200,31.9616666666667
+54,201,31.5171666666667
+54,202,29.8238333333333
+54,203,27.94
+54,204,22.6906666666667
+54,205,32.2156666666667
+54,206,26.6065
+54,207,27.7918333333333
+54,208,32.3426666666667
+54,209,27.2838333333333
+54,210,31.2631666666667
+54,211,20.8703333333333
+54,212,29.8661666666667
+54,213,28.7655
+54,214,27.4531666666667
+54,215,35.2213333333333
+54,216,29.3793333333333
+54,217,33.0411666666667
+54,218,28.448
+54,219,27.6648333333333
+54,220,31.2843333333333
+54,221,27.1145
+54,222,28.1093333333333
+54,223,26.7758333333333
+54,224,30.226
+54,225,23.2621666666667
+54,226,32.3215
+54,227,24.7861666666667
+54,228,30.5646666666667
+54,229,30.734
+54,230,28.5961666666667
+54,231,29.8238333333333
+54,232,27.5801666666667
+54,233,29.5275
+54,234,32.7025
+54,235,30.3953333333333
+54,236,28.2363333333333
+54,237,26.4371666666667
+54,238,24.4051666666667
+54,239,28.575
+54,240,26.7335
+54,241,26.3736666666667
+54,242,28.4056666666667
+54,243,32.4061666666667
+54,244,32.0886666666667
+54,245,26.0138333333333
+54,246,25.3153333333333
+54,247,29.0618333333333
+54,248,28.2151666666667
+54,249,27.6013333333333
+54,250,24.4898333333333
+54,251,24.9131666666667
+54,252,32.0675
+54,253,26.5641666666667
+54,254,27.9188333333333
+54,255,24.2146666666667
+54,256,25.2306666666667
+54,257,32.2791666666667
+54,258,33.2316666666667
+54,259,32.385
+54,260,27.3685
+54,261,31.6018333333333
+54,262,23.7278333333333
+54,263,25.781
+54,264,27.1356666666667
+54,265,32.9988333333333
+54,266,34.3958333333333
+54,267,27.9823333333333
+54,268,27.4743333333333
+54,269,31.75
+54,270,25.0401666666667
+54,271,31.0938333333333
+54,272,30.7128333333333
+54,273,24.6168333333333
+54,274,25.1248333333333
+54,275,32.0675
+54,276,26.8393333333333
+54,277,27.8553333333333
+54,278,23.4526666666667
+54,279,35.687
+54,280,29.972
+54,281,19.2193333333333
+54,282,35.179
+54,283,25.4423333333333
+54,284,18.7748333333333
+54,285,23.0505
+54,286,30.4376666666667
+54,287,29.337
+54,288,30.2895
+54,289,32.6178333333333
+54,290,30.6705
+54,291,23.9395
+54,292,35.7716666666667
+54,293,27.94
+54,294,26.035
+54,295,27.0933333333333
+54,296,29.083
+54,297,30.099
+54,298,22.987
+54,299,25.0401666666667
+54,300,24.2993333333333
+54,301,26.6065
+54,302,26.3736666666667
+54,303,34.9885
+54,304,25.0613333333333
+54,305,27.1568333333333
+54,306,28.2363333333333
+54,307,23.7278333333333
+54,308,26.0561666666667
+54,309,27.3896666666667
+54,310,27.305
+54,311,27.8976666666667
+54,312,29.1253333333333
+54,313,30.1836666666667
+54,314,29.6333333333333
+54,315,26.6488333333333
+54,316,25.9926666666667
+54,317,31.5171666666667
+54,318,25.9926666666667
+54,319,26.9875
+54,320,27.7706666666667
+54,321,31.2843333333333
+54,322,28.0881666666667
+54,323,32.5331666666667
+54,324,26.7123333333333
+54,325,32.9565
+54,326,29.6121666666667
+54,327,28.9348333333333
+54,328,30.9033333333333
+54,329,24.5321666666667
+54,330,30.607
+54,331,28.067
+54,332,28.9136666666667
+54,333,25.781
+54,334,26.416
+54,335,26.8393333333333
+54,336,28.8078333333333
+54,337,33.3375
+54,338,29.1041666666667
+54,339,30.3953333333333
+54,340,33.9725
+54,341,26.0773333333333
+54,342,24.1723333333333
+54,343,25.654
+54,344,28.0246666666667
+54,345,26.7546666666667
+54,346,22.9446666666667
+54,347,32.1945
+54,348,29.3158333333333
+54,349,25.5905
+54,350,24.6591666666667
+54,351,25.9503333333333
+54,352,33.2316666666667
+54,353,25.4
+54,354,30.1836666666667
+54,355,25.4211666666667
+54,356,22.8811666666667
+54,357,31.0303333333333
+54,358,28.6385
+54,359,30.353
+54,360,24.4898333333333
+54,361,27.4108333333333
+54,362,29.845
+54,363,31.5595
+54,364,28.0246666666667
+54,365,26.7123333333333
+54,366,29.464
+54,367,27.0933333333333
+54,368,30.8398333333333
+54,369,30.3318333333333
+54,370,28.7231666666667
+54,371,22.86
+54,372,28.8925
+54,373,26.9663333333333
+54,374,24.8708333333333
+54,375,30.0566666666667
+54,376,32.2368333333333
+54,377,30.3106666666667
+54,378,30.9245
+54,379,28.2575
+54,380,27.3896666666667
+54,381,30.5858333333333
+54,382,29.21
+54,383,32.2156666666667
+54,384,30.3318333333333
+54,385,29.7815
+54,386,30.8186666666667
+54,387,27.94
+54,388,28.1516666666667
+54,389,27.3896666666667
+54,390,30.2683333333333
+54,391,27.686
+54,392,24.0453333333333
+54,393,24.5956666666667
+54,394,28.3633333333333
+54,395,34.29
+54,396,25.146
+54,397,29.3581666666667
+54,398,27.4108333333333
+54,399,30.2683333333333
+54,400,29.1041666666667
+54,401,34.9038333333333
+54,402,26.9451666666667
+54,403,30.6916666666667
+54,404,24.8285
+54,405,25.273
+54,406,26.0985
+54,407,27.178
+54,408,28.067
+54,409,31.8135
+54,410,29.1676666666667
+54,411,29.718
+54,412,31.8135
+54,413,27.0721666666667
+54,414,34.9038333333333
+54,415,27.7071666666667
+54,416,27.9823333333333
+54,417,31.1996666666667
+54,418,30.6705
+54,419,35.6658333333333
+54,420,28.321
+54,421,25.7598333333333
+54,422,26.6911666666667
+54,423,30.3953333333333
+54,424,28.575
+54,425,30.5011666666667
+54,426,28.2575
+54,427,26.8181666666667
+54,428,34.6286666666667
+54,429,28.3845
+54,430,32.6813333333333
+54,431,28.1093333333333
+54,432,29.4005
+54,433,27.2203333333333
+54,434,27.9823333333333
+54,435,31.75
+54,436,36.5548333333333
+54,437,28.7655
+54,438,35.1155
+54,439,29.4428333333333
+54,440,29.9296666666667
+54,441,26.2678333333333
+54,442,26.8605
+54,443,33.7185
+54,444,28.4691666666667
+54,445,27.9823333333333
+54,446,29.845
+54,447,25.146
+54,448,26.0773333333333
+54,449,25.1248333333333
+54,450,28.3633333333333
+54,451,28.6385
+54,452,29.9508333333333
+54,453,34.1841666666667
+54,454,29.6756666666667
+54,455,27.051
+54,456,28.194
+54,457,29.083
+54,458,29.3581666666667
+54,459,27.0298333333333
+54,460,25.8445
+54,461,31.5806666666667
+54,462,25.9926666666667
+54,463,32.8083333333333
+54,464,35.4965
+54,465,26.1408333333333
+54,466,33.528
+54,467,26.2466666666667
+54,468,25.527
+54,469,26.416
+54,470,29.9931666666667
+54,471,29.6545
+54,472,28.2151666666667
+54,473,27.8553333333333
+54,474,26.5006666666667
+54,475,22.8176666666667
+54,476,31.8981666666667
+54,477,33.1893333333333
+54,478,30.4376666666667
+54,479,27.1568333333333
+54,480,32.1733333333333
+54,481,28.3633333333333
+54,482,29.9296666666667
+54,483,30.5858333333333
+54,484,33.1893333333333
+54,485,26.1831666666667
+54,486,25.0613333333333
+54,487,32.7236666666667
+54,488,29.2311666666667
+54,489,29.2946666666667
+54,490,25.4211666666667
+54,491,22.86
+54,492,24.9766666666667
+54,493,35.052
+54,494,34.0571666666667
+54,495,36.5125
+54,496,35.433
+54,497,30.5011666666667
+54,498,30.1836666666667
+54,499,32.7448333333333
+54,500,28.956
+54,501,29.1041666666667
+54,502,26.3948333333333
+54,503,24.5745
+54,504,35.0096666666667
+54,505,34.3958333333333
+54,506,27.3685
+54,507,25.5905
+54,508,27.1145
+54,509,35.433
+54,510,29.2735
+54,511,31.0091666666667
+54,512,24.5533333333333
+54,513,26.8181666666667
+54,514,31.9828333333333
+54,515,21.1243333333333
+54,516,31.1785
+54,517,32.4273333333333
+54,518,26.6276666666667
+54,519,24.6803333333333
+54,520,26.9028333333333
+54,521,30.8821666666667
+54,522,31.3901666666667
+54,523,30.1836666666667
+54,524,29.2311666666667
+54,525,26.6488333333333
+54,526,28.8078333333333
+54,527,31.1996666666667
+54,528,28.8078333333333
+54,529,27.4955
+54,530,28.2786666666667
+54,531,29.3158333333333
+54,532,29.9085
+54,533,26.5006666666667
+54,534,34.671
+54,535,22.5636666666667
+54,536,27.2415
+54,537,27.3261666666667
+54,538,25.3365
+54,539,31.623
+54,540,31.2208333333333
+54,541,30.8186666666667
+54,542,26.67
+54,543,28.194
+54,544,23.622
+54,545,31.6018333333333
+54,546,27.1145
+54,547,26.7123333333333
+54,548,23.5796666666667
+54,549,30.0143333333333
+54,550,38.7561666666667
+54,551,30.3318333333333
+54,552,28.5538333333333
+54,553,23.9183333333333
+54,554,29.4851666666667
+54,555,29.4428333333333
+54,556,23.4526666666667
+54,557,30.4165
+54,558,28.0458333333333
+54,559,28.8713333333333
+54,560,23.9818333333333
+54,561,26.3525
+54,562,30.607
+54,563,30.3106666666667
+54,564,32.131
+54,565,28.7443333333333
+54,566,24.511
+54,567,23.7701666666667
+54,568,28.6596666666667
+54,569,27.3473333333333
+54,570,30.5435
+54,571,28.194
+54,572,32.1733333333333
+54,573,24.8708333333333
+54,574,23.6855
+54,575,30.2683333333333
+54,576,28.8501666666667
+54,577,26.035
+54,578,28.4691666666667
+54,579,27.2626666666667
+54,580,28.9983333333333
+54,581,37.1263333333333
+54,582,27.686
+54,583,24.765
+54,584,29.5486666666667
+54,585,33.782
+54,586,26.8181666666667
+54,587,23.622
+54,588,33.7608333333333
+54,589,27.5166666666667
+54,590,28.6596666666667
+54,591,33.6338333333333
+54,592,24.5745
+54,593,33.0835
+54,594,26.9875
+54,595,29.1253333333333
+54,596,30.7551666666667
+54,597,28.6808333333333
+54,598,26.3525
+54,599,23.1351666666667
+54,600,23.6008333333333
+54,601,33.3798333333333
+54,602,27.6225
+54,603,30.3318333333333
+54,604,26.162
+54,605,26.1408333333333
+54,606,29.083
+54,607,33.274
+54,608,28.1093333333333
+54,609,29.3581666666667
+54,610,27.1568333333333
+54,611,25.0401666666667
+54,612,28.7231666666667
+54,613,30.6281666666667
+54,614,31.8981666666667
+54,615,29.7815
+54,616,35.2213333333333
+54,617,28.9136666666667
+54,618,25.7598333333333
+54,619,30.1625
+54,620,25.4
+54,621,31.5595
+54,622,25.527
+54,623,23.8971666666667
+54,624,32.5755
+54,625,28.575
+54,626,34.1206666666667
+54,627,34.9673333333333
+54,628,30.8398333333333
+54,629,33.6126666666667
+54,630,27.2415
+54,631,28.9348333333333
+54,632,25.4846666666667
+54,633,31.7076666666667
+54,634,33.5491666666667
+54,635,25.2095
+54,636,29.718
+54,637,25.3153333333333
+54,638,28.6173333333333
+54,639,28.2575
+54,640,27.7283333333333
+54,641,28.4056666666667
+54,642,31.0938333333333
+54,643,24.5956666666667
+54,644,27.9823333333333
+54,645,22.3096666666667
+54,646,35.7928333333333
+54,647,26.8181666666667
+54,648,31.3055
+54,649,31.5383333333333
+54,650,28.575
+54,651,25.7175
+54,652,30.1836666666667
+54,653,36.576
+54,654,33.3375
+54,655,28.1093333333333
+54,656,21.717
+54,657,33.8455
+54,658,23.114
+54,659,29.8238333333333
+54,660,28.194
+54,661,28.9983333333333
+54,662,30.4165
+54,663,32.5543333333333
+54,664,25.4635
+54,665,25.9291666666667
+54,666,29.4216666666667
+54,667,28.067
+54,668,26.1196666666667
+54,669,31.8558333333333
+54,670,32.4485
+54,671,33.4856666666667
+54,672,30.5858333333333
+54,673,33.3375
+54,674,31.1996666666667
+54,675,22.8388333333333
+54,676,26.4371666666667
+54,677,29.083
+54,678,30.9456666666667
+54,679,27.6013333333333
+54,680,31.9193333333333
+54,681,26.3101666666667
+54,682,29.6545
+54,683,30.226
+54,684,32.1945
+54,685,33.8666666666667
+54,686,26.1831666666667
+54,687,32.4273333333333
+54,688,27.2838333333333
+54,689,26.5853333333333
+54,690,29.1465
+54,691,30.0778333333333
+54,692,28.5115
+54,693,28.575
+54,694,28.575
+54,695,28.8713333333333
+54,696,26.8181666666667
+54,697,30.8821666666667
+54,698,32.512
+54,699,31.1573333333333
+54,700,26.1408333333333
+54,701,26.4795
+54,702,25.781
+54,703,29.6121666666667
+54,704,24.7226666666667
+54,705,27.432
+54,706,26.0561666666667
+54,707,26.4371666666667
+54,708,28.5115
+54,709,35.0943333333333
+54,710,21.844
+54,711,29.7603333333333
+54,712,27.559
+54,713,30.3953333333333
+54,714,25.8868333333333
+54,715,26.2255
+54,716,28.8078333333333
+54,717,23.114
+54,718,32.131
+54,719,25.4
+54,720,34.5016666666667
+54,721,26.67
+54,722,30.5011666666667
+54,723,26.4371666666667
+54,724,30.6916666666667
+54,725,28.5961666666667
+54,726,30.5435
+54,727,29.4428333333333
+54,728,31.6865
+54,729,33.0835
+54,730,32.8083333333333
+54,731,28.2998333333333
+54,732,33.4433333333333
+54,733,29.6121666666667
+54,734,33.3375
+54,735,32.7448333333333
+54,736,27.1145
+54,737,28.2363333333333
+54,738,29.4216666666667
+54,739,24.4898333333333
+54,740,27.3261666666667
+54,741,28.6173333333333
+54,742,27.94
+54,743,24.1723333333333
+54,744,31.1573333333333
+54,745,29.8873333333333
+54,746,32.1945
+54,747,27.0933333333333
+54,748,22.9446666666667
+54,749,25.1671666666667
+54,750,22.3308333333333
+54,751,22.7753333333333
+54,752,32.004
+54,753,26.416
+54,754,28.8925
+54,755,30.8398333333333
+54,756,28.4056666666667
+54,757,26.4795
+54,758,29.8661666666667
+54,759,27.3261666666667
+54,760,24.8073333333333
+54,761,35.7505
+54,762,28.1093333333333
+54,763,30.0778333333333
+54,764,27.8765
+54,765,28.4903333333333
+54,766,23.7066666666667
+54,767,26.1831666666667
+54,768,32.5543333333333
+54,769,30.4376666666667
+54,770,31.1361666666667
+54,771,26.5006666666667
+54,772,28.2998333333333
+54,773,20.4046666666667
+54,774,33.6973333333333
+54,775,28.4056666666667
+54,776,29.6545
+54,777,33.1046666666667
+54,778,28.2363333333333
+54,779,26.416
+54,780,28.7231666666667
+54,781,23.9183333333333
+54,782,27.305
+54,783,31.3478333333333
+54,784,26.3948333333333
+54,785,28.0246666666667
+54,786,32.004
+54,787,28.829
+54,788,35.6023333333333
+54,789,28.956
+54,790,31.0091666666667
+54,791,31.115
+54,792,30.9033333333333
+54,793,22.7965
+54,794,27.2838333333333
+54,795,28.7655
+54,796,30.9668333333333
+54,797,28.1093333333333
+54,798,25.273
+54,799,25.1883333333333
+54,800,31.242
+54,801,28.7866666666667
+54,802,27.6013333333333
+54,803,27.0933333333333
+54,804,25.781
+54,805,27.7706666666667
+54,806,30.0778333333333
+54,807,28.1093333333333
+54,808,32.7448333333333
+54,809,25.7175
+54,810,29.9085
+54,811,29.4005
+54,812,30.6493333333333
+54,813,28.7443333333333
+54,814,31.5383333333333
+54,815,24.9555
+54,816,28.6596666666667
+54,817,19.939
+54,818,30.6916666666667
+54,819,30.4165
+54,820,33.8031666666667
+54,821,36.4278333333333
+54,822,26.4795
+54,823,28.0246666666667
+54,824,28.2151666666667
+54,825,26.543
+54,826,22.86
+54,827,30.4165
+54,828,31.2631666666667
+54,829,27.686
+54,830,26.7335
+54,831,26.8393333333333
+54,832,27.051
+54,833,31.115
+54,834,23.0081666666667
+54,835,29.6545
+54,836,32.4908333333333
+54,837,26.0985
+54,838,30.6493333333333
+54,839,27.4108333333333
+54,840,30.0143333333333
+54,841,33.528
+54,842,29.5063333333333
+54,843,26.8605
+54,844,28.5538333333333
+54,845,24.8073333333333
+54,846,29.464
+54,847,26.5641666666667
+54,848,31.8558333333333
+54,849,33.4221666666667
+54,850,27.0721666666667
+54,851,29.6545
+54,852,26.162
+54,853,29.3793333333333
+54,854,30.1413333333333
+54,855,25.8445
+54,856,30.5858333333333
+54,857,31.0938333333333
+54,858,24.1723333333333
+54,859,31.7076666666667
+54,860,30.1625
+54,861,23.4315
+54,862,29.5275
+54,863,29.8661666666667
+54,864,27.7706666666667
+54,865,28.7866666666667
+54,866,29.0618333333333
+54,867,29.1888333333333
+54,868,30.5435
+54,869,23.9183333333333
+54,870,29.8238333333333
+54,871,24.5321666666667
+54,872,29.1041666666667
+54,873,32.9776666666667
+54,874,22.9235
+54,875,28.702
+54,876,30.4376666666667
+54,877,28.9136666666667
+54,878,26.3948333333333
+54,879,20.6798333333333
+54,880,30.4376666666667
+54,881,29.6333333333333
+54,882,27.3473333333333
+54,883,28.2575
+54,884,31.496
+54,885,22.9023333333333
+54,886,27.0298333333333
+54,887,30.5435
+54,888,25.654
+54,889,27.2626666666667
+54,890,28.194
+54,891,25.2306666666667
+54,892,25.4635
+54,893,31.2631666666667
+54,894,28.3421666666667
+54,895,31.9616666666667
+54,896,27.0721666666667
+54,897,27.4743333333333
+54,898,38.4175
+54,899,29.1041666666667
+54,900,26.9028333333333
+54,901,30.2683333333333
+54,902,27.6225
+54,903,29.6756666666667
+54,904,35.2213333333333
+54,905,33.0623333333333
+54,906,29.3158333333333
+54,907,24.3205
+54,908,28.5326666666667
+54,909,33.8878333333333
+54,910,23.4315
+54,911,25.4
+54,912,29.1465
+54,913,33.6126666666667
+54,914,25.6751666666667
+54,915,30.4376666666667
+54,916,30.861
+54,917,30.6705
+54,918,20.1718333333333
+54,919,23.2833333333333
+54,920,34.544
+54,921,29.845
+54,922,30.4588333333333
+54,923,30.7763333333333
+54,924,28.8713333333333
+54,925,28.5326666666667
+54,926,29.0406666666667
+54,927,28.2151666666667
+54,928,30.3318333333333
+54,929,30.7975
+54,930,31.3478333333333
+54,931,32.258
+54,932,29.3158333333333
+54,933,28.1305
+54,934,30.7128333333333
+54,935,29.083
+54,936,33.6126666666667
+54,937,26.0985
+54,938,30.5223333333333
+54,939,26.543
+54,940,30.7975
+54,941,32.8295
+54,942,27.5801666666667
+54,943,37.1898333333333
+54,944,29.0406666666667
+54,945,22.8176666666667
+54,946,30.4376666666667
+54,947,21.717
+54,948,27.7283333333333
+54,949,29.6968333333333
+54,950,27.0086666666667
+54,951,28.6808333333333
+54,952,24.765
+54,953,22.9023333333333
+54,954,29.1465
+54,955,30.7975
+54,956,25.9291666666667
+54,957,31.9616666666667
+54,958,33.8666666666667
+54,959,27.178
+54,960,30.3106666666667
+54,961,23.7913333333333
+54,962,30.3106666666667
+54,963,23.0716666666667
+54,964,31.5806666666667
+54,965,26.2678333333333
+54,966,32.8506666666667
+54,967,26.67
+54,968,29.0406666666667
+54,969,26.7335
+54,970,27.0086666666667
+54,971,31.8135
+54,972,26.543
+54,973,24.5956666666667
+54,974,29.9085
+54,975,27.5166666666667
+54,976,31.5383333333333
+54,977,34.7768333333333
+54,978,31.1573333333333
+54,979,28.1305
+54,980,27.8341666666667
+54,981,28.2575
+54,982,30.8821666666667
+54,983,31.4536666666667
+54,984,28.6596666666667
+54,985,25.527
+54,986,33.5068333333333
+54,987,28.321
+54,988,29.7603333333333
+54,989,27.2626666666667
+54,990,28.4268333333333
+54,991,26.6276666666667
+54,992,27.9823333333333
+54,993,33.9936666666667
+54,994,24.8496666666667
+54,995,28.6596666666667
+54,996,32.3215
+54,997,28.0881666666667
+54,998,32.9141666666667
+54,999,25.6116666666667
+54,1000,32.6813333333333
+55,1,22.9446666666667
+55,2,27.4743333333333
+55,3,28.2786666666667
+55,4,24.003
+55,5,20.3411666666667
+55,6,19.0923333333333
+55,7,23.6643333333333
+55,8,26.3313333333333
+55,9,28.5538333333333
+55,10,23.1563333333333
+55,11,28.575
+55,12,24.5533333333333
+55,13,23.4315
+55,14,25.3153333333333
+55,15,20.1295
+55,16,24.4263333333333
+55,17,26.0138333333333
+55,18,21.6111666666667
+55,19,28.8078333333333
+55,20,29.337
+55,21,19.8543333333333
+55,22,24.003
+55,23,20.8491666666667
+55,24,26.0561666666667
+55,25,26.8181666666667
+55,26,26.8816666666667
+55,27,21.6323333333333
+55,28,23.4315
+55,29,22.9658333333333
+55,30,19.7273333333333
+55,31,23.4738333333333
+55,32,20.0236666666667
+55,33,26.2043333333333
+55,34,28.9983333333333
+55,35,22.5636666666667
+55,36,28.829
+55,37,19.7273333333333
+55,38,23.0928333333333
+55,39,21.6746666666667
+55,40,26.6276666666667
+55,41,25.527
+55,42,27.4108333333333
+55,43,30.2895
+55,44,21.8016666666667
+55,45,22.9023333333333
+55,46,20.1718333333333
+55,47,20.7433333333333
+55,48,26.4371666666667
+55,49,20.8703333333333
+55,50,25.6963333333333
+55,51,22.7753333333333
+55,52,18.796
+55,53,33.1681666666667
+55,54,26.4371666666667
+55,55,24.257
+55,56,22.2673333333333
+55,57,25.8868333333333
+55,58,21.7593333333333
+55,59,16.9333333333333
+55,60,17.1873333333333
+55,61,26.9451666666667
+55,62,19.3463333333333
+55,63,26.416
+55,64,20.0025
+55,65,26.1408333333333
+55,66,27.813
+55,67,22.5848333333333
+55,68,25.9503333333333
+55,69,22.733
+55,70,23.3045
+55,71,33.3163333333333
+55,72,25.9503333333333
+55,73,23.3045
+55,74,25.6963333333333
+55,75,27.2838333333333
+55,76,30.3741666666667
+55,77,27.3473333333333
+55,78,19.3251666666667
+55,79,22.3096666666667
+55,80,20.8703333333333
+55,81,26.3736666666667
+55,82,24.4475
+55,83,24.2781666666667
+55,84,26.543
+55,85,21.5053333333333
+55,86,19.558
+55,87,26.4583333333333
+55,88,20.574
+55,89,22.3943333333333
+55,90,25.4423333333333
+55,91,27.305
+55,92,24.4263333333333
+55,93,30.6705
+55,94,22.0768333333333
+55,95,23.0716666666667
+55,96,30.0355
+55,97,25.3788333333333
+55,98,25.1248333333333
+55,99,26.1831666666667
+55,100,27.1356666666667
+55,101,23.0505
+55,102,27.0298333333333
+55,103,24.7015
+55,104,20.8491666666667
+55,105,23.876
+55,106,22.6483333333333
+55,107,23.2621666666667
+55,108,24.511
+55,109,33.5915
+55,110,26.5006666666667
+55,111,23.3256666666667
+55,112,21.9075
+55,113,28.829
+55,114,28.2575
+55,115,22.3943333333333
+55,116,20.8491666666667
+55,117,25.4423333333333
+55,118,24.1511666666667
+55,119,24.1723333333333
+55,120,24.8496666666667
+55,121,21.2725
+55,122,20.2353333333333
+55,123,25.7175
+55,124,22.733
+55,125,22.6271666666667
+55,126,19.6426666666667
+55,127,26.9028333333333
+55,128,27.1145
+55,129,24.5533333333333
+55,130,27.051
+55,131,18.9653333333333
+55,132,27.3896666666667
+55,133,19.0923333333333
+55,134,24.384
+55,135,27.4531666666667
+55,136,24.8285
+55,137,22.733
+55,138,30.1201666666667
+55,139,25.0613333333333
+55,140,23.0505
+55,141,31.0303333333333
+55,142,28.7866666666667
+55,143,28.9136666666667
+55,144,23.3045
+55,145,22.987
+55,146,28.8501666666667
+55,147,21.6323333333333
+55,148,28.829
+55,149,27.686
+55,150,23.7066666666667
+55,151,18.923
+55,152,28.6808333333333
+55,153,27.559
+55,154,25.3153333333333
+55,155,28.4268333333333
+55,156,22.8811666666667
+55,157,29.1465
+55,158,23.0081666666667
+55,159,22.3731666666667
+55,160,19.8755
+55,161,26.5641666666667
+55,162,21.5476666666667
+55,163,23.4738333333333
+55,164,33.0835
+55,165,30.3741666666667
+55,166,21.9286666666667
+55,167,18.9865
+55,168,22.0345
+55,169,27.8765
+55,170,23.4103333333333
+55,171,30.861
+55,172,23.114
+55,173,22.6483333333333
+55,174,22.3943333333333
+55,175,26.3101666666667
+55,176,25.8656666666667
+55,177,24.0665
+55,178,29.4216666666667
+55,179,21.9286666666667
+55,180,22.8811666666667
+55,181,30.226
+55,182,21.59
+55,183,20.9761666666667
+55,184,26.5218333333333
+55,185,22.8176666666667
+55,186,19.4521666666667
+55,187,20.0236666666667
+55,188,24.1723333333333
+55,189,19.4098333333333
+55,190,24.003
+55,191,22.3096666666667
+55,192,25.4846666666667
+55,193,22.9235
+55,194,21.9286666666667
+55,195,33.8455
+55,196,27.2626666666667
+55,197,21.59
+55,198,25.7598333333333
+55,199,25.6751666666667
+55,200,24.1088333333333
+55,201,23.622
+55,202,27.9823333333333
+55,203,18.9653333333333
+55,204,27.4743333333333
+55,205,27.1145
+55,206,27.2838333333333
+55,207,28.2363333333333
+55,208,28.2575
+55,209,22.6271666666667
+55,210,22.0556666666667
+55,211,24.4475
+55,212,21.7381666666667
+55,213,20.3623333333333
+55,214,21.4206666666667
+55,215,24.4475
+55,216,22.0133333333333
+55,217,29.2946666666667
+55,218,23.5796666666667
+55,219,22.3308333333333
+55,220,30.2683333333333
+55,221,28.3421666666667
+55,222,21.9075
+55,223,22.0133333333333
+55,224,32.7448333333333
+55,225,26.2678333333333
+55,226,23.7913333333333
+55,227,24.0876666666667
+55,228,25.6328333333333
+55,229,23.749
+55,230,22.5848333333333
+55,231,22.3731666666667
+55,232,24.1511666666667
+55,233,23.1563333333333
+55,234,30.861
+55,235,35.9833333333333
+55,236,23.8971666666667
+55,237,25.5905
+55,238,22.4366666666667
+55,239,23.114
+55,240,28.2363333333333
+55,241,21.2725
+55,242,27.5166666666667
+55,243,32.9353333333333
+55,244,24.3416666666667
+55,245,25.8445
+55,246,20.6375
+55,247,31.4536666666667
+55,248,24.8496666666667
+55,249,21.5265
+55,250,29.4428333333333
+55,251,29.464
+55,252,26.5006666666667
+55,253,25.9503333333333
+55,254,22.8811666666667
+55,255,23.2198333333333
+55,256,24.8073333333333
+55,257,20.8491666666667
+55,258,30.9456666666667
+55,259,28.8501666666667
+55,260,29.972
+55,261,27.2415
+55,262,22.2461666666667
+55,263,23.2621666666667
+55,264,21.1243333333333
+55,265,27.2626666666667
+55,266,21.0185
+55,267,22.987
+55,268,18.7113333333333
+55,269,32.3003333333333
+55,270,25.1248333333333
+55,271,21.59
+55,272,26.7546666666667
+55,273,26.8816666666667
+55,274,27.6225
+55,275,29.2523333333333
+55,276,23.0081666666667
+55,277,23.4103333333333
+55,278,24.1935
+55,279,23.1351666666667
+55,280,23.2621666666667
+55,281,27.2415
+55,282,25.4635
+55,283,28.1728333333333
+55,284,25.4635
+55,285,22.6271666666667
+55,286,24.0453333333333
+55,287,24.7015
+55,288,25.5693333333333
+55,289,28.4268333333333
+55,290,24.4686666666667
+55,291,21.971
+55,292,25.1883333333333
+55,293,24.8285
+55,294,24.765
+55,295,28.9136666666667
+55,296,22.479
+55,297,24.4475
+55,298,22.2461666666667
+55,299,28.0035
+55,300,21.0608333333333
+55,301,22.1615
+55,302,23.0081666666667
+55,303,31.0515
+55,304,25.8868333333333
+55,305,26.7758333333333
+55,306,31.242
+55,307,28.2998333333333
+55,308,30.6281666666667
+55,309,19.3463333333333
+55,310,22.1403333333333
+55,311,29.21
+55,312,25.4
+55,313,26.67
+55,314,20.9761666666667
+55,315,26.8181666666667
+55,316,18.2245
+55,317,33.5491666666667
+55,318,26.5006666666667
+55,319,27.4743333333333
+55,320,24.5956666666667
+55,321,24.3628333333333
+55,322,30.2895
+55,323,27.3261666666667
+55,324,24.892
+55,325,29.591
+55,326,22.2038333333333
+55,327,28.6173333333333
+55,328,20.9126666666667
+55,329,21.7805
+55,330,26.3736666666667
+55,331,35.433
+55,332,22.352
+55,333,22.4366666666667
+55,334,19.3886666666667
+55,335,20.2776666666667
+55,336,29.083
+55,337,26.8816666666667
+55,338,25.8445
+55,339,22.7118333333333
+55,340,21.6746666666667
+55,341,28.5961666666667
+55,342,19.6638333333333
+55,343,23.3045
+55,344,16.9333333333333
+55,345,21.3783333333333
+55,346,23.0081666666667
+55,347,26.162
+55,348,24.7226666666667
+55,349,22.3096666666667
+55,350,16.8486666666667
+55,351,20.3835
+55,352,23.368
+55,353,23.114
+55,354,24.7861666666667
+55,355,20.193
+55,356,21.3148333333333
+55,357,34.3111666666667
+55,358,30.6705
+55,359,31.6865
+55,360,27.94
+55,361,22.733
+55,362,22.7118333333333
+55,363,30.5223333333333
+55,364,20.955
+55,365,31.3055
+55,366,33.02
+55,367,22.479
+55,368,23.1563333333333
+55,369,17.7165
+55,370,22.3731666666667
+55,371,20.2141666666667
+55,372,23.4315
+55,373,27.4955
+55,374,29.1888333333333
+55,375,20.066
+55,376,23.5373333333333
+55,377,24.1511666666667
+55,378,20.2353333333333
+55,379,19.8966666666667
+55,380,27.7283333333333
+55,381,23.4738333333333
+55,382,25.5693333333333
+55,383,21.4206666666667
+55,384,28.321
+55,385,25.6751666666667
+55,386,24.257
+55,387,26.035
+55,388,22.4366666666667
+55,389,22.86
+55,390,25.8021666666667
+55,391,23.7913333333333
+55,392,26.7546666666667
+55,393,29.7815
+55,394,25.273
+55,395,24.3628333333333
+55,396,24.3628333333333
+55,397,23.0293333333333
+55,398,23.7701666666667
+55,399,28.448
+55,400,23.5373333333333
+55,401,20.0448333333333
+55,402,22.2885
+55,403,25.4635
+55,404,31.6018333333333
+55,405,28.0881666666667
+55,406,29.1041666666667
+55,407,30.6281666666667
+55,408,19.7061666666667
+55,409,25.4846666666667
+55,410,29.3158333333333
+55,411,27.1568333333333
+55,412,28.8713333333333
+55,413,22.8811666666667
+55,414,18.3938333333333
+55,415,23.6431666666667
+55,416,29.4851666666667
+55,417,22.352
+55,418,20.6375
+55,419,25.7386666666667
+55,420,23.495
+55,421,19.05
+55,422,26.1408333333333
+55,423,25.273
+55,424,27.3896666666667
+55,425,25.2941666666667
+55,426,29.1888333333333
+55,427,23.9395
+55,428,21.1243333333333
+55,429,25.4635
+55,430,25.9926666666667
+55,431,26.5218333333333
+55,432,23.8336666666667
+55,433,22.7541666666667
+55,434,20.8915
+55,435,19.7273333333333
+55,436,25.527
+55,437,18.5843333333333
+55,438,26.5218333333333
+55,439,23.6008333333333
+55,440,31.3901666666667
+55,441,18.669
+55,442,26.0773333333333
+55,443,27.8976666666667
+55,444,21.5476666666667
+55,445,21.3995
+55,446,27.1145
+55,447,28.8501666666667
+55,448,26.924
+55,449,26.8816666666667
+55,450,22.098
+55,451,25.7598333333333
+55,452,25.019
+55,453,23.2621666666667
+55,454,27.1356666666667
+55,455,24.3416666666667
+55,456,23.4315
+55,457,24.0453333333333
+55,458,29.0406666666667
+55,459,22.6695
+55,460,25.1036666666667
+55,461,24.6591666666667
+55,462,20.2988333333333
+55,463,23.0716666666667
+55,464,21.3783333333333
+55,465,28.321
+55,466,22.1403333333333
+55,467,24.6803333333333
+55,468,25.4635
+55,469,25.1036666666667
+55,470,22.2461666666667
+55,471,20.8703333333333
+55,472,24.2146666666667
+55,473,26.3313333333333
+55,474,30.3741666666667
+55,475,30.7975
+55,476,28.0246666666667
+55,477,22.1826666666667
+55,478,24.1511666666667
+55,479,19.3886666666667
+55,480,19.9813333333333
+55,481,23.0716666666667
+55,482,20.1718333333333
+55,483,31.369
+55,484,28.5961666666667
+55,485,30.1836666666667
+55,486,25.8021666666667
+55,487,26.5853333333333
+55,488,22.1826666666667
+55,489,26.543
+55,490,26.2043333333333
+55,491,23.5585
+55,492,22.606
+55,493,21.0608333333333
+55,494,27.051
+55,495,24.003
+55,496,27.6225
+55,497,20.1083333333333
+55,498,25.3365
+55,499,31.7711666666667
+55,500,22.5848333333333
+55,501,26.1408333333333
+55,502,27.7706666666667
+55,503,24.0241666666667
+55,504,21.2513333333333
+55,505,19.7061666666667
+55,506,31.75
+55,507,30.5223333333333
+55,508,27.8976666666667
+55,509,26.797
+55,510,21.4206666666667
+55,511,22.098
+55,512,30.3318333333333
+55,513,24.6168333333333
+55,514,18.3303333333333
+55,515,20.3411666666667
+55,516,24.2146666666667
+55,517,23.7701666666667
+55,518,19.7696666666667
+55,519,28.5961666666667
+55,520,24.003
+55,521,21.4841666666667
+55,522,20.9126666666667
+55,523,26.0561666666667
+55,524,19.431
+55,525,26.924
+55,526,30.5858333333333
+55,527,19.9601666666667
+55,528,29.0618333333333
+55,529,19.7696666666667
+55,530,29.2735
+55,531,27.6013333333333
+55,532,23.4738333333333
+55,533,25.3153333333333
+55,534,29.0195
+55,535,23.2198333333333
+55,536,30.9456666666667
+55,537,28.5326666666667
+55,538,23.114
+55,539,19.4521666666667
+55,540,19.3463333333333
+55,541,22.0133333333333
+55,542,29.1041666666667
+55,543,22.6271666666667
+55,544,30.3318333333333
+55,545,23.5796666666667
+55,546,21.8016666666667
+55,547,28.321
+55,548,29.0618333333333
+55,549,20.2141666666667
+55,550,21.2725
+55,551,28.3421666666667
+55,552,26.2678333333333
+55,553,25.654
+55,554,32.512
+55,555,23.622
+55,556,31.0515
+55,557,24.9555
+55,558,23.0293333333333
+55,559,25.1248333333333
+55,560,27.9611666666667
+55,561,25.1036666666667
+55,562,27.6225
+55,563,26.162
+55,564,28.3845
+55,565,21.4418333333333
+55,566,18.0551666666667
+55,567,26.5218333333333
+55,568,22.2673333333333
+55,569,25.0613333333333
+55,570,20.955
+55,571,24.2993333333333
+55,572,20.701
+55,573,29.21
+55,574,14.351
+55,575,26.3525
+55,576,17.5683333333333
+55,577,21.7593333333333
+55,578,19.6003333333333
+55,579,26.7546666666667
+55,580,20.32
+55,581,23.3256666666667
+55,582,23.0928333333333
+55,583,24.5956666666667
+55,584,27.4955
+55,585,17.018
+55,586,16.8275
+55,587,22.8811666666667
+55,588,28.702
+55,589,31.242
+55,590,25.6751666666667
+55,591,23.2833333333333
+55,592,25.2095
+55,593,23.6008333333333
+55,594,28.4691666666667
+55,595,25.019
+55,596,20.828
+55,597,25.4211666666667
+55,598,34.2265
+55,599,27.1145
+55,600,26.2255
+55,601,21.717
+55,602,17.2296666666667
+55,603,27.9611666666667
+55,604,29.1676666666667
+55,605,20.5105
+55,606,21.4841666666667
+55,607,25.9503333333333
+55,608,29.5698333333333
+55,609,18.796
+55,610,30.3953333333333
+55,611,22.2885
+55,612,25.2941666666667
+55,613,23.7066666666667
+55,614,26.0561666666667
+55,615,20.1506666666667
+55,616,24.5533333333333
+55,617,19.7273333333333
+55,618,22.733
+55,619,25.2306666666667
+55,620,25.4635
+55,621,21.3148333333333
+55,622,27.4955
+55,623,27.178
+55,624,22.5636666666667
+55,625,28.321
+55,626,21.5476666666667
+55,627,26.8181666666667
+55,628,23.876
+55,629,29.4851666666667
+55,630,25.6963333333333
+55,631,32.9776666666667
+55,632,26.1196666666667
+55,633,29.5275
+55,634,24.638
+55,635,17.7588333333333
+55,636,26.2466666666667
+55,637,23.0716666666667
+55,638,24.1723333333333
+55,639,23.0505
+55,640,21.717
+55,641,23.3045
+55,642,26.2678333333333
+55,643,25.4211666666667
+55,644,19.7485
+55,645,19.4733333333333
+55,646,33.528
+55,647,23.1351666666667
+55,648,19.9601666666667
+55,649,20.7221666666667
+55,650,23.368
+55,651,23.8125
+55,652,20.7856666666667
+55,653,30.1201666666667
+55,654,22.2461666666667
+55,655,28.3845
+55,656,29.1253333333333
+55,657,30.1201666666667
+55,658,25.4
+55,659,28.8501666666667
+55,660,23.0293333333333
+55,661,26.6911666666667
+55,662,21.3995
+55,663,22.0133333333333
+55,664,21.6111666666667
+55,665,24.4686666666667
+55,666,28.321
+55,667,23.6431666666667
+55,668,26.5218333333333
+55,669,29.6756666666667
+55,670,24.3628333333333
+55,671,21.0396666666667
+55,672,23.9606666666667
+55,673,19.1558333333333
+55,674,24.2993333333333
+55,675,22.7965
+55,676,19.2193333333333
+55,677,25.1248333333333
+55,678,23.495
+55,679,28.4691666666667
+55,680,21.6958333333333
+55,681,23.0293333333333
+55,682,21.5265
+55,683,26.3313333333333
+55,684,25.2518333333333
+55,685,16.1501666666667
+55,686,23.3045
+55,687,23.495
+55,688,26.7335
+55,689,32.9353333333333
+55,690,20.193
+55,691,25.908
+55,692,25.4
+55,693,18.8383333333333
+55,694,22.86
+55,695,26.8393333333333
+55,696,23.5373333333333
+55,697,28.0881666666667
+55,698,21.8228333333333
+55,699,19.0711666666667
+55,700,25.2306666666667
+55,701,34.5863333333333
+55,702,25.781
+55,703,24.8496666666667
+55,704,22.8176666666667
+55,705,22.225
+55,706,25.9291666666667
+55,707,19.3251666666667
+55,708,26.4371666666667
+55,709,23.9818333333333
+55,710,27.6225
+55,711,22.2673333333333
+55,712,24.2781666666667
+55,713,21.4418333333333
+55,714,23.4315
+55,715,32.3638333333333
+55,716,25.3153333333333
+55,717,23.1563333333333
+55,718,24.3416666666667
+55,719,21.3571666666667
+55,720,19.0923333333333
+55,721,25.1036666666667
+55,722,22.5848333333333
+55,723,22.1826666666667
+55,724,24.9978333333333
+55,725,22.9658333333333
+55,726,21.9075
+55,727,24.0241666666667
+55,728,16.7216666666667
+55,729,27.4743333333333
+55,730,19.9178333333333
+55,731,27.1568333333333
+55,732,25.6116666666667
+55,733,25.2095
+55,734,30.0566666666667
+55,735,22.9658333333333
+55,736,27.7071666666667
+55,737,20.9338333333333
+55,738,23.4526666666667
+55,739,24.0241666666667
+55,740,19.0288333333333
+55,741,20.8915
+55,742,25.9715
+55,743,25.8233333333333
+55,744,32.0675
+55,745,20.2141666666667
+55,746,23.0716666666667
+55,747,22.733
+55,748,19.7273333333333
+55,749,29.2311666666667
+55,750,26.0985
+55,751,24.8285
+55,752,19.1135
+55,753,19.8755
+55,754,22.225
+55,755,29.2523333333333
+55,756,30.734
+55,757,30.1201666666667
+55,758,30.3106666666667
+55,759,22.0133333333333
+55,760,23.0081666666667
+55,761,19.0923333333333
+55,762,24.4051666666667
+55,763,26.4795
+55,764,23.0928333333333
+55,765,25.1883333333333
+55,766,27.7918333333333
+55,767,22.1826666666667
+55,768,25.9715
+55,769,27.7071666666667
+55,770,23.8548333333333
+55,771,22.0345
+55,772,24.13
+55,773,24.13
+55,774,24.511
+55,775,26.8393333333333
+55,776,27.6436666666667
+55,777,22.7753333333333
+55,778,28.0035
+55,779,23.876
+55,780,21.1666666666667
+55,781,25.8656666666667
+55,782,20.3835
+55,783,16.2348333333333
+55,784,23.4526666666667
+55,785,21.3571666666667
+55,786,22.098
+55,787,26.0561666666667
+55,788,21.5053333333333
+55,789,28.0246666666667
+55,790,19.558
+55,791,33.6338333333333
+55,792,23.749
+55,793,20.4681666666667
+55,794,20.7856666666667
+55,795,27.2203333333333
+55,796,23.5585
+55,797,20.193
+55,798,26.6911666666667
+55,799,25.146
+55,800,23.114
+55,801,20.7433333333333
+55,802,21.717
+55,803,22.9658333333333
+55,804,23.3891666666667
+55,805,23.4738333333333
+55,806,25.4846666666667
+55,807,31.877
+55,808,23.6855
+55,809,25.8445
+55,810,20.9338333333333
+55,811,33.5491666666667
+55,812,26.2043333333333
+55,813,22.5425
+55,814,26.8393333333333
+55,815,23.495
+55,816,25.4846666666667
+55,817,26.0985
+55,818,24.0241666666667
+55,819,24.8285
+55,820,30.8186666666667
+55,821,19.6638333333333
+55,822,24.5745
+55,823,23.8125
+55,824,25.7175
+55,825,25.3576666666667
+55,826,21.4841666666667
+55,827,23.0928333333333
+55,828,27.305
+55,829,20.066
+55,830,26.162
+55,831,21.2513333333333
+55,832,27.559
+55,833,21.5688333333333
+55,834,23.8125
+55,835,19.9601666666667
+55,836,24.2993333333333
+55,837,23.8336666666667
+55,838,21.9921666666667
+55,839,29.2946666666667
+55,840,19.9178333333333
+55,841,23.3891666666667
+55,842,25.9926666666667
+55,843,22.6695
+55,844,26.5853333333333
+55,845,22.7965
+55,846,27.4743333333333
+55,847,23.1986666666667
+55,848,22.7541666666667
+55,849,16.9333333333333
+55,850,28.4056666666667
+55,851,22.352
+55,852,19.7061666666667
+55,853,26.6065
+55,854,19.3675
+55,855,23.1775
+55,856,23.9606666666667
+55,857,28.2575
+55,858,25.3365
+55,859,23.5585
+55,860,30.5223333333333
+55,861,23.0716666666667
+55,862,24.0876666666667
+55,863,26.3313333333333
+55,864,27.559
+55,865,24.3628333333333
+55,866,18.3091666666667
+55,867,37.4861666666667
+55,868,19.6003333333333
+55,869,28.4268333333333
+55,870,23.749
+55,871,24.6591666666667
+55,872,29.972
+55,873,23.8548333333333
+55,874,17.2931666666667
+55,875,27.3896666666667
+55,876,21.1666666666667
+55,877,22.8388333333333
+55,878,17.6953333333333
+55,879,20.9973333333333
+55,880,24.638
+55,881,28.6808333333333
+55,882,24.2146666666667
+55,883,22.1403333333333
+55,884,20.6375
+55,885,25.781
+55,886,25.7175
+55,887,24.2358333333333
+55,888,18.7536666666667
+55,889,23.622
+55,890,24.0241666666667
+55,891,23.8336666666667
+55,892,30.0566666666667
+55,893,19.1346666666667
+55,894,24.5956666666667
+55,895,24.5956666666667
+55,896,24.2358333333333
+55,897,27.9611666666667
+55,898,27.6225
+55,899,25.1883333333333
+55,900,28.1728333333333
+55,901,22.1615
+55,902,26.3948333333333
+55,903,26.7335
+55,904,27.1356666666667
+55,905,23.8336666666667
+55,906,25.6751666666667
+55,907,27.7706666666667
+55,908,24.3416666666667
+55,909,27.8553333333333
+55,910,22.6271666666667
+55,911,19.2405
+55,912,22.987
+55,913,29.8873333333333
+55,914,30.8398333333333
+55,915,26.9875
+55,916,25.9715
+55,917,26.0773333333333
+55,918,21.5053333333333
+55,919,31.2208333333333
+55,920,21.209
+55,921,21.0396666666667
+55,922,24.9131666666667
+55,923,23.0928333333333
+55,924,25.5693333333333
+55,925,23.9183333333333
+55,926,26.67
+55,927,21.7593333333333
+55,928,20.8703333333333
+55,929,25.5058333333333
+55,930,22.86
+55,931,28.2151666666667
+55,932,24.2358333333333
+55,933,21.1878333333333
+55,934,24.3628333333333
+55,935,27.5801666666667
+55,936,23.368
+55,937,32.7236666666667
+55,938,20.8915
+55,939,27.559
+55,940,25.2095
+55,941,30.2895
+55,942,22.098
+55,943,23.3045
+55,944,28.575
+55,945,32.8506666666667
+55,946,23.5161666666667
+55,947,33.7608333333333
+55,948,26.5641666666667
+55,949,23.2198333333333
+55,950,23.7701666666667
+55,951,28.3845
+55,952,21.6111666666667
+55,953,24.9555
+55,954,25.6116666666667
+55,955,19.8331666666667
+55,956,24.3628333333333
+55,957,24.7226666666667
+55,958,18.9441666666667
+55,959,27.7706666666667
+55,960,21.4206666666667
+55,961,27.2415
+55,962,20.2565
+55,963,19.8331666666667
+55,964,28.1305
+55,965,19.7061666666667
+55,966,28.9983333333333
+55,967,21.6746666666667
+55,968,23.4526666666667
+55,969,21.7593333333333
+55,970,21.9286666666667
+55,971,27.5166666666667
+55,972,24.8496666666667
+55,973,37.846
+55,974,26.9663333333333
+55,975,24.9978333333333
+55,976,28.5538333333333
+55,977,24.5956666666667
+55,978,24.7015
+55,979,20.1295
+55,980,23.7278333333333
+55,981,23.114
+55,982,22.7541666666667
+55,983,33.9725
+55,984,23.7066666666667
+55,985,27.8553333333333
+55,986,23.0505
+55,987,28.321
+55,988,22.1403333333333
+55,989,25.2306666666667
+55,990,22.1403333333333
+55,991,28.6596666666667
+55,992,27.8765
+55,993,24.5533333333333
+55,994,22.2885
+55,995,23.0716666666667
+55,996,28.2151666666667
+55,997,27.305
+55,998,32.258
+55,999,31.0303333333333
+55,1000,20.9338333333333
+56,1,29.9296666666667
+56,2,26.797
+56,3,25.4635
+56,4,30.353
+56,5,24.8073333333333
+56,6,24.5745
+56,7,25.1671666666667
+56,8,25.2095
+56,9,23.0293333333333
+56,10,27.3685
+56,11,25.8445
+56,12,29.6121666666667
+56,13,15.8961666666667
+56,14,20.4046666666667
+56,15,29.7391666666667
+56,16,24.8073333333333
+56,17,17.9493333333333
+56,18,21.3783333333333
+56,19,25.2306666666667
+56,20,24.9131666666667
+56,21,28.6808333333333
+56,22,29.337
+56,23,21.3571666666667
+56,24,28.1516666666667
+56,25,32.5331666666667
+56,26,24.8708333333333
+56,27,25.9926666666667
+56,28,27.4108333333333
+56,29,32.6178333333333
+56,30,34.3535
+56,31,32.9776666666667
+56,32,20.828
+56,33,19.2193333333333
+56,34,23.5796666666667
+56,35,19.685
+56,36,24.2146666666667
+56,37,22.6483333333333
+56,38,26.0561666666667
+56,39,26.6276666666667
+56,40,24.3416666666667
+56,41,24.1723333333333
+56,42,23.7701666666667
+56,43,24.1935
+56,44,31.1996666666667
+56,45,21.971
+56,46,24.1935
+56,47,24.2781666666667
+56,48,33.782
+56,49,23.1351666666667
+56,50,21.082
+56,51,18.2456666666667
+56,52,27.6013333333333
+56,53,21.5476666666667
+56,54,20.0236666666667
+56,55,21.8863333333333
+56,56,19.4733333333333
+56,57,28.0246666666667
+56,58,14.9436666666667
+56,59,22.4155
+56,60,28.956
+56,61,23.3256666666667
+56,62,29.7391666666667
+56,63,26.8816666666667
+56,64,18.8383333333333
+56,65,22.9235
+56,66,25.8868333333333
+56,67,26.035
+56,68,25.4423333333333
+56,69,25.1671666666667
+56,70,25.0401666666667
+56,71,18.9441666666667
+56,72,26.7758333333333
+56,73,14.4356666666667
+56,74,21.8651666666667
+56,75,27.9823333333333
+56,76,27.559
+56,77,22.6906666666667
+56,78,24.2358333333333
+56,79,25.3576666666667
+56,80,27.5801666666667
+56,81,21.082
+56,82,28.7443333333333
+56,83,22.606
+56,84,22.0556666666667
+56,85,29.7603333333333
+56,86,24.3205
+56,87,29.9508333333333
+56,88,28.956
+56,89,22.479
+56,90,28.3633333333333
+56,91,26.5853333333333
+56,92,24.4263333333333
+56,93,22.9446666666667
+56,94,19.7273333333333
+56,95,32.0675
+56,96,27.9188333333333
+56,97,17.5683333333333
+56,98,20.8491666666667
+56,99,27.2415
+56,100,37.9095
+56,101,31.0091666666667
+56,102,18.6266666666667
+56,103,27.0086666666667
+56,104,27.3473333333333
+56,105,24.7015
+56,106,21.0608333333333
+56,107,21.8228333333333
+56,108,25.654
+56,109,26.2255
+56,110,24.638
+56,111,28.702
+56,112,34.2053333333333
+56,113,25.2306666666667
+56,114,32.5543333333333
+56,115,20.9126666666667
+56,116,28.4056666666667
+56,117,23.1351666666667
+56,118,30.6705
+56,119,30.734
+56,120,26.3948333333333
+56,121,19.8331666666667
+56,122,30.226
+56,123,27.3473333333333
+56,124,30.0143333333333
+56,125,18.9441666666667
+56,126,23.4738333333333
+56,127,22.8176666666667
+56,128,27.7918333333333
+56,129,25.4423333333333
+56,130,22.3943333333333
+56,131,24.4263333333333
+56,132,23.2621666666667
+56,133,23.3256666666667
+56,134,19.177
+56,135,25.5058333333333
+56,136,27.8976666666667
+56,137,24.9766666666667
+56,138,17.2508333333333
+56,139,25.527
+56,140,21.0185
+56,141,30.5646666666667
+56,142,28.7443333333333
+56,143,22.606
+56,144,22.5213333333333
+56,145,29.9508333333333
+56,146,26.289
+56,147,23.1775
+56,148,17.2296666666667
+56,149,23.0293333333333
+56,150,20.5316666666667
+56,151,23.8125
+56,152,34.6286666666667
+56,153,31.2631666666667
+56,154,29.718
+56,155,25.6963333333333
+56,156,28.7443333333333
+56,157,29.1041666666667
+56,158,28.5961666666667
+56,159,22.987
+56,160,27.5801666666667
+56,161,26.8816666666667
+56,162,27.1356666666667
+56,163,27.051
+56,164,19.939
+56,165,25.781
+56,166,26.5218333333333
+56,167,24.638
+56,168,28.6173333333333
+56,169,27.2203333333333
+56,170,29.0195
+56,171,17.653
+56,172,21.2725
+56,173,26.3313333333333
+56,174,30.3106666666667
+56,175,28.1728333333333
+56,176,16.8063333333333
+56,177,24.765
+56,178,27.1356666666667
+56,179,22.7118333333333
+56,180,25.654
+56,181,21.463
+56,182,19.4945
+56,183,25.4423333333333
+56,184,22.2461666666667
+56,185,28.0246666666667
+56,186,25.0825
+56,187,28.9136666666667
+56,188,23.495
+56,189,25.2306666666667
+56,190,24.13
+56,191,19.4945
+56,192,28.3633333333333
+56,193,29.718
+56,194,26.8605
+56,195,21.3148333333333
+56,196,20.0025
+56,197,24.13
+56,198,23.4738333333333
+56,199,26.4583333333333
+56,200,18.415
+56,201,18.7748333333333
+56,202,23.6008333333333
+56,203,19.1558333333333
+56,204,14.6685
+56,205,23.495
+56,206,21.3995
+56,207,21.6323333333333
+56,208,17.3566666666667
+56,209,22.4155
+56,210,24.0876666666667
+56,211,26.5006666666667
+56,212,19.6426666666667
+56,213,27.559
+56,214,21.971
+56,215,26.3736666666667
+56,216,27.559
+56,217,18.8171666666667
+56,218,22.8176666666667
+56,219,33.401
+56,220,31.3266666666667
+56,221,22.9658333333333
+56,222,26.0138333333333
+56,223,30.1836666666667
+56,224,22.1826666666667
+56,225,27.9611666666667
+56,226,18.5843333333333
+56,227,38.1211666666667
+56,228,25.4423333333333
+56,229,22.3731666666667
+56,230,23.5585
+56,231,20.5105
+56,232,19.3463333333333
+56,233,17.9493333333333
+56,234,19.2405
+56,235,28.1516666666667
+56,236,20.574
+56,237,20.193
+56,238,24.8496666666667
+56,239,30.7128333333333
+56,240,28.9983333333333
+56,241,23.1986666666667
+56,242,23.0293333333333
+56,243,22.5001666666667
+56,244,27.3685
+56,245,24.13
+56,246,30.5858333333333
+56,247,21.6958333333333
+56,248,21.2725
+56,249,28.4268333333333
+56,250,26.035
+56,251,26.4371666666667
+56,252,23.3256666666667
+56,253,28.3421666666667
+56,254,20.2776666666667
+56,255,20.574
+56,256,27.051
+56,257,29.464
+56,258,19.2616666666667
+56,259,27.4743333333333
+56,260,17.8223333333333
+56,261,25.7175
+56,262,28.7866666666667
+56,263,19.1135
+56,264,22.225
+56,265,21.463
+56,266,17.6318333333333
+56,267,23.0716666666667
+56,268,21.8863333333333
+56,269,25.8233333333333
+56,270,28.3421666666667
+56,271,28.0035
+56,272,25.8656666666667
+56,273,24.6168333333333
+56,274,17.526
+56,275,25.5693333333333
+56,276,21.082
+56,277,24.1723333333333
+56,278,19.7273333333333
+56,279,33.6338333333333
+56,280,25.3788333333333
+56,281,26.0985
+56,282,26.7546666666667
+56,283,16.9121666666667
+56,284,26.1831666666667
+56,285,23.2621666666667
+56,286,25.7175
+56,287,25.527
+56,288,27.7283333333333
+56,289,27.4108333333333
+56,290,31.5806666666667
+56,291,35.1578333333333
+56,292,27.305
+56,293,20.8703333333333
+56,294,24.765
+56,295,20.6798333333333
+56,296,23.3468333333333
+56,297,22.1403333333333
+56,298,21.59
+56,299,21.9286666666667
+56,300,23.0928333333333
+56,301,21.0396666666667
+56,302,14.5626666666667
+56,303,25.3788333333333
+56,304,21.0185
+56,305,23.5796666666667
+56,306,25.0401666666667
+56,307,24.8073333333333
+56,308,24.1511666666667
+56,309,26.416
+56,310,19.431
+56,311,32.9141666666667
+56,312,27.6436666666667
+56,313,23.3256666666667
+56,314,24.0453333333333
+56,315,18.1821666666667
+56,316,26.0985
+56,317,23.1986666666667
+56,318,21.3995
+56,319,31.1996666666667
+56,320,22.9235
+56,321,24.7861666666667
+56,322,30.3953333333333
+56,323,26.035
+56,324,32.5331666666667
+56,325,23.2833333333333
+56,326,28.7866666666667
+56,327,23.4526666666667
+56,328,23.3891666666667
+56,329,24.5956666666667
+56,330,20.0236666666667
+56,331,19.8543333333333
+56,332,25.4846666666667
+56,333,22.5425
+56,334,25.019
+56,335,25.4
+56,336,21.0608333333333
+56,337,30.3953333333333
+56,338,26.3101666666667
+56,339,27.8976666666667
+56,340,25.9503333333333
+56,341,21.5265
+56,342,25.2306666666667
+56,343,23.5796666666667
+56,344,22.1191666666667
+56,345,27.7706666666667
+56,346,32.8718333333333
+56,347,17.4836666666667
+56,348,29.2735
+56,349,27.2626666666667
+56,350,29.2735
+56,351,23.4103333333333
+56,352,20.4046666666667
+56,353,29.2523333333333
+56,354,24.8285
+56,355,17.7588333333333
+56,356,17.9916666666667
+56,357,18.288
+56,358,17.2296666666667
+56,359,29.9508333333333
+56,360,31.242
+56,361,25.6328333333333
+56,362,19.685
+56,363,22.352
+56,364,17.907
+56,365,20.3835
+56,366,23.5161666666667
+56,367,20.701
+56,368,23.5796666666667
+56,369,22.86
+56,370,22.1826666666667
+56,371,22.733
+56,372,20.8703333333333
+56,373,20.7856666666667
+56,374,31.1573333333333
+56,375,22.3096666666667
+56,376,18.6901666666667
+56,377,24.8285
+56,378,28.2363333333333
+56,379,24.5745
+56,380,24.3205
+56,381,25.9715
+56,382,20.5951666666667
+56,383,32.8506666666667
+56,384,20.9973333333333
+56,385,22.0133333333333
+56,386,25.1036666666667
+56,387,22.5848333333333
+56,388,22.7753333333333
+56,389,13.1233333333333
+56,390,21.0185
+56,391,19.05
+56,392,24.4686666666667
+56,393,29.6545
+56,394,30.7975
+56,395,27.2626666666667
+56,396,28.4056666666667
+56,397,20.6163333333333
+56,398,21.844
+56,399,27.5166666666667
+56,400,24.5745
+56,401,16.2983333333333
+56,402,21.6535
+56,403,30.7551666666667
+56,404,25.654
+56,405,35.2425
+56,406,21.9921666666667
+56,407,31.4113333333333
+56,408,31.5383333333333
+56,409,29.718
+56,410,33.528
+56,411,21.1031666666667
+56,412,24.0876666666667
+56,413,26.2255
+56,414,30.6916666666667
+56,415,24.6591666666667
+56,416,31.6653333333333
+56,417,18.0975
+56,418,19.558
+56,419,23.0716666666667
+56,420,28.4691666666667
+56,421,30.3106666666667
+56,422,18.3938333333333
+56,423,21.4418333333333
+56,424,22.733
+56,425,27.8341666666667
+56,426,24.9978333333333
+56,427,21.209
+56,428,21.1455
+56,429,25.5481666666667
+56,430,22.7753333333333
+56,431,21.5265
+56,432,19.5791666666667
+56,433,19.3675
+56,434,30.7975
+56,435,25.4
+56,436,23.5796666666667
+56,437,28.067
+56,438,22.9446666666667
+56,439,25.6328333333333
+56,440,22.1191666666667
+56,441,23.114
+56,442,23.0505
+56,443,21.1031666666667
+56,444,32.0886666666667
+56,445,27.2203333333333
+56,446,34.798
+56,447,23.7278333333333
+56,448,21.4206666666667
+56,449,30.1201666666667
+56,450,21.2301666666667
+56,451,22.0768333333333
+56,452,28.9983333333333
+56,453,27.5801666666667
+56,454,21.717
+56,455,26.924
+56,456,25.146
+56,457,31.7288333333333
+56,458,23.8971666666667
+56,459,28.3633333333333
+56,460,16.4676666666667
+56,461,21.8863333333333
+56,462,16.7428333333333
+56,463,20.2988333333333
+56,464,23.1563333333333
+56,465,24.9766666666667
+56,466,31.4113333333333
+56,467,21.6958333333333
+56,468,19.431
+56,469,25.4846666666667
+56,470,21.3783333333333
+56,471,17.5683333333333
+56,472,33.1681666666667
+56,473,20.9126666666667
+56,474,23.622
+56,475,16.5946666666667
+56,476,27.5166666666667
+56,477,19.5791666666667
+56,478,20.1506666666667
+56,479,25.8445
+56,480,26.3736666666667
+56,481,23.4103333333333
+56,482,32.7236666666667
+56,483,27.6013333333333
+56,484,19.5156666666667
+56,485,28.7231666666667
+56,486,25.6328333333333
+56,487,26.0773333333333
+56,488,32.8295
+56,489,20.9973333333333
+56,490,25.2306666666667
+56,491,30.4588333333333
+56,492,22.1826666666667
+56,493,23.9183333333333
+56,494,25.8021666666667
+56,495,16.8063333333333
+56,496,31.0726666666667
+56,497,19.5156666666667
+56,498,22.8811666666667
+56,499,18.415
+56,500,25.6328333333333
+56,501,15.8326666666667
+56,502,19.4521666666667
+56,503,19.177
+56,504,33.7608333333333
+56,505,23.7913333333333
+56,506,26.9028333333333
+56,507,25.654
+56,508,19.939
+56,509,21.2301666666667
+56,510,23.495
+56,511,29.0618333333333
+56,512,21.3783333333333
+56,513,31.369
+56,514,25.3788333333333
+56,515,27.8341666666667
+56,516,25.146
+56,517,29.0618333333333
+56,518,27.7918333333333
+56,519,21.9286666666667
+56,520,28.0246666666667
+56,521,23.622
+56,522,27.2203333333333
+56,523,24.8708333333333
+56,524,27.813
+56,525,21.2725
+56,526,26.2678333333333
+56,527,24.1723333333333
+56,528,19.812
+56,529,21.082
+56,530,25.273
+56,531,22.225
+56,532,29.6121666666667
+56,533,30.099
+56,534,23.3468333333333
+56,535,27.0721666666667
+56,536,26.797
+56,537,15.494
+56,538,27.0933333333333
+56,539,26.3313333333333
+56,540,19.6215
+56,541,22.987
+56,542,19.9601666666667
+56,543,30.9033333333333
+56,544,21.1455
+56,545,22.6906666666667
+56,546,25.1036666666667
+56,547,22.8811666666667
+56,548,20.9973333333333
+56,549,20.8491666666667
+56,550,21.082
+56,551,26.1408333333333
+56,552,33.401
+56,553,19.7061666666667
+56,554,19.7485
+56,555,22.7753333333333
+56,556,19.7696666666667
+56,557,23.3891666666667
+56,558,25.1248333333333
+56,559,20.6798333333333
+56,560,29.9296666666667
+56,561,16.9545
+56,562,24.0241666666667
+56,563,19.7696666666667
+56,564,24.7226666666667
+56,565,22.4578333333333
+56,566,26.9451666666667
+56,567,21.3148333333333
+56,568,25.2306666666667
+56,569,27.8553333333333
+56,570,22.3943333333333
+56,571,25.8868333333333
+56,572,24.8285
+56,573,25.1883333333333
+56,574,22.4366666666667
+56,575,25.019
+56,576,25.9926666666667
+56,577,19.3675
+56,578,35.3483333333333
+56,579,24.5321666666667
+56,580,25.4
+56,581,21.3783333333333
+56,582,22.5848333333333
+56,583,28.702
+56,584,18.3303333333333
+56,585,23.749
+56,586,23.9606666666667
+56,587,23.0505
+56,588,26.3525
+56,589,23.622
+56,590,23.7278333333333
+56,591,24.6803333333333
+56,592,30.0143333333333
+56,593,23.4315
+56,594,26.4583333333333
+56,595,29.972
+56,596,25.9715
+56,597,28.6596666666667
+56,598,20.2353333333333
+56,599,25.8233333333333
+56,600,23.9818333333333
+56,601,22.0556666666667
+56,602,21.2301666666667
+56,603,21.844
+56,604,26.3313333333333
+56,605,17.9705
+56,606,25.3788333333333
+56,607,24.1723333333333
+56,608,21.1243333333333
+56,609,20.7433333333333
+56,610,30.6705
+56,611,19.8543333333333
+56,612,22.6483333333333
+56,613,25.5481666666667
+56,614,20.5105
+56,615,22.0768333333333
+56,616,24.5321666666667
+56,617,29.1253333333333
+56,618,22.5001666666667
+56,619,29.1465
+56,620,16.637
+56,621,24.257
+56,622,28.7231666666667
+56,623,21.0608333333333
+56,624,22.0345
+56,625,20.32
+56,626,30.5011666666667
+56,627,31.7076666666667
+56,628,20.0025
+56,629,24.3205
+56,630,34.6075
+56,631,25.6963333333333
+56,632,26.7758333333333
+56,633,24.6591666666667
+56,634,21.082
+56,635,21.1455
+56,636,34.163
+56,637,23.9183333333333
+56,638,25.527
+56,639,37.8248333333333
+56,640,24.003
+56,641,28.7443333333333
+56,642,20.3411666666667
+56,643,18.7325
+56,644,26.9451666666667
+56,645,23.876
+56,646,26.5218333333333
+56,647,23.3045
+56,648,25.8868333333333
+56,649,22.987
+56,650,23.1775
+56,651,24.5745
+56,652,23.368
+56,653,25.8868333333333
+56,654,26.0561666666667
+56,655,25.8656666666667
+56,656,29.6121666666667
+56,657,23.6855
+56,658,24.9131666666667
+56,659,18.3726666666667
+56,660,27.5378333333333
+56,661,35.814
+56,662,22.4366666666667
+56,663,22.6483333333333
+56,664,22.7753333333333
+56,665,24.384
+56,666,18.7325
+56,667,29.591
+56,668,26.4371666666667
+56,669,24.13
+56,670,31.5171666666667
+56,671,19.9601666666667
+56,672,21.8016666666667
+56,673,23.4103333333333
+56,674,28.5961666666667
+56,675,19.9601666666667
+56,676,32.6178333333333
+56,677,25.019
+56,678,20.7856666666667
+56,679,20.7645
+56,680,29.2523333333333
+56,681,27.813
+56,682,29.2735
+56,683,32.0675
+56,684,25.654
+56,685,22.8811666666667
+56,686,28.9771666666667
+56,687,20.6586666666667
+56,688,22.225
+56,689,21.5053333333333
+56,690,16.7216666666667
+56,691,21.4418333333333
+56,692,26.035
+56,693,35.8986666666667
+56,694,21.5265
+56,695,20.447
+56,696,26.2466666666667
+56,697,20.2141666666667
+56,698,24.4686666666667
+56,699,22.0133333333333
+56,700,22.1403333333333
+56,701,21.1666666666667
+56,702,27.9188333333333
+56,703,22.0133333333333
+56,704,23.495
+56,705,19.4945
+56,706,17.3143333333333
+56,707,23.876
+56,708,19.5156666666667
+56,709,22.6906666666667
+56,710,21.7593333333333
+56,711,24.8285
+56,712,20.5316666666667
+56,713,25.1036666666667
+56,714,26.7758333333333
+56,715,23.6643333333333
+56,716,21.971
+56,717,26.9875
+56,718,25.8868333333333
+56,719,20.0448333333333
+56,720,15.748
+56,721,27.4955
+56,722,21.4841666666667
+56,723,20.6375
+56,724,20.828
+56,725,27.3261666666667
+56,726,19.9601666666667
+56,727,21.9498333333333
+56,728,30.2048333333333
+56,729,16.4888333333333
+56,730,27.0933333333333
+56,731,22.3096666666667
+56,732,27.0721666666667
+56,733,15.1553333333333
+56,734,21.1455
+56,735,22.225
+56,736,25.4211666666667
+56,737,26.8605
+56,738,19.7061666666667
+56,739,22.1615
+56,740,20.7221666666667
+56,741,23.114
+56,742,21.5053333333333
+56,743,28.2151666666667
+56,744,19.812
+56,745,26.924
+56,746,22.479
+56,747,22.2673333333333
+56,748,20.7856666666667
+56,749,21.7593333333333
+56,750,21.4418333333333
+56,751,27.813
+56,752,26.0985
+56,753,30.988
+56,754,21.336
+56,755,24.2993333333333
+56,756,16.891
+56,757,21.082
+56,758,26.8393333333333
+56,759,28.702
+56,760,27.2203333333333
+56,761,20.4893333333333
+56,762,31.4113333333333
+56,763,30.5646666666667
+56,764,22.9023333333333
+56,765,19.2193333333333
+56,766,27.7071666666667
+56,767,23.7913333333333
+56,768,23.0293333333333
+56,769,22.4578333333333
+56,770,24.0453333333333
+56,771,24.9978333333333
+56,772,25.9291666666667
+56,773,23.3891666666667
+56,774,23.4315
+56,775,19.2616666666667
+56,776,21.3783333333333
+56,777,25.781
+56,778,22.9235
+56,779,23.6643333333333
+56,780,27.5801666666667
+56,781,18.7325
+56,782,34.0995
+56,783,19.431
+56,784,29.3581666666667
+56,785,23.241
+56,786,21.9921666666667
+56,787,26.6911666666667
+56,788,32.3215
+56,789,23.4738333333333
+56,790,22.0133333333333
+56,791,19.685
+56,792,21.6535
+56,793,18.5843333333333
+56,794,21.717
+56,795,26.2043333333333
+56,796,28.5115
+56,797,31.7076666666667
+56,798,28.2575
+56,799,20.2988333333333
+56,800,22.225
+56,801,22.7541666666667
+56,802,17.7376666666667
+56,803,28.5326666666667
+56,804,24.8073333333333
+56,805,21.9286666666667
+56,806,25.2518333333333
+56,807,31.8135
+56,808,22.1191666666667
+56,809,30.48
+56,810,27.0298333333333
+56,811,30.1625
+56,812,24.3416666666667
+56,813,28.5538333333333
+56,814,27.8765
+56,815,20.1083333333333
+56,816,18.6266666666667
+56,817,20.5105
+56,818,21.1031666666667
+56,819,20.8491666666667
+56,820,30.353
+56,821,19.685
+56,822,19.0288333333333
+56,823,30.734
+56,824,22.479
+56,825,26.8393333333333
+56,826,23.0293333333333
+56,827,21.9286666666667
+56,828,18.796
+56,829,22.225
+56,830,28.6808333333333
+56,831,27.6013333333333
+56,832,28.575
+56,833,28.0246666666667
+56,834,26.67
+56,835,31.369
+56,836,19.2616666666667
+56,837,25.6116666666667
+56,838,20.2776666666667
+56,839,25.273
+56,840,30.8821666666667
+56,841,31.8981666666667
+56,842,30.4588333333333
+56,843,23.241
+56,844,24.4263333333333
+56,845,23.1775
+56,846,22.3943333333333
+56,847,19.7273333333333
+56,848,22.6483333333333
+56,849,20.5105
+56,850,24.2781666666667
+56,851,21.6323333333333
+56,852,20.066
+56,853,19.1981666666667
+56,854,22.86
+56,855,27.7071666666667
+56,856,26.3736666666667
+56,857,25.2095
+56,858,19.0711666666667
+56,859,23.3256666666667
+56,860,25.6116666666667
+56,861,23.5585
+56,862,26.924
+56,863,25.1671666666667
+56,864,29.2523333333333
+56,865,26.7758333333333
+56,866,17.2296666666667
+56,867,27.0933333333333
+56,868,22.6906666666667
+56,869,17.4836666666667
+56,870,23.495
+56,871,24.4898333333333
+56,872,27.4955
+56,873,21.7381666666667
+56,874,30.5011666666667
+56,875,31.6653333333333
+56,876,22.5848333333333
+56,877,26.5006666666667
+56,878,22.7541666666667
+56,879,24.3628333333333
+56,880,36.0045
+56,881,23.3891666666667
+56,882,27.3473333333333
+56,883,16.9545
+56,884,22.1826666666667
+56,885,30.1201666666667
+56,886,21.717
+56,887,28.1728333333333
+56,888,25.3365
+56,889,25.8868333333333
+56,890,28.1516666666667
+56,891,28.8925
+56,892,28.1516666666667
+56,893,24.8496666666667
+56,894,25.6328333333333
+56,895,32.766
+56,896,29.5275
+56,897,16.4888333333333
+56,898,23.5373333333333
+56,899,35.0731666666667
+56,900,23.3045
+56,901,17.9705
+56,902,26.9028333333333
+56,903,24.9555
+56,904,19.05
+56,905,19.05
+56,906,24.4263333333333
+56,907,26.9451666666667
+56,908,23.3468333333333
+56,909,25.9291666666667
+56,910,27.178
+56,911,24.2358333333333
+56,912,30.8398333333333
+56,913,24.3628333333333
+56,914,29.9085
+56,915,25.4423333333333
+56,916,31.3478333333333
+56,917,19.939
+56,918,25.9291666666667
+56,919,21.6535
+56,920,26.797
+56,921,20.6586666666667
+56,922,29.1253333333333
+56,923,21.6323333333333
+56,924,25.146
+56,925,24.7015
+56,926,33.3375
+56,927,26.289
+56,928,28.829
+56,929,21.463
+56,930,31.7923333333333
+56,931,22.0345
+56,932,17.9705
+56,933,16.51
+56,934,28.1728333333333
+56,935,27.4955
+56,936,22.9446666666667
+56,937,21.7381666666667
+56,938,19.9178333333333
+56,939,28.4903333333333
+56,940,24.6168333333333
+56,941,22.9023333333333
+56,942,23.2198333333333
+56,943,26.797
+56,944,23.4526666666667
+56,945,22.987
+56,946,24.6168333333333
+56,947,16.5946666666667
+56,948,17.8011666666667
+56,949,27.5378333333333
+56,950,22.1826666666667
+56,951,24.5745
+56,952,21.5476666666667
+56,953,17.6953333333333
+56,954,33.909
+56,955,27.0298333333333
+56,956,14.0123333333333
+56,957,32.0675
+56,958,25.7175
+56,959,32.8506666666667
+56,960,20.7221666666667
+56,961,31.7923333333333
+56,962,22.5001666666667
+56,963,28.6808333333333
+56,964,28.5961666666667
+56,965,26.5006666666667
+56,966,19.685
+56,967,26.162
+56,968,29.845
+56,969,23.6431666666667
+56,970,28.448
+56,971,26.3313333333333
+56,972,19.2828333333333
+56,973,13.8006666666667
+56,974,28.0246666666667
+56,975,22.8176666666667
+56,976,27.305
+56,977,21.9286666666667
+56,978,18.034
+56,979,21.1666666666667
+56,980,24.9978333333333
+56,981,27.4743333333333
+56,982,26.2255
+56,983,25.0613333333333
+56,984,25.654
+56,985,22.3731666666667
+56,986,16.5735
+56,987,18.288
+56,988,26.4795
+56,989,23.9606666666667
+56,990,15.0071666666667
+56,991,31.1785
+56,992,27.7706666666667
+56,993,26.2043333333333
+56,994,29.718
+56,995,24.3205
+56,996,17.2508333333333
+56,997,23.876
+56,998,24.5533333333333
+56,999,25.9715
+56,1000,22.3096666666667
+57,1,17.78
+57,2,20.8703333333333
+57,3,23.7066666666667
+57,4,24.0876666666667
+57,5,20.7856666666667
+57,6,22.9446666666667
+57,7,25.1883333333333
+57,8,23.6643333333333
+57,9,27.5166666666667
+57,10,20.4046666666667
+57,11,25.3153333333333
+57,12,21.1243333333333
+57,13,24.13
+57,14,22.4366666666667
+57,15,22.6483333333333
+57,16,23.5373333333333
+57,17,23.9606666666667
+57,18,23.495
+57,19,18.6266666666667
+57,20,24.892
+57,21,17.4413333333333
+57,22,24.7226666666667
+57,23,21.463
+57,24,22.3096666666667
+57,25,20.2776666666667
+57,26,21.209
+57,27,19.8543333333333
+57,28,31.75
+57,29,23.495
+57,30,29.4216666666667
+57,31,24.2993333333333
+57,32,28.0246666666667
+57,33,15.4516666666667
+57,34,24.4686666666667
+57,35,18.3303333333333
+57,36,23.749
+57,37,25.781
+57,38,27.813
+57,39,29.2946666666667
+57,40,20.6586666666667
+57,41,20.0236666666667
+57,42,27.0086666666667
+57,43,25.3153333333333
+57,44,21.2936666666667
+57,45,18.5843333333333
+57,46,26.035
+57,47,23.876
+57,48,24.511
+57,49,21.209
+57,50,27.3896666666667
+57,51,27.0086666666667
+57,52,25.3576666666667
+57,53,23.7066666666667
+57,54,21.5476666666667
+57,55,23.5796666666667
+57,56,22.6906666666667
+57,57,19.812
+57,58,24.0453333333333
+57,59,20.32
+57,60,26.9663333333333
+57,61,20.2353333333333
+57,62,21.9286666666667
+57,63,17.3566666666667
+57,64,24.0453333333333
+57,65,22.1403333333333
+57,66,19.7273333333333
+57,67,23.241
+57,68,19.1346666666667
+57,69,26.9663333333333
+57,70,23.7066666666667
+57,71,22.479
+57,72,24.13
+57,73,19.4733333333333
+57,74,23.9183333333333
+57,75,23.9183333333333
+57,76,24.1723333333333
+57,77,24.638
+57,78,22.479
+57,79,29.4216666666667
+57,80,25.146
+57,81,24.2993333333333
+57,82,17.0603333333333
+57,83,23.2833333333333
+57,84,22.479
+57,85,23.114
+57,86,17.78
+57,87,17.3143333333333
+57,88,25.9503333333333
+57,89,23.1986666666667
+57,90,23.495
+57,91,23.4526666666667
+57,92,24.3416666666667
+57,93,22.86
+57,94,22.1403333333333
+57,95,24.257
+57,96,21.0396666666667
+57,97,24.4263333333333
+57,98,22.225
+57,99,21.5476666666667
+57,100,25.8656666666667
+57,101,27.813
+57,102,25.527
+57,103,21.6323333333333
+57,104,22.3096666666667
+57,105,20.6586666666667
+57,106,23.241
+57,107,27.3473333333333
+57,108,21.0396666666667
+57,109,19.939
+57,110,25.3576666666667
+57,111,22.225
+57,112,19.1346666666667
+57,113,17.1873333333333
+57,114,22.86
+57,115,19.939
+57,116,20.955
+57,117,21.209
+57,118,22.225
+57,119,21.2513333333333
+57,120,28.9983333333333
+57,121,24.0453333333333
+57,122,18.415
+57,123,20.9126666666667
+57,124,23.8336666666667
+57,125,27.178
+57,126,16.383
+57,127,26.7123333333333
+57,128,23.9183333333333
+57,129,24.13
+57,130,24.765
+57,131,22.225
+57,132,21.59
+57,133,23.6643333333333
+57,134,21.6323333333333
+57,135,20.1506666666667
+57,136,26.289
+57,137,20.193
+57,138,24.003
+57,139,22.9446666666667
+57,140,21.463
+57,141,27.6436666666667
+57,142,18.161
+57,143,23.7066666666667
+57,144,26.4583333333333
+57,145,24.638
+57,146,26.162
+57,147,19.3886666666667
+57,148,25.527
+57,149,20.4893333333333
+57,150,22.987
+57,151,24.4263333333333
+57,152,25.8233333333333
+57,153,16.5523333333333
+57,154,26.67
+57,155,23.7913333333333
+57,156,27.559
+57,157,18.3726666666667
+57,158,25.2306666666667
+57,159,22.5636666666667
+57,160,22.1403333333333
+57,161,26.0773333333333
+57,162,21.8016666666667
+57,163,22.987
+57,164,23.4103333333333
+57,165,20.447
+57,166,19.558
+57,167,21.59
+57,168,25.8233333333333
+57,169,19.2616666666667
+57,170,22.9446666666667
+57,171,21.717
+57,172,23.495
+57,173,23.241
+57,174,21.59
+57,175,18.4573333333333
+57,176,23.0716666666667
+57,177,25.1036666666667
+57,178,19.177
+57,179,29.6333333333333
+57,180,23.5796666666667
+57,181,22.6483333333333
+57,182,23.876
+57,183,28.2363333333333
+57,184,23.7066666666667
+57,185,21.2936666666667
+57,186,24.3416666666667
+57,187,20.9126666666667
+57,188,23.0293333333333
+57,189,21.8863333333333
+57,190,18.669
+57,191,20.701
+57,192,22.987
+57,193,21.2513333333333
+57,194,22.7753333333333
+57,195,22.3943333333333
+57,196,28.956
+57,197,21.6746666666667
+57,198,20.2776666666667
+57,199,24.2146666666667
+57,200,28.829
+57,201,23.5373333333333
+57,202,22.5636666666667
+57,203,28.448
+57,204,20.4046666666667
+57,205,15.8326666666667
+57,206,22.098
+57,207,20.6163333333333
+57,208,23.368
+57,209,21.2936666666667
+57,210,20.7856666666667
+57,211,23.749
+57,212,22.987
+57,213,17.78
+57,214,20.8703333333333
+57,215,18.4996666666667
+57,216,19.05
+57,217,26.162
+57,218,22.987
+57,219,25.6963333333333
+57,220,21.1666666666667
+57,221,20.0236666666667
+57,222,28.4056666666667
+57,223,20.2776666666667
+57,224,25.9926666666667
+57,225,28.6596666666667
+57,226,21.336
+57,227,20.066
+57,228,23.876
+57,229,18.034
+57,230,20.955
+57,231,20.828
+57,232,22.7753333333333
+57,233,26.289
+57,234,18.6266666666667
+57,235,26.8816666666667
+57,236,26.2466666666667
+57,237,18.3303333333333
+57,238,28.3633333333333
+57,239,23.241
+57,240,19.5156666666667
+57,241,26.67
+57,242,28.5326666666667
+57,243,24.003
+57,244,24.0453333333333
+57,245,25.3576666666667
+57,246,20.4893333333333
+57,247,19.3463333333333
+57,248,20.7856666666667
+57,249,21.1666666666667
+57,250,23.0716666666667
+57,251,27.6436666666667
+57,252,23.0716666666667
+57,253,27.178
+57,254,21.717
+57,255,23.1986666666667
+57,256,28.575
+57,257,20.574
+57,258,20.8703333333333
+57,259,22.5636666666667
+57,260,21.6746666666667
+57,261,26.3736666666667
+57,262,21.844
+57,263,26.3313333333333
+57,264,18.161
+57,265,20.1506666666667
+57,266,27.3896666666667
+57,267,24.8073333333333
+57,268,25.527
+57,269,20.6586666666667
+57,270,21.082
+57,271,25.908
+57,272,21.6746666666667
+57,273,20.6586666666667
+57,274,20.2353333333333
+57,275,20.4893333333333
+57,276,22.6906666666667
+57,277,17.1873333333333
+57,278,29.3793333333333
+57,279,21.6323333333333
+57,280,24.5533333333333
+57,281,20.9126666666667
+57,282,21.6323333333333
+57,283,18.0763333333333
+57,284,21.717
+57,285,27.8976666666667
+57,286,20.4893333333333
+57,287,21.9286666666667
+57,288,24.8496666666667
+57,289,21.4206666666667
+57,290,23.1986666666667
+57,291,25.6116666666667
+57,292,21.336
+57,293,22.479
+57,294,20.193
+57,295,21.5053333333333
+57,296,15.1553333333333
+57,297,25.8233333333333
+57,298,21.8863333333333
+57,299,23.6643333333333
+57,300,27.8553333333333
+57,301,18.3303333333333
+57,302,31.369
+57,303,23.9606666666667
+57,304,23.9606666666667
+57,305,21.9286666666667
+57,306,24.2146666666667
+57,307,28.829
+57,308,18.415
+57,309,23.241
+57,310,25.3576666666667
+57,311,20.9126666666667
+57,312,28.4903333333333
+57,313,19.685
+57,314,22.225
+57,315,22.733
+57,316,24.384
+57,317,20.32
+57,318,21.0396666666667
+57,319,21.6323333333333
+57,320,18.669
+57,321,23.7913333333333
+57,322,23.749
+57,323,23.2833333333333
+57,324,20.9126666666667
+57,325,18.923
+57,326,26.2043333333333
+57,327,24.1723333333333
+57,328,19.0923333333333
+57,329,22.7753333333333
+57,330,21.717
+57,331,20.8703333333333
+57,332,23.5796666666667
+57,333,22.0556666666667
+57,334,20.828
+57,335,27.432
+57,336,20.701
+57,337,19.4733333333333
+57,338,19.2193333333333
+57,339,19.685
+57,340,24.13
+57,341,20.32
+57,342,21.7593333333333
+57,343,16.6793333333333
+57,344,18.8806666666667
+57,345,23.2833333333333
+57,346,17.907
+57,347,18.415
+57,348,16.256
+57,349,28.956
+57,350,25.273
+57,351,27.7283333333333
+57,352,23.0293333333333
+57,353,22.5213333333333
+57,354,18.3303333333333
+57,355,20.7433333333333
+57,356,25.654
+57,357,20.8703333333333
+57,358,25.3153333333333
+57,359,25.8656666666667
+57,360,20.7856666666667
+57,361,22.5213333333333
+57,362,22.7753333333333
+57,363,27.7706666666667
+57,364,18.542
+57,365,19.6003333333333
+57,366,25.8656666666667
+57,367,14.8166666666667
+57,368,26.0773333333333
+57,369,23.495
+57,370,20.447
+57,371,24.7226666666667
+57,372,16.891
+57,373,21.7593333333333
+57,374,30.9033333333333
+57,375,21.6746666666667
+57,376,24.7226666666667
+57,377,24.0876666666667
+57,378,22.4366666666667
+57,379,20.2776666666667
+57,380,25.5693333333333
+57,381,17.0603333333333
+57,382,27.4743333333333
+57,383,28.3633333333333
+57,384,19.9813333333333
+57,385,27.7283333333333
+57,386,25.273
+57,387,20.9973333333333
+57,388,23.5373333333333
+57,389,20.828
+57,390,28.1093333333333
+57,391,23.7066666666667
+57,392,23.495
+57,393,18.161
+57,394,27.9823333333333
+57,395,19.939
+57,396,25.8656666666667
+57,397,20.3623333333333
+57,398,16.891
+57,399,21.2936666666667
+57,400,25.2306666666667
+57,401,22.9023333333333
+57,402,25.6963333333333
+57,403,18.923
+57,404,21.3783333333333
+57,405,19.8966666666667
+57,406,19.7696666666667
+57,407,24.638
+57,408,19.7696666666667
+57,409,29.2523333333333
+57,410,23.6643333333333
+57,411,23.241
+57,412,30.099
+57,413,20.2353333333333
+57,414,18.2033333333333
+57,415,20.4046666666667
+57,416,21.2936666666667
+57,417,28.829
+57,418,24.511
+57,419,25.146
+57,420,25.8656666666667
+57,421,26.7546666666667
+57,422,21.9286666666667
+57,423,24.0453333333333
+57,424,21.6746666666667
+57,425,25.7386666666667
+57,426,25.8656666666667
+57,427,22.9446666666667
+57,428,21.3783333333333
+57,429,17.7376666666667
+57,430,26.162
+57,431,28.1516666666667
+57,432,17.8223333333333
+57,433,18.3303333333333
+57,434,18.2033333333333
+57,435,21.082
+57,436,25.7386666666667
+57,437,22.8176666666667
+57,438,23.0716666666667
+57,439,24.4686666666667
+57,440,25.0613333333333
+57,441,21.5053333333333
+57,442,21.2936666666667
+57,443,27.3473333333333
+57,444,22.86
+57,445,23.495
+57,446,26.289
+57,447,19.558
+57,448,23.749
+57,449,23.876
+57,450,24.4686666666667
+57,451,22.9023333333333
+57,452,29.21
+57,453,24.2146666666667
+57,454,26.5006666666667
+57,455,21.3783333333333
+57,456,18.8806666666667
+57,457,23.0293333333333
+57,458,19.0923333333333
+57,459,22.733
+57,460,20.6586666666667
+57,461,21.7593333333333
+57,462,24.511
+57,463,22.5636666666667
+57,464,25.9503333333333
+57,465,25.9503333333333
+57,466,21.9286666666667
+57,467,24.5956666666667
+57,468,25.9926666666667
+57,469,22.733
+57,470,26.035
+57,471,24.6803333333333
+57,472,24.638
+57,473,18.669
+57,474,21.6323333333333
+57,475,24.6803333333333
+57,476,24.257
+57,477,20.5316666666667
+57,478,23.5796666666667
+57,479,18.4573333333333
+57,480,18.5843333333333
+57,481,25.781
+57,482,22.098
+57,483,20.574
+57,484,22.987
+57,485,27.9823333333333
+57,486,24.2993333333333
+57,487,26.5006666666667
+57,488,22.9446666666667
+57,489,20.7856666666667
+57,490,27.559
+57,491,20.6586666666667
+57,492,21.336
+57,493,21.3783333333333
+57,494,22.479
+57,495,28.1093333333333
+57,496,24.7226666666667
+57,497,23.5373333333333
+57,498,21.4206666666667
+57,499,18.7113333333333
+57,500,27.6013333333333
+57,501,19.1346666666667
+57,502,22.098
+57,503,27.7283333333333
+57,504,22.7753333333333
+57,505,24.2146666666667
+57,506,19.05
+57,507,23.749
+57,508,18.7536666666667
+57,509,20.2776666666667
+57,510,27.5166666666667
+57,511,24.638
+57,512,22.5636666666667
+57,513,20.32
+57,514,22.606
+57,515,24.13
+57,516,27.3896666666667
+57,517,18.4996666666667
+57,518,30.607
+57,519,21.209
+57,520,23.1563333333333
+57,521,22.479
+57,522,21.082
+57,523,23.114
+57,524,20.447
+57,525,22.86
+57,526,25.273
+57,527,22.352
+57,528,27.2626666666667
+57,529,22.6906666666667
+57,530,21.082
+57,531,23.1563333333333
+57,532,28.067
+57,533,21.8016666666667
+57,534,22.098
+57,535,20.6586666666667
+57,536,23.114
+57,537,20.3623333333333
+57,538,21.717
+57,539,20.6586666666667
+57,540,25.1036666666667
+57,541,22.225
+57,542,18.5843333333333
+57,543,17.399
+57,544,26.3313333333333
+57,545,30.2683333333333
+57,546,29.337
+57,547,23.0716666666667
+57,548,23.7913333333333
+57,549,25.781
+57,550,26.67
+57,551,20.8703333333333
+57,552,22.9446666666667
+57,553,23.5373333333333
+57,554,19.0076666666667
+57,555,24.8073333333333
+57,556,24.3416666666667
+57,557,26.8816666666667
+57,558,23.9183333333333
+57,559,19.177
+57,560,20.7433333333333
+57,561,20.447
+57,562,25.4846666666667
+57,563,23.0716666666667
+57,564,25.4846666666667
+57,565,24.13
+57,566,24.5533333333333
+57,567,28.8713333333333
+57,568,23.368
+57,569,15.748
+57,570,22.0133333333333
+57,571,22.098
+57,572,21.3783333333333
+57,573,25.3576666666667
+57,574,21.9286666666667
+57,575,28.4903333333333
+57,576,24.5533333333333
+57,577,18.542
+57,578,21.209
+57,579,21.463
+57,580,28.448
+57,581,25.8656666666667
+57,582,21.4206666666667
+57,583,22.3943333333333
+57,584,25.2306666666667
+57,585,26.5853333333333
+57,586,25.3576666666667
+57,587,20.4046666666667
+57,588,25.781
+57,589,26.035
+57,590,19.9813333333333
+57,591,18.542
+57,592,24.0453333333333
+57,593,20.9126666666667
+57,594,25.3576666666667
+57,595,26.67
+57,596,22.0133333333333
+57,597,18.8806666666667
+57,598,24.9343333333333
+57,599,25.654
+57,600,20.574
+57,601,20.1083333333333
+57,602,22.0556666666667
+57,603,18.669
+57,604,21.2936666666667
+57,605,22.3096666666667
+57,606,22.1403333333333
+57,607,20.7856666666667
+57,608,20.1506666666667
+57,609,24.2146666666667
+57,610,23.9183333333333
+57,611,23.6643333333333
+57,612,21.1666666666667
+57,613,21.336
+57,614,18.7113333333333
+57,615,22.86
+57,616,22.225
+57,617,24.8073333333333
+57,618,22.6906666666667
+57,619,20.2776666666667
+57,620,20.8703333333333
+57,621,20.6163333333333
+57,622,30.1836666666667
+57,623,24.2993333333333
+57,624,25.0613333333333
+57,625,23.622
+57,626,22.5213333333333
+57,627,23.876
+57,628,21.1666666666667
+57,629,20.3623333333333
+57,630,25.146
+57,631,21.336
+57,632,22.8176666666667
+57,633,20.4893333333333
+57,634,27.178
+57,635,26.924
+57,636,24.003
+57,637,18.6266666666667
+57,638,25.3576666666667
+57,639,17.7376666666667
+57,640,21.5476666666667
+57,641,22.5213333333333
+57,642,24.384
+57,643,25.4
+57,644,19.8543333333333
+57,645,21.971
+57,646,22.0133333333333
+57,647,25.146
+57,648,21.844
+57,649,24.9343333333333
+57,650,22.9023333333333
+57,651,19.8543333333333
+57,652,23.8336666666667
+57,653,24.892
+57,654,17.2296666666667
+57,655,20.066
+57,656,24.7226666666667
+57,657,22.8176666666667
+57,658,15.0283333333333
+57,659,28.7443333333333
+57,660,21.4206666666667
+57,661,24.511
+57,662,18.3726666666667
+57,663,19.558
+57,664,27.0933333333333
+57,665,21.971
+57,666,24.9766666666667
+57,667,22.6483333333333
+57,668,26.289
+57,669,27.6013333333333
+57,670,20.6586666666667
+57,671,17.7376666666667
+57,672,26.035
+57,673,20.7856666666667
+57,674,18.0763333333333
+57,675,26.8816666666667
+57,676,19.7273333333333
+57,677,19.8543333333333
+57,678,24.2146666666667
+57,679,28.2363333333333
+57,680,24.638
+57,681,26.5006666666667
+57,682,19.2616666666667
+57,683,21.1243333333333
+57,684,22.3096666666667
+57,685,22.6483333333333
+57,686,19.0923333333333
+57,687,18.8383333333333
+57,688,25.527
+57,689,25.8233333333333
+57,690,21.5053333333333
+57,691,20.9126666666667
+57,692,22.6906666666667
+57,693,21.1243333333333
+57,694,16.2983333333333
+57,695,25.4846666666667
+57,696,20.6163333333333
+57,697,24.003
+57,698,24.2146666666667
+57,699,24.0453333333333
+57,700,18.3303333333333
+57,701,25.3153333333333
+57,702,23.749
+57,703,21.209
+57,704,24.3416666666667
+57,705,27.0933333333333
+57,706,21.0396666666667
+57,707,20.3623333333333
+57,708,23.876
+57,709,21.844
+57,710,19.05
+57,711,24.0876666666667
+57,712,22.098
+57,713,25.2306666666667
+57,714,28.448
+57,715,20.8703333333333
+57,716,25.7386666666667
+57,717,19.558
+57,718,22.0556666666667
+57,719,21.717
+57,720,23.368
+57,721,23.368
+57,722,22.0133333333333
+57,723,22.1403333333333
+57,724,24.5956666666667
+57,725,22.987
+57,726,18.4996666666667
+57,727,18.2033333333333
+57,728,24.384
+57,729,20.066
+57,730,22.225
+57,731,19.2193333333333
+57,732,20.2353333333333
+57,733,23.3256666666667
+57,734,21.844
+57,735,22.6483333333333
+57,736,24.257
+57,737,20.7856666666667
+57,738,23.2833333333333
+57,739,19.812
+57,740,23.6643333333333
+57,741,22.3943333333333
+57,742,22.9446666666667
+57,743,21.8016666666667
+57,744,18.669
+57,745,21.6746666666667
+57,746,20.9973333333333
+57,747,24.4686666666667
+57,748,25.7386666666667
+57,749,23.495
+57,750,17.4413333333333
+57,751,21.463
+57,752,20.574
+57,753,24.0453333333333
+57,754,27.6013333333333
+57,755,23.749
+57,756,31.2843333333333
+57,757,18.923
+57,758,26.3736666666667
+57,759,18.7536666666667
+57,760,20.6163333333333
+57,761,23.8336666666667
+57,762,25.7386666666667
+57,763,20.447
+57,764,24.257
+57,765,19.304
+57,766,24.2146666666667
+57,767,26.7123333333333
+57,768,17.526
+57,769,19.7696666666667
+57,770,23.9183333333333
+57,771,27.051
+57,772,22.5636666666667
+57,773,23.4526666666667
+57,774,21.8863333333333
+57,775,16.7216666666667
+57,776,26.543
+57,777,18.6266666666667
+57,778,23.6643333333333
+57,779,23.241
+57,780,26.543
+57,781,22.8176666666667
+57,782,24.4263333333333
+57,783,21.1666666666667
+57,784,25.9926666666667
+57,785,21.59
+57,786,22.6906666666667
+57,787,24.2993333333333
+57,788,16.0866666666667
+57,789,19.6426666666667
+57,790,27.0086666666667
+57,791,25.6116666666667
+57,792,19.685
+57,793,17.907
+57,794,24.9343333333333
+57,795,22.0133333333333
+57,796,22.3096666666667
+57,797,22.1403333333333
+57,798,21.1666666666667
+57,799,21.6746666666667
+57,800,28.702
+57,801,23.5373333333333
+57,802,19.7273333333333
+57,803,19.7696666666667
+57,804,26.7123333333333
+57,805,20.7433333333333
+57,806,18.669
+57,807,23.114
+57,808,21.9286666666667
+57,809,20.4046666666667
+57,810,21.209
+57,811,22.479
+57,812,35.2636666666667
+57,813,21.8863333333333
+57,814,25.781
+57,815,20.9973333333333
+57,816,23.5796666666667
+57,817,16.4253333333333
+57,818,29.5063333333333
+57,819,20.3623333333333
+57,820,23.0293333333333
+57,821,23.5796666666667
+57,822,24.1723333333333
+57,823,19.3886666666667
+57,824,22.352
+57,825,26.8393333333333
+57,826,25.019
+57,827,22.86
+57,828,20.4046666666667
+57,829,22.4366666666667
+57,830,21.5476666666667
+57,831,22.2673333333333
+57,832,23.3256666666667
+57,833,24.6803333333333
+57,834,21.971
+57,835,25.146
+57,836,22.606
+57,837,20.5316666666667
+57,838,24.3416666666667
+57,839,25.9926666666667
+57,840,23.876
+57,841,23.8336666666667
+57,842,22.606
+57,843,25.273
+57,844,19.6426666666667
+57,845,20.1506666666667
+57,846,21.3783333333333
+57,847,26.2043333333333
+57,848,22.6906666666667
+57,849,17.907
+57,850,22.0556666666667
+57,851,27.0086666666667
+57,852,26.3736666666667
+57,853,21.6746666666667
+57,854,16.129
+57,855,20.9973333333333
+57,856,19.5156666666667
+57,857,16.5946666666667
+57,858,19.0923333333333
+57,859,21.8016666666667
+57,860,22.733
+57,861,24.5533333333333
+57,862,24.8496666666667
+57,863,22.6483333333333
+57,864,20.4046666666667
+57,865,21.1666666666667
+57,866,23.7913333333333
+57,867,25.4
+57,868,24.5533333333333
+57,869,17.526
+57,870,24.0453333333333
+57,871,25.2306666666667
+57,872,18.415
+57,873,18.4573333333333
+57,874,17.6953333333333
+57,875,26.7546666666667
+57,876,27.9823333333333
+57,877,23.5796666666667
+57,878,24.2146666666667
+57,879,24.0453333333333
+57,880,23.241
+57,881,25.781
+57,882,22.225
+57,883,20.32
+57,884,28.829
+57,885,19.1346666666667
+57,886,21.4206666666667
+57,887,19.304
+57,888,18.923
+57,889,25.4423333333333
+57,890,26.7546666666667
+57,891,24.2146666666667
+57,892,18.1186666666667
+57,893,24.2993333333333
+57,894,29.1253333333333
+57,895,22.9446666666667
+57,896,21.971
+57,897,22.733
+57,898,23.2833333333333
+57,899,20.193
+57,900,25.1036666666667
+57,901,16.4676666666667
+57,902,23.622
+57,903,24.0876666666667
+57,904,21.2513333333333
+57,905,16.764
+57,906,17.7376666666667
+57,907,20.9973333333333
+57,908,21.2513333333333
+57,909,19.7273333333333
+57,910,23.4103333333333
+57,911,20.0236666666667
+57,912,26.7123333333333
+57,913,18.542
+57,914,19.0076666666667
+57,915,26.6276666666667
+57,916,22.1403333333333
+57,917,21.6746666666667
+57,918,21.8016666666667
+57,919,19.9813333333333
+57,920,23.5373333333333
+57,921,20.4046666666667
+57,922,30.0143333333333
+57,923,18.7536666666667
+57,924,23.241
+57,925,20.1083333333333
+57,926,20.9973333333333
+57,927,21.2936666666667
+57,928,20.193
+57,929,21.717
+57,930,20.2776666666667
+57,931,26.8393333333333
+57,932,27.813
+57,933,25.1883333333333
+57,934,18.7536666666667
+57,935,18.3726666666667
+57,936,14.3933333333333
+57,937,22.225
+57,938,21.2936666666667
+57,939,21.336
+57,940,28.702
+57,941,23.8336666666667
+57,942,21.844
+57,943,24.638
+57,944,25.4
+57,945,23.622
+57,946,22.3943333333333
+57,947,24.7226666666667
+57,948,20.2353333333333
+57,949,20.447
+57,950,22.6483333333333
+57,951,20.828
+57,952,27.3473333333333
+57,953,22.9023333333333
+57,954,17.5683333333333
+57,955,26.8393333333333
+57,956,26.7546666666667
+57,957,22.9023333333333
+57,958,25.4
+57,959,20.701
+57,960,22.9446666666667
+57,961,19.558
+57,962,19.7696666666667
+57,963,22.7753333333333
+57,964,20.9973333333333
+57,965,21.6323333333333
+57,966,19.558
+57,967,22.9023333333333
+57,968,20.4893333333333
+57,969,22.7753333333333
+57,970,24.892
+57,971,20.7433333333333
+57,972,20.3623333333333
+57,973,26.8816666666667
+57,974,18.9653333333333
+57,975,20.3623333333333
+57,976,24.765
+57,977,24.4263333333333
+57,978,25.0613333333333
+57,979,22.098
+57,980,22.3096666666667
+57,981,23.749
+57,982,23.876
+57,983,21.3783333333333
+57,984,20.32
+57,985,20.7856666666667
+57,986,23.5373333333333
+57,987,23.622
+57,988,24.892
+57,989,17.399
+57,990,20.6586666666667
+57,991,22.4366666666667
+57,992,25.4
+57,993,27.94
+57,994,22.733
+57,995,23.495
+57,996,23.8336666666667
+57,997,22.1826666666667
+57,998,27.305
+57,999,26.5853333333333
+57,1000,23.9183333333333
+58,1,29.845
+58,2,24.7015
+58,3,35.9198333333333
+58,4,23.3468333333333
+58,5,24.7015
+58,6,29.3581666666667
+58,7,31.7923333333333
+58,8,33.5068333333333
+58,9,28.829
+58,10,33.1893333333333
+58,11,43.8573333333333
+58,12,29.6333333333333
+58,13,26.8393333333333
+58,14,26.4371666666667
+58,15,24.4898333333333
+58,16,27.2626666666667
+58,17,33.401
+58,18,32.004
+58,19,18.1186666666667
+58,20,34.5016666666667
+58,21,27.9611666666667
+58,22,39.0948333333333
+58,23,31.5595
+58,24,26.9451666666667
+58,25,36.7876666666667
+58,26,29.337
+58,27,23.3468333333333
+58,28,27.1991666666667
+58,29,31.5806666666667
+58,30,32.9776666666667
+58,31,22.098
+58,32,21.971
+58,33,30.1201666666667
+58,34,36.3643333333333
+58,35,38.227
+58,36,42.7778333333333
+58,37,22.5425
+58,38,22.733
+58,39,37.7825
+58,40,26.9663333333333
+58,41,29.6333333333333
+58,42,29.3793333333333
+58,43,29.5063333333333
+58,44,25.4
+58,45,37.592
+58,46,19.3251666666667
+58,47,29.464
+58,48,32.1098333333333
+58,49,23.9183333333333
+58,50,30.2895
+58,51,36.7453333333333
+58,52,28.2786666666667
+58,53,39.0313333333333
+58,54,26.5218333333333
+58,55,24.2146666666667
+58,56,37.8248333333333
+58,57,37.5073333333333
+58,58,30.3953333333333
+58,59,34.7768333333333
+58,60,24.8708333333333
+58,61,29.845
+58,62,27.2626666666667
+58,63,28.9348333333333
+58,64,38.2058333333333
+58,65,32.9565
+58,66,29.4851666666667
+58,67,30.7975
+58,68,31.6018333333333
+58,69,39.9415
+58,70,36.2373333333333
+58,71,40.9151666666667
+58,72,37.465
+58,73,30.1836666666667
+58,74,35.3483333333333
+58,75,36.5336666666667
+58,76,24.8496666666667
+58,77,35.9198333333333
+58,78,33.4856666666667
+58,79,34.7556666666667
+58,80,34.544
+58,81,30.5223333333333
+58,82,28.8925
+58,83,25.9291666666667
+58,84,32.8718333333333
+58,85,38.0153333333333
+58,86,31.0515
+58,87,33.8455
+58,88,24.7861666666667
+58,89,35.7716666666667
+58,90,33.3163333333333
+58,91,30.0355
+58,92,36.3431666666667
+58,93,30.988
+58,94,31.5595
+58,95,27.6436666666667
+58,96,26.6911666666667
+58,97,37.0205
+58,98,28.2151666666667
+58,99,26.8816666666667
+58,100,36.2161666666667
+58,101,23.8548333333333
+58,102,36.322
+58,103,30.2048333333333
+58,104,31.75
+58,105,30.3953333333333
+58,106,31.2208333333333
+58,107,25.0825
+58,108,29.4216666666667
+58,109,29.2311666666667
+58,110,37.1051666666667
+58,111,28.6808333333333
+58,112,23.0716666666667
+58,113,36.5125
+58,114,24.2993333333333
+58,115,29.5275
+58,116,31.3478333333333
+58,117,27.2415
+58,118,23.8548333333333
+58,119,28.829
+58,120,31.7288333333333
+58,121,34.8826666666667
+58,122,30.353
+58,123,25.6328333333333
+58,124,33.7185
+58,125,23.9183333333333
+58,126,28.6808333333333
+58,127,25.8021666666667
+58,128,32.6601666666667
+58,129,28.321
+58,130,29.3158333333333
+58,131,32.8083333333333
+58,132,42.4603333333333
+58,133,30.6705
+58,134,27.813
+58,135,26.8816666666667
+58,136,25.5693333333333
+58,137,23.9395
+58,138,39.3276666666667
+58,139,18.1821666666667
+58,140,28.7655
+58,141,21.1243333333333
+58,142,35.3483333333333
+58,143,31.877
+58,144,26.6911666666667
+58,145,29.5698333333333
+58,146,25.9926666666667
+58,147,25.908
+58,148,45.0426666666667
+58,149,41.9311666666667
+58,150,26.9875
+58,151,25.2306666666667
+58,152,33.8455
+58,153,19.6638333333333
+58,154,41.2538333333333
+58,155,40.8516666666667
+58,156,24.9343333333333
+58,157,32.7025
+58,158,27.7495
+58,159,20.3623333333333
+58,160,28.8925
+58,161,39.7721666666667
+58,162,29.6333333333333
+58,163,19.9813333333333
+58,164,26.162
+58,165,28.8078333333333
+58,166,33.0411666666667
+58,167,33.782
+58,168,37.592
+58,169,26.924
+58,170,27.2626666666667
+58,171,29.2735
+58,172,28.5961666666667
+58,173,28.6385
+58,174,28.6173333333333
+58,175,29.5698333333333
+58,176,26.1408333333333
+58,177,31.0303333333333
+58,178,28.1516666666667
+58,179,27.8341666666667
+58,180,29.6968333333333
+58,181,42.0158333333333
+58,182,25.4635
+58,183,30.1836666666667
+58,184,28.1093333333333
+58,185,28.702
+58,186,34.5651666666667
+58,187,26.3525
+58,188,21.5053333333333
+58,189,39.9203333333333
+58,190,26.4795
+58,191,30.2471666666667
+58,192,31.115
+58,193,22.7965
+58,194,32.3426666666667
+58,195,27.6013333333333
+58,196,27.305
+58,197,26.7335
+58,198,37.7825
+58,199,20.193
+58,200,34.3111666666667
+58,201,21.4418333333333
+58,202,30.6916666666667
+58,203,30.0355
+58,204,32.1098333333333
+58,205,32.5331666666667
+58,206,26.0985
+58,207,29.8661666666667
+58,208,31.7076666666667
+58,209,29.9085
+58,210,29.8873333333333
+58,211,22.0556666666667
+58,212,23.2621666666667
+58,213,29.464
+58,214,30.0143333333333
+58,215,32.1098333333333
+58,216,29.2311666666667
+58,217,33.1258333333333
+58,218,35.179
+58,219,34.417
+58,220,26.8181666666667
+58,221,38.989
+58,222,30.8398333333333
+58,223,34.4593333333333
+58,224,23.749
+58,225,26.3525
+58,226,28.956
+58,227,32.4485
+58,228,30.0355
+58,229,29.6756666666667
+58,230,31.4325
+58,231,26.9663333333333
+58,232,29.6121666666667
+58,233,26.8605
+58,234,20.2565
+58,235,31.115
+58,236,31.877
+58,237,30.226
+58,238,33.8031666666667
+58,239,25.8021666666667
+58,240,29.1676666666667
+58,241,28.9348333333333
+58,242,21.2936666666667
+58,243,38.1
+58,244,33.1258333333333
+58,245,41.275
+58,246,35.7081666666667
+58,247,25.527
+58,248,25.4635
+58,249,24.8073333333333
+58,250,33.1258333333333
+58,251,30.4165
+58,252,36.2585
+58,253,27.3685
+58,254,34.6921666666667
+58,255,25.2095
+58,256,28.194
+58,257,33.909
+58,258,31.0303333333333
+58,259,20.8703333333333
+58,260,37.3591666666667
+58,261,32.4273333333333
+58,262,27.1568333333333
+58,263,17.526
+58,264,34.671
+58,265,36.9146666666667
+58,266,31.115
+58,267,46.1856666666667
+58,268,30.2683333333333
+58,269,28.2575
+58,270,43.9631666666667
+58,271,28.8925
+58,272,24.4475
+58,273,28.5961666666667
+58,274,25.1248333333333
+58,275,27.8765
+58,276,41.4655
+58,277,30.2471666666667
+58,278,33.3586666666667
+58,279,26.6065
+58,280,28.3421666666667
+58,281,27.305
+58,282,26.8605
+58,283,27.4743333333333
+58,284,25.6328333333333
+58,285,31.2843333333333
+58,286,30.0143333333333
+58,287,21.5265
+58,288,24.0453333333333
+58,289,26.3313333333333
+58,290,26.7335
+58,291,24.7015
+58,292,32.131
+58,293,25.5693333333333
+58,294,38.354
+58,295,28.6808333333333
+58,296,34.1206666666667
+58,297,24.7861666666667
+58,298,23.876
+58,299,22.5636666666667
+58,300,25.781
+58,301,31.115
+58,302,30.6493333333333
+58,303,33.7608333333333
+58,304,25.6751666666667
+58,305,31.6653333333333
+58,306,33.2105
+58,307,33.8243333333333
+58,308,28.956
+58,309,19.5368333333333
+58,310,27.813
+58,311,29.718
+58,312,30.0143333333333
+58,313,21.971
+58,314,26.797
+58,315,32.1098333333333
+58,316,40.9786666666667
+58,317,16.8698333333333
+58,318,36.576
+58,319,27.7706666666667
+58,320,30.734
+58,321,31.369
+58,322,34.3111666666667
+58,323,28.4056666666667
+58,324,19.7061666666667
+58,325,30.9668333333333
+58,326,31.0303333333333
+58,327,29.8026666666667
+58,328,33.3586666666667
+58,329,28.5326666666667
+58,330,28.0458333333333
+58,331,22.1826666666667
+58,332,33.6761666666667
+58,333,34.1418333333333
+58,334,23.241
+58,335,31.8346666666667
+58,336,38.8408333333333
+58,337,31.2208333333333
+58,338,32.4696666666667
+58,339,24.0241666666667
+58,340,33.5703333333333
+58,341,24.8285
+58,342,31.4325
+58,343,24.9131666666667
+58,344,27.0086666666667
+58,345,38.2058333333333
+58,346,32.9776666666667
+58,347,50.8423333333333
+58,348,35.5388333333333
+58,349,44.0901666666667
+58,350,29.0195
+58,351,18.8595
+58,352,36.5548333333333
+58,353,35.7716666666667
+58,354,28.6596666666667
+58,355,23.0505
+58,356,34.6286666666667
+58,357,26.3313333333333
+58,358,32.9353333333333
+58,359,35.3695
+58,360,33.6338333333333
+58,361,31.242
+58,362,35.0943333333333
+58,363,30.2683333333333
+58,364,28.575
+58,365,33.6973333333333
+58,366,24.3205
+58,367,29.0195
+58,368,34.29
+58,369,28.702
+58,370,29.8661666666667
+58,371,40.3648333333333
+58,372,45.847
+58,373,29.9931666666667
+58,374,26.2255
+58,375,31.8135
+58,376,24.511
+58,377,29.2311666666667
+58,378,28.575
+58,379,34.8403333333333
+58,380,33.1681666666667
+58,381,43.6668333333333
+58,382,25.6116666666667
+58,383,36.4278333333333
+58,384,35.4541666666667
+58,385,25.4423333333333
+58,386,29.6333333333333
+58,387,38.0576666666667
+58,388,31.2208333333333
+58,389,31.6441666666667
+58,390,24.003
+58,391,38.0576666666667
+58,392,32.4061666666667
+58,393,24.8285
+58,394,23.7701666666667
+58,395,30.1413333333333
+58,396,36.9146666666667
+58,397,36.0256666666667
+58,398,26.3313333333333
+58,399,23.3891666666667
+58,400,25.1036666666667
+58,401,36.0256666666667
+58,402,28.702
+58,403,37.2533333333333
+58,404,26.6065
+58,405,30.353
+58,406,29.6545
+58,407,34.9885
+58,408,32.5543333333333
+58,409,33.2951666666667
+58,410,27.4531666666667
+58,411,30.353
+58,412,36.3643333333333
+58,413,27.8765
+58,414,27.051
+58,415,31.6865
+58,416,26.924
+58,417,22.1403333333333
+58,418,37.973
+58,419,32.5543333333333
+58,420,34.5651666666667
+58,421,35.56
+58,422,36.9146666666667
+58,423,27.4955
+58,424,36.83
+58,425,31.3478333333333
+58,426,33.8878333333333
+58,427,15.7903333333333
+58,428,23.7278333333333
+58,429,26.3948333333333
+58,430,39.7086666666667
+58,431,22.2885
+58,432,35.5388333333333
+58,433,36.0045
+58,434,25.4423333333333
+58,435,34.6075
+58,436,26.3525
+58,437,21.6111666666667
+58,438,37.3591666666667
+58,439,30.988
+58,440,36.1103333333333
+58,441,30.48
+58,442,25.5481666666667
+58,443,32.7448333333333
+58,444,33.6338333333333
+58,445,22.8811666666667
+58,446,28.8078333333333
+58,447,28.829
+58,448,32.766
+58,449,30.734
+58,450,31.8346666666667
+58,451,31.4325
+58,452,31.2208333333333
+58,453,20.9338333333333
+58,454,28.4903333333333
+58,455,28.5538333333333
+58,456,30.7763333333333
+58,457,30.226
+58,458,24.003
+58,459,26.9875
+58,460,34.9038333333333
+58,461,25.5058333333333
+58,462,33.401
+58,463,26.0985
+58,464,35.2425
+58,465,28.194
+58,466,27.4955
+58,467,30.5646666666667
+58,468,30.1836666666667
+58,469,29.8238333333333
+58,470,26.035
+58,471,32.512
+58,472,25.2518333333333
+58,473,26.4795
+58,474,44.196
+58,475,33.3163333333333
+58,476,22.8811666666667
+58,477,27.559
+58,478,22.0345
+58,479,32.4273333333333
+58,480,35.8563333333333
+58,481,21.6111666666667
+58,482,30.6493333333333
+58,483,27.1991666666667
+58,484,27.6225
+58,485,31.6441666666667
+58,486,24.4898333333333
+58,487,32.9988333333333
+58,488,22.4155
+58,489,27.6436666666667
+58,490,40.6611666666667
+58,491,28.5538333333333
+58,492,33.2951666666667
+58,493,34.29
+58,494,23.7701666666667
+58,495,30.9456666666667
+58,496,36.576
+58,497,22.352
+58,498,36.0045
+58,499,25.527
+58,500,27.4108333333333
+58,501,37.9941666666667
+58,502,26.4371666666667
+58,503,35.6446666666667
+58,504,28.2786666666667
+58,505,31.5806666666667
+58,506,29.6545
+58,507,26.924
+58,508,32.8718333333333
+58,509,32.639
+58,510,25.8868333333333
+58,511,33.1681666666667
+58,512,30.2683333333333
+58,513,25.4846666666667
+58,514,24.8073333333333
+58,515,34.3746666666667
+58,516,32.3215
+58,517,31.877
+58,518,36.195
+58,519,26.3525
+58,520,28.4903333333333
+58,521,28.2998333333333
+58,522,30.0143333333333
+58,523,29.6968333333333
+58,524,34.163
+58,525,29.6756666666667
+58,526,28.2575
+58,527,18.3303333333333
+58,528,33.6126666666667
+58,529,37.4015
+58,530,32.8718333333333
+58,531,27.9188333333333
+58,532,39.1371666666667
+58,533,27.7283333333333
+58,534,35.0731666666667
+58,535,30.5223333333333
+58,536,42.291
+58,537,27.432
+58,538,35.306
+58,539,36.576
+58,540,26.1196666666667
+58,541,34.1206666666667
+58,542,30.0566666666667
+58,543,30.353
+58,544,27.6436666666667
+58,545,33.147
+58,546,33.2528333333333
+58,547,24.9343333333333
+58,548,25.7598333333333
+58,549,31.9405
+58,550,30.6281666666667
+58,551,36.8723333333333
+58,552,30.5435
+58,553,33.2105
+58,554,29.5486666666667
+58,555,26.6911666666667
+58,556,22.4578333333333
+58,557,34.3535
+58,558,36.1315
+58,559,33.8031666666667
+58,560,34.9673333333333
+58,561,34.7768333333333
+58,562,27.4531666666667
+58,563,26.289
+58,564,25.8868333333333
+58,565,25.9926666666667
+58,566,27.7918333333333
+58,567,21.1243333333333
+58,568,25.9926666666667
+58,569,31.2843333333333
+58,570,42.1005
+58,571,31.3478333333333
+58,572,23.9183333333333
+58,573,35.0308333333333
+58,574,31.496
+58,575,28.067
+58,576,37.2533333333333
+58,577,34.6498333333333
+58,578,38.3328333333333
+58,579,26.0561666666667
+58,580,22.0768333333333
+58,581,35.0096666666667
+58,582,27.94
+58,583,38.1635
+58,584,22.7965
+58,585,22.6695
+58,586,25.8868333333333
+58,587,26.7758333333333
+58,588,26.9451666666667
+58,589,30.9245
+58,590,32.4273333333333
+58,591,31.8135
+58,592,23.0505
+58,593,34.5863333333333
+58,594,28.067
+58,595,30.4588333333333
+58,596,36.3431666666667
+58,597,33.0411666666667
+58,598,30.8821666666667
+58,599,30.5011666666667
+58,600,23.8971666666667
+58,601,35.7293333333333
+58,602,32.9565
+58,603,30.734
+58,604,35.4753333333333
+58,605,24.13
+58,606,27.9823333333333
+58,607,24.892
+58,608,39.8356666666667
+58,609,32.258
+58,610,20.2988333333333
+58,611,26.2255
+58,612,28.3845
+58,613,25.5905
+58,614,37.6131666666667
+58,615,35.2213333333333
+58,616,27.0933333333333
+58,617,25.3153333333333
+58,618,36.4066666666667
+58,619,36.9993333333333
+58,620,39.4335
+58,621,37.592
+58,622,29.4428333333333
+58,623,31.5806666666667
+58,624,35.0096666666667
+58,625,27.8341666666667
+58,626,21.6746666666667
+58,627,34.7345
+58,628,26.0773333333333
+58,629,31.115
+58,630,34.925
+58,631,23.9818333333333
+58,632,27.2415
+58,633,31.7076666666667
+58,634,23.7913333333333
+58,635,21.1878333333333
+58,636,31.4748333333333
+58,637,30.9245
+58,638,28.3421666666667
+58,639,38.5021666666667
+58,640,20.5105
+58,641,25.9715
+58,642,23.8336666666667
+58,643,35.6023333333333
+58,644,41.4866666666667
+58,645,26.035
+58,646,39.2641666666667
+58,647,28.2575
+58,648,24.6591666666667
+58,649,28.6385
+58,650,26.7123333333333
+58,651,24.3628333333333
+58,652,20.9761666666667
+58,653,24.4898333333333
+58,654,25.7175
+58,655,38.5233333333333
+58,656,30.48
+58,657,38.6926666666667
+58,658,38.9466666666667
+58,659,38.1846666666667
+58,660,32.9353333333333
+58,661,32.3003333333333
+58,662,29.2523333333333
+58,663,33.8031666666667
+58,664,38.2481666666667
+58,665,28.321
+58,666,28.8501666666667
+58,667,28.4268333333333
+58,668,21.4841666666667
+58,669,23.2833333333333
+58,670,37.084
+58,671,38.1
+58,672,30.7551666666667
+58,673,19.3675
+58,674,32.9141666666667
+58,675,30.5011666666667
+58,676,39.3488333333333
+58,677,24.9555
+58,678,31.623
+58,679,30.1413333333333
+58,680,37.2745
+58,681,36.2161666666667
+58,682,25.7386666666667
+58,683,35.6235
+58,684,31.0726666666667
+58,685,24.2993333333333
+58,686,26.035
+58,687,21.8228333333333
+58,688,36.322
+58,689,38.5868333333333
+58,690,31.6865
+58,691,33.4856666666667
+58,692,28.829
+58,693,32.7871666666667
+58,694,28.702
+58,695,29.7815
+58,696,20.9338333333333
+58,697,38.0153333333333
+58,698,31.8981666666667
+58,699,27.3685
+58,700,21.0608333333333
+58,701,23.0081666666667
+58,702,28.4056666666667
+58,703,36.8088333333333
+58,704,32.9988333333333
+58,705,25.4635
+58,706,27.9188333333333
+58,707,32.385
+58,708,28.2786666666667
+58,709,27.4743333333333
+58,710,35.2213333333333
+58,711,28.0246666666667
+58,712,17.907
+58,713,33.8243333333333
+58,714,29.8661666666667
+58,715,31.0091666666667
+58,716,20.6798333333333
+58,717,20.9126666666667
+58,718,34.9673333333333
+58,719,27.3685
+58,720,35.8986666666667
+58,721,29.3158333333333
+58,722,23.2198333333333
+58,723,36.3855
+58,724,27.305
+58,725,29.718
+58,726,29.1676666666667
+58,727,30.099
+58,728,34.4593333333333
+58,729,33.528
+58,730,31.9405
+58,731,27.6225
+58,732,32.4485
+58,733,29.9296666666667
+58,734,24.6803333333333
+58,735,29.1041666666667
+58,736,21.2301666666667
+58,737,26.4583333333333
+58,738,36.2373333333333
+58,739,31.6441666666667
+58,740,28.1093333333333
+58,741,24.8496666666667
+58,742,41.7195
+58,743,28.1305
+58,744,26.9875
+58,745,20.8703333333333
+58,746,31.5595
+58,747,33.2105
+58,748,25.4846666666667
+58,749,29.1253333333333
+58,750,39.3911666666667
+58,751,27.7918333333333
+58,752,22.4366666666667
+58,753,33.0835
+58,754,29.21
+58,755,32.512
+58,756,34.3323333333333
+58,757,35.4753333333333
+58,758,38.4175
+58,759,30.3953333333333
+58,760,26.0138333333333
+58,761,40.259
+58,762,34.5016666666667
+58,763,28.067
+58,764,35.1578333333333
+58,765,34.9461666666667
+58,766,33.7396666666667
+58,767,31.0091666666667
+58,768,25.6328333333333
+58,769,25.5058333333333
+58,770,35.1366666666667
+58,771,34.5651666666667
+58,772,23.3045
+58,773,26.7758333333333
+58,774,31.4748333333333
+58,775,28.956
+58,776,26.2678333333333
+58,777,36.83
+58,778,23.2621666666667
+58,779,21.9286666666667
+58,780,37.9095
+58,781,28.2363333333333
+58,782,31.5806666666667
+58,783,31.6018333333333
+58,784,27.051
+58,785,29.591
+58,786,29.845
+58,787,33.2316666666667
+58,788,33.4645
+58,789,32.0251666666667
+58,790,25.654
+58,791,47.2863333333333
+58,792,20.447
+58,793,33.4645
+58,794,35.0308333333333
+58,795,28.0458333333333
+58,796,29.8873333333333
+58,797,33.0411666666667
+58,798,38.1846666666667
+58,799,28.8925
+58,800,29.4216666666667
+58,801,36.6183333333333
+58,802,26.9663333333333
+58,803,41.5713333333333
+58,804,24.7861666666667
+58,805,40.3013333333333
+58,806,33.1893333333333
+58,807,28.448
+58,808,27.813
+58,809,29.9508333333333
+58,810,32.8506666666667
+58,811,29.1041666666667
+58,812,32.2368333333333
+58,813,29.1041666666667
+58,814,34.5651666666667
+58,815,27.2838333333333
+58,816,30.2048333333333
+58,817,32.5966666666667
+58,818,25.146
+58,819,29.3581666666667
+58,820,31.3055
+58,821,34.7556666666667
+58,822,27.686
+58,823,28.0246666666667
+58,824,33.2316666666667
+58,825,40.0896666666667
+58,826,28.3845
+58,827,29.8873333333333
+58,828,39.2641666666667
+58,829,27.1356666666667
+58,830,28.2786666666667
+58,831,31.7711666666667
+58,832,22.987
+58,833,27.4531666666667
+58,834,30.0566666666667
+58,835,27.1991666666667
+58,836,21.1031666666667
+58,837,23.4526666666667
+58,838,23.2621666666667
+58,839,28.5538333333333
+58,840,30.9668333333333
+58,841,31.1996666666667
+58,842,26.797
+58,843,32.639
+58,844,26.6488333333333
+58,845,31.7076666666667
+58,846,23.749
+58,847,34.8826666666667
+58,848,28.7443333333333
+58,849,31.9405
+58,850,31.0091666666667
+58,851,31.7923333333333
+58,852,39.9203333333333
+58,853,26.416
+58,854,42.3121666666667
+58,855,30.7975
+58,856,26.035
+58,857,24.8073333333333
+58,858,33.6973333333333
+58,859,31.3901666666667
+58,860,26.2043333333333
+58,861,42.1005
+58,862,22.5213333333333
+58,863,24.1511666666667
+58,864,31.9193333333333
+58,865,21.7381666666667
+58,866,32.385
+58,867,24.003
+58,868,36.957
+58,869,22.2885
+58,870,31.877
+58,871,25.1248333333333
+58,872,27.2415
+58,873,25.1248333333333
+58,874,25.2941666666667
+58,875,34.6286666666667
+58,876,29.845
+58,877,24.2358333333333
+58,878,28.194
+58,879,45.6988333333333
+58,880,22.1191666666667
+58,881,35.2636666666667
+58,882,27.3261666666667
+58,883,23.8548333333333
+58,884,32.2368333333333
+58,885,24.9766666666667
+58,886,26.2678333333333
+58,887,26.5853333333333
+58,888,29.2523333333333
+58,889,24.384
+58,890,33.655
+58,891,38.3328333333333
+58,892,29.2523333333333
+58,893,26.1196666666667
+58,894,34.8826666666667
+58,895,24.9555
+58,896,25.1036666666667
+58,897,34.6498333333333
+58,898,36.7453333333333
+58,899,26.8605
+58,900,31.4536666666667
+58,901,28.6808333333333
+58,902,32.8718333333333
+58,903,28.7866666666667
+58,904,37.719
+58,905,24.5321666666667
+58,906,22.0556666666667
+58,907,30.0566666666667
+58,908,28.6596666666667
+58,909,33.0623333333333
+58,910,27.1356666666667
+58,911,28.2151666666667
+58,912,31.1996666666667
+58,913,36.2796666666667
+58,914,33.1258333333333
+58,915,26.6276666666667
+58,916,30.1201666666667
+58,917,25.3153333333333
+58,918,26.162
+58,919,16.2983333333333
+58,920,34.0995
+58,921,33.7185
+58,922,37.9941666666667
+58,923,29.6121666666667
+58,924,41.5713333333333
+58,925,25.6963333333333
+58,926,27.178
+58,927,23.2198333333333
+58,928,33.909
+58,929,37.7613333333333
+58,930,22.9658333333333
+58,931,30.0566666666667
+58,932,26.8605
+58,933,25.5058333333333
+58,934,33.3375
+58,935,29.9296666666667
+58,936,28.0035
+58,937,19.2828333333333
+58,938,24.765
+58,939,31.1573333333333
+58,940,36.8723333333333
+58,941,24.003
+58,942,31.242
+58,943,38.5233333333333
+58,944,33.274
+58,945,32.1098333333333
+58,946,32.0675
+58,947,28.702
+58,948,21.0608333333333
+58,949,27.2203333333333
+58,950,31.623
+58,951,22.7118333333333
+58,952,24.9766666666667
+58,953,36.9993333333333
+58,954,29.5486666666667
+58,955,38.4598333333333
+58,956,28.6385
+58,957,21.8863333333333
+58,958,24.257
+58,959,21.0396666666667
+58,960,23.0928333333333
+58,961,31.8135
+58,962,28.194
+58,963,41.4443333333333
+58,964,31.8558333333333
+58,965,36.6395
+58,966,31.242
+58,967,27.7918333333333
+58,968,32.4061666666667
+58,969,28.3633333333333
+58,970,33.5703333333333
+58,971,25.5058333333333
+58,972,31.623
+58,973,33.0411666666667
+58,974,31.5383333333333
+58,975,38.5445
+58,976,28.0035
+58,977,25.908
+58,978,23.0928333333333
+58,979,29.2311666666667
+58,980,30.8398333333333
+58,981,28.321
+58,982,33.0411666666667
+58,983,36.068
+58,984,26.7335
+58,985,33.9936666666667
+58,986,24.5956666666667
+58,987,31.369
+58,988,31.1785
+58,989,29.1253333333333
+58,990,31.75
+58,991,31.9828333333333
+58,992,30.48
+58,993,22.225
+58,994,21.3148333333333
+58,995,31.6653333333333
+58,996,28.2998333333333
+58,997,29.972
+58,998,30.1413333333333
+58,999,29.5698333333333
+58,1000,37.3591666666667
+59,1,27.0298333333333
+59,2,28.0035
+59,3,29.3158333333333
+59,4,24.3416666666667
+59,5,25.4846666666667
+59,6,17.2508333333333
+59,7,31.115
+59,8,25.6116666666667
+59,9,24.4263333333333
+59,10,25.9503333333333
+59,11,25.2941666666667
+59,12,25.3788333333333
+59,13,35.1578333333333
+59,14,26.1831666666667
+59,15,19.2193333333333
+59,16,30.7975
+59,17,26.162
+59,18,24.8496666666667
+59,19,21.8016666666667
+59,20,26.3101666666667
+59,21,26.8816666666667
+59,22,30.353
+59,23,16.256
+59,24,24.7438333333333
+59,25,25.4423333333333
+59,26,27.6648333333333
+59,27,27.051
+59,28,29.0406666666667
+59,29,29.1041666666667
+59,30,21.717
+59,31,23.1775
+59,32,25.3576666666667
+59,33,26.7123333333333
+59,34,31.9616666666667
+59,35,20.5105
+59,36,25.8233333333333
+59,37,22.479
+59,38,23.9183333333333
+59,39,26.6276666666667
+59,40,25.9503333333333
+59,41,24.4475
+59,42,17.2085
+59,43,27.0721666666667
+59,44,31.0303333333333
+59,45,25.908
+59,46,21.209
+59,47,22.1191666666667
+59,48,25.3788333333333
+59,49,23.9818333333333
+59,50,24.3628333333333
+59,51,36.5971666666667
+59,52,28.2575
+59,53,20.9973333333333
+59,54,25.2518333333333
+59,55,25.4846666666667
+59,56,38.4386666666667
+59,57,24.9766666666667
+59,58,24.5533333333333
+59,59,22.8176666666667
+59,60,26.162
+59,61,25.1036666666667
+59,62,20.0236666666667
+59,63,31.0515
+59,64,26.416
+59,65,22.3308333333333
+59,66,18.542
+59,67,23.6643333333333
+59,68,30.861
+59,69,26.8816666666667
+59,70,28.7443333333333
+59,71,28.2786666666667
+59,72,21.082
+59,73,22.1191666666667
+59,74,22.4578333333333
+59,75,24.4898333333333
+59,76,20.574
+59,77,23.4738333333333
+59,78,25.9715
+59,79,21.2725
+59,80,20.6375
+59,81,31.7923333333333
+59,82,21.4841666666667
+59,83,25.4
+59,84,26.162
+59,85,24.2146666666667
+59,86,26.0773333333333
+59,87,21.4418333333333
+59,88,22.1191666666667
+59,89,27.0298333333333
+59,90,29.591
+59,91,25.5693333333333
+59,92,26.3313333333333
+59,93,26.8816666666667
+59,94,20.066
+59,95,25.7175
+59,96,26.5006666666667
+59,97,27.3685
+59,98,28.448
+59,99,28.3633333333333
+59,100,23.5161666666667
+59,101,22.8388333333333
+59,102,24.5321666666667
+59,103,22.352
+59,104,24.13
+59,105,33.0835
+59,106,25.8021666666667
+59,107,25.3576666666667
+59,108,23.6008333333333
+59,109,28.9348333333333
+59,110,19.9178333333333
+59,111,32.9141666666667
+59,112,25.3576666666667
+59,113,32.512
+59,114,33.147
+59,115,23.5585
+59,116,23.3045
+59,117,29.9296666666667
+59,118,26.67
+59,119,23.368
+59,120,22.479
+59,121,32.3638333333333
+59,122,29.7815
+59,123,30.5223333333333
+59,124,26.6276666666667
+59,125,26.8605
+59,126,24.0876666666667
+59,127,22.6906666666667
+59,128,23.3045
+59,129,30.2683333333333
+59,130,29.718
+59,131,24.8708333333333
+59,132,20.828
+59,133,26.2466666666667
+59,134,28.5961666666667
+59,135,30.099
+59,136,23.3045
+59,137,22.8811666666667
+59,138,25.6751666666667
+59,139,29.083
+59,140,19.8966666666667
+59,141,26.7123333333333
+59,142,19.9178333333333
+59,143,26.5641666666667
+59,144,33.528
+59,145,26.4795
+59,146,30.0143333333333
+59,147,23.749
+59,148,22.5848333333333
+59,149,27.559
+59,150,29.337
+59,151,33.6338333333333
+59,152,27.1356666666667
+59,153,26.797
+59,154,25.654
+59,155,23.495
+59,156,28.2786666666667
+59,157,21.1031666666667
+59,158,26.0773333333333
+59,159,24.4686666666667
+59,160,23.0293333333333
+59,161,27.8976666666667
+59,162,22.9235
+59,163,29.7603333333333
+59,164,26.3525
+59,165,24.8073333333333
+59,166,26.3101666666667
+59,167,22.0345
+59,168,23.0716666666667
+59,169,25.6328333333333
+59,170,23.1351666666667
+59,171,29.1041666666667
+59,172,24.6803333333333
+59,173,28.1305
+59,174,22.7541666666667
+59,175,31.9616666666667
+59,176,21.2301666666667
+59,177,26.416
+59,178,28.321
+59,179,22.7541666666667
+59,180,22.5425
+59,181,24.5321666666667
+59,182,25.146
+59,183,23.8125
+59,184,25.6751666666667
+59,185,32.5543333333333
+59,186,24.4686666666667
+59,187,26.2043333333333
+59,188,29.8873333333333
+59,189,26.4583333333333
+59,190,23.9183333333333
+59,191,25.273
+59,192,24.2146666666667
+59,193,28.7231666666667
+59,194,27.5801666666667
+59,195,26.5641666666667
+59,196,21.1878333333333
+59,197,21.3148333333333
+59,198,28.8713333333333
+59,199,25.5905
+59,200,30.988
+59,201,24.6803333333333
+59,202,30.4165
+59,203,22.225
+59,204,26.289
+59,205,28.448
+59,206,22.8388333333333
+59,207,28.2786666666667
+59,208,27.2203333333333
+59,209,25.3153333333333
+59,210,27.7283333333333
+59,211,31.4113333333333
+59,212,23.3045
+59,213,23.7701666666667
+59,214,26.3948333333333
+59,215,29.9508333333333
+59,216,32.7236666666667
+59,217,22.2673333333333
+59,218,21.6958333333333
+59,219,19.2405
+59,220,27.7706666666667
+59,221,25.2518333333333
+59,222,15.3881666666667
+59,223,27.5801666666667
+59,224,34.7556666666667
+59,225,30.7763333333333
+59,226,24.1723333333333
+59,227,26.3101666666667
+59,228,22.4578333333333
+59,229,26.6911666666667
+59,230,29.3793333333333
+59,231,23.749
+59,232,19.3251666666667
+59,233,27.178
+59,234,27.3896666666667
+59,235,32.8083333333333
+59,236,28.194
+59,237,27.94
+59,238,28.0035
+59,239,26.924
+59,240,20.8915
+59,241,22.7541666666667
+59,242,25.8021666666667
+59,243,28.9136666666667
+59,244,31.877
+59,245,27.3685
+59,246,26.9875
+59,247,27.1145
+59,248,26.289
+59,249,25.8233333333333
+59,250,26.2678333333333
+59,251,20.1083333333333
+59,252,28.7866666666667
+59,253,24.6591666666667
+59,254,34.1418333333333
+59,255,27.2415
+59,256,24.13
+59,257,26.0138333333333
+59,258,25.9291666666667
+59,259,22.6906666666667
+59,260,25.9926666666667
+59,261,28.4056666666667
+59,262,25.4
+59,263,27.813
+59,264,25.7598333333333
+59,265,23.7913333333333
+59,266,28.1305
+59,267,28.321
+59,268,23.3256666666667
+59,269,23.114
+59,270,25.146
+59,271,26.6911666666667
+59,272,24.892
+59,273,22.3096666666667
+59,274,25.3576666666667
+59,275,24.6168333333333
+59,276,31.0726666666667
+59,277,22.352
+59,278,25.1036666666667
+59,279,18.0763333333333
+59,280,25.5058333333333
+59,281,21.0608333333333
+59,282,27.7918333333333
+59,283,20.9761666666667
+59,284,29.9508333333333
+59,285,28.2575
+59,286,25.7598333333333
+59,287,26.2043333333333
+59,288,26.3313333333333
+59,289,21.7593333333333
+59,290,19.05
+59,291,27.813
+59,292,28.5326666666667
+59,293,26.3736666666667
+59,294,28.0881666666667
+59,295,22.7753333333333
+59,296,26.416
+59,297,23.2621666666667
+59,298,25.2941666666667
+59,299,21.717
+59,300,30.1625
+59,301,21.844
+59,302,21.3571666666667
+59,303,23.241
+59,304,24.9766666666667
+59,305,25.273
+59,306,28.9348333333333
+59,307,27.1145
+59,308,29.972
+59,309,23.6008333333333
+59,310,26.5641666666667
+59,311,24.1935
+59,312,24.892
+59,313,23.0716666666667
+59,314,21.463
+59,315,29.2946666666667
+59,316,24.0453333333333
+59,317,24.8496666666667
+59,318,25.5058333333333
+59,319,25.273
+59,320,30.7975
+59,321,27.3896666666667
+59,322,27.5166666666667
+59,323,26.4583333333333
+59,324,32.1733333333333
+59,325,16.9121666666667
+59,326,27.5378333333333
+59,327,27.4955
+59,328,27.8341666666667
+59,329,24.9766666666667
+59,330,25.6328333333333
+59,331,22.7118333333333
+59,332,31.496
+59,333,25.2941666666667
+59,334,22.5001666666667
+59,335,32.0463333333333
+59,336,29.9508333333333
+59,337,33.02
+59,338,25.9715
+59,339,29.464
+59,340,23.1563333333333
+59,341,31.1996666666667
+59,342,24.5745
+59,343,23.749
+59,344,31.1573333333333
+59,345,24.892
+59,346,22.8388333333333
+59,347,24.4686666666667
+59,348,27.8976666666667
+59,349,28.4056666666667
+59,350,29.8873333333333
+59,351,35.433
+59,352,29.2311666666667
+59,353,34.4593333333333
+59,354,20.574
+59,355,27.2626666666667
+59,356,31.3266666666667
+59,357,21.0608333333333
+59,358,23.1351666666667
+59,359,22.098
+59,360,26.5853333333333
+59,361,27.2203333333333
+59,362,29.5275
+59,363,24.5745
+59,364,23.7066666666667
+59,365,15.5998333333333
+59,366,31.0515
+59,367,28.8713333333333
+59,368,22.0556666666667
+59,369,27.2415
+59,370,24.4263333333333
+59,371,26.4795
+59,372,27.7706666666667
+59,373,29.972
+59,374,26.924
+59,375,24.2781666666667
+59,376,27.2415
+59,377,22.4366666666667
+59,378,25.0613333333333
+59,379,35.0308333333333
+59,380,26.3525
+59,381,30.6493333333333
+59,382,26.289
+59,383,26.035
+59,384,27.5801666666667
+59,385,27.178
+59,386,27.3473333333333
+59,387,27.1991666666667
+59,388,27.2838333333333
+59,389,22.7753333333333
+59,390,26.2255
+59,391,21.5688333333333
+59,392,29.8238333333333
+59,393,25.0401666666667
+59,394,25.908
+59,395,26.9028333333333
+59,396,23.114
+59,397,28.4903333333333
+59,398,28.7655
+59,399,29.9085
+59,400,31.7076666666667
+59,401,19.1346666666667
+59,402,23.7066666666667
+59,403,22.0556666666667
+59,404,28.8501666666667
+59,405,25.6328333333333
+59,406,23.0716666666667
+59,407,29.1041666666667
+59,408,21.1243333333333
+59,409,30.099
+59,410,31.0091666666667
+59,411,31.3266666666667
+59,412,23.5585
+59,413,29.5063333333333
+59,414,23.7066666666667
+59,415,30.226
+59,416,26.0985
+59,417,20.3835
+59,418,25.5905
+59,419,26.5641666666667
+59,420,24.4263333333333
+59,421,27.5166666666667
+59,422,24.7015
+59,423,28.829
+59,424,34.6921666666667
+59,425,18.7536666666667
+59,426,31.7288333333333
+59,427,29.2523333333333
+59,428,26.6276666666667
+59,429,25.9503333333333
+59,430,26.7123333333333
+59,431,28.575
+59,432,24.3416666666667
+59,433,28.7443333333333
+59,434,32.1733333333333
+59,435,23.4738333333333
+59,436,26.5218333333333
+59,437,25.6328333333333
+59,438,27.8341666666667
+59,439,33.5915
+59,440,28.8078333333333
+59,441,30.4376666666667
+59,442,24.9343333333333
+59,443,28.0246666666667
+59,444,24.0453333333333
+59,445,27.8976666666667
+59,446,26.7123333333333
+59,447,23.622
+59,448,21.463
+59,449,22.098
+59,450,28.2998333333333
+59,451,28.194
+59,452,28.8078333333333
+59,453,29.1253333333333
+59,454,23.8548333333333
+59,455,21.8228333333333
+59,456,24.2358333333333
+59,457,28.1728333333333
+59,458,21.0396666666667
+59,459,22.5213333333333
+59,460,29.1253333333333
+59,461,32.5966666666667
+59,462,29.8238333333333
+59,463,18.7325
+59,464,27.7283333333333
+59,465,32.004
+59,466,26.035
+59,467,22.606
+59,468,23.4526666666667
+59,469,21.844
+59,470,29.0195
+59,471,26.1408333333333
+59,472,24.892
+59,473,28.8501666666667
+59,474,31.8346666666667
+59,475,23.0716666666667
+59,476,22.3096666666667
+59,477,29.8026666666667
+59,478,23.1775
+59,479,25.019
+59,480,20.6163333333333
+59,481,28.0035
+59,482,26.6911666666667
+59,483,23.3891666666667
+59,484,30.1201666666667
+59,485,28.8501666666667
+59,486,24.3628333333333
+59,487,25.1248333333333
+59,488,30.861
+59,489,28.4691666666667
+59,490,23.6643333333333
+59,491,26.5218333333333
+59,492,23.9183333333333
+59,493,28.956
+59,494,30.5646666666667
+59,495,25.0825
+59,496,32.4273333333333
+59,497,27.178
+59,498,24.7015
+59,499,34.544
+59,500,27.3473333333333
+59,501,26.924
+59,502,25.4635
+59,503,26.1831666666667
+59,504,24.9343333333333
+59,505,20.4893333333333
+59,506,25.8445
+59,507,21.1243333333333
+59,508,25.6328333333333
+59,509,23.6008333333333
+59,510,25.2941666666667
+59,511,21.5265
+59,512,30.6493333333333
+59,513,32.4485
+59,514,29.2523333333333
+59,515,21.2301666666667
+59,516,24.8073333333333
+59,517,25.654
+59,518,22.8388333333333
+59,519,21.1455
+59,520,26.543
+59,521,25.3153333333333
+59,522,23.0928333333333
+59,523,26.0138333333333
+59,524,22.3308333333333
+59,525,26.3101666666667
+59,526,24.765
+59,527,26.8605
+59,528,22.2885
+59,529,21.4841666666667
+59,530,28.0458333333333
+59,531,21.8651666666667
+59,532,26.8816666666667
+59,533,25.4423333333333
+59,534,28.9136666666667
+59,535,26.3525
+59,536,22.7118333333333
+59,537,31.1996666666667
+59,538,22.5001666666667
+59,539,24.9766666666667
+59,540,26.0985
+59,541,24.4898333333333
+59,542,25.8233333333333
+59,543,26.035
+59,544,21.9921666666667
+59,545,27.1568333333333
+59,546,28.3845
+59,547,27.2415
+59,548,20.2353333333333
+59,549,24.6168333333333
+59,550,20.6163333333333
+59,551,29.2735
+59,552,20.7856666666667
+59,553,26.6911666666667
+59,554,29.8238333333333
+59,555,27.5378333333333
+59,556,25.0825
+59,557,21.2513333333333
+59,558,30.6493333333333
+59,559,25.2095
+59,560,23.4315
+59,561,25.2941666666667
+59,562,28.829
+59,563,24.9978333333333
+59,564,30.6493333333333
+59,565,21.844
+59,566,23.2198333333333
+59,567,27.3473333333333
+59,568,25.654
+59,569,30.8186666666667
+59,570,20.9973333333333
+59,571,27.3685
+59,572,30.1413333333333
+59,573,24.8073333333333
+59,574,25.908
+59,575,28.829
+59,576,25.4211666666667
+59,577,27.0721666666667
+59,578,25.8445
+59,579,29.2735
+59,580,24.8708333333333
+59,581,18.3091666666667
+59,582,22.3943333333333
+59,583,25.273
+59,584,18.3515
+59,585,31.3478333333333
+59,586,29.1676666666667
+59,587,25.8233333333333
+59,588,28.2786666666667
+59,589,28.575
+59,590,27.3473333333333
+59,591,29.9508333333333
+59,592,23.5585
+59,593,25.7175
+59,594,28.8713333333333
+59,595,24.5745
+59,596,20.6375
+59,597,28.2786666666667
+59,598,26.2466666666667
+59,599,24.4686666666667
+59,600,32.4696666666667
+59,601,25.6328333333333
+59,602,26.7758333333333
+59,603,23.495
+59,604,27.8341666666667
+59,605,31.9616666666667
+59,606,24.5956666666667
+59,607,31.6653333333333
+59,608,31.2843333333333
+59,609,24.9978333333333
+59,610,28.067
+59,611,23.4738333333333
+59,612,26.2678333333333
+59,613,27.3473333333333
+59,614,25.8656666666667
+59,615,27.1145
+59,616,23.241
+59,617,26.4795
+59,618,25.2306666666667
+59,619,33.3375
+59,620,28.1516666666667
+59,621,26.7123333333333
+59,622,33.6973333333333
+59,623,24.0241666666667
+59,624,26.8816666666667
+59,625,19.939
+59,626,19.3675
+59,627,22.1826666666667
+59,628,18.0763333333333
+59,629,26.0138333333333
+59,630,24.2146666666667
+59,631,33.147
+59,632,25.1248333333333
+59,633,23.7278333333333
+59,634,26.0561666666667
+59,635,30.0566666666667
+59,636,19.8755
+59,637,24.2146666666667
+59,638,26.416
+59,639,23.8125
+59,640,35.7505
+59,641,24.7226666666667
+59,642,23.2198333333333
+59,643,26.924
+59,644,21.1031666666667
+59,645,23.8125
+59,646,27.813
+59,647,27.4531666666667
+59,648,22.1826666666667
+59,649,24.2146666666667
+59,650,24.9343333333333
+59,651,24.7861666666667
+59,652,27.7706666666667
+59,653,32.7236666666667
+59,654,26.543
+59,655,23.4315
+59,656,27.9611666666667
+59,657,26.6276666666667
+59,658,24.765
+59,659,21.2725
+59,660,28.6173333333333
+59,661,18.669
+59,662,25.8445
+59,663,29.083
+59,664,26.4583333333333
+59,665,32.9353333333333
+59,666,29.5486666666667
+59,667,25.273
+59,668,23.368
+59,669,22.1826666666667
+59,670,25.9503333333333
+59,671,22.1615
+59,672,30.0143333333333
+59,673,23.4526666666667
+59,674,29.972
+59,675,26.3948333333333
+59,676,26.8393333333333
+59,677,28.5115
+59,678,25.273
+59,679,27.051
+59,680,28.448
+59,681,26.7758333333333
+59,682,24.4263333333333
+59,683,30.0778333333333
+59,684,20.3623333333333
+59,685,25.9503333333333
+59,686,24.5745
+59,687,23.7278333333333
+59,688,29.718
+59,689,26.2255
+59,690,23.3891666666667
+59,691,27.0086666666667
+59,692,21.8228333333333
+59,693,21.5265
+59,694,21.971
+59,695,33.9301666666667
+59,696,23.749
+59,697,26.0773333333333
+59,698,28.702
+59,699,26.6488333333333
+59,700,20.5951666666667
+59,701,22.479
+59,702,23.622
+59,703,24.003
+59,704,28.5326666666667
+59,705,19.05
+59,706,28.2786666666667
+59,707,24.5533333333333
+59,708,27.7495
+59,709,27.051
+59,710,30.2683333333333
+59,711,25.8233333333333
+59,712,29.8026666666667
+59,713,19.0923333333333
+59,714,22.6695
+59,715,26.2255
+59,716,31.6865
+59,717,22.1826666666667
+59,718,29.591
+59,719,31.0091666666667
+59,720,24.638
+59,721,22.7541666666667
+59,722,24.003
+59,723,25.1883333333333
+59,724,25.0613333333333
+59,725,22.0556666666667
+59,726,27.8341666666667
+59,727,28.1516666666667
+59,728,22.86
+59,729,25.6963333333333
+59,730,26.9875
+59,731,18.3091666666667
+59,732,29.5486666666667
+59,733,27.9188333333333
+59,734,21.336
+59,735,24.0876666666667
+59,736,32.6601666666667
+59,737,25.654
+59,738,31.6018333333333
+59,739,25.4635
+59,740,25.1248333333333
+59,741,25.8868333333333
+59,742,20.9126666666667
+59,743,27.305
+59,744,22.5848333333333
+59,745,27.6648333333333
+59,746,24.9131666666667
+59,747,26.3101666666667
+59,748,29.5063333333333
+59,749,25.2306666666667
+59,750,27.6648333333333
+59,751,21.8863333333333
+59,752,26.0985
+59,753,29.5063333333333
+59,754,24.6591666666667
+59,755,24.9555
+59,756,25.8656666666667
+59,757,19.4098333333333
+59,758,25.0613333333333
+59,759,21.9921666666667
+59,760,18.5631666666667
+59,761,27.2838333333333
+59,762,23.1986666666667
+59,763,20.4681666666667
+59,764,20.955
+59,765,28.5115
+59,766,23.2621666666667
+59,767,29.9085
+59,768,23.8125
+59,769,22.225
+59,770,24.5533333333333
+59,771,24.892
+59,772,26.5853333333333
+59,773,25.6751666666667
+59,774,18.0551666666667
+59,775,26.5218333333333
+59,776,21.3783333333333
+59,777,31.4325
+59,778,26.035
+59,779,26.1408333333333
+59,780,24.3205
+59,781,31.0515
+59,782,27.5166666666667
+59,783,28.4903333333333
+59,784,21.2725
+59,785,26.6065
+59,786,27.7495
+59,787,31.3901666666667
+59,788,20.447
+59,789,30.3953333333333
+59,790,22.5848333333333
+59,791,31.8135
+59,792,25.6751666666667
+59,793,28.321
+59,794,27.7918333333333
+59,795,23.0081666666667
+59,796,23.749
+59,797,22.3943333333333
+59,798,27.686
+59,799,25.527
+59,800,25.4
+59,801,20.9126666666667
+59,802,23.1775
+59,803,28.6173333333333
+59,804,26.9875
+59,805,30.8186666666667
+59,806,24.1088333333333
+59,807,30.1201666666667
+59,808,27.051
+59,809,25.1036666666667
+59,810,21.7381666666667
+59,811,21.844
+59,812,29.0618333333333
+59,813,23.7913333333333
+59,814,25.4
+59,815,22.7753333333333
+59,816,27.3685
+59,817,26.162
+59,818,23.4526666666667
+59,819,26.8393333333333
+59,820,23.8971666666667
+59,821,24.9555
+59,822,30.2048333333333
+59,823,24.5745
+59,824,20.955
+59,825,29.3793333333333
+59,826,29.8661666666667
+59,827,23.3468333333333
+59,828,25.4423333333333
+59,829,22.7118333333333
+59,830,25.3576666666667
+59,831,27.178
+59,832,26.035
+59,833,26.6065
+59,834,18.4361666666667
+59,835,22.5848333333333
+59,836,27.0298333333333
+59,837,21.844
+59,838,26.0985
+59,839,27.1568333333333
+59,840,28.575
+59,841,19.8543333333333
+59,842,29.21
+59,843,25.8868333333333
+59,844,23.241
+59,845,28.448
+59,846,30.2471666666667
+59,847,26.162
+59,848,23.0505
+59,849,21.1455
+59,850,25.3576666666667
+59,851,28.8078333333333
+59,852,22.9235
+59,853,25.6751666666667
+59,854,28.7443333333333
+59,855,24.9978333333333
+59,856,28.321
+59,857,22.1826666666667
+59,858,21.463
+59,859,24.5533333333333
+59,860,28.1305
+59,861,33.9725
+59,862,31.2631666666667
+59,863,31.9193333333333
+59,864,33.1681666666667
+59,865,23.3468333333333
+59,866,27.4531666666667
+59,867,29.9085
+59,868,24.8496666666667
+59,869,29.5486666666667
+59,870,21.8863333333333
+59,871,24.765
+59,872,32.0463333333333
+59,873,25.9503333333333
+59,874,21.5053333333333
+59,875,22.6906666666667
+59,876,23.241
+59,877,24.0453333333333
+59,878,27.6436666666667
+59,879,21.9498333333333
+59,880,26.4371666666667
+59,881,28.6173333333333
+59,882,24.1723333333333
+59,883,30.5646666666667
+59,884,23.6008333333333
+59,885,19.0711666666667
+59,886,31.6653333333333
+59,887,28.0246666666667
+59,888,29.6545
+59,889,25.4635
+59,890,26.8393333333333
+59,891,30.734
+59,892,29.2946666666667
+59,893,32.131
+59,894,30.6493333333333
+59,895,26.543
+59,896,30.48
+59,897,24.8285
+59,898,26.8393333333333
+59,899,29.972
+59,900,21.463
+59,901,30.6493333333333
+59,902,26.9663333333333
+59,903,33.6761666666667
+59,904,22.8811666666667
+59,905,28.2998333333333
+59,906,31.4325
+59,907,22.4366666666667
+59,908,24.892
+59,909,26.2466666666667
+59,910,24.5745
+59,911,32.4273333333333
+59,912,24.765
+59,913,27.432
+59,914,28.321
+59,915,20.8915
+59,916,21.9075
+59,917,23.5161666666667
+59,918,28.2363333333333
+59,919,27.1356666666667
+59,920,29.1041666666667
+59,921,29.0406666666667
+59,922,30.2048333333333
+59,923,23.6008333333333
+59,924,25.6116666666667
+59,925,22.8811666666667
+59,926,31.1573333333333
+59,927,21.6323333333333
+59,928,31.623
+59,929,20.2776666666667
+59,930,26.8181666666667
+59,931,25.908
+59,932,25.7598333333333
+59,933,23.2833333333333
+59,934,27.3473333333333
+59,935,29.1041666666667
+59,936,21.2936666666667
+59,937,27.2203333333333
+59,938,20.955
+59,939,25.0825
+59,940,23.0716666666667
+59,941,20.2565
+59,942,30.7975
+59,943,28.6596666666667
+59,944,23.749
+59,945,31.8558333333333
+59,946,26.1408333333333
+59,947,26.3525
+59,948,29.7815
+59,949,26.6065
+59,950,24.7438333333333
+59,951,23.5373333333333
+59,952,25.5058333333333
+59,953,27.432
+59,954,25.5481666666667
+59,955,25.6116666666667
+59,956,21.6958333333333
+59,957,26.797
+59,958,24.2993333333333
+59,959,29.2946666666667
+59,960,21.3995
+59,961,19.2193333333333
+59,962,25.6116666666667
+59,963,30.353
+59,964,24.7015
+59,965,30.9033333333333
+59,966,26.3101666666667
+59,967,23.1775
+59,968,25.3153333333333
+59,969,22.7541666666667
+59,970,28.1728333333333
+59,971,26.3736666666667
+59,972,32.4061666666667
+59,973,24.9131666666667
+59,974,24.6803333333333
+59,975,26.0561666666667
+59,976,22.9235
+59,977,26.2678333333333
+59,978,32.9565
+59,979,29.21
+59,980,21.0608333333333
+59,981,25.4635
+59,982,24.0241666666667
+59,983,21.2301666666667
+59,984,24.2781666666667
+59,985,29.4428333333333
+59,986,28.7866666666667
+59,987,20.9338333333333
+59,988,20.7221666666667
+59,989,31.115
+59,990,26.2678333333333
+59,991,25.8445
+59,992,27.3685
+59,993,29.0195
+59,994,26.7758333333333
+59,995,21.8863333333333
+59,996,27.1568333333333
+59,997,22.5213333333333
+59,998,26.8816666666667
+59,999,26.5218333333333
+59,1000,22.7118333333333
+60,1,18.0560133333333
+60,2,17.4201666666667
+60,3,18.7333466666667
+60,4,24.4898333333333
+60,5,21.2411733333333
+60,6,22.1403333333333
+60,7,20.193
+60,8,22.1835133333333
+60,9,20.7755066666667
+60,10,19.2625133333333
+60,11,22.2995066666667
+60,12,20.5528333333333
+60,13,18.0975
+60,14,14.72184
+60,15,16.0130066666667
+60,16,20.61718
+60,17,20.7120066666667
+60,18,22.2038333333333
+60,19,19.8441733333333
+60,20,18.4573333333333
+60,21,21.8228333333333
+60,22,24.5431733333333
+60,23,13.4526866666667
+60,24,17.38884
+60,25,18.3726666666667
+60,26,19.2311866666667
+60,27,21.2411733333333
+60,28,25.146
+60,29,18.4996666666667
+60,30,17.4100066666667
+60,31,19.02968
+60,32,17.0933533333333
+60,33,22.86
+60,34,12.7220133333333
+60,35,19.5800133333333
+60,36,18.1296733333333
+60,37,17.31518
+60,38,16.11884
+60,39,17.145
+60,40,21.1040133333333
+60,41,26.3101666666667
+60,42,21.4951733333333
+60,43,14.53134
+60,44,20.0236666666667
+60,45,16.637
+60,46,15.8961666666667
+60,47,22.33168
+60,48,20.79752
+60,49,17.8545066666667
+60,50,22.1090066666667
+60,51,22.9446666666667
+60,52,23.8971666666667
+60,53,18.6275133333333
+60,54,18.6063466666667
+60,55,20.1718333333333
+60,56,15.3458333333333
+60,57,22.1403333333333
+60,58,19.2515066666667
+60,59,17.75968
+60,60,21.1565066666667
+60,61,17.6741666666667
+60,62,20.32
+60,63,19.812
+60,64,16.5735
+60,65,19.73834
+60,66,20.3945066666667
+60,67,25.6963333333333
+60,68,19.685
+60,69,18.4793466666667
+60,70,15.29334
+60,71,22.86
+60,72,19.7273333333333
+60,73,24.2146666666667
+60,74,17.64284
+60,75,24.7125066666667
+60,76,16.1611733333333
+60,77,21.8550066666667
+60,78,18.7435066666667
+60,79,23.3256666666667
+60,80,19.8763466666667
+60,81,19.41068
+60,82,19.6536733333333
+60,83,17.0815
+60,84,24.05634
+60,85,21.8660133333333
+60,86,21.9828533333333
+60,87,19.79168
+60,88,17.1771733333333
+60,89,23.114
+60,90,18.6901666666667
+60,91,21.1776733333333
+60,92,17.6318333333333
+60,93,20.6163333333333
+60,94,22.6483333333333
+60,95,21.1141733333333
+60,96,24.4263333333333
+60,97,20.4046666666667
+60,98,20.62734
+60,99,17.7165
+60,100,16.43634
+60,101,22.02434
+60,102,21.70684
+60,103,21.5375066666667
+60,104,20.9558466666667
+60,105,16.002
+60,106,15.0613533333333
+60,107,15.5583466666667
+60,108,17.6750133333333
+60,109,21.2936666666667
+60,110,17.7486733333333
+60,111,25.5693333333333
+60,112,19.03984
+60,113,17.9180066666667
+60,114,19.7485
+60,115,20.30984
+60,116,19.5901733333333
+60,117,19.99234
+60,118,21.717
+60,119,23.2621666666667
+60,120,20.6163333333333
+60,121,15.0503466666667
+60,122,13.9386733333333
+60,123,21.77034
+60,124,17.9281666666667
+60,125,22.21484
+60,126,21.3046733333333
+60,127,17.95018
+60,128,16.891
+60,129,22.39518
+60,130,20.86102
+60,131,18.923
+60,132,22.0345
+60,133,20.447
+60,134,19.3886666666667
+60,135,18.9238466666667
+60,136,18.6901666666667
+60,137,23.7498466666667
+60,138,20.9761666666667
+60,139,20.2675066666667
+60,140,24.6803333333333
+60,141,15.16634
+60,142,21.6645066666667
+60,143,14.9335066666667
+60,144,23.86584
+60,145,16.23568
+60,146,18.415
+60,147,18.7545133333333
+60,148,13.8116733333333
+60,149,19.99234
+60,150,21.7593333333333
+60,151,18.2245
+60,152,25.0825
+60,153,17.8223333333333
+60,154,20.3623333333333
+60,155,19.1143466666667
+60,156,22.64918
+60,157,26.2043333333333
+60,158,16.2136666666667
+60,159,15.8326666666667
+60,160,20.8703333333333
+60,161,17.3143333333333
+60,162,23.4001733333333
+60,163,19.71802
+60,164,17.8121733333333
+60,165,20.9135133333333
+60,166,21.209
+60,167,17.7486733333333
+60,168,18.7325
+60,169,14.7328466666667
+60,170,26.8190133333333
+60,171,23.6855
+60,172,23.9716733333333
+60,173,18.3726666666667
+60,174,20.62734
+60,175,23.7066666666667
+60,176,19.3691933333333
+60,177,19.1151933333333
+60,178,19.2091733333333
+60,179,20.7331733333333
+60,180,19.5156666666667
+60,181,23.3256666666667
+60,182,25.6328333333333
+60,183,15.2840266666667
+60,184,14.6168533333333
+60,185,16.56334
+60,186,19.4521666666667
+60,187,17.7173466666667
+60,188,19.54784
+60,189,20.69084
+60,190,24.0351733333333
+60,191,16.8063333333333
+60,192,20.55368
+60,193,18.9975066666667
+60,194,17.0501733333333
+60,195,21.3470066666667
+60,196,19.1456733333333
+60,197,14.37386
+60,198,17.9391733333333
+60,199,18.3836733333333
+60,200,21.0295066666667
+60,201,21.0608333333333
+60,202,18.3625066666667
+60,203,22.07768
+60,204,19.0186733333333
+60,205,17.5903466666667
+60,206,17.1771733333333
+60,207,19.8128466666667
+60,208,17.0823466666667
+60,209,20.43684
+60,210,16.11884
+60,211,19.5596933333333
+60,212,20.9135133333333
+60,213,18.7748333333333
+60,214,25.8656666666667
+60,215,15.8233533333333
+60,216,19.3361733333333
+60,217,19.4631733333333
+60,218,20.574
+60,219,15.92834
+60,220,20.05584
+60,221,20.3208466666667
+60,222,18.77568
+60,223,16.79702
+60,224,20.1303466666667
+60,225,24.384
+60,226,21.4740066666667
+60,227,23.4221866666667
+60,228,19.6435133333333
+60,229,17.0823466666667
+60,230,18.6055
+60,231,21.07184
+60,232,15.9071733333333
+60,233,22.7440066666667
+60,234,17.272
+60,235,19.8128466666667
+60,236,17.3041733333333
+60,237,17.3998466666667
+60,238,20.74418
+60,239,21.971
+60,240,20.49018
+60,241,18.6910133333333
+60,242,17.4210133333333
+60,243,20.2251733333333
+60,244,26.85034
+60,245,17.399
+60,246,24.8191866666667
+60,247,26.33218
+60,248,24.9241733333333
+60,249,16.8613666666667
+60,250,22.1301733333333
+60,251,17.8435
+60,252,17.64284
+60,253,16.8698333333333
+60,254,25.82418
+60,255,19.3785066666667
+60,256,22.5111733333333
+60,257,20.10918
+60,258,24.3526733333333
+60,259,21.7805
+60,260,19.2828333333333
+60,261,19.09318
+60,262,19.80184
+60,263,22.9980066666667
+60,264,20.9761666666667
+60,265,19.4631733333333
+60,266,22.84984
+60,267,16.256
+60,268,19.3251666666667
+60,269,19.0186733333333
+60,270,20.9660066666667
+60,271,20.4681666666667
+60,272,20.0025
+60,273,20.9871733333333
+60,274,20.09902
+60,275,20.2886733333333
+60,276,21.8126733333333
+60,277,17.5166866666667
+60,278,22.0768333333333
+60,279,21.7593333333333
+60,280,19.2413466666667
+60,281,20.2988333333333
+60,282,20.6798333333333
+60,283,17.24152
+60,284,22.57552
+60,285,18.2566733333333
+60,286,12.48918
+60,287,26.34234
+60,288,18.8806666666667
+60,289,12.9658533333333
+60,290,18.0551666666667
+60,291,20.9871733333333
+60,292,22.65934
+60,293,21.6340266666667
+60,294,24.5321666666667
+60,295,22.4366666666667
+60,296,21.6323333333333
+60,297,23.2621666666667
+60,298,18.02384
+60,299,21.83384
+60,300,18.08734
+60,301,17.8646666666667
+60,302,18.21434
+60,303,21.5476666666667
+60,304,17.6106666666667
+60,305,24.5321666666667
+60,306,20.2565
+60,307,17.5480133333333
+60,308,23.80234
+60,309,17.9925133333333
+60,310,20.3623333333333
+60,311,16.4888333333333
+60,312,21.844
+60,313,19.1346666666667
+60,314,19.35734
+60,315,22.78634
+60,316,16.1510133333333
+60,317,18.4573333333333
+60,318,19.5156666666667
+60,319,21.4951733333333
+60,320,19.3150066666667
+60,321,17.6005066666667
+60,322,22.0133333333333
+60,323,21.336
+60,324,21.6856733333333
+60,325,18.53184
+60,326,23.27402
+60,327,24.7226666666667
+60,328,20.066
+60,329,18.7113333333333
+60,330,17.9493333333333
+60,331,18.06702
+60,332,19.7171733333333
+60,333,22.2885
+60,334,16.7750066666667
+60,335,22.8388333333333
+60,336,16.1611733333333
+60,337,21.8863333333333
+60,338,16.6386933333333
+60,339,20.62734
+60,340,23.6330066666667
+60,341,14.8606933333333
+60,342,17.5895
+60,343,20.23618
+60,344,18.6800066666667
+60,345,17.7165
+60,346,15.59052
+60,347,20.99818
+60,348,20.0025
+60,349,19.5266733333333
+60,350,15.9385
+60,351,22.1107
+60,352,18.4370133333333
+60,353,23.0505
+60,354,18.45818
+60,355,17.57934
+60,356,19.7485
+60,357,21.3046733333333
+60,358,17.4430266666667
+60,359,22.2571733333333
+60,360,22.733
+60,361,19.5690066666667
+60,362,20.7551866666667
+60,363,15.67434
+60,364,18.923
+60,365,17.8545066666667
+60,366,17.9815066666667
+60,367,22.6805066666667
+60,368,20.05584
+60,369,22.0455066666667
+60,370,13.5466666666667
+60,371,18.1195133333333
+60,372,18.1398333333333
+60,373,17.1026666666667
+60,374,22.21484
+60,375,21.0405133333333
+60,376,20.8703333333333
+60,377,14.90218
+60,378,18.0348466666667
+60,379,20.18284
+60,380,21.3046733333333
+60,381,19.0923333333333
+60,382,19.73834
+60,383,23.42134
+60,384,16.24584
+60,385,23.7710133333333
+60,386,29.083
+60,387,23.29434
+60,388,17.9078466666667
+60,389,14.8700066666667
+60,390,21.9498333333333
+60,391,21.76018
+60,392,18.02384
+60,393,16.9451866666667
+60,394,21.3470066666667
+60,395,21.77034
+60,396,18.97634
+60,397,17.9815066666667
+60,398,20.29968
+60,399,22.7651733333333
+60,400,18.4996666666667
+60,401,19.177
+60,402,19.67484
+60,403,17.0721866666667
+60,404,15.99184
+60,405,16.04518
+60,406,16.4041666666667
+60,407,24.5753466666667
+60,408,21.9185066666667
+60,409,19.2413466666667
+60,410,14.6701933333333
+60,411,21.6120133333333
+60,412,21.19884
+60,413,23.4958466666667
+60,414,16.1933466666667
+60,415,21.1031666666667
+60,416,19.16684
+60,417,23.8548333333333
+60,418,18.8916733333333
+60,419,19.14652
+60,420,18.5631666666667
+60,421,17.9815066666667
+60,422,20.8491666666667
+60,423,19.8865066666667
+60,424,20.3420133333333
+60,425,24.5956666666667
+60,426,17.5683333333333
+60,427,24.8073333333333
+60,428,19.5156666666667
+60,429,18.2465133333333
+60,430,18.26768
+60,431,20.2573466666667
+60,432,21.0193466666667
+60,433,23.3256666666667
+60,434,19.5800133333333
+60,435,19.4733333333333
+60,436,23.114
+60,437,24.7760066666667
+60,438,26.72334
+60,439,23.0928333333333
+60,440,23.0928333333333
+60,441,15.53718
+60,442,19.2413466666667
+60,443,21.4740066666667
+60,444,20.5011866666667
+60,445,19.812
+60,446,16.0443333333333
+60,447,18.4895066666667
+60,448,18.4471733333333
+60,449,17.4100066666667
+60,450,19.0821733333333
+60,451,18.4471733333333
+60,452,23.61184
+60,453,21.1565066666667
+60,454,19.2311866666667
+60,455,20.0566866666667
+60,456,19.3361733333333
+60,457,19.2193333333333
+60,458,18.5208333333333
+60,459,17.76984
+60,460,18.8171666666667
+60,461,21.1243333333333
+60,462,19.2726733333333
+60,463,16.36268
+60,464,24.1410066666667
+60,465,16.1730266666667
+60,466,20.5858533333333
+60,467,21.31568
+60,468,25.4956733333333
+60,469,20.0025
+60,470,15.58036
+60,471,17.7275066666667
+60,472,23.16734
+60,473,21.1666666666667
+60,474,28.7341733333333
+60,475,17.1560066666667
+60,476,18.91284
+60,477,14.4255066666667
+60,478,21.59
+60,479,21.3148333333333
+60,480,14.4890066666667
+60,481,18.02384
+60,482,17.6741666666667
+60,483,15.9393466666667
+60,484,18.3726666666667
+60,485,20.7331733333333
+60,486,20.11934
+60,487,23.0928333333333
+60,488,21.70684
+60,489,18.5530066666667
+60,490,19.4420066666667
+60,491,23.3265133333333
+60,492,12.62634
+60,493,14.96568
+60,494,21.9286666666667
+60,495,21.32584
+60,496,20.066
+60,497,23.9606666666667
+60,498,20.574
+60,499,15.1773466666667
+60,500,21.6958333333333
+60,501,20.9135133333333
+60,502,19.2413466666667
+60,503,26.1196666666667
+60,504,21.336
+60,505,16.3195
+60,506,18.6800066666667
+60,507,19.05
+60,508,22.225
+60,509,20.1506666666667
+60,510,19.1245066666667
+60,511,17.6318333333333
+60,512,25.146
+60,513,19.08302
+60,514,23.0615066666667
+60,515,20.0770066666667
+60,516,16.2983333333333
+60,517,14.1926733333333
+60,518,19.8755
+60,519,20.9973333333333
+60,520,21.70684
+60,521,18.5538533333333
+60,522,20.4681666666667
+60,523,20.6061733333333
+60,524,13.9073466666667
+60,525,16.8698333333333
+60,526,23.1986666666667
+60,527,18.8815133333333
+60,528,18.91284
+60,529,20.36318
+60,530,20.9338333333333
+60,531,22.3308333333333
+60,532,18.7536666666667
+60,533,18.3625066666667
+60,534,22.2470133333333
+60,535,20.955
+60,536,21.2945133333333
+60,537,20.1295
+60,538,22.1191666666667
+60,539,20.1718333333333
+60,540,20.828
+60,541,24.0986733333333
+60,542,18.6596866666667
+60,543,25.2840066666667
+60,544,26.9985066666667
+60,545,14.5525066666667
+60,546,14.8911733333333
+60,547,19.812
+60,548,20.9660066666667
+60,549,21.19884
+60,550,19.2091733333333
+60,551,18.6266666666667
+60,552,20.5426733333333
+60,553,25.0935066666667
+60,554,19.685
+60,555,15.3145066666667
+60,556,20.32
+60,557,21.7076866666667
+60,558,21.89734
+60,559,17.25168
+60,560,20.6798333333333
+60,561,22.1098533333333
+60,562,20.1845333333333
+60,563,18.4793466666667
+60,564,21.6221733333333
+60,565,20.9871733333333
+60,566,18.7333466666667
+60,567,20.6586666666667
+60,568,22.72284
+60,569,23.3155066666667
+60,570,20.9770133333333
+60,571,17.2728466666667
+60,572,20.3208466666667
+60,573,19.2091733333333
+60,574,19.1778466666667
+60,575,23.10384
+60,576,19.4631733333333
+60,577,21.2411733333333
+60,578,22.6170066666667
+60,579,25.5591733333333
+60,580,27.6868466666667
+60,581,20.574
+60,582,18.415
+60,583,20.9558466666667
+60,584,18.6376733333333
+60,585,19.2726733333333
+60,586,20.18284
+60,587,23.7913333333333
+60,588,22.7973466666667
+60,589,25.5591733333333
+60,590,19.28368
+60,591,21.209
+60,592,22.02434
+60,593,25.6650066666667
+60,594,16.3313533333333
+60,595,20.9236733333333
+60,596,22.6271666666667
+60,597,15.9071733333333
+60,598,17.11452
+60,599,15.7590066666667
+60,600,18.6063466666667
+60,601,22.7118333333333
+60,602,17.9180066666667
+60,603,21.8660133333333
+60,604,20.8601733333333
+60,605,18.1195133333333
+60,606,19.1456733333333
+60,607,17.6851733333333
+60,608,17.4117
+60,609,20.2886733333333
+60,610,21.7813466666667
+60,611,17.8011666666667
+60,612,19.2828333333333
+60,613,19.5800133333333
+60,614,15.6430133333333
+60,615,20.6061733333333
+60,616,15.8021866666667
+60,617,23.60168
+60,618,15.29334
+60,619,19.80184
+60,620,18.4056866666667
+60,621,17.12468
+60,622,17.4100066666667
+60,623,21.6221733333333
+60,624,22.2571733333333
+60,625,18.1830133333333
+60,626,16.7115066666667
+60,627,24.5330133333333
+60,628,23.0826733333333
+60,629,17.63268
+60,630,20.0770066666667
+60,631,17.7385133333333
+60,632,18.97634
+60,633,17.0290066666667
+60,634,20.18284
+60,635,22.02434
+60,636,20.1083333333333
+60,637,18.6698466666667
+60,638,16.24584
+60,639,20.3411666666667
+60,640,19.7696666666667
+60,641,19.2616666666667
+60,642,17.8646666666667
+60,643,15.99184
+60,644,18.33118
+60,645,15.8123466666667
+60,646,17.9815066666667
+60,647,16.8181866666667
+60,648,23.0716666666667
+60,649,21.0938533333333
+60,650,17.51584
+60,651,17.1873333333333
+60,652,20.9025066666667
+60,653,23.0826733333333
+60,654,18.8383333333333
+60,655,20.9761666666667
+60,656,20.4258333333333
+60,657,21.6746666666667
+60,658,22.1403333333333
+60,659,24.8395066666667
+60,660,22.5425
+60,661,20.99818
+60,662,20.7120066666667
+60,663,16.6691733333333
+60,664,20.0135066666667
+60,665,18.65884
+60,666,16.8275
+60,667,27.15768
+60,668,23.0505
+60,669,21.5053333333333
+60,670,15.4093333333333
+60,671,16.256
+60,672,20.17268
+60,673,16.0663466666667
+60,674,22.2995066666667
+60,675,22.65934
+60,676,16.0341733333333
+60,677,19.5901733333333
+60,678,21.5273466666667
+60,679,15.1985133333333
+60,680,18.6063466666667
+60,681,16.764
+60,682,16.74368
+60,683,17.6741666666667
+60,684,19.3886666666667
+60,685,22.84984
+60,686,17.7588333333333
+60,687,24.75484
+60,688,19.177
+60,689,20.6586666666667
+60,690,20.6586666666667
+60,691,24.3205
+60,692,16.1713333333333
+60,693,23.3891666666667
+60,694,17.57934
+60,695,21.2513333333333
+60,696,16.6056733333333
+60,697,20.4046666666667
+60,698,17.0188466666667
+60,699,21.18868
+60,700,21.45284
+60,701,20.1083333333333
+60,702,22.9243466666667
+60,703,21.00834
+60,704,19.1778466666667
+60,705,24.36368
+60,706,19.685
+60,707,16.5421733333333
+60,708,21.31568
+60,709,19.2091733333333
+60,710,18.27784
+60,711,16.69034
+60,712,19.812
+60,713,19.42084
+60,714,19.54784
+60,715,21.6856733333333
+60,716,17.8223333333333
+60,717,18.59534
+60,718,15.1765
+60,719,22.2893466666667
+60,720,16.7851666666667
+60,721,16.5853533333333
+60,722,18.65884
+60,723,21.3148333333333
+60,724,18.542
+60,725,18.923
+60,726,21.0828466666667
+60,727,20.74418
+60,728,23.5170133333333
+60,729,19.2091733333333
+60,730,19.0610066666667
+60,731,17.0501733333333
+60,732,20.32
+60,733,17.0815
+60,734,20.4791733333333
+60,735,25.1883333333333
+60,736,24.9131666666667
+60,737,20.6595133333333
+60,738,16.9756666666667
+60,739,17.8443466666667
+60,740,18.6063466666667
+60,741,18.0246866666667
+60,742,19.1245066666667
+60,743,20.24634
+60,744,23.3366733333333
+60,745,17.5903466666667
+60,746,16.74368
+60,747,18.9865
+60,748,17.1771733333333
+60,749,21.70684
+60,750,18.8705066666667
+60,751,20.56384
+60,752,24.4051666666667
+60,753,21.4951733333333
+60,754,23.9615133333333
+60,755,21.7280066666667
+60,756,20.8390066666667
+60,757,20.7331733333333
+60,758,22.08784
+60,759,20.0346733333333
+60,760,18.4996666666667
+60,761,22.3426866666667
+60,762,18.1296733333333
+60,763,18.9865
+60,764,21.19884
+60,765,14.0021733333333
+60,766,21.5476666666667
+60,767,20.9761666666667
+60,768,20.2776666666667
+60,769,20.11934
+60,770,16.9968333333333
+60,771,15.7903333333333
+60,772,23.4526666666667
+60,773,23.29434
+60,774,22.6178533333333
+60,775,22.5331866666667
+60,776,26.53284
+60,777,25.6751666666667
+60,778,22.3308333333333
+60,779,26.65984
+60,780,15.4525133333333
+60,781,26.9875
+60,782,15.1985133333333
+60,783,17.1670133333333
+60,784,25.8445
+60,785,23.3155066666667
+60,786,17.145
+60,787,15.6853466666667
+60,788,15.86484
+60,789,14.1181666666667
+60,790,19.35734
+60,791,24.88184
+60,792,18.5208333333333
+60,793,22.4265066666667
+60,794,18.5640133333333
+60,795,21.32584
+60,796,15.1146933333333
+60,797,20.99818
+60,798,23.0615066666667
+60,799,23.53818
+60,800,18.3735133333333
+60,801,17.2305133333333
+60,802,21.4841666666667
+60,803,24.7226666666667
+60,804,18.1931733333333
+60,805,19.34718
+60,806,14.097
+60,807,18.1618466666667
+60,808,21.1565066666667
+60,809,24.3526733333333
+60,810,21.2310133333333
+60,811,22.352
+60,812,18.5530066666667
+60,813,20.9236733333333
+60,814,17.1560066666667
+60,815,17.3676733333333
+60,816,18.53184
+60,817,17.6318333333333
+60,818,20.6586666666667
+60,819,21.88718
+60,820,21.26234
+60,821,23.6330066666667
+60,822,18.034
+60,823,15.2823333333333
+60,824,15.86484
+60,825,23.3045
+60,826,22.6381733333333
+60,827,18.8603466666667
+60,828,17.3778333333333
+60,829,19.2523533333333
+60,830,17.5048333333333
+60,831,19.4631733333333
+60,832,19.9178333333333
+60,833,21.844
+60,834,17.45234
+60,835,22.1090066666667
+60,836,16.5845066666667
+60,837,18.2566733333333
+60,838,23.3256666666667
+60,839,16.3305066666667
+60,840,23.0293333333333
+60,841,19.3150066666667
+60,842,16.5108466666667
+60,843,17.6106666666667
+60,844,19.1981666666667
+60,845,21.31568
+60,846,21.2945133333333
+60,847,20.1506666666667
+60,848,21.0828466666667
+60,849,18.9238466666667
+60,850,20.5528333333333
+60,851,18.7646733333333
+60,852,15.5363333333333
+60,853,18.9551733333333
+60,854,20.2141666666667
+60,855,19.9500066666667
+60,856,16.5421733333333
+60,857,24.765
+60,858,21.70684
+60,859,18.415
+60,860,19.4420066666667
+60,861,23.5695066666667
+60,862,19.558
+60,863,21.59
+60,864,23.2621666666667
+60,865,17.1771733333333
+60,866,19.8543333333333
+60,867,19.1456733333333
+60,868,20.574
+60,869,22.0666733333333
+60,870,16.1831866666667
+60,871,16.8275
+60,872,19.99234
+60,873,19.3886666666667
+60,874,16.3516733333333
+60,875,18.6698466666667
+60,876,22.8388333333333
+60,877,20.04568
+60,878,25.8868333333333
+60,879,17.2296666666667
+60,880,18.6376733333333
+60,881,20.8915
+60,882,20.61718
+60,883,21.70684
+60,884,20.4055133333333
+60,885,19.3793533333333
+60,886,21.5053333333333
+60,887,21.07184
+60,888,22.2673333333333
+60,889,19.7070133333333
+60,890,19.67484
+60,891,21.1463466666667
+60,892,18.9975066666667
+60,893,22.7541666666667
+60,894,19.5055066666667
+60,895,21.0396666666667
+60,896,20.4258333333333
+60,897,17.3355
+60,898,22.5001666666667
+60,899,20.87118
+60,900,19.16684
+60,901,16.7961733333333
+60,902,24.1511666666667
+60,903,19.3785066666667
+60,904,22.1936733333333
+60,905,21.717
+60,906,21.13534
+60,907,17.8240266666667
+60,908,20.0025
+60,909,22.479
+60,910,22.606
+60,911,18.5326866666667
+60,912,18.32102
+60,913,22.479
+60,914,16.9866733333333
+60,915,16.1713333333333
+60,916,16.03502
+60,917,20.066
+60,918,18.796
+60,919,18.1931733333333
+60,920,18.2990066666667
+60,921,16.9333333333333
+60,922,18.7011733333333
+60,923,20.05584
+60,924,16.24584
+60,925,21.2411733333333
+60,926,20.8601733333333
+60,927,18.7435066666667
+60,928,16.2136666666667
+60,929,16.0138533333333
+60,930,20.4046666666667
+60,931,23.4526666666667
+60,932,17.4735066666667
+60,933,19.9601666666667
+60,934,16.0240133333333
+60,935,21.32584
+60,936,21.0726866666667
+60,937,20.4580066666667
+60,938,20.8923466666667
+60,939,19.6003333333333
+60,940,22.7016733333333
+60,941,16.7428333333333
+60,942,19.48434
+60,943,14.7531666666667
+60,944,21.8651666666667
+60,945,20.2886733333333
+60,946,21.96084
+60,947,20.4156733333333
+60,948,20.3521733333333
+60,949,19.15668
+60,950,20.17268
+60,951,20.92452
+60,952,18.8916733333333
+60,953,26.035
+60,954,22.53234
+60,955,25.9291666666667
+60,956,22.7016733333333
+60,957,19.2413466666667
+60,958,18.3091666666667
+60,959,19.29384
+60,960,19.7171733333333
+60,961,21.0396666666667
+60,962,19.1245066666667
+60,963,20.8915
+60,964,18.9340066666667
+60,965,19.2515066666667
+60,966,25.63368
+60,967,22.0886866666667
+60,968,18.0975
+60,969,15.5050066666667
+60,970,20.43684
+60,971,20.1083333333333
+60,972,23.35784
+60,973,18.3091666666667
+60,974,22.5636666666667
+60,975,24.6591666666667
+60,976,17.4100066666667
+60,977,22.86
+60,978,19.4098333333333
+60,979,16.3838466666667
+60,980,18.2990066666667
+60,981,20.9558466666667
+60,982,19.8543333333333
+60,983,15.0071666666667
+60,984,18.415
+60,985,22.0768333333333
+60,986,21.6010066666667
+60,987,23.3053466666667
+60,988,20.09902
+60,989,15.0503466666667
+60,990,19.1346666666667
+60,991,21.5273466666667
+60,992,26.9451666666667
+60,993,21.2835066666667
+60,994,17.6106666666667
+60,995,17.2195066666667
+60,996,21.0608333333333
+60,997,19.7273333333333
+60,998,20.7966733333333
+60,999,18.5005133333333
+60,1000,26.15184
+61,1,21.7593333333333
+61,2,27.2245666666667
+61,3,23.3722333333333
+61,4,19.8543333333333
+61,5,24.0072333333333
+61,6,23.3299
+61,7,25.8360333333333
+61,8,24.384
+61,9,23.3764666666667
+61,10,26.5895666666667
+61,11,22.7414666666667
+61,12,24.13
+61,13,21.463
+61,14,22.7795666666667
+61,15,27.3177
+61,16,25.9969
+61,17,24.0919
+61,18,21.1751333333333
+61,19,23.7193666666667
+61,20,23.6685666666667
+61,21,23.3256666666667
+61,22,25.1036666666667
+61,23,23.8336666666667
+61,24,29.4301333333333
+61,25,19.05
+61,26,20.4512333333333
+61,27,25.9926666666667
+61,28,30.5689
+61,29,24.8158
+61,30,26.2551333333333
+61,31,25.781
+61,32,25.4846666666667
+61,33,25.5735666666667
+61,34,22.8684666666667
+61,35,24.8496666666667
+61,36,21.4206666666667
+61,37,29.3454666666667
+61,38,21.463
+61,39,26.67
+61,40,27.3092333333333
+61,41,24.5618
+61,42,22.1403333333333
+61,43,21.3825666666667
+61,44,20.4046666666667
+61,45,30.1836666666667
+61,46,26.5006666666667
+61,47,24.8073333333333
+61,48,23.5034666666667
+61,49,19.8966666666667
+61,50,20.2819
+61,51,23.2071333333333
+61,52,30.4419
+61,53,23.876
+61,54,26.3736666666667
+61,55,19.1812333333333
+61,56,24.1469333333333
+61,57,23.2918
+61,58,27.051
+61,59,22.987
+61,60,19.7696666666667
+61,61,23.622
+61,62,23.7066666666667
+61,63,23.7109
+61,64,23.3341333333333
+61,65,20.7899
+61,66,25.8275666666667
+61,67,22.6949
+61,68,19.812
+61,69,28.6258
+61,70,27.6098
+61,71,20.7475666666667
+61,72,19.0965666666667
+61,73,25.3661333333333
+61,74,21.463
+61,75,19.8966666666667
+61,76,27.051
+61,77,23.8082666666667
+61,78,30.2302333333333
+61,79,29.8577
+61,80,21.7212333333333
+61,81,23.7998
+61,82,26.5938
+61,83,27.3473333333333
+61,84,20.7899
+61,85,24.4348
+61,86,20.4978
+61,87,23.8379
+61,88,24.6041333333333
+61,89,23.6643333333333
+61,90,22.6906666666667
+61,91,24.3882333333333
+61,92,23.5881333333333
+61,93,26.3355666666667
+61,94,18.8425666666667
+61,95,19.3505666666667
+61,96,23.2833333333333
+61,97,21.463
+61,98,29.9847
+61,99,24.9385666666667
+61,100,22.9023333333333
+61,101,26.3355666666667
+61,102,27.0975666666667
+61,103,27.1441333333333
+61,104,21.463
+61,105,16.764
+61,106,23.8844666666667
+61,107,26.035
+61,108,24.1469333333333
+61,109,22.2673333333333
+61,110,21.1666666666667
+61,111,21.0058
+61,112,23.4992333333333
+61,113,23.9225666666667
+61,114,23.5034666666667
+61,115,25.0274666666667
+61,116,21.5053333333333
+61,117,26.8901333333333
+61,118,21.1666666666667
+61,119,23.7151333333333
+61,120,20.3284666666667
+61,121,17.6995666666667
+61,122,26.7165666666667
+61,123,27.6563666666667
+61,124,25.3619
+61,125,25.2814666666667
+61,126,24.8962333333333
+61,127,24.511
+61,128,24.9851333333333
+61,129,26.8435666666667
+61,130,27.7283333333333
+61,131,23.7109
+61,132,26.6319
+61,133,25.8656666666667
+61,134,24.384
+61,135,23.2452333333333
+61,136,26.1281333333333
+61,137,21.5053333333333
+61,138,24.3882333333333
+61,139,26.1662333333333
+61,140,24.9809
+61,141,23.749
+61,142,18.2033333333333
+61,143,20.9169
+61,144,25.9545666666667
+61,145,21.336
+61,146,25.4169333333333
+61,147,21.8101333333333
+61,148,23.0801333333333
+61,149,23.7913333333333
+61,150,22.9489
+61,151,19.5199
+61,152,18.0805666666667
+61,153,24.7226666666667
+61,154,20.8788
+61,155,23.5373333333333
+61,156,18.0382333333333
+61,157,21.8016666666667
+61,158,19.7739
+61,159,22.7753333333333
+61,160,23.7955666666667
+61,161,23.9649
+61,162,35.1366666666667
+61,163,23.6685666666667
+61,164,26.7631333333333
+61,165,21.6746666666667
+61,166,26.416
+61,167,25.7386666666667
+61,168,20.3708
+61,169,23.7574666666667
+61,170,25.8699
+61,171,24.003
+61,172,24.1342333333333
+61,173,18.669
+61,174,26.2466666666667
+61,175,25.6582333333333
+61,176,21.2132333333333
+61,177,24.5999
+61,178,22.6102333333333
+61,179,22.5298
+61,180,23.5839
+61,181,23.9225666666667
+61,182,22.9023333333333
+61,183,21.7212333333333
+61,184,22.4366666666667
+61,185,24.2993333333333
+61,186,23.8802333333333
+61,187,25.2814666666667
+61,188,18.8383333333333
+61,189,26.7631333333333
+61,190,20.2014666666667
+61,191,27.1822333333333
+61,192,21.3402333333333
+61,193,22.5679
+61,194,20.828
+61,195,26.6403666666667
+61,196,24.257
+61,197,24.8496666666667
+61,198,21.5561333333333
+61,199,22.7372333333333
+61,200,26.0053666666667
+61,201,21.5476666666667
+61,202,22.8176666666667
+61,203,23.2071333333333
+61,204,27.2330333333333
+61,205,25.3619
+61,206,25.1502333333333
+61,207,21.2132333333333
+61,208,24.6041333333333
+61,209,22.2673333333333
+61,210,18.034
+61,211,13.4662333333333
+61,212,28.3337
+61,213,25.0613333333333
+61,214,28.956
+61,215,24.9004666666667
+61,216,25.6582333333333
+61,217,21.463
+61,218,24.7226666666667
+61,219,21.8863333333333
+61,220,24.0919
+61,221,23.0801333333333
+61,222,26.5049
+61,223,22.6483333333333
+61,224,21.7635666666667
+61,225,24.5575666666667
+61,226,22.0133333333333
+61,227,24.7777
+61,228,21.4672333333333
+61,229,24.6845666666667
+61,230,24.8115666666667
+61,231,21.717
+61,232,19.1346666666667
+61,233,25.1079
+61,234,28.1178
+61,235,23.4653666666667
+61,236,24.6803333333333
+61,237,21.336
+61,238,19.7739
+61,239,25.781
+61,240,25.6624666666667
+61,241,23.5077
+61,242,27.1907
+61,243,21.8059
+61,244,22.1826666666667
+61,245,28.3675666666667
+61,246,23.5077
+61,247,24.6845666666667
+61,248,20.9592333333333
+61,249,23.114
+61,250,24.4686666666667
+61,251,22.1445666666667
+61,252,26.0519333333333
+61,253,25.7937
+61,254,23.114
+61,255,21.6450333333333
+61,256,25.4465666666667
+61,257,22.2715666666667
+61,258,25.4
+61,259,23.9183333333333
+61,260,27.2711333333333
+61,261,25.7048
+61,262,23.3299
+61,263,21.8482333333333
+61,264,26.0011333333333
+61,265,23.1182333333333
+61,266,23.8379
+61,267,22.1953666666667
+61,268,28.8036
+61,269,22.5255666666667
+61,270,20.32
+61,271,17.8646666666667
+61,272,24.5194666666667
+61,273,27.0129
+61,274,22.0175666666667
+61,275,20.2776666666667
+61,276,25.2349
+61,277,23.876
+61,278,20.3665666666667
+61,279,23.4145666666667
+61,280,27.4743333333333
+61,281,18.1229
+61,282,21.082
+61,283,18.9695666666667
+61,284,26.5049
+61,285,23.3722333333333
+61,286,21.6746666666667
+61,287,22.0133333333333
+61,288,27.3558
+61,289,26.797
+61,290,22.3985666666667
+61,291,28.9221333333333
+61,292,26.5514666666667
+61,293,26.5472333333333
+61,294,20.5316666666667
+61,295,22.6906666666667
+61,296,18.796
+61,297,19.177
+61,298,26.67
+61,299,22.9912333333333
+61,300,24.2189
+61,301,17.018
+61,302,21.8524666666667
+61,303,26.9324666666667
+61,304,25.5312333333333
+61,305,25.8275666666667
+61,306,25.1883333333333
+61,307,25.9926666666667
+61,308,19.5156666666667
+61,309,29.7603333333333
+61,310,21.5519
+61,311,21.4333666666667
+61,312,20.4935666666667
+61,313,25.6159
+61,314,27.0933333333333
+61,315,22.0133333333333
+61,316,24.3162666666667
+61,317,22.606
+61,318,21.3402333333333
+61,319,24.5618
+61,320,24.8115666666667
+61,321,28.4945666666667
+61,322,24.4729
+61,323,21.9329
+61,324,22.9954666666667
+61,325,27.2288
+61,326,30.2302333333333
+61,327,24.7269
+61,328,25.908
+61,329,22.1022333333333
+61,330,27.5632333333333
+61,331,26.289
+61,332,26.5938
+61,333,24.8539
+61,334,22.225
+61,335,24.7734666666667
+61,336,24.3035666666667
+61,337,19.8966666666667
+61,338,24.6422333333333
+61,339,29.7645666666667
+61,340,24.4432666666667
+61,341,26.5091333333333
+61,342,20.7052333333333
+61,343,30.0609
+61,344,27.3515666666667
+61,345,23.9183333333333
+61,346,20.9126666666667
+61,347,29.2142333333333
+61,348,21.2132333333333
+61,349,22.1488
+61,350,19.177
+61,351,22.7372333333333
+61,352,20.3708
+61,353,20.4512333333333
+61,354,21.717
+61,355,20.6629
+61,356,28.2109333333333
+61,357,30.7001333333333
+61,358,27.686
+61,359,25.5354666666667
+61,360,26.162
+61,361,26.035
+61,362,21.1666666666667
+61,363,21.4714666666667
+61,364,22.3604666666667
+61,365,18.5928
+61,366,27.0975666666667
+61,367,21.7254666666667
+61,368,24.3882333333333
+61,369,24.1342333333333
+61,370,23.7151333333333
+61,371,25.2772333333333
+61,372,26.4202333333333
+61,373,18.8002333333333
+61,374,22.7372333333333
+61,375,22.4451333333333
+61,376,27.2203333333333
+61,377,22.1911333333333
+61,378,20.2776666666667
+61,379,26.7165666666667
+61,380,24.6845666666667
+61,381,22.9912333333333
+61,382,19.9813333333333
+61,383,20.7899
+61,384,27.5166666666667
+61,385,25.781
+61,386,22.86
+61,387,19.7739
+61,388,28.5834666666667
+61,389,23.7574666666667
+61,390,26.162
+61,391,26.2932333333333
+61,392,23.5796666666667
+61,393,20.4046666666667
+61,394,19.6892333333333
+61,395,19.7739
+61,396,21.8143666666667
+61,397,22.2758
+61,398,20.828
+61,399,22.7414666666667
+61,400,30.6959
+61,401,23.4526666666667
+61,402,20.4893333333333
+61,403,22.7414666666667
+61,404,23.2833333333333
+61,405,21.1666666666667
+61,406,20.7052333333333
+61,407,23.7066666666667
+61,408,23.2833333333333
+61,409,25.1883333333333
+61,410,22.8219
+61,411,25.4042333333333
+61,412,20.447
+61,413,22.5255666666667
+61,414,24.8115666666667
+61,415,28.448
+61,416,24.8115666666667
+61,417,20.3242333333333
+61,418,25.9969
+61,419,27.6140333333333
+61,420,22.1530333333333
+61,421,18.0001333333333
+61,422,19.9813333333333
+61,423,25.7894666666667
+61,424,17.4921333333333
+61,425,23.5839
+61,426,29.7264666666667
+61,427,23.4992333333333
+61,428,25.1036666666667
+61,429,25.7429
+61,430,20.5867
+61,431,22.5213333333333
+61,432,24.8623666666667
+61,433,30.9499
+61,434,22.5679
+61,435,19.304
+61,436,25.1925666666667
+61,437,21.0015666666667
+61,438,22.2673333333333
+61,439,21.5942333333333
+61,440,27.0552333333333
+61,441,20.5020333333333
+61,442,28.3252333333333
+61,443,19.177
+61,444,23.2452333333333
+61,445,26.0858
+61,446,27.559
+61,447,24.0876666666667
+61,448,17.2339
+61,449,27.6902333333333
+61,450,21.6789
+61,451,25.4084666666667
+61,452,26.9705666666667
+61,453,20.4978
+61,454,27.305
+61,455,19.2616666666667
+61,456,26.6403666666667
+61,457,27.0975666666667
+61,458,26.035
+61,459,21.4206666666667
+61,460,22.9446666666667
+61,461,16.5946666666667
+61,462,20.066
+61,463,22.6949
+61,464,30.7848
+61,465,16.6793333333333
+61,466,22.1911333333333
+61,467,29.6375666666667
+61,468,23.0335666666667
+61,469,18.8468
+61,470,23.3722333333333
+61,471,22.2334666666667
+61,472,17.6149
+61,473,20.7433333333333
+61,474,23.3299
+61,475,23.7574666666667
+61,476,25.8656666666667
+61,477,22.4832333333333
+61,478,24.1808
+61,479,21.8863333333333
+61,480,22.352
+61,481,29.9847
+61,482,18.161
+61,483,24.1765666666667
+61,484,23.7066666666667
+61,485,27.0637
+61,486,25.1502333333333
+61,487,25.3576666666667
+61,488,27.1822333333333
+61,489,25.908
+61,490,22.4366666666667
+61,491,21.0058
+61,492,17.7376666666667
+61,493,22.733
+61,494,24.3459
+61,495,26.4244666666667
+61,496,23.2833333333333
+61,497,28.7528
+61,498,22.1064666666667
+61,499,22.7838
+61,500,26.0858
+61,501,20.6163333333333
+61,502,20.1083333333333
+61,503,22.733
+61,504,25.1036666666667
+61,505,20.2353333333333
+61,506,21.5476666666667
+61,507,26.035
+61,508,23.7109
+61,509,21.463
+61,510,26.8816666666667
+61,511,27.8595666666667
+61,512,25.4846666666667
+61,513,21.9371333333333
+61,514,23.6262333333333
+61,515,26.035
+61,516,22.6483333333333
+61,517,22.4917
+61,518,23.9225666666667
+61,519,22.1826666666667
+61,520,24.5533333333333
+61,521,24.9809
+61,522,19.304
+61,523,24.9385666666667
+61,524,23.114
+61,525,23.4188
+61,526,24.638
+61,527,28.2829
+61,528,26.8901333333333
+61,529,24.765
+61,530,25.6328333333333
+61,531,17.5683333333333
+61,532,26.797
+61,533,22.4366666666667
+61,534,27.4023666666667
+61,535,24.6422333333333
+61,536,24.6930333333333
+61,537,21.7635666666667
+61,538,21.2513333333333
+61,539,21.7593333333333
+61,540,25.7894666666667
+61,541,27.4362333333333
+61,542,20.8703333333333
+61,543,26.9705666666667
+61,544,25.019
+61,545,24.8158
+61,546,21.717
+61,547,25.3153333333333
+61,548,22.6568
+61,549,22.9446666666667
+61,550,24.3416666666667
+61,551,23.1224666666667
+61,552,23.114
+61,553,28.2363333333333
+61,554,26.416
+61,555,17.6995666666667
+61,556,19.685
+61,557,21.1666666666667
+61,558,23.1224666666667
+61,559,20.5443666666667
+61,560,24.5660333333333
+61,561,27.0129
+61,562,33.7058
+61,563,22.9489
+61,564,27.0933333333333
+61,565,28.321
+61,566,20.0744666666667
+61,567,21.5984666666667
+61,568,23.0801333333333
+61,569,24.8115666666667
+61,570,26.6742333333333
+61,571,27.6013333333333
+61,572,24.8115666666667
+61,573,23.241
+61,574,24.5575666666667
+61,575,23.2875666666667
+61,576,24.2231333333333
+61,577,26.1239
+61,578,26.6784666666667
+61,579,21.4672333333333
+61,580,28.4945666666667
+61,581,25.7471333333333
+61,582,27.3092333333333
+61,583,30.1963666666667
+61,584,28.2067
+61,585,19.431
+61,586,18.9653333333333
+61,587,19.5156666666667
+61,588,26.5133666666667
+61,589,27.2203333333333
+61,590,21.4672333333333
+61,591,26.8435666666667
+61,592,16.383
+61,593,20.574
+61,594,26.7673666666667
+61,595,24.2146666666667
+61,596,27.2203333333333
+61,597,25.7894666666667
+61,598,24.5575666666667
+61,599,25.3238
+61,600,19.9855666666667
+61,601,23.7066666666667
+61,602,24.765
+61,603,20.5443666666667
+61,604,23.4526666666667
+61,605,22.8261333333333
+61,606,27.4743333333333
+61,607,25.3153333333333
+61,608,28.1093333333333
+61,609,25.4127
+61,610,24.4348
+61,611,26.416
+61,612,22.6483333333333
+61,613,22.5213333333333
+61,614,26.4625666666667
+61,615,20.5316666666667
+61,616,21.8905666666667
+61,617,25.527
+61,618,21.2513333333333
+61,619,21.6323333333333
+61,620,25.3661333333333
+61,621,22.0556666666667
+61,622,24.003
+61,623,28.5411333333333
+61,624,28.8332333333333
+61,625,22.3139
+61,626,28.1516666666667
+61,627,27.8638
+61,628,24.3882333333333
+61,629,22.3985666666667
+61,630,23.876
+61,631,26.3017
+61,632,21.5476666666667
+61,633,18.2033333333333
+61,634,27.6055666666667
+61,635,26.9748
+61,636,24.5575666666667
+61,637,26.7165666666667
+61,638,25.8656666666667
+61,639,26.2509
+61,640,25.6159
+61,641,25.6159
+61,642,23.5839
+61,643,21.209
+61,644,24.892
+61,645,22.733
+61,646,19.304
+61,647,26.3779
+61,648,25.8233333333333
+61,649,16.8486666666667
+61,650,25.8699
+61,651,25.4846666666667
+61,652,20.8703333333333
+61,653,21.5942333333333
+61,654,22.5255666666667
+61,655,21.209
+61,656,27.4743333333333
+61,657,24.7269
+61,658,20.5867
+61,659,18.0001333333333
+61,660,28.2829
+61,661,18.8425666666667
+61,662,22.3139
+61,663,24.2189
+61,664,25.4508
+61,665,19.6469
+61,666,28.1516666666667
+61,667,23.9606666666667
+61,668,19.6045666666667
+61,669,26.4244666666667
+61,670,26.797
+61,671,19.8204666666667
+61,672,24.0072333333333
+61,673,21.5942333333333
+61,674,22.1445666666667
+61,675,26.289
+61,676,25.4042333333333
+61,677,29.5063333333333
+61,678,25.527
+61,679,25.4846666666667
+61,680,23.7109
+61,681,24.1384666666667
+61,682,26.4625666666667
+61,683,21.2555666666667
+61,684,22.7372333333333
+61,685,22.3985666666667
+61,686,24.4305666666667
+61,687,26.5853333333333
+61,688,22.7795666666667
+61,689,19.5664666666667
+61,690,18.2033333333333
+61,691,21.463
+61,692,23.4145666666667
+61,693,20.5359
+61,694,23.0335666666667
+61,695,22.3985666666667
+61,696,20.3369333333333
+61,697,28.9179
+61,698,22.6991333333333
+61,699,22.6483333333333
+61,700,28.0373666666667
+61,701,25.2814666666667
+61,702,22.098
+61,703,26.6319
+61,704,20.0702333333333
+61,705,20.701
+61,706,21.8905666666667
+61,707,31.4155666666667
+61,708,27.0086666666667
+61,709,19.3929
+61,710,21.8482333333333
+61,711,22.4832333333333
+61,712,24.8962333333333
+61,713,23.622
+61,714,26.8012333333333
+61,715,18.1652333333333
+61,716,19.3548
+61,717,22.225
+61,718,18.5843333333333
+61,719,27.0975666666667
+61,720,22.4366666666667
+61,721,27.3939
+61,722,25.0232333333333
+61,723,22.1445666666667
+61,724,24.2189
+61,725,20.9634666666667
+61,726,22.6187
+61,727,23.9691333333333
+61,728,18.288
+61,729,25.7005666666667
+61,730,24.257
+61,731,28.4903333333333
+61,732,23.7955666666667
+61,733,29.3454666666667
+61,734,23.876
+61,735,19.6892333333333
+61,736,22.5636666666667
+61,737,22.6568
+61,738,26.1196666666667
+61,739,23.5415666666667
+61,740,25.3619
+61,741,22.5636666666667
+61,742,20.4512333333333
+61,743,29.1380333333333
+61,744,18.7113333333333
+61,745,24.2231333333333
+61,746,25.7852333333333
+61,747,23.3256666666667
+61,748,27.8553333333333
+61,749,20.9592333333333
+61,750,30.9541333333333
+61,751,21.1666666666667
+61,752,25.0613333333333
+61,753,23.622
+61,754,17.8689
+61,755,24.7226666666667
+61,756,26.3355666666667
+61,757,26.8859
+61,758,20.701
+61,759,23.241
+61,760,24.4263333333333
+61,761,24.0919
+61,762,24.5956666666667
+61,763,20.7052333333333
+61,764,26.035
+61,765,22.6483333333333
+61,766,21.3063666666667
+61,767,21.59
+61,768,32.2749333333333
+61,769,25.3576666666667
+61,770,29.4724666666667
+61,771,23.495
+61,772,26.1662333333333
+61,773,21.2132333333333
+61,774,18.4192333333333
+61,775,21.59
+61,776,19.0923333333333
+61,777,28.7062333333333
+61,778,20.6586666666667
+61,779,25.9545666666667
+61,780,22.9108
+61,781,21.7678
+61,782,26.924
+61,783,29.3835666666667
+61,784,23.9225666666667
+61,785,24.1342333333333
+61,786,20.9592333333333
+61,787,23.7955666666667
+61,788,20.2776666666667
+61,789,25.7132666666667
+61,790,24.8115666666667
+61,791,22.6906666666667
+61,792,25.9207
+61,793,22.6949
+61,794,23.495
+61,795,27.7876
+61,796,25.8741333333333
+61,797,24.8539
+61,798,29.0025666666667
+61,799,26.7589
+61,800,23.114
+61,801,23.6304666666667
+61,802,30.6959
+61,803,20.7433333333333
+61,804,25.0274666666667
+61,805,23.7109
+61,806,28.4945666666667
+61,807,19.6934666666667
+61,808,20.0279
+61,809,26.2043333333333
+61,810,26.5049
+61,811,25.6116666666667
+61,812,23.7532333333333
+61,813,24.5533333333333
+61,814,25.4508
+61,815,22.606
+61,816,20.4046666666667
+61,817,22.098
+61,818,22.606
+61,819,22.9023333333333
+61,820,24.3078
+61,821,24.5999
+61,822,23.0335666666667
+61,823,28.8755666666667
+61,824,21.6789
+61,825,20.7560333333333
+61,826,30.4842333333333
+61,827,27.3939
+61,828,26.2128
+61,829,21.5053333333333
+61,830,21.463
+61,831,22.9150333333333
+61,832,26.0773333333333
+61,833,20.0279
+61,834,22.6525666666667
+61,835,21.717
+61,836,23.7574666666667
+61,837,24.8496666666667
+61,838,22.0175666666667
+61,839,22.0556666666667
+61,840,18.9653333333333
+61,841,25.2772333333333
+61,842,23.3256666666667
+61,843,21.6789
+61,844,23.2494666666667
+61,845,22.9065666666667
+61,846,20.955
+61,847,19.4437
+61,848,20.7052333333333
+61,849,20.4935666666667
+61,850,20.2776666666667
+61,851,24.3501333333333
+61,852,22.0641333333333
+61,853,22.2673333333333
+61,854,28.448
+61,855,24.4686666666667
+61,856,29.9762333333333
+61,857,21.0862333333333
+61,858,22.7795666666667
+61,859,23.1563333333333
+61,860,22.6991333333333
+61,861,24.9385666666667
+61,862,23.4145666666667
+61,863,23.0293333333333
+61,864,21.2555666666667
+61,865,23.7109
+61,866,22.6525666666667
+61,867,26.4625666666667
+61,868,20.2776666666667
+61,869,18.0382333333333
+61,870,20.9973333333333
+61,871,24.9851333333333
+61,872,27.5632333333333
+61,873,19.8585666666667
+61,874,27.6055666666667
+61,875,28.1093333333333
+61,876,25.9630333333333
+61,877,24.0453333333333
+61,878,21.9371333333333
+61,879,27.3939
+61,880,21.971
+61,881,24.7269
+61,882,24.5575666666667
+61,883,23.7913333333333
+61,884,29.8915666666667
+61,885,26.3779
+61,886,22.098
+61,887,21.8524666666667
+61,888,18.542
+61,889,21.8524666666667
+61,890,23.5415666666667
+61,891,21.9371333333333
+61,892,22.8727
+61,893,27.8680333333333
+61,894,34.1206666666667
+61,895,25.9926666666667
+61,896,25.6116666666667
+61,897,24.3035666666667
+61,898,23.2960333333333
+61,899,25.9122333333333
+61,900,23.5839
+61,901,25.3153333333333
+61,902,23.9183333333333
+61,903,19.1389
+61,904,22.6991333333333
+61,905,26.289
+61,906,29.4259
+61,907,25.2349
+61,908,30.1117
+61,909,24.0876666666667
+61,910,31.2547
+61,911,22.7795666666667
+61,912,24.0072333333333
+61,913,27.1822333333333
+61,914,20.32
+61,915,24.8539
+61,916,21.5476666666667
+61,917,25.7471333333333
+61,918,22.4028
+61,919,24.1342333333333
+61,920,22.1869
+61,921,22.479
+61,922,25.4889
+61,923,25.6159
+61,924,22.6102333333333
+61,925,24.4263333333333
+61,926,20.7052333333333
+61,927,22.5679
+61,928,27.7706666666667
+61,929,19.3971333333333
+61,930,26.0392333333333
+61,931,25.4042333333333
+61,932,20.3623333333333
+61,933,21.8059
+61,934,25.8275666666667
+61,935,24.0453333333333
+61,936,18.796
+61,937,23.6685666666667
+61,938,24.0453333333333
+61,939,22.3562333333333
+61,940,23.622
+61,941,22.9446666666667
+61,942,23.2029
+61,943,26.7546666666667
+61,944,28.0246666666667
+61,945,19.812
+61,946,25.7471333333333
+61,947,27.6944666666667
+61,948,26.924
+61,949,22.1403333333333
+61,950,22.9912333333333
+61,951,26.7589
+61,952,25.6116666666667
+61,953,19.8966666666667
+61,954,20.7856666666667
+61,955,25.5735666666667
+61,956,23.8379
+61,957,26.1239
+61,958,20.7518
+61,959,23.2833333333333
+61,960,24.765
+61,961,23.5796666666667
+61,962,27.0975666666667
+61,963,23.3299
+61,964,25.3322666666667
+61,965,25.9164666666667
+61,966,22.987
+61,967,22.2673333333333
+61,968,28.1601333333333
+61,969,23.2071333333333
+61,970,20.5824666666667
+61,971,25.0232333333333
+61,972,24.7692333333333
+61,973,22.098
+61,974,23.4992333333333
+61,975,27.4743333333333
+61,976,23.8336666666667
+61,977,26.0985
+61,978,24.7734666666667
+61,979,24.5575666666667
+61,980,17.7419
+61,981,30.5223333333333
+61,982,23.3722333333333
+61,983,24.5618
+61,984,25.6159
+61,985,22.9108
+61,986,21.0100333333333
+61,987,19.9009
+61,988,24.892
+61,989,28.1601333333333
+61,990,21.6746666666667
+61,991,25.7513666666667
+61,992,25.019
+61,993,25.4465666666667
+61,994,24.0495666666667
+61,995,21.5053333333333
+61,996,22.3647
+61,997,28.1093333333333
+61,998,23.2875666666667
+61,999,23.9225666666667
+61,1000,27.7325666666667
+62,1,24.9766666666667
+62,2,28.8925
+62,3,25.3576666666667
+62,4,33.4645
+62,5,33.9936666666667
+62,6,30.734
+62,7,23.0716666666667
+62,8,26.7758333333333
+62,9,31.3478333333333
+62,10,28.1728333333333
+62,11,26.289
+62,12,32.0886666666667
+62,13,31.2631666666667
+62,14,34.4381666666667
+62,15,33.5703333333333
+62,16,34.2476666666667
+62,17,31.877
+62,18,30.099
+62,19,23.9818333333333
+62,20,29.4851666666667
+62,21,32.0675
+62,22,31.1785
+62,23,30.7551666666667
+62,24,24.765
+62,25,33.8243333333333
+62,26,40.8093333333333
+62,27,24.1935
+62,28,29.972
+62,29,35.9198333333333
+62,30,31.1996666666667
+62,31,33.8666666666667
+62,32,34.4805
+62,33,29.6756666666667
+62,34,26.4583333333333
+62,35,32.3215
+62,36,31.7076666666667
+62,37,33.3163333333333
+62,38,20.5105
+62,39,29.845
+62,40,41.5078333333333
+62,41,28.1728333333333
+62,42,30.0778333333333
+62,43,25.0613333333333
+62,44,34.2476666666667
+62,45,24.6803333333333
+62,46,36.0891666666667
+62,47,40.3013333333333
+62,48,30.734
+62,49,25.8233333333333
+62,50,30.48
+62,51,32.1945
+62,52,22.3731666666667
+62,53,33.7608333333333
+62,54,27.6648333333333
+62,55,28.4056666666667
+62,56,22.0768333333333
+62,57,40.4706666666667
+62,58,30.8186666666667
+62,59,26.0985
+62,60,21.0608333333333
+62,61,29.1253333333333
+62,62,34.5228333333333
+62,63,41.275
+62,64,26.67
+62,65,32.131
+62,66,31.8135
+62,67,33.9513333333333
+62,68,28.702
+62,69,27.3473333333333
+62,70,30.1201666666667
+62,71,32.1098333333333
+62,72,28.2151666666667
+62,73,38.1846666666667
+62,74,30.2471666666667
+62,75,30.3318333333333
+62,76,31.0938333333333
+62,77,33.9513333333333
+62,78,32.6178333333333
+62,79,32.893
+62,80,22.0768333333333
+62,81,31.7711666666667
+62,82,25.1248333333333
+62,83,30.8821666666667
+62,84,31.242
+62,85,32.3215
+62,86,29.0406666666667
+62,87,29.083
+62,88,32.3638333333333
+62,89,27.9188333333333
+62,90,19.7061666666667
+62,91,36.068
+62,92,30.8821666666667
+62,93,28.4056666666667
+62,94,35.56
+62,95,20.2776666666667
+62,96,25.019
+62,97,23.8548333333333
+62,98,41.2538333333333
+62,99,39.5393333333333
+62,100,21.5265
+62,101,35.6235
+62,102,30.8398333333333
+62,103,26.67
+62,104,32.6813333333333
+62,105,29.6756666666667
+62,106,25.8656666666667
+62,107,34.3535
+62,108,27.6436666666667
+62,109,33.4856666666667
+62,110,29.972
+62,111,39.2641666666667
+62,112,24.5533333333333
+62,113,29.0618333333333
+62,114,23.9183333333333
+62,115,26.3313333333333
+62,116,27.2203333333333
+62,117,36.5971666666667
+62,118,33.8031666666667
+62,119,32.4908333333333
+62,120,31.7076666666667
+62,121,24.8496666666667
+62,122,28.956
+62,123,32.3003333333333
+62,124,26.0985
+62,125,33.8666666666667
+62,126,25.2518333333333
+62,127,34.5228333333333
+62,128,33.9513333333333
+62,129,33.401
+62,130,34.1418333333333
+62,131,36.8511666666667
+62,132,34.0571666666667
+62,133,31.3266666666667
+62,134,29.845
+62,135,36.0891666666667
+62,136,27.4108333333333
+62,137,34.1418333333333
+62,138,26.7335
+62,139,48.6198333333333
+62,140,30.48
+62,141,31.1996666666667
+62,142,24.9131666666667
+62,143,35.1578333333333
+62,144,28.0035
+62,145,26.8605
+62,146,26.8393333333333
+62,147,26.3525
+62,148,31.6018333333333
+62,149,31.8981666666667
+62,150,30.7551666666667
+62,151,33.9513333333333
+62,152,29.845
+62,153,32.4061666666667
+62,154,33.8031666666667
+62,155,25.4423333333333
+62,156,39.6028333333333
+62,157,26.4371666666667
+62,158,30.0143333333333
+62,159,33.5703333333333
+62,160,37.4015
+62,161,30.099
+62,162,25.8445
+62,163,24.6591666666667
+62,164,32.9141666666667
+62,165,27.5378333333333
+62,166,22.3308333333333
+62,167,28.8501666666667
+62,168,25.4846666666667
+62,169,32.5755
+62,170,29.1041666666667
+62,171,27.1145
+62,172,28.194
+62,173,35.4118333333333
+62,174,31.2843333333333
+62,175,26.8393333333333
+62,176,37.3803333333333
+62,177,26.9875
+62,178,31.8558333333333
+62,179,34.0571666666667
+62,180,27.6225
+62,181,34.0148333333333
+62,182,29.0618333333333
+62,183,31.5383333333333
+62,184,23.4526666666667
+62,185,29.1253333333333
+62,186,30.3741666666667
+62,187,36.9146666666667
+62,188,25.146
+62,189,32.8295
+62,190,36.068
+62,191,26.67
+62,192,27.5378333333333
+62,193,25.273
+62,194,28.8078333333333
+62,195,31.0303333333333
+62,196,32.7448333333333
+62,197,30.2048333333333
+62,198,23.5796666666667
+62,199,40.005
+62,200,28.0035
+62,201,29.8026666666667
+62,202,24.8285
+62,203,35.5176666666667
+62,204,34.4805
+62,205,25.5058333333333
+62,206,28.3633333333333
+62,207,33.3163333333333
+62,208,29.1676666666667
+62,209,28.702
+62,210,28.6808333333333
+62,211,23.0081666666667
+62,212,27.4531666666667
+62,213,25.019
+62,214,31.9828333333333
+62,215,28.8713333333333
+62,216,34.6075
+62,217,28.7655
+62,218,29.6545
+62,219,36.9358333333333
+62,220,26.1408333333333
+62,221,34.163
+62,222,26.67
+62,223,33.8666666666667
+62,224,31.4325
+62,225,26.2043333333333
+62,226,26.3736666666667
+62,227,32.2156666666667
+62,228,31.8135
+62,229,29.2946666666667
+62,230,31.877
+62,231,34.7345
+62,232,29.8873333333333
+62,233,32.131
+62,234,29.6333333333333
+62,235,25.908
+62,236,27.432
+62,237,28.7866666666667
+62,238,33.0623333333333
+62,239,20.447
+62,240,30.0143333333333
+62,241,28.5538333333333
+62,242,28.6596666666667
+62,243,33.3163333333333
+62,244,26.289
+62,245,33.6973333333333
+62,246,28.956
+62,247,26.9875
+62,248,32.3638333333333
+62,249,32.766
+62,250,29.2523333333333
+62,251,28.6385
+62,252,26.8393333333333
+62,253,31.1573333333333
+62,254,34.0148333333333
+62,255,25.0613333333333
+62,256,32.9141666666667
+62,257,30.734
+62,258,29.21
+62,259,31.877
+62,260,34.8826666666667
+62,261,28.8713333333333
+62,262,25.6328333333333
+62,263,37.719
+62,264,25.8445
+62,265,36.3643333333333
+62,266,33.8243333333333
+62,267,33.528
+62,268,32.7236666666667
+62,269,30.3953333333333
+62,270,24.384
+62,271,37.9941666666667
+62,272,35.3483333333333
+62,273,35.0096666666667
+62,274,36.195
+62,275,27.0721666666667
+62,276,27.0933333333333
+62,277,36.1315
+62,278,29.464
+62,279,27.2626666666667
+62,280,32.8506666666667
+62,281,33.8031666666667
+62,282,28.3633333333333
+62,283,33.0411666666667
+62,284,34.0995
+62,285,37.0416666666667
+62,286,39.497
+62,287,27.2838333333333
+62,288,23.5585
+62,289,31.5595
+62,290,29.2735
+62,291,33.5491666666667
+62,292,37.1051666666667
+62,293,27.2838333333333
+62,294,23.2833333333333
+62,295,32.1521666666667
+62,296,35.2636666666667
+62,297,31.4325
+62,298,24.1723333333333
+62,299,30.3106666666667
+62,300,28.7443333333333
+62,301,29.6121666666667
+62,302,27.6013333333333
+62,303,27.6436666666667
+62,304,31.7711666666667
+62,305,33.9725
+62,306,32.9988333333333
+62,307,22.9235
+62,308,32.4273333333333
+62,309,21.8228333333333
+62,310,28.8713333333333
+62,311,32.4273333333333
+62,312,26.2678333333333
+62,313,31.2208333333333
+62,314,32.6601666666667
+62,315,27.8765
+62,316,38.1423333333333
+62,317,29.2735
+62,318,38.3963333333333
+62,319,30.988
+62,320,31.2843333333333
+62,321,26.8181666666667
+62,322,25.2306666666667
+62,323,25.7598333333333
+62,324,26.4795
+62,325,30.0566666666667
+62,326,34.163
+62,327,27.3473333333333
+62,328,33.8031666666667
+62,329,29.7391666666667
+62,330,31.9193333333333
+62,331,25.6963333333333
+62,332,31.7923333333333
+62,333,37.9941666666667
+62,334,22.606
+62,335,33.9936666666667
+62,336,29.4428333333333
+62,337,26.67
+62,338,22.8811666666667
+62,339,27.7918333333333
+62,340,29.845
+62,341,36.4701666666667
+62,342,33.8243333333333
+62,343,29.8661666666667
+62,344,32.9776666666667
+62,345,33.0623333333333
+62,346,27.8765
+62,347,25.1671666666667
+62,348,29.8661666666667
+62,349,29.464
+62,350,29.8661666666667
+62,351,35.2213333333333
+62,352,29.5486666666667
+62,353,31.0515
+62,354,29.6333333333333
+62,355,34.671
+62,356,24.0453333333333
+62,357,30.7975
+62,358,33.9301666666667
+62,359,39.5393333333333
+62,360,33.2951666666667
+62,361,27.94
+62,362,29.1676666666667
+62,363,28.194
+62,364,27.813
+62,365,26.2678333333333
+62,366,39.0525
+62,367,32.3003333333333
+62,368,29.3581666666667
+62,369,24.4898333333333
+62,370,20.4893333333333
+62,371,31.3055
+62,372,29.6121666666667
+62,373,37.6766666666667
+62,374,41.3385
+62,375,32.385
+62,376,34.5863333333333
+62,377,36.0468333333333
+62,378,30.2471666666667
+62,379,29.3793333333333
+62,380,38.0576666666667
+62,381,31.6653333333333
+62,382,28.2786666666667
+62,383,25.2941666666667
+62,384,34.4593333333333
+62,385,33.274
+62,386,24.7015
+62,387,24.9766666666667
+62,388,32.1098333333333
+62,389,27.4743333333333
+62,390,34.29
+62,391,25.0401666666667
+62,392,26.1408333333333
+62,393,39.4758333333333
+62,394,31.4536666666667
+62,395,26.3948333333333
+62,396,27.9823333333333
+62,397,40.9363333333333
+62,398,28.8078333333333
+62,399,30.607
+62,400,32.6601666666667
+62,401,29.1253333333333
+62,402,29.4428333333333
+62,403,33.5068333333333
+62,404,33.528
+62,405,28.1516666666667
+62,406,24.6168333333333
+62,407,29.8026666666667
+62,408,23.9818333333333
+62,409,27.0933333333333
+62,410,30.4165
+62,411,29.0406666666667
+62,412,37.6131666666667
+62,413,38.2481666666667
+62,414,26.416
+62,415,32.8295
+62,416,31.496
+62,417,31.8981666666667
+62,418,30.9033333333333
+62,419,32.2368333333333
+62,420,32.893
+62,421,28.6173333333333
+62,422,28.575
+62,423,26.9451666666667
+62,424,33.1258333333333
+62,425,30.8186666666667
+62,426,28.8078333333333
+62,427,33.4221666666667
+62,428,36.8723333333333
+62,429,26.5641666666667
+62,430,30.0778333333333
+62,431,25.3153333333333
+62,432,32.1098333333333
+62,433,28.1516666666667
+62,434,23.6008333333333
+62,435,25.654
+62,436,29.083
+62,437,25.7598333333333
+62,438,38.7773333333333
+62,439,27.1991666666667
+62,440,33.9301666666667
+62,441,24.4051666666667
+62,442,35.8563333333333
+62,443,33.7608333333333
+62,444,36.9146666666667
+62,445,24.4263333333333
+62,446,28.4268333333333
+62,447,25.5693333333333
+62,448,28.7231666666667
+62,449,27.5801666666667
+62,450,35.2425
+62,451,30.8398333333333
+62,452,25.654
+62,453,27.8976666666667
+62,454,28.3421666666667
+62,455,29.7603333333333
+62,456,29.8661666666667
+62,457,25.5481666666667
+62,458,27.4955
+62,459,22.7753333333333
+62,460,26.5853333333333
+62,461,33.4856666666667
+62,462,27.432
+62,463,31.9405
+62,464,32.6601666666667
+62,465,27.7706666666667
+62,466,29.4005
+62,467,26.6276666666667
+62,468,30.2895
+62,469,33.2951666666667
+62,470,30.4165
+62,471,32.5331666666667
+62,472,31.3055
+62,473,25.0825
+62,474,30.7763333333333
+62,475,30.5011666666667
+62,476,30.2471666666667
+62,477,32.8295
+62,478,28.8501666666667
+62,479,29.2735
+62,480,29.8238333333333
+62,481,27.178
+62,482,27.051
+62,483,30.5011666666667
+62,484,28.6173333333333
+62,485,38.4386666666667
+62,486,29.3793333333333
+62,487,32.5755
+62,488,23.6855
+62,489,29.6756666666667
+62,490,27.178
+62,491,32.3215
+62,492,23.8336666666667
+62,493,28.2786666666667
+62,494,32.3638333333333
+62,495,25.0825
+62,496,29.8661666666667
+62,497,36.5548333333333
+62,498,27.4955
+62,499,32.1945
+62,500,31.9828333333333
+62,501,31.5171666666667
+62,502,28.448
+62,503,41.1903333333333
+62,504,29.6545
+62,505,26.5641666666667
+62,506,34.2476666666667
+62,507,36.4278333333333
+62,508,30.226
+62,509,24.511
+62,510,24.003
+62,511,27.9188333333333
+62,512,33.1893333333333
+62,513,34.9673333333333
+62,514,31.2208333333333
+62,515,24.4263333333333
+62,516,29.845
+62,517,23.4103333333333
+62,518,20.4258333333333
+62,519,36.6183333333333
+62,520,38.0153333333333
+62,521,26.4371666666667
+62,522,30.9668333333333
+62,523,24.765
+62,524,28.2998333333333
+62,525,25.654
+62,526,22.5001666666667
+62,527,22.6483333333333
+62,528,31.5171666666667
+62,529,33.909
+62,530,37.9095
+62,531,31.115
+62,532,35.6235
+62,533,28.5538333333333
+62,534,25.4
+62,535,28.067
+62,536,29.3581666666667
+62,537,20.9338333333333
+62,538,26.0561666666667
+62,539,26.9451666666667
+62,540,27.7706666666667
+62,541,21.9075
+62,542,33.5915
+62,543,31.4748333333333
+62,544,32.512
+62,545,31.623
+62,546,25.9715
+62,547,35.306
+62,548,39.3276666666667
+62,549,26.8181666666667
+62,550,23.0928333333333
+62,551,26.5641666666667
+62,552,34.8615
+62,553,32.639
+62,554,29.0406666666667
+62,555,35.0096666666667
+62,556,22.2885
+62,557,26.5006666666667
+62,558,23.4315
+62,559,32.3638333333333
+62,560,34.3958333333333
+62,561,28.8501666666667
+62,562,28.9348333333333
+62,563,24.9131666666667
+62,564,29.083
+62,565,32.6813333333333
+62,566,31.3266666666667
+62,567,21.9286666666667
+62,568,27.0933333333333
+62,569,33.6126666666667
+62,570,29.0406666666667
+62,571,27.178
+62,572,32.8506666666667
+62,573,22.4155
+62,574,34.9673333333333
+62,575,35.2848333333333
+62,576,27.559
+62,577,38.1
+62,578,41.4866666666667
+62,579,34.6921666666667
+62,580,30.5011666666667
+62,581,27.2415
+62,582,34.8826666666667
+62,583,24.0241666666667
+62,584,33.2316666666667
+62,585,25.654
+62,586,30.3106666666667
+62,587,27.7283333333333
+62,588,29.2523333333333
+62,589,20.9338333333333
+62,590,35.306
+62,591,32.004
+62,592,35.2636666666667
+62,593,26.1408333333333
+62,594,30.6705
+62,595,39.7298333333333
+62,596,23.3256666666667
+62,597,36.4913333333333
+62,598,28.4691666666667
+62,599,34.29
+62,600,30.5223333333333
+62,601,28.7655
+62,602,35.6446666666667
+62,603,27.7283333333333
+62,604,37.338
+62,605,26.9451666666667
+62,606,23.5373333333333
+62,607,26.9028333333333
+62,608,26.3525
+62,609,27.5378333333333
+62,610,36.9993333333333
+62,611,36.2585
+62,612,31.5806666666667
+62,613,32.3215
+62,614,33.3798333333333
+62,615,30.6493333333333
+62,616,23.6855
+62,617,29.464
+62,618,21.5053333333333
+62,619,36.576
+62,620,29.7391666666667
+62,621,33.5068333333333
+62,622,28.1093333333333
+62,623,28.1305
+62,624,24.8073333333333
+62,625,31.496
+62,626,35.3695
+62,627,29.6333333333333
+62,628,31.496
+62,629,28.5326666666667
+62,630,26.543
+62,631,35.8563333333333
+62,632,27.1145
+62,633,34.544
+62,634,24.6168333333333
+62,635,27.2415
+62,636,36.7876666666667
+62,637,34.2688333333333
+62,638,28.8713333333333
+62,639,29.0406666666667
+62,640,33.5068333333333
+62,641,24.7015
+62,642,32.9353333333333
+62,643,30.2048333333333
+62,644,28.4268333333333
+62,645,30.48
+62,646,36.8511666666667
+62,647,27.4743333333333
+62,648,29.7815
+62,649,30.6493333333333
+62,650,30.6916666666667
+62,651,31.4748333333333
+62,652,30.607
+62,653,33.2105
+62,654,35.1578333333333
+62,655,33.3163333333333
+62,656,30.1413333333333
+62,657,34.5651666666667
+62,658,27.6013333333333
+62,659,27.1145
+62,660,27.9823333333333
+62,661,45.0215
+62,662,29.2735
+62,663,27.0298333333333
+62,664,32.5543333333333
+62,665,25.7386666666667
+62,666,24.5956666666667
+62,667,20.0871666666667
+62,668,27.7071666666667
+62,669,24.9766666666667
+62,670,32.1098333333333
+62,671,25.2306666666667
+62,672,26.0138333333333
+62,673,28.0246666666667
+62,674,40.4283333333333
+62,675,24.257
+62,676,31.1785
+62,677,24.9766666666667
+62,678,28.8078333333333
+62,679,30.5435
+62,680,35.052
+62,681,37.719
+62,682,25.3788333333333
+62,683,25.8656666666667
+62,684,23.2621666666667
+62,685,28.4691666666667
+62,686,23.2621666666667
+62,687,30.2048333333333
+62,688,26.1408333333333
+62,689,24.384
+62,690,33.3163333333333
+62,691,27.7706666666667
+62,692,30.6493333333333
+62,693,30.353
+62,694,32.9353333333333
+62,695,38.481
+62,696,31.7288333333333
+62,697,32.7025
+62,698,34.3958333333333
+62,699,26.2043333333333
+62,700,27.7283333333333
+62,701,33.3375
+62,702,32.0675
+62,703,24.9766666666667
+62,704,25.527
+62,705,26.6911666666667
+62,706,38.9255
+62,707,32.6178333333333
+62,708,30.3106666666667
+62,709,25.8233333333333
+62,710,24.9343333333333
+62,711,25.9291666666667
+62,712,29.6333333333333
+62,713,23.3256666666667
+62,714,33.3798333333333
+62,715,30.8821666666667
+62,716,31.1785
+62,717,34.925
+62,718,33.8455
+62,719,27.0086666666667
+62,720,34.798
+62,721,29.6968333333333
+62,722,23.5161666666667
+62,723,27.9823333333333
+62,724,28.5538333333333
+62,725,37.592
+62,726,27.559
+62,727,27.8341666666667
+62,728,30.3106666666667
+62,729,24.2146666666667
+62,730,29.4428333333333
+62,731,27.4531666666667
+62,732,23.8125
+62,733,32.5331666666667
+62,734,39.0313333333333
+62,735,25.3365
+62,736,29.3158333333333
+62,737,25.3153333333333
+62,738,34.2053333333333
+62,739,27.7495
+62,740,33.5915
+62,741,30.5858333333333
+62,742,32.4696666666667
+62,743,26.1196666666667
+62,744,37.6131666666667
+62,745,30.6916666666667
+62,746,24.2358333333333
+62,747,33.147
+62,748,20.9338333333333
+62,749,29.6545
+62,750,31.877
+62,751,31.7711666666667
+62,752,35.3271666666667
+62,753,22.6906666666667
+62,754,32.0463333333333
+62,755,38.8408333333333
+62,756,30.734
+62,757,32.7448333333333
+62,758,28.2363333333333
+62,759,32.766
+62,760,32.0886666666667
+62,761,34.3323333333333
+62,762,31.7711666666667
+62,763,29.845
+62,764,28.8925
+62,765,30.3106666666667
+62,766,32.2368333333333
+62,767,33.1893333333333
+62,768,32.1098333333333
+62,769,28.2786666666667
+62,770,28.8925
+62,771,28.829
+62,772,26.7758333333333
+62,773,26.3313333333333
+62,774,31.1996666666667
+62,775,38.3963333333333
+62,776,31.4748333333333
+62,777,30.607
+62,778,23.9183333333333
+62,779,28.194
+62,780,32.6178333333333
+62,781,24.13
+62,782,29.5063333333333
+62,783,39.7086666666667
+62,784,42.2486666666667
+62,785,30.0566666666667
+62,786,30.861
+62,787,32.8083333333333
+62,788,35.8986666666667
+62,789,28.3633333333333
+62,790,32.258
+62,791,32.2156666666667
+62,792,34.0995
+62,793,28.0246666666667
+62,794,30.6493333333333
+62,795,32.3426666666667
+62,796,34.4593333333333
+62,797,27.7495
+62,798,26.5218333333333
+62,799,32.0886666666667
+62,800,34.0571666666667
+62,801,30.7128333333333
+62,802,31.8558333333333
+62,803,24.6591666666667
+62,804,28.2575
+62,805,21.7381666666667
+62,806,33.147
+62,807,31.9828333333333
+62,808,36.449
+62,809,29.7603333333333
+62,810,29.3581666666667
+62,811,26.543
+62,812,32.7025
+62,813,28.5961666666667
+62,814,25.9715
+62,815,29.0195
+62,816,30.988
+62,817,30.988
+62,818,27.2838333333333
+62,819,32.8083333333333
+62,820,28.448
+62,821,36.4913333333333
+62,822,30.3106666666667
+62,823,31.6653333333333
+62,824,26.6911666666667
+62,825,30.3741666666667
+62,826,32.1521666666667
+62,827,24.5956666666667
+62,828,26.2678333333333
+62,829,34.7133333333333
+62,830,24.5745
+62,831,37.338
+62,832,29.5486666666667
+62,833,37.7401666666667
+62,834,28.956
+62,835,28.1305
+62,836,23.7913333333333
+62,837,28.9348333333333
+62,838,31.9828333333333
+62,839,28.194
+62,840,29.718
+62,841,40.9151666666667
+62,842,18.2033333333333
+62,843,33.3586666666667
+62,844,22.5636666666667
+62,845,33.782
+62,846,31.0091666666667
+62,847,26.6488333333333
+62,848,24.1723333333333
+62,849,30.1836666666667
+62,850,27.0721666666667
+62,851,36.8511666666667
+62,852,28.0881666666667
+62,853,24.5321666666667
+62,854,23.9183333333333
+62,855,29.0618333333333
+62,856,28.5326666666667
+62,857,31.6653333333333
+62,858,29.1253333333333
+62,859,30.9456666666667
+62,860,28.829
+62,861,27.432
+62,862,24.765
+62,863,29.6968333333333
+62,864,38.3116666666667
+62,865,36.1526666666667
+62,866,30.0566666666667
+62,867,33.3586666666667
+62,868,26.0138333333333
+62,869,32.004
+62,870,32.1098333333333
+62,871,28.6808333333333
+62,872,27.305
+62,873,25.5058333333333
+62,874,28.6173333333333
+62,875,28.8713333333333
+62,876,32.385
+62,877,28.7866666666667
+62,878,40.8516666666667
+62,879,31.6018333333333
+62,880,32.639
+62,881,27.0086666666667
+62,882,30.0566666666667
+62,883,24.6803333333333
+62,884,31.4536666666667
+62,885,28.194
+62,886,28.5538333333333
+62,887,36.3431666666667
+62,888,25.2518333333333
+62,889,19.2828333333333
+62,890,27.1145
+62,891,34.7345
+62,892,24.9978333333333
+62,893,30.6705
+62,894,36.2585
+62,895,33.3798333333333
+62,896,29.5275
+62,897,34.7133333333333
+62,898,28.8713333333333
+62,899,34.6286666666667
+62,900,26.0138333333333
+62,901,25.8656666666667
+62,902,28.3421666666667
+62,903,29.3158333333333
+62,904,25.6963333333333
+62,905,33.2105
+62,906,32.0251666666667
+62,907,25.4423333333333
+62,908,31.7711666666667
+62,909,25.6751666666667
+62,910,23.5373333333333
+62,911,35.0096666666667
+62,912,29.7815
+62,913,35.0308333333333
+62,914,24.3205
+62,915,30.099
+62,916,31.4748333333333
+62,917,33.655
+62,918,29.6121666666667
+62,919,29.2311666666667
+62,920,35.5388333333333
+62,921,28.7866666666667
+62,922,31.2843333333333
+62,923,29.845
+62,924,25.2941666666667
+62,925,34.0783333333333
+62,926,33.7185
+62,927,19.4521666666667
+62,928,42.418
+62,929,28.7231666666667
+62,930,37.9518333333333
+62,931,35.3906666666667
+62,932,27.432
+62,933,32.8295
+62,934,31.4325
+62,935,24.5956666666667
+62,936,32.3215
+62,937,35.5388333333333
+62,938,28.3845
+62,939,35.6023333333333
+62,940,29.9296666666667
+62,941,24.7226666666667
+62,942,38.5445
+62,943,30.1836666666667
+62,944,33.655
+62,945,26.7335
+62,946,31.5171666666667
+62,947,38.227
+62,948,27.3685
+62,949,29.3158333333333
+62,950,39.7933333333333
+62,951,37.8883333333333
+62,952,35.7293333333333
+62,953,32.0463333333333
+62,954,34.0571666666667
+62,955,27.1568333333333
+62,956,27.8765
+62,957,28.3633333333333
+62,958,28.3633333333333
+62,959,27.8553333333333
+62,960,24.765
+62,961,30.7975
+62,962,24.384
+62,963,35.3906666666667
+62,964,30.4165
+62,965,26.6065
+62,966,33.0835
+62,967,34.6075
+62,968,33.0411666666667
+62,969,25.5481666666667
+62,970,24.8285
+62,971,25.4635
+62,972,28.9771666666667
+62,973,28.956
+62,974,26.9663333333333
+62,975,24.3628333333333
+62,976,36.449
+62,977,29.6968333333333
+62,978,33.9513333333333
+62,979,25.3365
+62,980,21.3783333333333
+62,981,27.813
+62,982,23.6431666666667
+62,983,37.338
+62,984,33.2105
+62,985,28.0035
+62,986,39.0736666666667
+62,987,32.4696666666667
+62,988,26.9028333333333
+62,989,26.6911666666667
+62,990,21.9921666666667
+62,991,34.7556666666667
+62,992,27.4743333333333
+62,993,32.2368333333333
+62,994,32.0675
+62,995,30.861
+62,996,26.6488333333333
+62,997,26.1196666666667
+62,998,26.2043333333333
+62,999,28.8078333333333
+62,1000,33.8455
+63,1,20.4258333333333
+63,2,31.0642
+63,3,18.3303333333333
+63,4,29.4301333333333
+63,5,25.3195666666667
+63,6,21.0185
+63,7,23.5373333333333
+63,8,29.7010666666667
+63,9,29.0618333333333
+63,10,20.3665666666667
+63,11,33.0623333333333
+63,12,24.7946333333333
+63,13,28.8247666666667
+63,14,20.1125666666667
+63,15,32.5247
+63,16,24.0665
+63,17,28.5411333333333
+63,18,27.3304
+63,19,19.7908333333333
+63,20,25.0825
+63,21,19.6088
+63,22,20.9592333333333
+63,23,27.051
+63,24,19.6215
+63,25,25.527
+63,26,30.1625
+63,27,20.5782333333333
+63,28,20.3030666666667
+63,29,26.3101666666667
+63,30,20.3665666666667
+63,31,24.1596333333333
+63,32,26.7800666666667
+63,33,22.5890666666667
+63,34,23.622
+63,35,25.8021666666667
+63,36,35.5684666666667
+63,37,21.463
+63,38,29.3200666666667
+63,39,24.8750666666667
+63,40,29.8915666666667
+63,41,27.3558
+63,42,25.7598333333333
+63,43,23.3087333333333
+63,44,23.6855
+63,45,28.6639
+63,46,20.2607333333333
+63,47,27.178
+63,48,26.416
+63,49,24.6210666666667
+63,50,21.7805
+63,51,21.9286666666667
+63,52,32.0929
+63,53,22.8684666666667
+63,54,27.5420666666667
+63,55,20.8788
+63,56,22.5594333333333
+63,57,25.8656666666667
+63,58,28.7866666666667
+63,59,26.4795
+63,60,29.8365333333333
+63,61,29.1041666666667
+63,62,22.4282
+63,63,25.3407333333333
+63,64,29.4259
+63,65,30.8440666666667
+63,66,24.384
+63,67,27.3304
+63,68,20.1718333333333
+63,69,24.4305666666667
+63,70,25.2772333333333
+63,71,29.8026666666667
+63,72,29.0025666666667
+63,73,25.4719666666667
+63,74,28.4183666666667
+63,75,20.0109666666667
+63,76,26.162
+63,77,23.4738333333333
+63,78,26.543
+63,79,30.2514
+63,80,29.3581666666667
+63,81,20.8703333333333
+63,82,22.8007333333333
+63,83,29.6418
+63,84,30.6493333333333
+63,85,27.4066
+63,86,30.607
+63,87,25.4
+63,88,26.162
+63,89,26.4202333333333
+63,90,23.5373333333333
+63,91,33.5153
+63,92,29.1465
+63,93,26.797
+63,94,27.5801666666667
+63,95,19.9855666666667
+63,96,37.1094
+63,97,27.9442333333333
+63,98,33.2401333333333
+63,99,27.9061333333333
+63,100,26.1874
+63,101,27.4997333333333
+63,102,16.4465
+63,103,24.1342333333333
+63,104,21.9117333333333
+63,105,22.6483333333333
+63,106,27.1441333333333
+63,107,24.3882333333333
+63,108,26.5049
+63,109,25.654
+63,110,20.0236666666667
+63,111,29.3624
+63,112,25.2814666666667
+63,113,17.4498
+63,114,22.7965
+63,115,28.0373666666667
+63,116,26.7165666666667
+63,117,23.2664
+63,118,31.7923333333333
+63,119,27.6479
+63,120,29.591
+63,121,22.9658333333333
+63,122,21.2725
+63,123,21.844
+63,124,21.7000666666667
+63,125,32.7279
+63,126,35.6573666666667
+63,127,27.6436666666667
+63,128,29.2354
+63,129,21.9159666666667
+63,130,28.9348333333333
+63,131,29.083
+63,132,30.7678666666667
+63,133,21.0396666666667
+63,134,18.2245
+63,135,32.9861333333333
+63,136,30.3572333333333
+63,137,24.2993333333333
+63,138,24.1935
+63,139,19.2828333333333
+63,140,25.9291666666667
+63,141,21.2301666666667
+63,142,22.0556666666667
+63,143,28.3040666666667
+63,144,25.5354666666667
+63,145,24.9343333333333
+63,146,30.6281666666667
+63,147,25.527
+63,148,20.701
+63,149,25.5735666666667
+63,150,19.7061666666667
+63,151,24.2189
+63,152,26.9451666666667
+63,153,21.1074
+63,154,27.2923
+63,155,25.4635
+63,156,21.2555666666667
+63,157,29.7857333333333
+63,158,27.9019
+63,159,22.2123
+63,160,22.4155
+63,161,17.2974
+63,162,30.4630666666667
+63,163,27.3473333333333
+63,164,27.8765
+63,165,27.8553333333333
+63,166,24.9978333333333
+63,167,24.8073333333333
+63,168,30.5265666666667
+63,169,31.369
+63,170,26.543
+63,171,29.1126333333333
+63,172,25.7429
+63,173,25.4465666666667
+63,174,19.3886666666667
+63,175,21.5519
+63,176,27.2880666666667
+63,177,26.3779
+63,178,27.6140333333333
+63,179,27.1610666666667
+63,180,30.5858333333333
+63,181,21.6365666666667
+63,182,29.8746333333333
+63,183,29.7053
+63,184,30.9541333333333
+63,185,32.0124666666667
+63,186,21.7424
+63,187,27.4150666666667
+63,188,28.4099
+63,189,32.0294
+63,190,28.5792333333333
+63,191,23.368
+63,192,23.1351666666667
+63,193,22.8515333333333
+63,194,22.7160666666667
+63,195,25.5100666666667
+63,196,21.3402333333333
+63,197,25.2814666666667
+63,198,24.1427
+63,199,19.5199
+63,200,31.5171666666667
+63,201,22.4366666666667
+63,202,25.5185333333333
+63,203,22.0175666666667
+63,204,23.0293333333333
+63,205,22.3308333333333
+63,206,29.6375666666667
+63,207,29.0491333333333
+63,208,20.5147333333333
+63,209,27.7706666666667
+63,210,26.6488333333333
+63,211,29.2946666666667
+63,212,23.5161666666667
+63,213,25.3195666666667
+63,214,20.2776666666667
+63,215,28.8586333333333
+63,216,26.0985
+63,217,21.6958333333333
+63,218,26.8181666666667
+63,219,21.8567
+63,220,28.5157333333333
+63,221,22.9065666666667
+63,222,27.9273
+63,223,18.6351333333333
+63,224,22.86
+63,225,25.3788333333333
+63,226,18.034
+63,227,25.4889
+63,228,30.226
+63,229,24.2400666666667
+63,230,28.1982333333333
+63,231,29.4682333333333
+63,232,19.7061666666667
+63,233,26.9663333333333
+63,234,19.4098333333333
+63,235,24.8793
+63,236,28.3294666666667
+63,237,25.1925666666667
+63,238,28.2363333333333
+63,239,24.7015
+63,240,27.2034
+63,241,22.6906666666667
+63,242,22.6483333333333
+63,243,27.6055666666667
+63,244,26.2382
+63,245,26.0180666666667
+63,246,22.9446666666667
+63,247,22.1657333333333
+63,248,24.3416666666667
+63,249,27.9273
+63,250,25.6963333333333
+63,251,32.5331666666667
+63,252,21.0015666666667
+63,253,26.2382
+63,254,32.5670333333333
+63,255,23.9606666666667
+63,256,23.495
+63,257,23.0716666666667
+63,258,26.2932333333333
+63,259,24.7015
+63,260,31.4833
+63,261,32.6601666666667
+63,262,20.7475666666667
+63,263,38.2989666666667
+63,264,24.5956666666667
+63,265,31.8135
+63,266,31.1869666666667
+63,267,22.6906666666667
+63,268,30.3741666666667
+63,269,26.035
+63,270,26.5895666666667
+63,271,22.0429666666667
+63,272,26.1493
+63,273,25.5693333333333
+63,274,28.0289
+63,275,34.1884
+63,276,21.1031666666667
+63,277,28.7485666666667
+63,278,28.3252333333333
+63,279,29.2819666666667
+63,280,30.5646666666667
+63,281,27.0298333333333
+63,282,20.3030666666667
+63,283,27.4616333333333
+63,284,22.7160666666667
+63,285,34.3365666666667
+63,286,22.6525666666667
+63,287,17.9705
+63,288,29.9804666666667
+63,289,24.8073333333333
+63,290,27.7918333333333
+63,291,27.8341666666667
+63,292,25.3492
+63,293,27.0129
+63,294,20.9973333333333
+63,295,24.8835333333333
+63,296,27.1568333333333
+63,297,25.8360333333333
+63,298,31.4367333333333
+63,299,24.7480666666667
+63,300,32.1775666666667
+63,301,27.3896666666667
+63,302,27.5166666666667
+63,303,19.4352333333333
+63,304,21.5053333333333
+63,305,22.5848333333333
+63,306,25.3026333333333
+63,307,18.669
+63,308,23.2452333333333
+63,309,25.0020666666667
+63,310,28.4056666666667
+63,311,22.5509666666667
+63,312,27.0552333333333
+63,313,22.1445666666667
+63,314,25.4211666666667
+63,315,28.7697333333333
+63,316,31.6865
+63,317,20.6459666666667
+63,318,28.3464
+63,319,17.9705
+63,320,29.1888333333333
+63,321,22.7838
+63,322,25.5481666666667
+63,323,25.1502333333333
+63,324,25.2095
+63,325,21.3614
+63,326,24.1554
+63,327,21.0650666666667
+63,328,23.0335666666667
+63,329,27.9484666666667
+63,330,29.2862
+63,331,20.8576333333333
+63,332,22.8388333333333
+63,333,24.4983
+63,334,23.7109
+63,335,30.1413333333333
+63,336,24.7523
+63,337,33.2782333333333
+63,338,20.4089
+63,339,22.4282
+63,340,31.4155666666667
+63,341,30.0143333333333
+63,342,20.3411666666667
+63,343,26.6488333333333
+63,344,20.955
+63,345,29.0195
+63,346,22.2715666666667
+63,347,31.0599666666667
+63,348,22.3139
+63,349,22.5001666666667
+63,350,25.6370666666667
+63,351,30.6705
+63,352,25.4296333333333
+63,353,27.8892
+63,354,26.0011333333333
+63,355,29.2523333333333
+63,356,26.416
+63,357,28.3506333333333
+63,358,17.2296666666667
+63,359,24.1511666666667
+63,360,25.9164666666667
+63,361,26.2932333333333
+63,362,26.2297333333333
+63,363,30.0185666666667
+63,364,24.5787333333333
+63,365,21.7212333333333
+63,366,24.638
+63,367,25.9799666666667
+63,368,25.9334
+63,369,27.4531666666667
+63,370,20.1337333333333
+63,371,24.8327333333333
+63,372,25.4635
+63,373,31.0557333333333
+63,374,24.6591666666667
+63,375,28.5369
+63,376,22.2461666666667
+63,377,21.5307333333333
+63,378,25.9926666666667
+63,379,26.0180666666667
+63,380,25.1290666666667
+63,381,29.9381333333333
+63,382,21.7847333333333
+63,383,23.0970666666667
+63,384,19.6215
+63,385,21.6746666666667
+63,386,29.7222333333333
+63,387,25.4719666666667
+63,388,25.0444
+63,389,20.7264
+63,390,25.1248333333333
+63,391,17.8435
+63,392,21.9964
+63,393,25.6963333333333
+63,394,27.7537333333333
+63,395,24.5406333333333
+63,396,30.8017333333333
+63,397,26.7335
+63,398,26.6107333333333
+63,399,29.5063333333333
+63,400,22.0345
+63,401,33.3205666666667
+63,402,27.2034
+63,403,25.5481666666667
+63,404,22.3816333333333
+63,405,30.8398333333333
+63,406,27.1822333333333
+63,407,26.2763
+63,408,24.9131666666667
+63,409,21.463
+63,410,26.797
+63,411,28.6046333333333
+63,412,27.0129
+63,413,31.6695666666667
+63,414,21.7381666666667
+63,415,23.3468333333333
+63,416,22.0175666666667
+63,417,26.543
+63,418,25.0825
+63,419,24.5745
+63,420,21.5392
+63,421,27.6013333333333
+63,422,17.6360666666667
+63,423,24.0495666666667
+63,424,32.3638333333333
+63,425,24.6168333333333
+63,426,22.0768333333333
+63,427,24.2189
+63,428,32.6220666666667
+63,429,21.8059
+63,430,25.5693333333333
+63,431,25.3661333333333
+63,432,25.3153333333333
+63,433,28.1178
+63,434,28.8798
+63,435,28.6808333333333
+63,436,30.2175333333333
+63,437,30.1074666666667
+63,438,27.6055666666667
+63,439,27.2838333333333
+63,440,21.5476666666667
+63,441,24.9174
+63,442,22.9658333333333
+63,443,21.0481333333333
+63,444,22.2885
+63,445,26.2720666666667
+63,446,28.6596666666667
+63,447,28.9009666666667
+63,448,20.8322333333333
+63,449,21.5942333333333
+63,450,34.2688333333333
+63,451,20.7475666666667
+63,452,25.2306666666667
+63,453,21.6154
+63,454,25.1671666666667
+63,455,20.9592333333333
+63,456,27.3515666666667
+63,457,24.9766666666667
+63,458,19.4352333333333
+63,459,25.0655666666667
+63,460,26.9875
+63,461,30.6916666666667
+63,462,24.7269
+63,463,25.1502333333333
+63,464,28.9052
+63,465,29.4089666666667
+63,466,25.7598333333333
+63,467,18.6097333333333
+63,468,20.828
+63,469,31.7965666666667
+63,470,30.3995666666667
+63,471,21.5688333333333
+63,472,25.5100666666667
+63,473,23.8379
+63,474,32.9395666666667
+63,475,24.3035666666667
+63,476,28.6850666666667
+63,477,24.6253
+63,478,22.9531333333333
+63,479,29.9593
+63,480,24.4263333333333
+63,481,28.0035
+63,482,25.9588
+63,483,24.8581333333333
+63,484,31.4155666666667
+63,485,23.1563333333333
+63,486,28.4776333333333
+63,487,21.4841666666667
+63,488,21.1497333333333
+63,489,25.0825
+63,490,29.3793333333333
+63,491,26.0646333333333
+63,492,26.9494
+63,493,17.3397333333333
+63,494,30.2683333333333
+63,495,24.3078
+63,496,26.2678333333333
+63,497,28.9179
+63,498,23.495
+63,499,29.0195
+63,500,26.924
+63,501,19.1346666666667
+63,502,30.8398333333333
+63,503,24.1003666666667
+63,504,14.2070666666667
+63,505,34.544
+63,506,22.733
+63,507,21.7424
+63,508,26.7335
+63,509,29.4047333333333
+63,510,23.9649
+63,511,31.0980666666667
+63,512,31.1615666666667
+63,513,29.845
+63,514,18.3726666666667
+63,515,31.3520666666667
+63,516,28.4903333333333
+63,517,27.4362333333333
+63,518,18.9484
+63,519,20.2988333333333
+63,520,21.209
+63,521,27.2034
+63,522,31.7330666666667
+63,523,34.0656333333333
+63,524,22.8854
+63,525,19.6892333333333
+63,526,24.1088333333333
+63,527,26.2297333333333
+63,528,22.8811666666667
+63,529,30.5900666666667
+63,530,22.1488
+63,531,27.3092333333333
+63,532,21.0185
+63,533,24.0114666666667
+63,534,23.6474
+63,535,26.4202333333333
+63,536,31.5806666666667
+63,537,24.9428
+63,538,26.2509
+63,539,27.2923
+63,540,29.083
+63,541,24.1342333333333
+63,542,25.3619
+63,543,24.8285
+63,544,21.3995
+63,545,24.8793
+63,546,19.5664666666667
+63,547,21.0735333333333
+63,548,24.6253
+63,549,24.384
+63,550,34.8615
+63,551,22.1022333333333
+63,552,29.1761333333333
+63,553,25.7005666666667
+63,554,29.1041666666667
+63,555,30.3741666666667
+63,556,28.2659666666667
+63,557,24.765
+63,558,26.5303
+63,559,27.5674666666667
+63,560,24.0495666666667
+63,561,27.305
+63,562,24.9639666666667
+63,563,23.5373333333333
+63,564,22.7795666666667
+63,565,26.3144
+63,566,29.2057666666667
+63,567,27.4108333333333
+63,568,22.9362
+63,569,26.0773333333333
+63,570,17.4413333333333
+63,571,24.1173
+63,572,19.7104
+63,573,26.2255
+63,574,23.4992333333333
+63,575,23.7151333333333
+63,576,25.5566333333333
+63,577,29.4513
+63,578,20.4935666666667
+63,579,24.9174
+63,580,26.6361333333333
+63,581,24.5575666666667
+63,582,26.0773333333333
+63,583,22.225
+63,584,34.7853
+63,585,20.6163333333333
+63,586,23.3468333333333
+63,587,17.3820666666667
+63,588,30.607
+63,589,28.8544
+63,590,25.0020666666667
+63,591,30.0143333333333
+63,592,26.5641666666667
+63,593,21.3021333333333
+63,594,37.7020666666667
+63,595,28.0924
+63,596,26.9028333333333
+63,597,29.8492333333333
+63,598,23.9479666666667
+63,599,24.8708333333333
+63,600,26.1069666666667
+63,601,27.1991666666667
+63,602,30.0228
+63,603,21.8694
+63,604,30.4673
+63,605,23.7066666666667
+63,606,20.1506666666667
+63,607,30.9922333333333
+63,608,23.1182333333333
+63,609,21.9921666666667
+63,610,20.7687333333333
+63,611,27.3388666666667
+63,612,26.2297333333333
+63,613,29.9762333333333
+63,614,21.8270666666667
+63,615,31.5849
+63,616,33.7904666666667
+63,617,24.0961333333333
+63,618,25.8064
+63,619,24.7692333333333
+63,620,24.7057333333333
+63,621,22.7372333333333
+63,622,19.7273333333333
+63,623,30.1879
+63,624,26.5853333333333
+63,625,26.4583333333333
+63,626,23.9437333333333
+63,627,31.8600666666667
+63,628,29.9974
+63,629,26.8859
+63,630,22.5467333333333
+63,631,27.7960666666667
+63,632,26.5091333333333
+63,633,19.3251666666667
+63,634,30.4884666666667
+63,635,27.1568333333333
+63,636,27.686
+63,637,26.7250333333333
+63,638,21.8270666666667
+63,639,28.6173333333333
+63,640,26.5853333333333
+63,641,20.4512333333333
+63,642,20.3919666666667
+63,643,28.3845
+63,644,30.3868666666667
+63,645,37.3253
+63,646,31.7203666666667
+63,647,25.2984
+63,648,28.0881666666667
+63,649,34.7175666666667
+63,650,26.7546666666667
+63,651,24.0284
+63,652,26.4414
+63,653,27.7198666666667
+63,654,22.7795666666667
+63,655,35.7547333333333
+63,656,34.4635666666667
+63,657,28.9263666666667
+63,658,26.1323666666667
+63,659,22.1445666666667
+63,660,26.8012333333333
+63,661,29.5063333333333
+63,662,21.8948
+63,663,26.0646333333333
+63,664,22.1234
+63,665,19.2447333333333
+63,666,24.1638666666667
+63,667,22.479
+63,668,29.21
+63,669,32.6009
+63,670,21.3233
+63,671,25.7259666666667
+63,672,21.4249
+63,673,32.3638333333333
+63,674,28.0754666666667
+63,675,23.6262333333333
+63,676,21.0862333333333
+63,677,26.2932333333333
+63,678,25.4296333333333
+63,679,19.4098333333333
+63,680,24.7480666666667
+63,681,19.9178333333333
+63,682,28.0754666666667
+63,683,28.2617333333333
+63,684,21.6746666666667
+63,685,31.5425666666667
+63,686,25.2222
+63,687,22.5890666666667
+63,688,22.8642333333333
+63,689,22.3096666666667
+63,690,23.2198333333333
+63,691,19.3082333333333
+63,692,21.209
+63,693,24.9555
+63,694,23.1817333333333
+63,695,16.6793333333333
+63,696,31.8389
+63,697,23.5627333333333
+63,698,23.2240666666667
+63,699,26.4371666666667
+63,700,21.2132333333333
+63,701,31.623
+63,702,27.2118666666667
+63,703,25.3788333333333
+63,704,28.9433
+63,705,29.337
+63,706,28.0543
+63,707,30.5943
+63,708,28.4903333333333
+63,709,26.7800666666667
+63,710,25.1883333333333
+63,711,23.9606666666667
+63,712,24.4940666666667
+63,713,20.8322333333333
+63,714,30.226
+63,715,28.2405666666667
+63,716,21.1666666666667
+63,717,22.7118333333333
+63,718,32.131
+63,719,23.4315
+63,720,23.9225666666667
+63,721,26.2297333333333
+63,722,26.3525
+63,723,21.5561333333333
+63,724,18.2922333333333
+63,725,25.6328333333333
+63,726,25.0401666666667
+63,727,20.2776666666667
+63,728,25.2560666666667
+63,729,27.3304
+63,730,36.5379
+63,731,29.2311666666667
+63,732,26.0604
+63,733,27.7537333333333
+63,734,31.0472666666667
+63,735,29.1549666666667
+63,736,23.1648
+63,737,26.289
+63,738,19.5622333333333
+63,739,17.5895
+63,740,20.2776666666667
+63,741,27.8595666666667
+63,742,26.7335
+63,743,29.0660666666667
+63,744,27.0552333333333
+63,745,22.1445666666667
+63,746,30.7848
+63,747,28.3464
+63,748,22.8430666666667
+63,749,27.5505333333333
+63,750,23.9903
+63,751,26.7377333333333
+63,752,23.6897333333333
+63,753,23.4103333333333
+63,754,17.272
+63,755,25.2518333333333
+63,756,18.7790666666667
+63,757,22.987
+63,758,20.7899
+63,759,30.5477333333333
+63,760,31.2462333333333
+63,761,25.9334
+63,762,29.0872333333333
+63,763,25.6794
+63,764,23.6093
+63,765,25.781
+63,766,26.1704666666667
+63,767,24.6591666666667
+63,768,27.2880666666667
+63,769,25.2772333333333
+63,770,27.8341666666667
+63,771,25.9799666666667
+63,772,24.6888
+63,773,24.3289666666667
+63,774,23.5246333333333
+63,775,25.4254
+63,776,27.6436666666667
+63,777,20.0871666666667
+63,778,27.2626666666667
+63,779,30.607
+63,780,28.2617333333333
+63,781,25.4296333333333
+63,782,26.1408333333333
+63,783,22.5975333333333
+63,784,31.6314666666667
+63,785,23.6939666666667
+63,786,26.6954
+63,787,21.1116333333333
+63,788,28.1432
+63,789,26.9367
+63,790,23.4315
+63,791,29.4682333333333
+63,792,29.7476333333333
+63,793,29.5952333333333
+63,794,30.2768
+63,795,24.4094
+63,796,21.2936666666667
+63,797,28.2575
+63,798,21.5095666666667
+63,799,34.5059
+63,800,29.8534666666667
+63,801,23.7278333333333
+63,802,30.3149
+63,803,28.8925
+63,804,23.6093
+63,805,25.0401666666667
+63,806,27.9865666666667
+63,807,19.431
+63,808,19.812
+63,809,20.7433333333333
+63,810,21.0608333333333
+63,811,25.8445
+63,812,25.2095
+63,813,18.4996666666667
+63,814,24.3670666666667
+63,815,34.9461666666667
+63,816,23.1986666666667
+63,817,26.6361333333333
+63,818,22.9065666666667
+63,819,27.9103666666667
+63,820,26.0392333333333
+63,821,18.8595
+63,822,25.7386666666667
+63,823,26.0434666666667
+63,824,27.5039666666667
+63,825,26.0900333333333
+63,826,31.1488666666667
+63,827,23.7786333333333
+63,828,25.4846666666667
+63,829,26.4625666666667
+63,830,27.2076333333333
+63,831,31.1023
+63,832,29.7222333333333
+63,833,29.3624
+63,834,26.2043333333333
+63,835,23.3468333333333
+63,836,25.8064
+63,837,24.0241666666667
+63,838,19.9855666666667
+63,839,33.8074
+63,840,21.7847333333333
+63,841,32.4273333333333
+63,842,26.5938
+63,843,29.1084
+63,844,25.5397
+63,845,29.0449
+63,846,26.3313333333333
+63,847,19.0330666666667
+63,848,25.9715
+63,849,23.9437333333333
+63,850,19.6215
+63,851,28.0712333333333
+63,852,22.0387333333333
+63,853,22.0429666666667
+63,854,26.9705666666667
+63,855,26.1704666666667
+63,856,19.4733333333333
+63,857,26.5557
+63,858,24.1511666666667
+63,859,19.1981666666667
+63,860,28.7612666666667
+63,861,28.2913666666667
+63,862,29.9508333333333
+63,863,18.415
+63,864,25.5312333333333
+63,865,21.5942333333333
+63,866,26.9070666666667
+63,867,26.3355666666667
+63,868,22.7160666666667
+63,869,35.6235
+63,870,22.0387333333333
+63,871,19.4733333333333
+63,872,27.6436666666667
+63,873,33.9344
+63,874,24.7904
+63,875,21.1031666666667
+63,876,22.1403333333333
+63,877,22.6102333333333
+63,878,27.0764
+63,879,33.7396666666667
+63,880,21.3656333333333
+63,881,27.3558
+63,882,21.2598
+63,883,29.4470666666667
+63,884,30.5011666666667
+63,885,25.7217333333333
+63,886,23.1563333333333
+63,887,29.5105666666667
+63,888,30.3360666666667
+63,889,26.5853333333333
+63,890,24.2824
+63,891,23.4823
+63,892,26.4371666666667
+63,893,29.0025666666667
+63,894,28.2617333333333
+63,895,23.9818333333333
+63,896,28.9771666666667
+63,897,30.1455666666667
+63,898,25.4846666666667
+63,899,32.2622333333333
+63,900,22.9023333333333
+63,901,32.0251666666667
+63,902,20.0871666666667
+63,903,21.9921666666667
+63,904,27.0002
+63,905,26.0815666666667
+63,906,22.6949
+63,907,24.6591666666667
+63,908,30.3233666666667
+63,909,21.8016666666667
+63,910,24.8539
+63,911,22.3816333333333
+63,912,27.4997333333333
+63,913,20.32
+63,914,22.7965
+63,915,29.0449
+63,916,26.4202333333333
+63,917,36.2415666666667
+63,918,27.0933333333333
+63,919,23.9437333333333
+63,920,28.0500666666667
+63,921,24.8327333333333
+63,922,27.5251333333333
+63,923,26.9875
+63,924,23.1605666666667
+63,925,28.5538333333333
+63,926,27.9315333333333
+63,927,17.9916666666667
+63,928,25.4508
+63,929,31.7288333333333
+63,930,25.0232333333333
+63,931,27.6775333333333
+63,932,29.845
+63,933,19.6553666666667
+63,934,28.0712333333333
+63,935,20.2988333333333
+63,936,21.5307333333333
+63,937,21.4841666666667
+63,938,25.7471333333333
+63,939,31.7796333333333
+63,940,30.1074666666667
+63,941,27.0764
+63,942,25.0020666666667
+63,943,24.7607666666667
+63,944,27.8384
+63,945,23.9818333333333
+63,946,30.4334333333333
+63,947,25.4889
+63,948,27.2034
+63,949,22.3308333333333
+63,950,25.3365
+63,951,29.6333333333333
+63,952,23.0505
+63,953,26.3779
+63,954,22.8473
+63,955,23.0843666666667
+63,956,24.6845666666667
+63,957,22.5509666666667
+63,958,25.0867333333333
+63,959,27.2457333333333
+63,960,27.6648333333333
+63,961,20.0236666666667
+63,962,21.0396666666667
+63,963,27.3346333333333
+63,964,25.0867333333333
+63,965,22.5679
+63,966,27.4404666666667
+63,967,18.0594
+63,968,25.1290666666667
+63,969,27.0806333333333
+63,970,22.5213333333333
+63,971,22.9912333333333
+63,972,21.844
+63,973,19.4437
+63,974,26.416
+63,975,25.4211666666667
+63,976,24.4136333333333
+63,977,23.8548333333333
+63,978,22.6991333333333
+63,979,24.9555
+63,980,24.1765666666667
+63,981,26.9070666666667
+63,982,19.7273333333333
+63,983,28.8078333333333
+63,984,27.3261666666667
+63,985,29.0237333333333
+63,986,26.3567333333333
+63,987,21.6958333333333
+63,988,24.9131666666667
+63,989,24.7438333333333
+63,990,26.2720666666667
+63,991,30.0439666666667
+63,992,24.9512666666667
+63,993,24.6676333333333
+63,994,30.9668333333333
+63,995,20.4978
+63,996,29.6587333333333
+63,997,26.4244666666667
+63,998,27.8341666666667
+63,999,24.9216333333333
+63,1000,24.4898333333333
+64,1,23.5373333333333
+64,2,25.1248333333333
+64,3,32.9141666666667
+64,4,33.6338333333333
+64,5,31.4113333333333
+64,6,33.4856666666667
+64,7,34.036
+64,8,31.8558333333333
+64,9,34.5228333333333
+64,10,28.067
+64,11,24.4051666666667
+64,12,27.5378333333333
+64,13,22.1403333333333
+64,14,30.6705
+64,15,31.8346666666667
+64,16,31.8981666666667
+64,17,23.749
+64,18,22.7965
+64,19,27.8765
+64,20,29.3793333333333
+64,21,25.5905
+64,22,27.813
+64,23,29.1465
+64,24,34.8403333333333
+64,25,21.6535
+64,26,26.8393333333333
+64,27,30.6281666666667
+64,28,30.9456666666667
+64,29,33.8455
+64,30,30.6281666666667
+64,31,23.1351666666667
+64,32,31.4325
+64,33,27.4531666666667
+64,34,28.1305
+64,35,41.3385
+64,36,27.7071666666667
+64,37,27.3685
+64,38,24.0665
+64,39,28.6596666666667
+64,40,21.082
+64,41,35.2425
+64,42,25.9503333333333
+64,43,33.8878333333333
+64,44,31.4748333333333
+64,45,31.115
+64,46,22.7541666666667
+64,47,34.2476666666667
+64,48,28.6808333333333
+64,49,30.48
+64,50,24.1088333333333
+64,51,23.0716666666667
+64,52,23.241
+64,53,29.8661666666667
+64,54,25.9503333333333
+64,55,26.2255
+64,56,26.2043333333333
+64,57,36.2161666666667
+64,58,29.2311666666667
+64,59,29.9085
+64,60,32.0675
+64,61,25.2941666666667
+64,62,28.9136666666667
+64,63,28.8501666666667
+64,64,27.3685
+64,65,35.5388333333333
+64,66,27.2415
+64,67,33.2105
+64,68,31.0091666666667
+64,69,31.496
+64,70,26.5006666666667
+64,71,28.9983333333333
+64,72,29.8661666666667
+64,73,31.3478333333333
+64,74,34.544
+64,75,26.8393333333333
+64,76,28.067
+64,77,28.2998333333333
+64,78,28.4691666666667
+64,79,29.591
+64,80,29.5275
+64,81,26.4583333333333
+64,82,33.1258333333333
+64,83,34.0783333333333
+64,84,31.6653333333333
+64,85,29.6545
+64,86,32.1733333333333
+64,87,27.051
+64,88,27.1568333333333
+64,89,33.6973333333333
+64,90,28.1305
+64,91,29.6121666666667
+64,92,33.0623333333333
+64,93,34.0783333333333
+64,94,29.5063333333333
+64,95,33.2951666666667
+64,96,28.5961666666667
+64,97,27.3473333333333
+64,98,25.0613333333333
+64,99,27.0933333333333
+64,100,31.75
+64,101,27.8765
+64,102,36.6606666666667
+64,103,29.4216666666667
+64,104,30.6916666666667
+64,105,30.988
+64,106,31.115
+64,107,37.1686666666667
+64,108,28.6808333333333
+64,109,34.9038333333333
+64,110,31.7711666666667
+64,111,31.6865
+64,112,29.3581666666667
+64,113,31.1785
+64,114,35.5811666666667
+64,115,28.575
+64,116,35.052
+64,117,27.4108333333333
+64,118,32.9141666666667
+64,119,28.1305
+64,120,31.3055
+64,121,27.8341666666667
+64,122,33.0411666666667
+64,123,27.4531666666667
+64,124,27.5378333333333
+64,125,23.8971666666667
+64,126,25.5481666666667
+64,127,25.6116666666667
+64,128,29.2523333333333
+64,129,23.2621666666667
+64,130,32.9776666666667
+64,131,22.6695
+64,132,30.353
+64,133,28.5115
+64,134,25.2306666666667
+64,135,23.622
+64,136,21.5265
+64,137,32.4696666666667
+64,138,27.3473333333333
+64,139,35.7928333333333
+64,140,30.1625
+64,141,28.7655
+64,142,35.2636666666667
+64,143,28.8078333333333
+64,144,28.3845
+64,145,32.1733333333333
+64,146,27.4955
+64,147,19.3251666666667
+64,148,27.1991666666667
+64,149,28.2363333333333
+64,150,29.4851666666667
+64,151,26.3525
+64,152,37.2956666666667
+64,153,31.4113333333333
+64,154,26.8605
+64,155,29.7815
+64,156,34.544
+64,157,30.0778333333333
+64,158,27.7918333333333
+64,159,34.0783333333333
+64,160,33.3163333333333
+64,161,31.75
+64,162,25.6116666666667
+64,163,32.2791666666667
+64,164,33.5915
+64,165,30.9245
+64,166,32.1945
+64,167,27.7706666666667
+64,168,28.5961666666667
+64,169,32.385
+64,170,34.2688333333333
+64,171,30.0355
+64,172,30.9033333333333
+64,173,25.4
+64,174,30.7975
+64,175,33.1258333333333
+64,176,25.4846666666667
+64,177,30.0778333333333
+64,178,24.8285
+64,179,29.2311666666667
+64,180,29.2735
+64,181,31.3478333333333
+64,182,29.21
+64,183,27.7283333333333
+64,184,21.971
+64,185,35.2213333333333
+64,186,33.1258333333333
+64,187,33.2105
+64,188,26.9663333333333
+64,189,28.8078333333333
+64,190,25.273
+64,191,23.5796666666667
+64,192,29.845
+64,193,23.8971666666667
+64,194,27.6225
+64,195,28.1728333333333
+64,196,31.0091666666667
+64,197,27.9823333333333
+64,198,33.6761666666667
+64,199,28.8925
+64,200,28.4268333333333
+64,201,30.7975
+64,202,27.2626666666667
+64,203,33.2951666666667
+64,204,26.8816666666667
+64,205,23.2198333333333
+64,206,32.3426666666667
+64,207,25.9926666666667
+64,208,27.4955
+64,209,28.448
+64,210,25.9715
+64,211,23.6855
+64,212,25.1036666666667
+64,213,30.4376666666667
+64,214,36.2796666666667
+64,215,35.052
+64,216,28.9348333333333
+64,217,23.5373333333333
+64,218,27.0298333333333
+64,219,22.987
+64,220,27.686
+64,221,34.29
+64,222,30.1836666666667
+64,223,31.115
+64,224,26.7123333333333
+64,225,32.7025
+64,226,23.4526666666667
+64,227,30.6705
+64,228,28.7866666666667
+64,229,22.1403333333333
+64,230,28.7866666666667
+64,231,32.1733333333333
+64,232,25.8656666666667
+64,233,26.8816666666667
+64,234,33.0835
+64,235,33.6126666666667
+64,236,29.845
+64,237,32.893
+64,238,30.8398333333333
+64,239,29.4851666666667
+64,240,27.3896666666667
+64,241,32.7025
+64,242,31.7711666666667
+64,243,30.607
+64,244,28.8501666666667
+64,245,28.9983333333333
+64,246,24.6803333333333
+64,247,32.4908333333333
+64,248,27.7918333333333
+64,249,30.5435
+64,250,35.1578333333333
+64,251,23.3891666666667
+64,252,27.9611666666667
+64,253,29.0195
+64,254,26.9028333333333
+64,255,24.6591666666667
+64,256,26.4371666666667
+64,257,32.2368333333333
+64,258,26.7546666666667
+64,259,23.7066666666667
+64,260,29.7815
+64,261,31.3266666666667
+64,262,29.21
+64,263,27.8553333333333
+64,264,23.1563333333333
+64,265,24.003
+64,266,28.702
+64,267,27.1568333333333
+64,268,29.2735
+64,269,24.9766666666667
+64,270,34.2265
+64,271,29.8238333333333
+64,272,31.5806666666667
+64,273,31.7288333333333
+64,274,25.1036666666667
+64,275,24.4898333333333
+64,276,23.876
+64,277,32.9776666666667
+64,278,29.591
+64,279,25.1671666666667
+64,280,27.9188333333333
+64,281,32.3638333333333
+64,282,30.1625
+64,283,27.6648333333333
+64,284,31.8346666666667
+64,285,26.289
+64,286,29.718
+64,287,24.4051666666667
+64,288,32.3215
+64,289,33.7185
+64,290,32.7448333333333
+64,291,25.4211666666667
+64,292,28.5961666666667
+64,293,28.8713333333333
+64,294,35.2425
+64,295,27.9611666666667
+64,296,34.29
+64,297,33.147
+64,298,33.1046666666667
+64,299,32.639
+64,300,27.7495
+64,301,31.1573333333333
+64,302,24.3416666666667
+64,303,31.6441666666667
+64,304,36.3008333333333
+64,305,28.194
+64,306,27.9188333333333
+64,307,24.2993333333333
+64,308,33.5703333333333
+64,309,25.9926666666667
+64,310,26.797
+64,311,36.2373333333333
+64,312,37.0416666666667
+64,313,35.3695
+64,314,26.67
+64,315,30.9245
+64,316,27.7706666666667
+64,317,31.0726666666667
+64,318,28.575
+64,319,26.4371666666667
+64,320,37.211
+64,321,28.702
+64,322,26.9663333333333
+64,323,26.3313333333333
+64,324,35.2636666666667
+64,325,29.337
+64,326,28.4268333333333
+64,327,27.8553333333333
+64,328,30.9668333333333
+64,329,28.4691666666667
+64,330,27.6225
+64,331,33.4645
+64,332,27.686
+64,333,30.9668333333333
+64,334,22.7541666666667
+64,335,25.3576666666667
+64,336,27.5166666666667
+64,337,34.3958333333333
+64,338,25.7598333333333
+64,339,29.591
+64,340,31.75
+64,341,31.5806666666667
+64,342,27.7495
+64,343,28.0246666666667
+64,344,37.0628333333333
+64,345,29.9296666666667
+64,346,29.5063333333333
+64,347,30.5223333333333
+64,348,28.9771666666667
+64,349,29.6121666666667
+64,350,26.1408333333333
+64,351,31.4748333333333
+64,352,28.3845
+64,353,27.7283333333333
+64,354,24.9131666666667
+64,355,30.6281666666667
+64,356,23.2198333333333
+64,357,32.9776666666667
+64,358,29.1465
+64,359,29.8873333333333
+64,360,27.559
+64,361,27.2626666666667
+64,362,25.5058333333333
+64,363,31.0515
+64,364,27.2838333333333
+64,365,30.861
+64,366,27.559
+64,367,29.4216666666667
+64,368,25.5058333333333
+64,369,20.8491666666667
+64,370,29.3581666666667
+64,371,27.6436666666667
+64,372,27.7283333333333
+64,373,24.5321666666667
+64,374,25.6963333333333
+64,375,29.845
+64,376,30.7128333333333
+64,377,31.1573333333333
+64,378,35.0308333333333
+64,379,31.7076666666667
+64,380,29.9296666666667
+64,381,23.1351666666667
+64,382,23.749
+64,383,27.5801666666667
+64,384,28.1093333333333
+64,385,25.3576666666667
+64,386,26.2255
+64,387,31.8135
+64,388,25.0825
+64,389,29.8026666666667
+64,390,35.2636666666667
+64,391,30.353
+64,392,25.8233333333333
+64,393,27.7918333333333
+64,394,33.9725
+64,395,27.0933333333333
+64,396,28.9136666666667
+64,397,31.496
+64,398,29.6545
+64,399,28.7231666666667
+64,400,27.432
+64,401,30.3318333333333
+64,402,26.9663333333333
+64,403,30.1625
+64,404,29.8873333333333
+64,405,35.9621666666667
+64,406,30.8398333333333
+64,407,31.242
+64,408,21.6323333333333
+64,409,34.5651666666667
+64,410,30.7128333333333
+64,411,27.0298333333333
+64,412,30.3318333333333
+64,413,29.6333333333333
+64,414,30.3953333333333
+64,415,25.1671666666667
+64,416,33.8031666666667
+64,417,25.9503333333333
+64,418,25.7598333333333
+64,419,27.5166666666667
+64,420,36.7241666666667
+64,421,26.0985
+64,422,32.893
+64,423,23.749
+64,424,27.94
+64,425,35.814
+64,426,23.9818333333333
+64,427,29.8661666666667
+64,428,24.5745
+64,429,27.8765
+64,430,31.369
+64,431,27.8765
+64,432,28.2786666666667
+64,433,28.575
+64,434,26.416
+64,435,27.686
+64,436,21.9075
+64,437,28.3845
+64,438,27.8341666666667
+64,439,28.8713333333333
+64,440,31.7711666666667
+64,441,24.9978333333333
+64,442,30.0566666666667
+64,443,27.5378333333333
+64,444,35.6658333333333
+64,445,28.8925
+64,446,27.8765
+64,447,28.321
+64,448,33.4433333333333
+64,449,35.9621666666667
+64,450,30.1836666666667
+64,451,24.7861666666667
+64,452,32.3426666666667
+64,453,27.2415
+64,454,31.496
+64,455,32.5755
+64,456,30.9456666666667
+64,457,29.7603333333333
+64,458,33.2951666666667
+64,459,28.321
+64,460,31.5806666666667
+64,461,32.7025
+64,462,24.6168333333333
+64,463,29.0195
+64,464,32.1945
+64,465,27.305
+64,466,31.6441666666667
+64,467,36.3008333333333
+64,468,30.4165
+64,469,22.4578333333333
+64,470,29.2946666666667
+64,471,26.1408333333333
+64,472,32.0463333333333
+64,473,25.4211666666667
+64,474,28.448
+64,475,30.9456666666667
+64,476,30.48
+64,477,29.3158333333333
+64,478,30.1625
+64,479,30.5011666666667
+64,480,25.273
+64,481,25.7598333333333
+64,482,28.7866666666667
+64,483,25.6963333333333
+64,484,28.0458333333333
+64,485,24.4686666666667
+64,486,29.9508333333333
+64,487,28.0246666666667
+64,488,28.0458333333333
+64,489,28.4056666666667
+64,490,31.6653333333333
+64,491,29.1676666666667
+64,492,28.8925
+64,493,24.9766666666667
+64,494,31.3055
+64,495,28.1093333333333
+64,496,28.8713333333333
+64,497,27.7071666666667
+64,498,31.7923333333333
+64,499,30.7763333333333
+64,500,27.1568333333333
+64,501,29.4428333333333
+64,502,32.7025
+64,503,28.0246666666667
+64,504,26.289
+64,505,27.5801666666667
+64,506,32.512
+64,507,28.9136666666667
+64,508,28.5538333333333
+64,509,31.242
+64,510,38.1423333333333
+64,511,28.5961666666667
+64,512,26.5218333333333
+64,513,32.4485
+64,514,23.6855
+64,515,34.8403333333333
+64,516,25.6116666666667
+64,517,28.6808333333333
+64,518,28.194
+64,519,29.5063333333333
+64,520,26.2255
+64,521,26.8393333333333
+64,522,29.8238333333333
+64,523,32.4061666666667
+64,524,24.6591666666667
+64,525,24.511
+64,526,29.4851666666667
+64,527,29.1676666666667
+64,528,24.4051666666667
+64,529,29.1676666666667
+64,530,35.8351666666667
+64,531,26.6911666666667
+64,532,27.4108333333333
+64,533,30.4588333333333
+64,534,29.6545
+64,535,30.2048333333333
+64,536,23.495
+64,537,27.1568333333333
+64,538,32.7448333333333
+64,539,22.6483333333333
+64,540,30.8821666666667
+64,541,31.7288333333333
+64,542,22.5425
+64,543,28.9136666666667
+64,544,29.1888333333333
+64,545,26.416
+64,546,30.2471666666667
+64,547,25.1248333333333
+64,548,24.1511666666667
+64,549,25.0401666666667
+64,550,22.2885
+64,551,29.7603333333333
+64,552,31.2208333333333
+64,553,26.8181666666667
+64,554,30.6705
+64,555,28.6596666666667
+64,556,26.7123333333333
+64,557,26.6911666666667
+64,558,28.9348333333333
+64,559,32.0886666666667
+64,560,27.4743333333333
+64,561,26.1408333333333
+64,562,29.6333333333333
+64,563,25.7386666666667
+64,564,37.2533333333333
+64,565,32.004
+64,566,32.5755
+64,567,32.9988333333333
+64,568,28.4903333333333
+64,569,32.7448333333333
+64,570,31.369
+64,571,25.5693333333333
+64,572,29.3793333333333
+64,573,26.7335
+64,574,33.0623333333333
+64,575,29.7815
+64,576,31.242
+64,577,27.7071666666667
+64,578,36.6395
+64,579,24.384
+64,580,25.3365
+64,581,25.908
+64,582,24.4898333333333
+64,583,26.5218333333333
+64,584,27.0933333333333
+64,585,26.543
+64,586,25.7386666666667
+64,587,26.2255
+64,588,24.6803333333333
+64,589,29.21
+64,590,35.052
+64,591,29.4851666666667
+64,592,23.4526666666667
+64,593,30.9033333333333
+64,594,26.6911666666667
+64,595,20.9126666666667
+64,596,29.0195
+64,597,24.638
+64,598,26.035
+64,599,21.4418333333333
+64,600,25.3788333333333
+64,601,30.7128333333333
+64,602,28.7866666666667
+64,603,25.8021666666667
+64,604,31.2843333333333
+64,605,23.5585
+64,606,39.9415
+64,607,26.1196666666667
+64,608,31.4113333333333
+64,609,34.3111666666667
+64,610,25.8021666666667
+64,611,25.6963333333333
+64,612,28.5538333333333
+64,613,32.5543333333333
+64,614,30.6916666666667
+64,615,24.9766666666667
+64,616,33.528
+64,617,25.4211666666667
+64,618,29.5698333333333
+64,619,34.6498333333333
+64,620,28.3845
+64,621,25.8021666666667
+64,622,34.1206666666667
+64,623,31.4113333333333
+64,624,33.8031666666667
+64,625,29.7391666666667
+64,626,28.5961666666667
+64,627,29.8026666666667
+64,628,32.0251666666667
+64,629,28.6173333333333
+64,630,27.9611666666667
+64,631,27.9823333333333
+64,632,24.7861666666667
+64,633,24.2781666666667
+64,634,25.9715
+64,635,25.146
+64,636,32.7871666666667
+64,637,31.369
+64,638,29.464
+64,639,26.9663333333333
+64,640,26.2678333333333
+64,641,34.6286666666667
+64,642,28.6385
+64,643,27.7071666666667
+64,644,29.5486666666667
+64,645,27.6013333333333
+64,646,30.0566666666667
+64,647,33.4221666666667
+64,648,29.1041666666667
+64,649,25.6328333333333
+64,650,31.877
+64,651,31.75
+64,652,28.0246666666667
+64,653,34.2476666666667
+64,654,21.1455
+64,655,29.0195
+64,656,26.9663333333333
+64,657,25.7386666666667
+64,658,24.892
+64,659,22.0345
+64,660,29.6333333333333
+64,661,25.781
+64,662,28.7866666666667
+64,663,25.6328333333333
+64,664,27.1145
+64,665,25.4211666666667
+64,666,33.4433333333333
+64,667,27.3896666666667
+64,668,26.3101666666667
+64,669,27.7918333333333
+64,670,31.9616666666667
+64,671,24.9343333333333
+64,672,27.178
+64,673,28.8713333333333
+64,674,29.6968333333333
+64,675,29.9931666666667
+64,676,22.0345
+64,677,26.7546666666667
+64,678,23.9183333333333
+64,679,29.1041666666667
+64,680,25.4635
+64,681,30.353
+64,682,31.4113333333333
+64,683,26.162
+64,684,26.035
+64,685,24.3416666666667
+64,686,32.4696666666667
+64,687,25.3576666666667
+64,688,27.813
+64,689,32.9141666666667
+64,690,31.115
+64,691,30.988
+64,692,28.6808333333333
+64,693,27.3685
+64,694,22.9235
+64,695,31.0938333333333
+64,696,31.7288333333333
+64,697,31.369
+64,698,25.8656666666667
+64,699,29.5698333333333
+64,700,30.7551666666667
+64,701,28.5115
+64,702,25.5481666666667
+64,703,24.3205
+64,704,37.1475
+64,705,30.9033333333333
+64,706,33.5068333333333
+64,707,27.305
+64,708,29.4005
+64,709,29.5486666666667
+64,710,29.5275
+64,711,25.6963333333333
+64,712,26.3736666666667
+64,713,32.4273333333333
+64,714,28.702
+64,715,33.2528333333333
+64,716,29.4428333333333
+64,717,25.7175
+64,718,26.1408333333333
+64,719,29.3793333333333
+64,720,25.6328333333333
+64,721,22.0133333333333
+64,722,31.115
+64,723,23.2621666666667
+64,724,34.8191666666667
+64,725,33.274
+64,726,34.2688333333333
+64,727,30.5223333333333
+64,728,28.575
+64,729,27.051
+64,730,19.5791666666667
+64,731,28.7866666666667
+64,732,21.9921666666667
+64,733,33.5703333333333
+64,734,32.5755
+64,735,27.2203333333333
+64,736,25.8021666666667
+64,737,29.6756666666667
+64,738,24.6591666666667
+64,739,27.0721666666667
+64,740,32.6813333333333
+64,741,29.2735
+64,742,33.3375
+64,743,34.0571666666667
+64,744,28.7231666666667
+64,745,30.0566666666667
+64,746,28.9348333333333
+64,747,27.305
+64,748,21.336
+64,749,30.2683333333333
+64,750,29.591
+64,751,32.2791666666667
+64,752,24.511
+64,753,25.7598333333333
+64,754,27.3685
+64,755,36.4913333333333
+64,756,29.4428333333333
+64,757,33.4645
+64,758,32.8718333333333
+64,759,27.3896666666667
+64,760,24.7226666666667
+64,761,29.2946666666667
+64,762,25.8656666666667
+64,763,31.7076666666667
+64,764,30.5435
+64,765,25.1036666666667
+64,766,30.1413333333333
+64,767,29.464
+64,768,30.0355
+64,769,25.5905
+64,770,33.02
+64,771,19.7061666666667
+64,772,31.7288333333333
+64,773,34.0571666666667
+64,774,28.8925
+64,775,33.9725
+64,776,26.3313333333333
+64,777,28.8501666666667
+64,778,22.479
+64,779,31.4536666666667
+64,780,23.6643333333333
+64,781,33.9936666666667
+64,782,34.9038333333333
+64,783,21.8651666666667
+64,784,27.178
+64,785,35.2001666666667
+64,786,34.544
+64,787,24.9343333333333
+64,788,23.2833333333333
+64,789,23.749
+64,790,32.0463333333333
+64,791,29.337
+64,792,21.1455
+64,793,27.8976666666667
+64,794,28.0035
+64,795,34.036
+64,796,23.7913333333333
+64,797,25.6116666666667
+64,798,29.8873333333333
+64,799,28.5326666666667
+64,800,31.8135
+64,801,34.4381666666667
+64,802,30.3106666666667
+64,803,24.1088333333333
+64,804,31.0303333333333
+64,805,30.9033333333333
+64,806,26.8181666666667
+64,807,25.4211666666667
+64,808,35.1578333333333
+64,809,27.9823333333333
+64,810,28.1305
+64,811,32.4696666666667
+64,812,30.3741666666667
+64,813,28.3633333333333
+64,814,24.1723333333333
+64,815,27.4955
+64,816,29.3581666666667
+64,817,30.2048333333333
+64,818,27.5166666666667
+64,819,28.3845
+64,820,26.543
+64,821,30.5435
+64,822,28.9983333333333
+64,823,27.2838333333333
+64,824,28.8501666666667
+64,825,29.8026666666667
+64,826,23.7701666666667
+64,827,28.5115
+64,828,30.6705
+64,829,27.0298333333333
+64,830,27.2838333333333
+64,831,33.1681666666667
+64,832,25.908
+64,833,29.972
+64,834,36.8723333333333
+64,835,29.0195
+64,836,28.8713333333333
+64,837,23.4315
+64,838,30.2471666666667
+64,839,32.1945
+64,840,30.9033333333333
+64,841,32.7236666666667
+64,842,32.0251666666667
+64,843,29.7603333333333
+64,844,34.544
+64,845,31.3266666666667
+64,846,28.448
+64,847,28.6173333333333
+64,848,32.0886666666667
+64,849,26.4583333333333
+64,850,25.6116666666667
+64,851,32.4061666666667
+64,852,26.7335
+64,853,23.495
+64,854,26.797
+64,855,28.5538333333333
+64,856,25.8868333333333
+64,857,30.0778333333333
+64,858,29.9508333333333
+64,859,28.0881666666667
+64,860,27.9823333333333
+64,861,31.369
+64,862,29.7391666666667
+64,863,32.385
+64,864,32.8083333333333
+64,865,28.702
+64,866,23.4738333333333
+64,867,30.6281666666667
+64,868,25.7175
+64,869,26.2043333333333
+64,870,29.0406666666667
+64,871,25.8021666666667
+64,872,33.7396666666667
+64,873,29.0406666666667
+64,874,26.4795
+64,875,27.0298333333333
+64,876,32.512
+64,877,25.4211666666667
+64,878,25.6751666666667
+64,879,25.4635
+64,880,32.2791666666667
+64,881,29.7391666666667
+64,882,25.5058333333333
+64,883,34.4381666666667
+64,884,30.0566666666667
+64,885,25.8233333333333
+64,886,30.3953333333333
+64,887,32.6601666666667
+64,888,25.0613333333333
+64,889,28.2786666666667
+64,890,34.2053333333333
+64,891,23.6008333333333
+64,892,25.7598333333333
+64,893,29.9085
+64,894,19.177
+64,895,27.3261666666667
+64,896,28.8501666666667
+64,897,29.0618333333333
+64,898,28.6808333333333
+64,899,30.3318333333333
+64,900,31.2208333333333
+64,901,26.9663333333333
+64,902,22.0345
+64,903,23.9183333333333
+64,904,22.0133333333333
+64,905,35.6235
+64,906,21.0608333333333
+64,907,26.8181666666667
+64,908,31.8981666666667
+64,909,28.7866666666667
+64,910,23.8548333333333
+64,911,30.5435
+64,912,31.1785
+64,913,30.2471666666667
+64,914,28.702
+64,915,25.3365
+64,916,26.4795
+64,917,25.1036666666667
+64,918,25.6751666666667
+64,919,26.0561666666667
+64,920,36.1315
+64,921,28.1516666666667
+64,922,25.2306666666667
+64,923,30.9245
+64,924,26.2466666666667
+64,925,34.417
+64,926,19.4945
+64,927,28.448
+64,928,32.5966666666667
+64,929,30.8821666666667
+64,930,27.2626666666667
+64,931,28.6808333333333
+64,932,29.6968333333333
+64,933,26.67
+64,934,29.1465
+64,935,29.4428333333333
+64,936,30.8398333333333
+64,937,33.8455
+64,938,33.0623333333333
+64,939,36.195
+64,940,24.4263333333333
+64,941,29.7603333333333
+64,942,30.48
+64,943,31.5171666666667
+64,944,34.4381666666667
+64,945,28.3633333333333
+64,946,30.2895
+64,947,26.924
+64,948,24.003
+64,949,32.766
+64,950,28.4268333333333
+64,951,26.9875
+64,952,24.4475
+64,953,26.5006666666667
+64,954,29.4005
+64,955,32.4273333333333
+64,956,21.9921666666667
+64,957,29.6121666666667
+64,958,30.0778333333333
+64,959,21.6323333333333
+64,960,25.4
+64,961,27.1145
+64,962,30.6281666666667
+64,963,29.6756666666667
+64,964,27.5378333333333
+64,965,36.0256666666667
+64,966,19.558
+64,967,24.2781666666667
+64,968,41.4231666666667
+64,969,26.5006666666667
+64,970,29.6121666666667
+64,971,32.5755
+64,972,26.4371666666667
+64,973,20.3623333333333
+64,974,22.5848333333333
+64,975,28.9983333333333
+64,976,22.1191666666667
+64,977,26.5641666666667
+64,978,34.7768333333333
+64,979,27.0933333333333
+64,980,31.4536666666667
+64,981,27.94
+64,982,29.5486666666667
+64,983,28.6385
+64,984,32.1945
+64,985,26.4371666666667
+64,986,31.369
+64,987,29.337
+64,988,36.4913333333333
+64,989,25.4211666666667
+64,990,27.6225
+64,991,32.639
+64,992,37.9518333333333
+64,993,31.4113333333333
+64,994,26.2255
+64,995,34.8403333333333
+64,996,31.1996666666667
+64,997,27.7283333333333
+64,998,33.9725
+64,999,31.6018333333333
+64,1000,19.4521666666667
+65,1,30.0566666666667
+65,2,28.0881666666667
+65,3,21.3783333333333
+65,4,22.225
+65,5,29.1465
+65,6,24.9555
+65,7,22.7965
+65,8,28.6808333333333
+65,9,21.4418333333333
+65,10,21.463
+65,11,24.7015
+65,12,30.5646666666667
+65,13,26.0773333333333
+65,14,32.0675
+65,15,24.8073333333333
+65,16,27.1568333333333
+65,17,24.1935
+65,18,27.3261666666667
+65,19,22.8388333333333
+65,20,26.1196666666667
+65,21,28.9771666666667
+65,22,25.3365
+65,23,20.3835
+65,24,22.6483333333333
+65,25,24.4475
+65,26,24.1935
+65,27,28.8078333333333
+65,28,24.9978333333333
+65,29,23.9818333333333
+65,30,24.5321666666667
+65,31,22.3731666666667
+65,32,24.638
+65,33,26.0985
+65,34,29.0406666666667
+65,35,28.8713333333333
+65,36,27.9611666666667
+65,37,22.4366666666667
+65,38,24.638
+65,39,28.8501666666667
+65,40,25.019
+65,41,22.86
+65,42,24.638
+65,43,28.5115
+65,44,25.0825
+65,45,25.4211666666667
+65,46,27.3473333333333
+65,47,18.0551666666667
+65,48,24.8708333333333
+65,49,23.5796666666667
+65,50,26.2466666666667
+65,51,19.5156666666667
+65,52,32.004
+65,53,20.4258333333333
+65,54,28.575
+65,55,26.8181666666667
+65,56,21.5476666666667
+65,57,27.4531666666667
+65,58,24.1088333333333
+65,59,19.2405
+65,60,19.1346666666667
+65,61,26.5006666666667
+65,62,25.6963333333333
+65,63,25.4211666666667
+65,64,19.0288333333333
+65,65,27.6013333333333
+65,66,28.4056666666667
+65,67,22.6906666666667
+65,68,28.067
+65,69,22.4578333333333
+65,70,22.5848333333333
+65,71,30.861
+65,72,32.131
+65,73,23.495
+65,74,23.6643333333333
+65,75,25.7386666666667
+65,76,17.5048333333333
+65,77,25.654
+65,78,22.8176666666667
+65,79,26.797
+65,80,24.892
+65,81,23.3256666666667
+65,82,27.7918333333333
+65,83,24.6803333333333
+65,84,19.0711666666667
+65,85,33.02
+65,86,23.6855
+65,87,32.1521666666667
+65,88,29.591
+65,89,22.7965
+65,90,28.1516666666667
+65,91,22.098
+65,92,28.7231666666667
+65,93,26.0985
+65,94,21.6111666666667
+65,95,29.9296666666667
+65,96,32.6813333333333
+65,97,28.067
+65,98,22.4578333333333
+65,99,22.5213333333333
+65,100,24.9555
+65,101,24.2993333333333
+65,102,32.6178333333333
+65,103,25.0401666666667
+65,104,27.051
+65,105,24.1935
+65,106,20.3411666666667
+65,107,26.2678333333333
+65,108,23.0716666666667
+65,109,27.1568333333333
+65,110,22.2038333333333
+65,111,21.4418333333333
+65,112,24.3416666666667
+65,113,20.7221666666667
+65,114,27.051
+65,115,22.2885
+65,116,29.1253333333333
+65,117,22.4578333333333
+65,118,30.0566666666667
+65,119,28.0035
+65,120,28.1728333333333
+65,121,28.2363333333333
+65,122,33.8243333333333
+65,123,21.1455
+65,124,30.3318333333333
+65,125,22.2038333333333
+65,126,20.8491666666667
+65,127,23.5161666666667
+65,128,24.1511666666667
+65,129,21.5688333333333
+65,130,22.0556666666667
+65,131,22.987
+65,132,26.035
+65,133,28.5115
+65,134,38.1
+65,135,28.7231666666667
+65,136,27.6013333333333
+65,137,24.1088333333333
+65,138,22.3096666666667
+65,139,27.1356666666667
+65,140,22.5636666666667
+65,141,25.3576666666667
+65,142,30.5646666666667
+65,143,27.3896666666667
+65,144,28.6385
+65,145,16.0655
+65,146,26.2043333333333
+65,147,32.5966666666667
+65,148,30.3741666666667
+65,149,24.638
+65,150,28.5326666666667
+65,151,30.3106666666667
+65,152,24.2358333333333
+65,153,26.797
+65,154,25.5693333333333
+65,155,27.94
+65,156,21.6746666666667
+65,157,30.099
+65,158,27.0721666666667
+65,159,24.7861666666667
+65,160,38.735
+65,161,28.067
+65,162,28.9348333333333
+65,163,30.3318333333333
+65,164,22.4155
+65,165,27.5166666666667
+65,166,23.1986666666667
+65,167,30.8821666666667
+65,168,31.7288333333333
+65,169,32.639
+65,170,21.6958333333333
+65,171,25.527
+65,172,29.3581666666667
+65,173,26.162
+65,174,24.4686666666667
+65,175,27.0721666666667
+65,176,21.6958333333333
+65,177,29.1676666666667
+65,178,22.0133333333333
+65,179,23.4738333333333
+65,180,25.019
+65,181,22.6271666666667
+65,182,26.8393333333333
+65,183,30.4376666666667
+65,184,30.3106666666667
+65,185,20.574
+65,186,25.8445
+65,187,26.6276666666667
+65,188,18.7113333333333
+65,189,19.6003333333333
+65,190,25.4211666666667
+65,191,30.1836666666667
+65,192,29.972
+65,193,24.892
+65,194,21.8863333333333
+65,195,26.7123333333333
+65,196,25.6116666666667
+65,197,26.3525
+65,198,29.845
+65,199,30.1836666666667
+65,200,24.4051666666667
+65,201,25.019
+65,202,27.5801666666667
+65,203,23.876
+65,204,24.1511666666667
+65,205,27.0933333333333
+65,206,28.6808333333333
+65,207,31.7288333333333
+65,208,20.6798333333333
+65,209,27.9188333333333
+65,210,24.1723333333333
+65,211,28.2786666666667
+65,212,24.4263333333333
+65,213,24.2781666666667
+65,214,26.0138333333333
+65,215,24.7015
+65,216,23.6008333333333
+65,217,25.7386666666667
+65,218,27.686
+65,219,28.9983333333333
+65,220,24.6803333333333
+65,221,27.3685
+65,222,19.8331666666667
+65,223,24.4475
+65,224,29.6756666666667
+65,225,26.2678333333333
+65,226,24.9766666666667
+65,227,26.2255
+65,228,29.9931666666667
+65,229,26.3101666666667
+65,230,23.9606666666667
+65,231,26.7123333333333
+65,232,22.1403333333333
+65,233,25.6328333333333
+65,234,28.1093333333333
+65,235,22.0133333333333
+65,236,29.3581666666667
+65,237,27.7283333333333
+65,238,23.1775
+65,239,29.337
+65,240,25.3576666666667
+65,241,22.86
+65,242,20.4046666666667
+65,243,29.1676666666667
+65,244,25.7175
+65,245,33.7396666666667
+65,246,21.8863333333333
+65,247,32.7448333333333
+65,248,24.5321666666667
+65,249,24.13
+65,250,20.2565
+65,251,24.4263333333333
+65,252,22.225
+65,253,19.939
+65,254,25.8233333333333
+65,255,25.9503333333333
+65,256,21.7381666666667
+65,257,20.701
+65,258,26.1196666666667
+65,259,25.908
+65,260,24.5533333333333
+65,261,26.9451666666667
+65,262,20.5105
+65,263,28.8078333333333
+65,264,25.4846666666667
+65,265,19.3675
+65,266,20.4046666666667
+65,267,31.496
+65,268,28.575
+65,269,24.511
+65,270,24.4475
+65,271,27.0933333333333
+65,272,24.6803333333333
+65,273,26.8181666666667
+65,274,28.2786666666667
+65,275,36.8088333333333
+65,276,23.3468333333333
+65,277,24.7226666666667
+65,278,29.5698333333333
+65,279,25.0613333333333
+65,280,30.0778333333333
+65,281,27.6648333333333
+65,282,24.3416666666667
+65,283,28.0246666666667
+65,284,23.9818333333333
+65,285,24.4686666666667
+65,286,31.369
+65,287,23.9818333333333
+65,288,24.3628333333333
+65,289,21.5688333333333
+65,290,24.7438333333333
+65,291,25.1036666666667
+65,292,29.0618333333333
+65,293,26.7758333333333
+65,294,22.2461666666667
+65,295,23.1563333333333
+65,296,27.5801666666667
+65,297,27.686
+65,298,21.8016666666667
+65,299,29.4216666666667
+65,300,21.2301666666667
+65,301,21.6746666666667
+65,302,24.1511666666667
+65,303,28.5326666666667
+65,304,30.2048333333333
+65,305,25.0401666666667
+65,306,29.8238333333333
+65,307,24.8285
+65,308,24.4475
+65,309,17.2296666666667
+65,310,24.2358333333333
+65,311,17.6741666666667
+65,312,17.8858333333333
+65,313,23.3045
+65,314,26.0561666666667
+65,315,25.1036666666667
+65,316,25.4423333333333
+65,317,23.9606666666667
+65,318,24.1511666666667
+65,319,24.003
+65,320,23.9818333333333
+65,321,25.5693333333333
+65,322,26.8393333333333
+65,323,21.7805
+65,324,28.3845
+65,325,25.0613333333333
+65,326,25.8656666666667
+65,327,27.4743333333333
+65,328,33.7396666666667
+65,329,25.527
+65,330,18.6266666666667
+65,331,23.8336666666667
+65,332,18.7113333333333
+65,333,26.9663333333333
+65,334,27.7283333333333
+65,335,30.3318333333333
+65,336,31.3478333333333
+65,337,23.6855
+65,338,22.3943333333333
+65,339,23.5796666666667
+65,340,24.6803333333333
+65,341,24.765
+65,342,26.3525
+65,343,23.9395
+65,344,29.8026666666667
+65,345,27.2203333333333
+65,346,29.1041666666667
+65,347,27.7706666666667
+65,348,30.9245
+65,349,20.701
+65,350,24.9343333333333
+65,351,25.3576666666667
+65,352,22.3096666666667
+65,353,20.9338333333333
+65,354,19.9178333333333
+65,355,25.1883333333333
+65,356,21.0185
+65,357,22.0133333333333
+65,358,29.3793333333333
+65,359,24.4475
+65,360,28.2151666666667
+65,361,16.764
+65,362,21.2301666666667
+65,363,28.2998333333333
+65,364,26.797
+65,365,23.0716666666667
+65,366,19.939
+65,367,21.2513333333333
+65,368,23.6855
+65,369,22.3096666666667
+65,370,22.6271666666667
+65,371,29.1041666666667
+65,372,32.5966666666667
+65,373,22.3096666666667
+65,374,22.86
+65,375,22.7965
+65,376,25.6328333333333
+65,377,24.13
+65,378,23.5161666666667
+65,379,22.2673333333333
+65,380,22.0133333333333
+65,381,27.1356666666667
+65,382,23.9183333333333
+65,383,23.114
+65,384,20.0236666666667
+65,385,20.955
+65,386,22.0345
+65,387,24.0876666666667
+65,388,24.4686666666667
+65,389,25.7386666666667
+65,390,20.3835
+65,391,24.7438333333333
+65,392,28.0246666666667
+65,393,25.7386666666667
+65,394,27.7918333333333
+65,395,23.2198333333333
+65,396,28.6385
+65,397,21.6323333333333
+65,398,24.2358333333333
+65,399,22.8388333333333
+65,400,22.6483333333333
+65,401,28.9136666666667
+65,402,25.781
+65,403,19.558
+65,404,30.099
+65,405,33.3375
+65,406,24.0665
+65,407,24.3628333333333
+65,408,16.637
+65,409,27.7283333333333
+65,410,30.099
+65,411,25.1036666666667
+65,412,18.5843333333333
+65,413,23.3045
+65,414,22.0556666666667
+65,415,27.3261666666667
+65,416,28.7655
+65,417,30.988
+65,418,23.114
+65,419,27.8765
+65,420,33.5703333333333
+65,421,21.209
+65,422,25.5693333333333
+65,423,28.1516666666667
+65,424,21.8651666666667
+65,425,24.4051666666667
+65,426,22.3308333333333
+65,427,35.8351666666667
+65,428,23.9606666666667
+65,429,25.7175
+65,430,27.6436666666667
+65,431,25.0825
+65,432,32.4908333333333
+65,433,29.6968333333333
+65,434,20.2565
+65,435,24.7861666666667
+65,436,26.5218333333333
+65,437,25.8021666666667
+65,438,25.908
+65,439,25.0613333333333
+65,440,27.4531666666667
+65,441,24.1511666666667
+65,442,27.7071666666667
+65,443,30.5011666666667
+65,444,21.6746666666667
+65,445,23.1563333333333
+65,446,31.3055
+65,447,27.0721666666667
+65,448,29.0195
+65,449,28.2998333333333
+65,450,20.6586666666667
+65,451,29.5486666666667
+65,452,32.766
+65,453,18.6055
+65,454,33.9301666666667
+65,455,35.5176666666667
+65,456,23.7701666666667
+65,457,26.3313333333333
+65,458,24.765
+65,459,20.1295
+65,460,25.8656666666667
+65,461,27.7495
+65,462,27.0721666666667
+65,463,31.5806666666667
+65,464,21.5476666666667
+65,465,21.0185
+65,466,19.9601666666667
+65,467,26.9451666666667
+65,468,28.9771666666667
+65,469,21.1031666666667
+65,470,17.1238333333333
+65,471,24.4475
+65,472,25.4
+65,473,19.4521666666667
+65,474,29.6333333333333
+65,475,31.2843333333333
+65,476,32.0675
+65,477,23.7066666666667
+65,478,30.5646666666667
+65,479,24.0241666666667
+65,480,29.337
+65,481,26.0138333333333
+65,482,29.0618333333333
+65,483,23.8125
+65,484,26.8393333333333
+65,485,24.9131666666667
+65,486,29.8026666666667
+65,487,23.3468333333333
+65,488,24.1935
+65,489,19.6215
+65,490,20.9761666666667
+65,491,25.7598333333333
+65,492,32.893
+65,493,25.7386666666667
+65,494,30.4376666666667
+65,495,29.2523333333333
+65,496,30.4376666666667
+65,497,26.4371666666667
+65,498,23.622
+65,499,34.2053333333333
+65,500,25.4846666666667
+65,501,25.8445
+65,502,24.0453333333333
+65,503,25.9503333333333
+65,504,25.3788333333333
+65,505,21.717
+65,506,23.6431666666667
+65,507,19.7485
+65,508,24.7861666666667
+65,509,30.7763333333333
+65,510,25.7598333333333
+65,511,25.2518333333333
+65,512,30.9668333333333
+65,513,27.4108333333333
+65,514,23.0928333333333
+65,515,27.4108333333333
+65,516,22.733
+65,517,26.1196666666667
+65,518,25.9503333333333
+65,519,25.2941666666667
+65,520,28.5326666666667
+65,521,27.6436666666667
+65,522,20.9973333333333
+65,523,24.2993333333333
+65,524,23.7278333333333
+65,525,19.685
+65,526,23.0081666666667
+65,527,27.1568333333333
+65,528,25.6963333333333
+65,529,21.3571666666667
+65,530,24.2146666666667
+65,531,22.6483333333333
+65,532,23.0081666666667
+65,533,25.654
+65,534,24.5321666666667
+65,535,27.6225
+65,536,23.0505
+65,537,26.4371666666667
+65,538,23.9183333333333
+65,539,24.9978333333333
+65,540,29.9508333333333
+65,541,28.0035
+65,542,22.606
+65,543,27.2626666666667
+65,544,28.0458333333333
+65,545,29.8026666666667
+65,546,31.0091666666667
+65,547,32.1733333333333
+65,548,19.3675
+65,549,28.2786666666667
+65,550,27.6225
+65,551,25.9926666666667
+65,552,21.4418333333333
+65,553,21.9286666666667
+65,554,21.971
+65,555,24.5956666666667
+65,556,26.9875
+65,557,33.655
+65,558,24.5745
+65,559,25.9503333333333
+65,560,30.1625
+65,561,20.8068333333333
+65,562,25.0613333333333
+65,563,24.5533333333333
+65,564,27.7495
+65,565,28.0881666666667
+65,566,22.5213333333333
+65,567,20.6375
+65,568,25.4423333333333
+65,569,21.7381666666667
+65,570,28.4268333333333
+65,571,29.0406666666667
+65,572,29.718
+65,573,28.4268333333333
+65,574,20.9973333333333
+65,575,21.4841666666667
+65,576,24.4898333333333
+65,577,26.4583333333333
+65,578,22.733
+65,579,20.574
+65,580,20.9126666666667
+65,581,19.558
+65,582,19.3886666666667
+65,583,24.3628333333333
+65,584,24.9766666666667
+65,585,24.5745
+65,586,31.5383333333333
+65,587,23.622
+65,588,25.3153333333333
+65,589,30.353
+65,590,21.9075
+65,591,21.6746666666667
+65,592,24.2993333333333
+65,593,33.3798333333333
+65,594,34.5863333333333
+65,595,30.8821666666667
+65,596,26.5641666666667
+65,597,27.7706666666667
+65,598,27.4531666666667
+65,599,28.2575
+65,600,22.7753333333333
+65,601,18.2456666666667
+65,602,27.559
+65,603,22.4155
+65,604,31.4325
+65,605,22.5001666666667
+65,606,26.1831666666667
+65,607,26.7758333333333
+65,608,23.749
+65,609,24.384
+65,610,24.8708333333333
+65,611,33.9513333333333
+65,612,24.9343333333333
+65,613,25.4211666666667
+65,614,34.036
+65,615,26.6065
+65,616,29.1676666666667
+65,617,27.305
+65,618,23.3045
+65,619,28.829
+65,620,36.5336666666667
+65,621,40.2801666666667
+65,622,31.75
+65,623,22.9658333333333
+65,624,27.6436666666667
+65,625,27.7283333333333
+65,626,21.8651666666667
+65,627,25.2095
+65,628,30.9456666666667
+65,629,33.1893333333333
+65,630,29.2946666666667
+65,631,17.4625
+65,632,24.6168333333333
+65,633,23.1351666666667
+65,634,18.9865
+65,635,27.4955
+65,636,24.2358333333333
+65,637,26.9875
+65,638,24.9766666666667
+65,639,28.2151666666667
+65,640,26.6065
+65,641,21.1031666666667
+65,642,25.1671666666667
+65,643,24.2993333333333
+65,644,17.2085
+65,645,24.13
+65,646,31.6653333333333
+65,647,28.067
+65,648,30.48
+65,649,20.4258333333333
+65,650,18.4573333333333
+65,651,22.1191666666667
+65,652,27.3473333333333
+65,653,28.0881666666667
+65,654,29.1253333333333
+65,655,25.1248333333333
+65,656,23.4526666666667
+65,657,23.0293333333333
+65,658,25.781
+65,659,30.2471666666667
+65,660,30.3106666666667
+65,661,19.7696666666667
+65,662,26.289
+65,663,27.0086666666667
+65,664,22.6906666666667
+65,665,27.4531666666667
+65,666,24.4475
+65,667,24.9766666666667
+65,668,23.8336666666667
+65,669,17.272
+65,670,22.6483333333333
+65,671,35.3483333333333
+65,672,23.6431666666667
+65,673,26.543
+65,674,29.3581666666667
+65,675,22.1191666666667
+65,676,28.1728333333333
+65,677,28.0881666666667
+65,678,22.4578333333333
+65,679,27.5801666666667
+65,680,21.8228333333333
+65,681,28.3845
+65,682,23.0293333333333
+65,683,19.3251666666667
+65,684,24.6168333333333
+65,685,27.7283333333333
+65,686,24.9978333333333
+65,687,26.9028333333333
+65,688,31.0726666666667
+65,689,17.8223333333333
+65,690,21.1031666666667
+65,691,28.9136666666667
+65,692,35.3695
+65,693,29.9085
+65,694,32.9353333333333
+65,695,24.4263333333333
+65,696,20.6798333333333
+65,697,21.4206666666667
+65,698,28.9136666666667
+65,699,22.9235
+65,700,25.6328333333333
+65,701,18.3938333333333
+65,702,26.2678333333333
+65,703,25.3788333333333
+65,704,30.226
+65,705,18.0975
+65,706,26.5218333333333
+65,707,23.9606666666667
+65,708,26.8816666666667
+65,709,24.5321666666667
+65,710,27.6436666666667
+65,711,26.543
+65,712,27.8765
+65,713,26.5218333333333
+65,714,28.0881666666667
+65,715,21.3148333333333
+65,716,28.8925
+65,717,26.2678333333333
+65,718,22.479
+65,719,28.7443333333333
+65,720,21.5265
+65,721,26.3101666666667
+65,722,26.3525
+65,723,23.0081666666667
+65,724,20.3835
+65,725,28.5326666666667
+65,726,20.7645
+65,727,25.2306666666667
+65,728,26.3525
+65,729,28.6173333333333
+65,730,27.3261666666667
+65,731,29.1676666666667
+65,732,18.796
+65,733,29.2946666666667
+65,734,21.463
+65,735,23.114
+65,736,28.7231666666667
+65,737,26.7123333333333
+65,738,25.5693333333333
+65,739,19.9178333333333
+65,740,26.6276666666667
+65,741,26.543
+65,742,29.5063333333333
+65,743,27.8553333333333
+65,744,24.9343333333333
+65,745,20.9126666666667
+65,746,29.4428333333333
+65,747,26.1196666666667
+65,748,30.9245
+65,749,24.9343333333333
+65,750,24.3628333333333
+65,751,21.2513333333333
+65,752,25.5905
+65,753,22.352
+65,754,32.2156666666667
+65,755,26.9451666666667
+65,756,23.7701666666667
+65,757,23.3256666666667
+65,758,26.4371666666667
+65,759,29.0406666666667
+65,760,28.4268333333333
+65,761,23.4738333333333
+65,762,27.178
+65,763,27.178
+65,764,23.3468333333333
+65,765,21.844
+65,766,19.8331666666667
+65,767,24.2358333333333
+65,768,28.8925
+65,769,19.3463333333333
+65,770,25.1671666666667
+65,771,32.1098333333333
+65,772,22.5001666666667
+65,773,30.3741666666667
+65,774,28.448
+65,775,24.7861666666667
+65,776,23.5161666666667
+65,777,21.2936666666667
+65,778,23.2198333333333
+65,779,22.4155
+65,780,14.1605
+65,781,21.4418333333333
+65,782,25.8868333333333
+65,783,24.5321666666667
+65,784,24.8285
+65,785,25.7175
+65,786,19.4521666666667
+65,787,29.4216666666667
+65,788,24.2358333333333
+65,789,19.8543333333333
+65,790,27.5166666666667
+65,791,22.9658333333333
+65,792,27.0086666666667
+65,793,35.3906666666667
+65,794,31.8981666666667
+65,795,34.7768333333333
+65,796,30.5646666666667
+65,797,32.3426666666667
+65,798,27.432
+65,799,25.8445
+65,800,30.8821666666667
+65,801,24.1088333333333
+65,802,22.6695
+65,803,25.5905
+65,804,24.0241666666667
+65,805,22.5213333333333
+65,806,24.4475
+65,807,25.3365
+65,808,28.1728333333333
+65,809,24.257
+65,810,20.7433333333333
+65,811,29.2311666666667
+65,812,25.019
+65,813,20.9338333333333
+65,814,19.7485
+65,815,26.7546666666667
+65,816,27.1356666666667
+65,817,27.9188333333333
+65,818,24.892
+65,819,27.2838333333333
+65,820,25.781
+65,821,28.067
+65,822,27.2203333333333
+65,823,28.9348333333333
+65,824,19.6215
+65,825,23.1351666666667
+65,826,29.7391666666667
+65,827,21.9286666666667
+65,828,24.003
+65,829,24.0876666666667
+65,830,21.463
+65,831,27.8341666666667
+65,832,28.5538333333333
+65,833,26.6065
+65,834,30.4588333333333
+65,835,24.2993333333333
+65,836,27.1145
+65,837,25.8021666666667
+65,838,25.0401666666667
+65,839,36.2796666666667
+65,840,25.3576666666667
+65,841,23.114
+65,842,34.29
+65,843,19.7485
+65,844,30.2471666666667
+65,845,23.6431666666667
+65,846,25.7175
+65,847,22.7965
+65,848,25.8021666666667
+65,849,25.527
+65,850,28.4268333333333
+65,851,24.7015
+65,852,28.4691666666667
+65,853,34.8403333333333
+65,854,26.5218333333333
+65,855,25.0613333333333
+65,856,26.3313333333333
+65,857,28.6808333333333
+65,858,24.4686666666667
+65,859,25.8021666666667
+65,860,23.1351666666667
+65,861,26.0985
+65,862,27.4743333333333
+65,863,25.5058333333333
+65,864,33.528
+65,865,22.3943333333333
+65,866,26.035
+65,867,26.5853333333333
+65,868,23.0716666666667
+65,869,32.7025
+65,870,29.2946666666667
+65,871,27.9611666666667
+65,872,26.2466666666667
+65,873,23.0928333333333
+65,874,27.6013333333333
+65,875,33.147
+65,876,18.7325
+65,877,24.3628333333333
+65,878,26.9875
+65,879,22.7118333333333
+65,880,28.1093333333333
+65,881,27.8553333333333
+65,882,27.2415
+65,883,26.7546666666667
+65,884,24.4475
+65,885,27.94
+65,886,24.9555
+65,887,24.4898333333333
+65,888,30.353
+65,889,27.813
+65,890,29.4428333333333
+65,891,28.5961666666667
+65,892,27.2838333333333
+65,893,30.3318333333333
+65,894,20.6586666666667
+65,895,23.2621666666667
+65,896,33.2951666666667
+65,897,21.6111666666667
+65,898,23.6431666666667
+65,899,22.2885
+65,900,20.8703333333333
+65,901,25.654
+65,902,20.828
+65,903,24.8496666666667
+65,904,21.2936666666667
+65,905,21.5265
+65,906,34.417
+65,907,34.8403333333333
+65,908,23.4738333333333
+65,909,19.0288333333333
+65,910,20.0448333333333
+65,911,28.8078333333333
+65,912,34.5651666666667
+65,913,24.1935
+65,914,22.6483333333333
+65,915,23.749
+65,916,22.8388333333333
+65,917,19.2193333333333
+65,918,24.7226666666667
+65,919,26.5641666666667
+65,920,16.9545
+65,921,22.7753333333333
+65,922,28.8078333333333
+65,923,31.0726666666667
+65,924,19.1981666666667
+65,925,23.114
+65,926,24.4475
+65,927,21.6111666666667
+65,928,24.4898333333333
+65,929,23.4738333333333
+65,930,21.5688333333333
+65,931,27.5801666666667
+65,932,30.48
+65,933,24.5745
+65,934,31.9405
+65,935,30.607
+65,936,23.8548333333333
+65,937,25.2518333333333
+65,938,27.1145
+65,939,29.4005
+65,940,31.5171666666667
+65,941,28.3421666666667
+65,942,19.812
+65,943,27.0086666666667
+65,944,21.2725
+65,945,19.8755
+65,946,23.4738333333333
+65,947,20.2353333333333
+65,948,31.7711666666667
+65,949,26.8393333333333
+65,950,25.0613333333333
+65,951,29.337
+65,952,24.8496666666667
+65,953,23.8971666666667
+65,954,26.9663333333333
+65,955,21.59
+65,956,23.3891666666667
+65,957,29.1465
+65,958,25.1883333333333
+65,959,25.8868333333333
+65,960,28.702
+65,961,25.2518333333333
+65,962,20.0448333333333
+65,963,22.606
+65,964,26.8816666666667
+65,965,16.764
+65,966,24.5533333333333
+65,967,24.765
+65,968,29.5486666666667
+65,969,28.2575
+65,970,23.9183333333333
+65,971,22.098
+65,972,24.5745
+65,973,23.3045
+65,974,22.352
+65,975,34.2476666666667
+65,976,24.9555
+65,977,25.5693333333333
+65,978,28.5961666666667
+65,979,23.749
+65,980,27.9188333333333
+65,981,21.0608333333333
+65,982,27.8765
+65,983,24.384
+65,984,28.4268333333333
+65,985,23.7701666666667
+65,986,26.1831666666667
+65,987,20.4893333333333
+65,988,25.654
+65,989,23.7701666666667
+65,990,24.4898333333333
+65,991,24.8073333333333
+65,992,26.67
+65,993,29.4428333333333
+65,994,24.4475
+65,995,27.3685
+65,996,18.542
+65,997,28.829
+65,998,26.6276666666667
+65,999,24.7015
+65,1000,33.3798333333333
+66,1,23.495
+66,2,23.3256666666667
+66,3,27.4108333333333
+66,4,28.575
+66,5,25.2941666666667
+66,6,28.9983333333333
+66,7,30.2471666666667
+66,8,31.8981666666667
+66,9,23.8971666666667
+66,10,37.8036666666667
+66,11,31.7711666666667
+66,12,29.2946666666667
+66,13,25.6328333333333
+66,14,28.6596666666667
+66,15,20.4258333333333
+66,16,31.2208333333333
+66,17,33.6761666666667
+66,18,28.6173333333333
+66,19,31.8135
+66,20,31.5806666666667
+66,21,25.3153333333333
+66,22,19.431
+66,23,32.3426666666667
+66,24,23.8336666666667
+66,25,29.337
+66,26,28.1305
+66,27,27.2203333333333
+66,28,27.5378333333333
+66,29,29.3793333333333
+66,30,24.9343333333333
+66,31,23.7701666666667
+66,32,20.066
+66,33,30.7128333333333
+66,34,24.257
+66,35,19.4733333333333
+66,36,29.6121666666667
+66,37,27.7495
+66,38,26.3736666666667
+66,39,24.4686666666667
+66,40,27.4955
+66,41,27.3261666666667
+66,42,27.5166666666667
+66,43,26.1408333333333
+66,44,27.94
+66,45,20.8491666666667
+66,46,27.4531666666667
+66,47,30.9456666666667
+66,48,28.1728333333333
+66,49,23.7278333333333
+66,50,37.0628333333333
+66,51,28.6385
+66,52,21.5688333333333
+66,53,23.0505
+66,54,23.5373333333333
+66,55,19.7908333333333
+66,56,24.8073333333333
+66,57,26.0773333333333
+66,58,27.559
+66,59,25.9503333333333
+66,60,26.7758333333333
+66,61,33.5068333333333
+66,62,22.225
+66,63,23.6643333333333
+66,64,21.1878333333333
+66,65,32.8295
+66,66,22.5001666666667
+66,67,26.6276666666667
+66,68,27.0721666666667
+66,69,26.8605
+66,70,24.765
+66,71,27.6225
+66,72,26.2255
+66,73,23.7278333333333
+66,74,21.8016666666667
+66,75,31.9828333333333
+66,76,27.7706666666667
+66,77,31.9193333333333
+66,78,24.2146666666667
+66,79,31.9405
+66,80,23.9395
+66,81,26.3736666666667
+66,82,18.6266666666667
+66,83,25.4635
+66,84,24.8073333333333
+66,85,21.6111666666667
+66,86,18.8806666666667
+66,87,28.2151666666667
+66,88,22.5213333333333
+66,89,22.6483333333333
+66,90,31.9405
+66,91,27.3473333333333
+66,92,25.0825
+66,93,24.2146666666667
+66,94,25.4635
+66,95,24.5321666666667
+66,96,26.0773333333333
+66,97,28.7866666666667
+66,98,32.1521666666667
+66,99,29.6333333333333
+66,100,23.7066666666667
+66,101,28.4268333333333
+66,102,26.289
+66,103,26.8393333333333
+66,104,25.8021666666667
+66,105,26.2678333333333
+66,106,25.2941666666667
+66,107,26.4583333333333
+66,108,22.8811666666667
+66,109,19.3251666666667
+66,110,21.6746666666667
+66,111,27.6436666666667
+66,112,28.8501666666667
+66,113,27.7071666666667
+66,114,27.051
+66,115,18.2456666666667
+66,116,27.7706666666667
+66,117,22.2673333333333
+66,118,27.9823333333333
+66,119,24.4051666666667
+66,120,32.0251666666667
+66,121,23.9818333333333
+66,122,24.0453333333333
+66,123,33.8666666666667
+66,124,30.8821666666667
+66,125,30.8186666666667
+66,126,22.1191666666667
+66,127,27.1145
+66,128,20.5528333333333
+66,129,27.2838333333333
+66,130,23.0716666666667
+66,131,29.5698333333333
+66,132,31.3055
+66,133,27.686
+66,134,28.702
+66,135,23.2198333333333
+66,136,27.7283333333333
+66,137,33.2528333333333
+66,138,31.1573333333333
+66,139,28.0035
+66,140,30.353
+66,141,22.2673333333333
+66,142,21.8016666666667
+66,143,28.9983333333333
+66,144,22.0345
+66,145,30.3106666666667
+66,146,24.2358333333333
+66,147,31.0091666666667
+66,148,24.0241666666667
+66,149,22.2038333333333
+66,150,21.8016666666667
+66,151,24.6803333333333
+66,152,27.0721666666667
+66,153,26.035
+66,154,26.9663333333333
+66,155,28.4691666666667
+66,156,25.7386666666667
+66,157,25.8656666666667
+66,158,31.877
+66,159,20.8703333333333
+66,160,29.2735
+66,161,23.0716666666667
+66,162,26.3948333333333
+66,163,22.6483333333333
+66,164,22.225
+66,165,30.9456666666667
+66,166,24.4686666666667
+66,167,22.8811666666667
+66,168,26.2255
+66,169,18.4996666666667
+66,170,27.2838333333333
+66,171,30.5011666666667
+66,172,26.6911666666667
+66,173,28.7866666666667
+66,174,27.3896666666667
+66,175,28.067
+66,176,29.9085
+66,177,28.956
+66,178,28.3421666666667
+66,179,33.6126666666667
+66,180,17.2931666666667
+66,181,25.6116666666667
+66,182,31.496
+66,183,27.2838333333333
+66,184,25.781
+66,185,27.0086666666667
+66,186,24.3205
+66,187,29.7391666666667
+66,188,30.7128333333333
+66,189,29.0195
+66,190,24.0241666666667
+66,191,28.8713333333333
+66,192,23.6431666666667
+66,193,24.3205
+66,194,22.6695
+66,195,19.0711666666667
+66,196,24.511
+66,197,30.4165
+66,198,29.5698333333333
+66,199,25.8868333333333
+66,200,24.4898333333333
+66,201,32.9988333333333
+66,202,29.4005
+66,203,28.2151666666667
+66,204,20.0871666666667
+66,205,25.2941666666667
+66,206,20.955
+66,207,25.5058333333333
+66,208,25.0613333333333
+66,209,22.1403333333333
+66,210,20.2141666666667
+66,211,28.2363333333333
+66,212,21.1878333333333
+66,213,26.3313333333333
+66,214,23.5161666666667
+66,215,24.7438333333333
+66,216,24.7015
+66,217,23.9818333333333
+66,218,23.6431666666667
+66,219,23.7701666666667
+66,220,28.6385
+66,221,31.4113333333333
+66,222,22.7965
+66,223,24.6168333333333
+66,224,31.4113333333333
+66,225,26.1196666666667
+66,226,22.1615
+66,227,23.622
+66,228,27.8976666666667
+66,229,29.8661666666667
+66,230,28.0035
+66,231,35.3271666666667
+66,232,29.2735
+66,233,23.114
+66,234,31.5806666666667
+66,235,22.9235
+66,236,28.2363333333333
+66,237,25.146
+66,238,25.5905
+66,239,25.4635
+66,240,23.495
+66,241,32.9565
+66,242,23.8548333333333
+66,243,21.4206666666667
+66,244,25.9503333333333
+66,245,29.9085
+66,246,26.0985
+66,247,16.383
+66,248,25.4846666666667
+66,249,23.8336666666667
+66,250,27.051
+66,251,26.162
+66,252,26.7758333333333
+66,253,24.7861666666667
+66,254,26.0985
+66,255,28.9348333333333
+66,256,26.3736666666667
+66,257,24.003
+66,258,30.1836666666667
+66,259,31.3055
+66,260,30.6705
+66,261,23.3045
+66,262,23.1775
+66,263,30.9668333333333
+66,264,20.574
+66,265,22.5001666666667
+66,266,33.782
+66,267,39.497
+66,268,30.9456666666667
+66,269,27.1991666666667
+66,270,25.0613333333333
+66,271,22.7965
+66,272,28.0035
+66,273,30.3741666666667
+66,274,26.7546666666667
+66,275,20.1718333333333
+66,276,20.6586666666667
+66,277,20.574
+66,278,27.051
+66,279,22.987
+66,280,30.6705
+66,281,31.75
+66,282,34.0783333333333
+66,283,33.401
+66,284,23.3045
+66,285,25.8233333333333
+66,286,25.0401666666667
+66,287,22.4366666666667
+66,288,25.527
+66,289,25.1036666666667
+66,290,20.5316666666667
+66,291,22.8811666666667
+66,292,29.5275
+66,293,21.2513333333333
+66,294,27.0933333333333
+66,295,26.7546666666667
+66,296,30.2683333333333
+66,297,23.114
+66,298,24.2781666666667
+66,299,25.4635
+66,300,27.1991666666667
+66,301,24.1088333333333
+66,302,22.86
+66,303,32.5755
+66,304,30.226
+66,305,26.2678333333333
+66,306,26.9663333333333
+66,307,22.987
+66,308,20.1718333333333
+66,309,25.908
+66,310,29.4428333333333
+66,311,26.9028333333333
+66,312,24.5956666666667
+66,313,23.3045
+66,314,31.9405
+66,315,28.2786666666667
+66,316,25.5058333333333
+66,317,26.8181666666667
+66,318,28.9136666666667
+66,319,24.1088333333333
+66,320,24.7015
+66,321,31.9616666666667
+66,322,32.7448333333333
+66,323,29.464
+66,324,30.861
+66,325,28.9136666666667
+66,326,21.2301666666667
+66,327,22.4155
+66,328,29.083
+66,329,24.9343333333333
+66,330,22.7541666666667
+66,331,30.3953333333333
+66,332,29.5063333333333
+66,333,26.0773333333333
+66,334,21.1455
+66,335,24.2993333333333
+66,336,22.9235
+66,337,25.0613333333333
+66,338,33.2316666666667
+66,339,26.4795
+66,340,24.511
+66,341,30.353
+66,342,21.1878333333333
+66,343,28.2363333333333
+66,344,23.8548333333333
+66,345,26.7758333333333
+66,346,23.2198333333333
+66,347,24.3416666666667
+66,348,29.0406666666667
+66,349,25.0825
+66,350,24.892
+66,351,31.9828333333333
+66,352,29.6121666666667
+66,353,19.7273333333333
+66,354,27.8976666666667
+66,355,32.5543333333333
+66,356,21.7805
+66,357,22.8176666666667
+66,358,29.1041666666667
+66,359,31.0303333333333
+66,360,25.4211666666667
+66,361,21.9921666666667
+66,362,23.368
+66,363,24.5745
+66,364,23.876
+66,365,31.8346666666667
+66,366,20.1718333333333
+66,367,29.2946666666667
+66,368,38.8408333333333
+66,369,27.6436666666667
+66,370,23.9183333333333
+66,371,29.9508333333333
+66,372,26.7758333333333
+66,373,21.7593333333333
+66,374,26.2678333333333
+66,375,33.6761666666667
+66,376,31.5806666666667
+66,377,21.209
+66,378,28.9983333333333
+66,379,30.1201666666667
+66,380,28.5326666666667
+66,381,27.813
+66,382,28.2575
+66,383,24.5745
+66,384,31.7076666666667
+66,385,19.8966666666667
+66,386,24.0876666666667
+66,387,27.8765
+66,388,18.8806666666667
+66,389,22.9235
+66,390,24.5956666666667
+66,391,28.4056666666667
+66,392,27.5378333333333
+66,393,24.6591666666667
+66,394,27.178
+66,395,24.4686666666667
+66,396,24.2781666666667
+66,397,26.3313333333333
+66,398,29.1888333333333
+66,399,26.0561666666667
+66,400,29.5698333333333
+66,401,25.3365
+66,402,26.5006666666667
+66,403,31.1573333333333
+66,404,19.9813333333333
+66,405,20.5528333333333
+66,406,24.5533333333333
+66,407,30.8186666666667
+66,408,26.9663333333333
+66,409,22.2885
+66,410,32.3003333333333
+66,411,23.1986666666667
+66,412,18.5843333333333
+66,413,31.115
+66,414,25.3153333333333
+66,415,23.7278333333333
+66,416,27.2203333333333
+66,417,32.3215
+66,418,27.3685
+66,419,23.6855
+66,420,27.6436666666667
+66,421,32.3215
+66,422,28.4903333333333
+66,423,24.5956666666667
+66,424,27.0933333333333
+66,425,25.4635
+66,426,23.1351666666667
+66,427,27.2626666666667
+66,428,29.4428333333333
+66,429,28.0458333333333
+66,430,23.4315
+66,431,31.7711666666667
+66,432,26.3313333333333
+66,433,23.0928333333333
+66,434,29.464
+66,435,32.1945
+66,436,26.0138333333333
+66,437,27.051
+66,438,26.8393333333333
+66,439,19.812
+66,440,24.1511666666667
+66,441,26.6911666666667
+66,442,26.5218333333333
+66,443,26.9875
+66,444,25.273
+66,445,23.1986666666667
+66,446,28.7655
+66,447,22.8388333333333
+66,448,27.3261666666667
+66,449,27.2838333333333
+66,450,24.4898333333333
+66,451,20.7856666666667
+66,452,27.6225
+66,453,24.1511666666667
+66,454,27.559
+66,455,23.1986666666667
+66,456,30.5435
+66,457,23.2198333333333
+66,458,22.987
+66,459,30.353
+66,460,29.21
+66,461,33.8243333333333
+66,462,26.162
+66,463,30.0355
+66,464,29.6968333333333
+66,465,24.6803333333333
+66,466,22.9658333333333
+66,467,22.479
+66,468,26.4795
+66,469,22.6483333333333
+66,470,18.1186666666667
+66,471,30.6493333333333
+66,472,25.2306666666667
+66,473,29.6333333333333
+66,474,18.9653333333333
+66,475,33.528
+66,476,24.3416666666667
+66,477,26.3525
+66,478,27.1356666666667
+66,479,31.3478333333333
+66,480,27.0086666666667
+66,481,29.1465
+66,482,24.5321666666667
+66,483,26.8181666666667
+66,484,23.6008333333333
+66,485,26.2466666666667
+66,486,31.1361666666667
+66,487,23.495
+66,488,29.972
+66,489,25.4
+66,490,30.1836666666667
+66,491,22.2461666666667
+66,492,25.8233333333333
+66,493,25.3788333333333
+66,494,25.6328333333333
+66,495,29.5486666666667
+66,496,29.2523333333333
+66,497,25.0825
+66,498,26.2043333333333
+66,499,25.0613333333333
+66,500,26.0138333333333
+66,501,18.923
+66,502,21.1031666666667
+66,503,31.3266666666667
+66,504,27.6013333333333
+66,505,24.1511666666667
+66,506,24.8285
+66,507,25.7386666666667
+66,508,25.3788333333333
+66,509,24.4686666666667
+66,510,26.8605
+66,511,23.5585
+66,512,27.8976666666667
+66,513,23.7913333333333
+66,514,25.5693333333333
+66,515,29.6756666666667
+66,516,30.1201666666667
+66,517,27.4743333333333
+66,518,28.6808333333333
+66,519,24.5533333333333
+66,520,26.6276666666667
+66,521,25.9715
+66,522,27.3261666666667
+66,523,31.7288333333333
+66,524,26.2466666666667
+66,525,27.8976666666667
+66,526,24.9555
+66,527,28.2151666666667
+66,528,27.5801666666667
+66,529,19.7908333333333
+66,530,26.8393333333333
+66,531,31.6653333333333
+66,532,29.2523333333333
+66,533,20.8915
+66,534,22.479
+66,535,23.0505
+66,536,25.019
+66,537,32.6601666666667
+66,538,29.4428333333333
+66,539,30.7551666666667
+66,540,28.702
+66,541,27.686
+66,542,23.1351666666667
+66,543,31.877
+66,544,24.2358333333333
+66,545,21.7805
+66,546,28.575
+66,547,26.4795
+66,548,23.1986666666667
+66,549,29.845
+66,550,23.2833333333333
+66,551,28.2151666666667
+66,552,27.9823333333333
+66,553,23.622
+66,554,26.0138333333333
+66,555,29.0406666666667
+66,556,22.3096666666667
+66,557,25.7175
+66,558,25.6116666666667
+66,559,21.463
+66,560,31.9828333333333
+66,561,30.0778333333333
+66,562,29.4216666666667
+66,563,19.2828333333333
+66,564,28.8501666666667
+66,565,20.2776666666667
+66,566,31.8346666666667
+66,567,34.3535
+66,568,24.257
+66,569,25.6328333333333
+66,570,34.29
+66,571,24.4686666666667
+66,572,21.1878333333333
+66,573,27.178
+66,574,22.2461666666667
+66,575,28.6808333333333
+66,576,32.8083333333333
+66,577,25.908
+66,578,26.0985
+66,579,26.6276666666667
+66,580,24.5956666666667
+66,581,21.3571666666667
+66,582,23.5585
+66,583,20.3835
+66,584,33.7396666666667
+66,585,30.0566666666667
+66,586,24.0453333333333
+66,587,23.5796666666667
+66,588,26.3313333333333
+66,589,25.1248333333333
+66,590,20.8703333333333
+66,591,20.8703333333333
+66,592,24.1935
+66,593,25.1883333333333
+66,594,28.8713333333333
+66,595,24.2358333333333
+66,596,33.9936666666667
+66,597,25.3576666666667
+66,598,20.2565
+66,599,21.209
+66,600,31.6653333333333
+66,601,28.6173333333333
+66,602,26.4795
+66,603,26.6065
+66,604,27.6013333333333
+66,605,23.5161666666667
+66,606,33.147
+66,607,29.4005
+66,608,22.6483333333333
+66,609,26.7758333333333
+66,610,23.1563333333333
+66,611,23.6643333333333
+66,612,27.0933333333333
+66,613,27.4955
+66,614,23.1563333333333
+66,615,22.2673333333333
+66,616,22.3308333333333
+66,617,23.6008333333333
+66,618,30.1836666666667
+66,619,30.9456666666667
+66,620,30.8821666666667
+66,621,27.178
+66,622,28.9983333333333
+66,623,36.7453333333333
+66,624,23.7701666666667
+66,625,29.5486666666667
+66,626,29.3793333333333
+66,627,20.5528333333333
+66,628,31.115
+66,629,22.606
+66,630,30.6705
+66,631,30.5858333333333
+66,632,16.1501666666667
+66,633,25.5481666666667
+66,634,24.5321666666667
+66,635,26.0561666666667
+66,636,35.2425
+66,637,26.6488333333333
+66,638,26.543
+66,639,21.0185
+66,640,24.4686666666667
+66,641,28.448
+66,642,26.5218333333333
+66,643,32.4273333333333
+66,644,28.6596666666667
+66,645,28.7231666666667
+66,646,27.1991666666667
+66,647,26.7335
+66,648,31.5595
+66,649,28.829
+66,650,24.1935
+66,651,20.193
+66,652,24.0241666666667
+66,653,29.6333333333333
+66,654,28.7443333333333
+66,655,28.2151666666667
+66,656,27.1356666666667
+66,657,24.8073333333333
+66,658,29.2735
+66,659,27.1991666666667
+66,660,24.13
+66,661,31.3901666666667
+66,662,19.6215
+66,663,30.861
+66,664,29.6545
+66,665,23.8548333333333
+66,666,26.0561666666667
+66,667,19.8755
+66,668,33.1046666666667
+66,669,23.1986666666667
+66,670,33.7608333333333
+66,671,23.114
+66,672,31.1996666666667
+66,673,24.1723333333333
+66,674,29.8873333333333
+66,675,23.8971666666667
+66,676,27.4531666666667
+66,677,26.2678333333333
+66,678,24.9978333333333
+66,679,29.4851666666667
+66,680,28.1093333333333
+66,681,33.1046666666667
+66,682,21.082
+66,683,19.1135
+66,684,22.2461666666667
+66,685,24.765
+66,686,19.8331666666667
+66,687,22.6483333333333
+66,688,27.2415
+66,689,26.4583333333333
+66,690,23.9183333333333
+66,691,23.9395
+66,692,26.3948333333333
+66,693,20.066
+66,694,26.0138333333333
+66,695,36.0891666666667
+66,696,24.4263333333333
+66,697,25.8868333333333
+66,698,32.1945
+66,699,19.5791666666667
+66,700,22.7541666666667
+66,701,26.3101666666667
+66,702,25.0825
+66,703,21.082
+66,704,26.1196666666667
+66,705,26.67
+66,706,31.3478333333333
+66,707,24.4686666666667
+66,708,23.9183333333333
+66,709,26.3525
+66,710,26.7123333333333
+66,711,24.2993333333333
+66,712,29.0195
+66,713,34.2688333333333
+66,714,28.1728333333333
+66,715,25.1036666666667
+66,716,28.4691666666667
+66,717,27.6436666666667
+66,718,24.9555
+66,719,28.1516666666667
+66,720,29.083
+66,721,34.4805
+66,722,30.2471666666667
+66,723,31.1573333333333
+66,724,27.9823333333333
+66,725,23.3891666666667
+66,726,23.0081666666667
+66,727,31.9616666666667
+66,728,25.3788333333333
+66,729,29.7603333333333
+66,730,22.8811666666667
+66,731,19.1558333333333
+66,732,26.9875
+66,733,25.4635
+66,734,28.5961666666667
+66,735,20.4258333333333
+66,736,30.3318333333333
+66,737,28.8501666666667
+66,738,26.67
+66,739,23.7701666666667
+66,740,22.3731666666667
+66,741,25.781
+66,742,22.4155
+66,743,23.1775
+66,744,21.6535
+66,745,27.8341666666667
+66,746,22.6483333333333
+66,747,26.6276666666667
+66,748,26.162
+66,749,26.5218333333333
+66,750,25.9503333333333
+66,751,26.9663333333333
+66,752,34.5228333333333
+66,753,22.9023333333333
+66,754,23.5585
+66,755,26.5641666666667
+66,756,25.1248333333333
+66,757,31.5806666666667
+66,758,22.6483333333333
+66,759,26.3525
+66,760,27.3685
+66,761,29.0406666666667
+66,762,30.6916666666667
+66,763,19.4733333333333
+66,764,27.0298333333333
+66,765,28.5961666666667
+66,766,23.0081666666667
+66,767,30.5646666666667
+66,768,26.2466666666667
+66,769,33.1681666666667
+66,770,26.3948333333333
+66,771,26.3948333333333
+66,772,28.0035
+66,773,24.4051666666667
+66,774,17.018
+66,775,24.8285
+66,776,28.1305
+66,777,23.1986666666667
+66,778,26.8605
+66,779,25.9503333333333
+66,780,20.574
+66,781,24.5956666666667
+66,782,26.0985
+66,783,22.9235
+66,784,32.9565
+66,785,26.3313333333333
+66,786,19.4098333333333
+66,787,31.0091666666667
+66,788,28.4056666666667
+66,789,29.6756666666667
+66,790,30.5858333333333
+66,791,35.2001666666667
+66,792,23.9395
+66,793,23.2621666666667
+66,794,22.3308333333333
+66,795,22.1191666666667
+66,796,27.813
+66,797,27.8765
+66,798,27.4531666666667
+66,799,24.4898333333333
+66,800,27.6225
+66,801,23.9183333333333
+66,802,27.2626666666667
+66,803,19.558
+66,804,25.2941666666667
+66,805,26.3525
+66,806,21.8863333333333
+66,807,30.1836666666667
+66,808,31.5595
+66,809,24.8073333333333
+66,810,24.8073333333333
+66,811,22.0133333333333
+66,812,25.1036666666667
+66,813,25.4
+66,814,30.2048333333333
+66,815,28.8713333333333
+66,816,23.2198333333333
+66,817,28.1728333333333
+66,818,25.781
+66,819,24.9555
+66,820,28.4268333333333
+66,821,32.131
+66,822,30.7551666666667
+66,823,30.7763333333333
+66,824,28.9136666666667
+66,825,23.6855
+66,826,24.7226666666667
+66,827,32.6813333333333
+66,828,28.7443333333333
+66,829,30.988
+66,830,27.0933333333333
+66,831,32.766
+66,832,24.1511666666667
+66,833,21.59
+66,834,31.5806666666667
+66,835,28.6173333333333
+66,836,19.6215
+66,837,26.035
+66,838,23.0081666666667
+66,839,23.6855
+66,840,24.8496666666667
+66,841,20.9338333333333
+66,842,23.0081666666667
+66,843,22.987
+66,844,22.606
+66,845,25.3365
+66,846,34.163
+66,847,25.3153333333333
+66,848,21.0396666666667
+66,849,28.8925
+66,850,20.6375
+66,851,31.6018333333333
+66,852,28.0881666666667
+66,853,29.5063333333333
+66,854,24.9555
+66,855,22.9658333333333
+66,856,24.8073333333333
+66,857,24.7226666666667
+66,858,28.2151666666667
+66,859,25.2941666666667
+66,860,28.4056666666667
+66,861,25.2518333333333
+66,862,31.3901666666667
+66,863,30.0778333333333
+66,864,25.9503333333333
+66,865,29.7603333333333
+66,866,36.195
+66,867,27.305
+66,868,25.1248333333333
+66,869,30.3106666666667
+66,870,25.908
+66,871,27.2838333333333
+66,872,20.2776666666667
+66,873,31.7923333333333
+66,874,27.432
+66,875,25.5693333333333
+66,876,23.3045
+66,877,28.5326666666667
+66,878,30.1201666666667
+66,879,25.019
+66,880,24.5321666666667
+66,881,31.8346666666667
+66,882,20.9973333333333
+66,883,23.0293333333333
+66,884,21.0185
+66,885,26.0561666666667
+66,886,29.3793333333333
+66,887,24.5956666666667
+66,888,25.8445
+66,889,27.4743333333333
+66,890,20.8915
+66,891,19.9813333333333
+66,892,27.432
+66,893,21.8651666666667
+66,894,21.5688333333333
+66,895,28.0458333333333
+66,896,17.78
+66,897,22.2673333333333
+66,898,28.1728333333333
+66,899,23.495
+66,900,26.8605
+66,901,27.8765
+66,902,24.638
+66,903,31.3055
+66,904,22.5425
+66,905,25.5481666666667
+66,906,25.5905
+66,907,27.7706666666667
+66,908,26.4583333333333
+66,909,27.686
+66,910,20.2353333333333
+66,911,24.7226666666667
+66,912,27.2203333333333
+66,913,23.8971666666667
+66,914,23.7913333333333
+66,915,22.5213333333333
+66,916,29.0195
+66,917,33.1681666666667
+66,918,26.1831666666667
+66,919,23.8971666666667
+66,920,27.2415
+66,921,26.2466666666667
+66,922,23.495
+66,923,29.1676666666667
+66,924,28.1305
+66,925,27.1356666666667
+66,926,25.2095
+66,927,28.702
+66,928,21.9498333333333
+66,929,33.4221666666667
+66,930,27.7071666666667
+66,931,34.4805
+66,932,26.3101666666667
+66,933,26.9663333333333
+66,934,30.5435
+66,935,36.7453333333333
+66,936,19.9813333333333
+66,937,23.6008333333333
+66,938,18.6478333333333
+66,939,31.7288333333333
+66,940,24.6591666666667
+66,941,19.6638333333333
+66,942,23.6008333333333
+66,943,25.9291666666667
+66,944,20.1718333333333
+66,945,25.3576666666667
+66,946,26.0561666666667
+66,947,25.6963333333333
+66,948,28.5538333333333
+66,949,24.4263333333333
+66,950,24.4475
+66,951,32.6178333333333
+66,952,37.9518333333333
+66,953,23.5161666666667
+66,954,22.3308333333333
+66,955,25.7175
+66,956,27.4743333333333
+66,957,26.924
+66,958,32.9565
+66,959,27.1991666666667
+66,960,23.4103333333333
+66,961,24.1935
+66,962,27.94
+66,963,25.1671666666667
+66,964,22.3308333333333
+66,965,28.1516666666667
+66,966,28.4903333333333
+66,967,27.1568333333333
+66,968,22.1615
+66,969,24.638
+66,970,29.8873333333333
+66,971,27.0298333333333
+66,972,23.3468333333333
+66,973,33.1258333333333
+66,974,23.876
+66,975,35.4753333333333
+66,976,23.6855
+66,977,26.6488333333333
+66,978,25.2095
+66,979,23.4103333333333
+66,980,19.2405
+66,981,27.8765
+66,982,24.5956666666667
+66,983,26.3313333333333
+66,984,29.6121666666667
+66,985,36.1103333333333
+66,986,24.4051666666667
+66,987,29.2735
+66,988,21.8651666666667
+66,989,23.1986666666667
+66,990,24.1088333333333
+66,991,17.8646666666667
+66,992,26.6911666666667
+66,993,27.3473333333333
+66,994,20.701
+66,995,25.2306666666667
+66,996,21.7805
+66,997,27.051
+66,998,17.8011666666667
+66,999,26.8605
+66,1000,32.7025
+67,1,18.034
+67,2,18.923
+67,3,20.447
+67,4,20.6163333333333
+67,5,15.24
+67,6,15.0283333333333
+67,7,24.8073333333333
+67,8,18.2456666666667
+67,9,20.066
+67,10,21.2936666666667
+67,11,14.351
+67,12,17.2296666666667
+67,13,21.971
+67,14,16.0866666666667
+67,15,22.5636666666667
+67,16,18.542
+67,17,16.51
+67,18,25.0613333333333
+67,19,21.2936666666667
+67,20,20.6586666666667
+67,21,21.6746666666667
+67,22,17.5683333333333
+67,23,17.526
+67,24,21.5053333333333
+67,25,20.066
+67,26,18.288
+67,27,22.3943333333333
+67,28,19.0076666666667
+67,29,20.4046666666667
+67,30,22.8176666666667
+67,31,14.3086666666667
+67,32,21.5053333333333
+67,33,20.1506666666667
+67,34,24.4686666666667
+67,35,22.5636666666667
+67,36,17.8646666666667
+67,37,19.2616666666667
+67,38,19.177
+67,39,17.4836666666667
+67,40,24.9766666666667
+67,41,18.9653333333333
+67,42,19.0076666666667
+67,43,19.558
+67,44,17.3566666666667
+67,45,18.415
+67,46,18.2033333333333
+67,47,22.987
+67,48,15.24
+67,49,17.6953333333333
+67,50,26.8393333333333
+67,51,16.5523333333333
+67,52,18.415
+67,53,24.638
+67,54,14.5626666666667
+67,55,22.1826666666667
+67,56,20.193
+67,57,19.05
+67,58,23.622
+67,59,21.5476666666667
+67,60,23.7066666666667
+67,61,22.1826666666667
+67,62,19.558
+67,63,18.8383333333333
+67,64,16.8486666666667
+67,65,21.5476666666667
+67,66,20.2353333333333
+67,67,19.6003333333333
+67,68,20.8703333333333
+67,69,21.9286666666667
+67,70,23.8336666666667
+67,71,19.5156666666667
+67,72,24.2146666666667
+67,73,20.32
+67,74,17.526
+67,75,15.367
+67,76,20.0236666666667
+67,77,18.9653333333333
+67,78,17.4413333333333
+67,79,21.717
+67,80,25.8656666666667
+67,81,17.8646666666667
+67,82,20.6586666666667
+67,83,21.8016666666667
+67,84,20.701
+67,85,21.6323333333333
+67,86,22.9446666666667
+67,87,13.3773333333333
+67,88,16.6793333333333
+67,89,29.0406666666667
+67,90,18.1186666666667
+67,91,20.6586666666667
+67,92,23.114
+67,93,19.685
+67,94,22.1403333333333
+67,95,21.2936666666667
+67,96,25.781
+67,97,20.828
+67,98,19.3463333333333
+67,99,20.1506666666667
+67,100,22.6483333333333
+67,101,17.9493333333333
+67,102,20.955
+67,103,20.9126666666667
+67,104,18.3726666666667
+67,105,19.177
+67,106,18.1186666666667
+67,107,17.3143333333333
+67,108,21.463
+67,109,19.177
+67,110,18.034
+67,111,19.431
+67,112,14.986
+67,113,22.5636666666667
+67,114,19.05
+67,115,16.002
+67,116,25.1036666666667
+67,117,19.8966666666667
+67,118,18.288
+67,119,23.4526666666667
+67,120,18.2456666666667
+67,121,20.2353333333333
+67,122,18.2033333333333
+67,123,18.4996666666667
+67,124,18.6266666666667
+67,125,22.225
+67,126,17.9916666666667
+67,127,15.113
+67,128,13.97
+67,129,19.2193333333333
+67,130,18.3303333333333
+67,131,20.1083333333333
+67,132,20.9973333333333
+67,133,15.7056666666667
+67,134,17.4836666666667
+67,135,21.6746666666667
+67,136,17.272
+67,137,16.4676666666667
+67,138,26.6276666666667
+67,139,19.9813333333333
+67,140,19.2616666666667
+67,141,20.32
+67,142,20.9126666666667
+67,143,25.3576666666667
+67,144,20.32
+67,145,23.749
+67,146,14.224
+67,147,21.3783333333333
+67,148,23.0716666666667
+67,149,20.7433333333333
+67,150,22.3943333333333
+67,151,26.7546666666667
+67,152,21.336
+67,153,16.637
+67,154,26.543
+67,155,22.1826666666667
+67,156,23.4103333333333
+67,157,21.9286666666667
+67,158,21.971
+67,159,18.8383333333333
+67,160,15.1553333333333
+67,161,21.844
+67,162,21.6323333333333
+67,163,19.5156666666667
+67,164,20.1083333333333
+67,165,19.7696666666667
+67,166,23.9606666666667
+67,167,19.177
+67,168,25.654
+67,169,20.2353333333333
+67,170,23.7913333333333
+67,171,20.4893333333333
+67,172,24.9766666666667
+67,173,22.86
+67,174,23.7066666666667
+67,175,19.3463333333333
+67,176,21.5053333333333
+67,177,20.32
+67,178,26.162
+67,179,20.4893333333333
+67,180,21.59
+67,181,21.9286666666667
+67,182,24.9766666666667
+67,183,18.4573333333333
+67,184,18.3726666666667
+67,185,15.2823333333333
+67,186,24.5533333333333
+67,187,19.431
+67,188,15.748
+67,189,19.939
+67,190,19.9813333333333
+67,191,22.1826666666667
+67,192,22.8176666666667
+67,193,28.1516666666667
+67,194,16.7216666666667
+67,195,17.907
+67,196,15.5786666666667
+67,197,13.1656666666667
+67,198,19.1346666666667
+67,199,26.797
+67,200,20.2353333333333
+67,201,20.2353333333333
+67,202,17.78
+67,203,23.9606666666667
+67,204,19.939
+67,205,20.9126666666667
+67,206,25.1883333333333
+67,207,20.701
+67,208,19.3886666666667
+67,209,19.2616666666667
+67,210,24.4686666666667
+67,211,17.272
+67,212,18.9653333333333
+67,213,27.5166666666667
+67,214,17.3143333333333
+67,215,21.717
+67,216,20.2353333333333
+67,217,15.7903333333333
+67,218,16.3406666666667
+67,219,20.1506666666667
+67,220,18.5843333333333
+67,221,17.272
+67,222,18.8383333333333
+67,223,19.304
+67,224,21.844
+67,225,16.891
+67,226,23.7066666666667
+67,227,17.3566666666667
+67,228,21.9286666666667
+67,229,20.4893333333333
+67,230,20.8703333333333
+67,231,17.1873333333333
+67,232,19.7273333333333
+67,233,21.1666666666667
+67,234,16.891
+67,235,18.8806666666667
+67,236,14.0123333333333
+67,237,16.7216666666667
+67,238,23.2833333333333
+67,239,17.9916666666667
+67,240,19.304
+67,241,22.5636666666667
+67,242,18.923
+67,243,20.193
+67,244,20.6586666666667
+67,245,21.7593333333333
+67,246,19.2193333333333
+67,247,17.0603333333333
+67,248,21.463
+67,249,19.2616666666667
+67,250,21.4206666666667
+67,251,24.0876666666667
+67,252,19.8543333333333
+67,253,18.034
+67,254,18.161
+67,255,18.2033333333333
+67,256,18.1186666666667
+67,257,18.923
+67,258,23.9606666666667
+67,259,14.097
+67,260,20.4046666666667
+67,261,15.748
+67,262,25.8233333333333
+67,263,20.6163333333333
+67,264,17.9916666666667
+67,265,20.3623333333333
+67,266,21.7593333333333
+67,267,18.2456666666667
+67,268,18.161
+67,269,17.4836666666667
+67,270,19.7696666666667
+67,271,18.3303333333333
+67,272,19.431
+67,273,19.8543333333333
+67,274,18.1186666666667
+67,275,20.9973333333333
+67,276,18.034
+67,277,18.1186666666667
+67,278,15.748
+67,279,22.3096666666667
+67,280,22.098
+67,281,17.9493333333333
+67,282,22.479
+67,283,17.4836666666667
+67,284,23.368
+67,285,19.558
+67,286,21.6323333333333
+67,287,23.2833333333333
+67,288,19.3886666666667
+67,289,25.019
+67,290,20.2353333333333
+67,291,22.6483333333333
+67,292,17.8223333333333
+67,293,21.8016666666667
+67,294,23.4526666666667
+67,295,18.4996666666667
+67,296,17.5683333333333
+67,297,17.8646666666667
+67,298,17.8223333333333
+67,299,21.209
+67,300,22.2673333333333
+67,301,19.685
+67,302,20.1083333333333
+67,303,20.828
+67,304,23.5796666666667
+67,305,20.701
+67,306,21.59
+67,307,17.9493333333333
+67,308,19.9813333333333
+67,309,18.3303333333333
+67,310,18.161
+67,311,16.0443333333333
+67,312,22.098
+67,313,19.3463333333333
+67,314,22.5213333333333
+67,315,21.7593333333333
+67,316,17.6953333333333
+67,317,20.4046666666667
+67,318,20.193
+67,319,19.177
+67,320,20.9973333333333
+67,321,20.1083333333333
+67,322,17.7376666666667
+67,323,14.605
+67,324,21.336
+67,325,25.0613333333333
+67,326,18.161
+67,327,18.7113333333333
+67,328,19.05
+67,329,19.5156666666667
+67,330,20.574
+67,331,17.5683333333333
+67,332,18.6266666666667
+67,333,16.5946666666667
+67,334,19.177
+67,335,16.0866666666667
+67,336,22.606
+67,337,18.5843333333333
+67,338,21.6746666666667
+67,339,20.1506666666667
+67,340,16.3406666666667
+67,341,20.828
+67,342,14.986
+67,343,20.7856666666667
+67,344,23.4526666666667
+67,345,14.859
+67,346,16.256
+67,347,17.2296666666667
+67,348,18.2456666666667
+67,349,19.2193333333333
+67,350,27.7283333333333
+67,351,17.9916666666667
+67,352,19.8966666666667
+67,353,17.0603333333333
+67,354,21.8863333333333
+67,355,13.9276666666667
+67,356,16.129
+67,357,19.3886666666667
+67,358,24.5533333333333
+67,359,20.5316666666667
+67,360,21.463
+67,361,23.7913333333333
+67,362,15.494
+67,363,18.6266666666667
+67,364,17.3143333333333
+67,365,21.8863333333333
+67,366,16.9333333333333
+67,367,14.3086666666667
+67,368,18.0763333333333
+67,369,18.796
+67,370,17.018
+67,371,17.272
+67,372,11.938
+67,373,16.5946666666667
+67,374,17.145
+67,375,19.3463333333333
+67,376,17.018
+67,377,18.034
+67,378,11.303
+67,379,17.145
+67,380,21.6323333333333
+67,381,19.431
+67,382,18.0763333333333
+67,383,23.2833333333333
+67,384,19.7696666666667
+67,385,24.9343333333333
+67,386,17.7376666666667
+67,387,15.367
+67,388,24.0453333333333
+67,389,16.2136666666667
+67,390,21.971
+67,391,23.4526666666667
+67,392,24.9343333333333
+67,393,15.8326666666667
+67,394,14.5203333333333
+67,395,17.8646666666667
+67,396,24.0453333333333
+67,397,21.0396666666667
+67,398,23.0293333333333
+67,399,19.7273333333333
+67,400,19.685
+67,401,18.4573333333333
+67,402,19.558
+67,403,16.4676666666667
+67,404,20.828
+67,405,20.066
+67,406,18.7113333333333
+67,407,24.511
+67,408,20.1083333333333
+67,409,16.002
+67,410,18.0763333333333
+67,411,20.0236666666667
+67,412,15.7056666666667
+67,413,15.2823333333333
+67,414,23.114
+67,415,20.7433333333333
+67,416,18.288
+67,417,16.891
+67,418,14.1393333333333
+67,419,16.129
+67,420,15.5363333333333
+67,421,17.272
+67,422,24.2993333333333
+67,423,19.2616666666667
+67,424,20.4046666666667
+67,425,20.6163333333333
+67,426,20.8703333333333
+67,427,21.3783333333333
+67,428,20.8703333333333
+67,429,19.3886666666667
+67,430,20.9973333333333
+67,431,17.272
+67,432,17.9493333333333
+67,433,17.3143333333333
+67,434,19.685
+67,435,21.082
+67,436,20.447
+67,437,18.8383333333333
+67,438,19.4733333333333
+67,439,17.78
+67,440,19.3463333333333
+67,441,21.082
+67,442,18.2456666666667
+67,443,18.2033333333333
+67,444,18.3303333333333
+67,445,19.3463333333333
+67,446,18.542
+67,447,24.7226666666667
+67,448,21.082
+67,449,20.6586666666667
+67,450,20.1083333333333
+67,451,20.5316666666667
+67,452,19.8543333333333
+67,453,18.8806666666667
+67,454,24.384
+67,455,22.4366666666667
+67,456,16.2136666666667
+67,457,16.0866666666667
+67,458,20.447
+67,459,18.034
+67,460,15.7056666666667
+67,461,15.2823333333333
+67,462,24.6803333333333
+67,463,22.225
+67,464,19.2616666666667
+67,465,17.6953333333333
+67,466,19.2193333333333
+67,467,17.4413333333333
+67,468,14.9436666666667
+67,469,20.7433333333333
+67,470,21.2936666666667
+67,471,16.7216666666667
+67,472,18.6266666666667
+67,473,17.4413333333333
+67,474,21.209
+67,475,16.637
+67,476,24.257
+67,477,20.9973333333333
+67,478,19.7696666666667
+67,479,20.7856666666667
+67,480,20.574
+67,481,17.4413333333333
+67,482,15.9596666666667
+67,483,15.3246666666667
+67,484,15.5786666666667
+67,485,21.082
+67,486,19.685
+67,487,22.3096666666667
+67,488,15.1976666666667
+67,489,16.891
+67,490,20.4893333333333
+67,491,20.9126666666667
+67,492,22.0133333333333
+67,493,20.8703333333333
+67,494,20.066
+67,495,22.0133333333333
+67,496,23.9606666666667
+67,497,16.4676666666667
+67,498,16.9333333333333
+67,499,16.8063333333333
+67,500,17.4413333333333
+67,501,20.3623333333333
+67,502,22.2673333333333
+67,503,14.9436666666667
+67,504,20.5316666666667
+67,505,17.8223333333333
+67,506,22.352
+67,507,20.6163333333333
+67,508,26.67
+67,509,21.6746666666667
+67,510,17.653
+67,511,17.3566666666667
+67,512,18.9653333333333
+67,513,20.5316666666667
+67,514,19.685
+67,515,16.8063333333333
+67,516,18.542
+67,517,14.9013333333333
+67,518,17.78
+67,519,21.6323333333333
+67,520,17.9493333333333
+67,521,14.1816666666667
+67,522,19.431
+67,523,22.3943333333333
+67,524,22.098
+67,525,20.9126666666667
+67,526,12.954
+67,527,20.193
+67,528,16.0866666666667
+67,529,18.4573333333333
+67,530,19.6003333333333
+67,531,21.59
+67,532,18.7113333333333
+67,533,25.4846666666667
+67,534,21.7593333333333
+67,535,20.193
+67,536,16.9333333333333
+67,537,22.7753333333333
+67,538,17.9916666666667
+67,539,23.9183333333333
+67,540,26.543
+67,541,23.7066666666667
+67,542,19.812
+67,543,16.9756666666667
+67,544,15.24
+67,545,20.0236666666667
+67,546,18.6266666666667
+67,547,18.288
+67,548,21.59
+67,549,19.431
+67,550,23.7913333333333
+67,551,13.97
+67,552,22.2673333333333
+67,553,18.8806666666667
+67,554,18.4573333333333
+67,555,15.9173333333333
+67,556,14.7743333333333
+67,557,19.3886666666667
+67,558,15.4093333333333
+67,559,25.019
+67,560,21.6746666666667
+67,561,17.6953333333333
+67,562,19.6426666666667
+67,563,17.2296666666667
+67,564,28.1093333333333
+67,565,17.6106666666667
+67,566,14.605
+67,567,25.4423333333333
+67,568,15.5786666666667
+67,569,17.399
+67,570,20.2353333333333
+67,571,21.0396666666667
+67,572,22.7753333333333
+67,573,18.5843333333333
+67,574,18.288
+67,575,25.2306666666667
+67,576,19.177
+67,577,16.129
+67,578,20.7433333333333
+67,579,18.5843333333333
+67,580,23.114
+67,581,18.669
+67,582,19.939
+67,583,18.7536666666667
+67,584,21.463
+67,585,20.6586666666667
+67,586,19.7273333333333
+67,587,22.479
+67,588,20.5316666666667
+67,589,18.3726666666667
+67,590,16.5946666666667
+67,591,19.177
+67,592,25.0613333333333
+67,593,27.1356666666667
+67,594,24.765
+67,595,18.161
+67,596,16.0443333333333
+67,597,16.129
+67,598,20.4893333333333
+67,599,24.9343333333333
+67,600,22.8176666666667
+67,601,20.5316666666667
+67,602,23.4526666666667
+67,603,18.7536666666667
+67,604,18.923
+67,605,19.05
+67,606,21.4206666666667
+67,607,20.2353333333333
+67,608,19.8543333333333
+67,609,19.7696666666667
+67,610,17.0603333333333
+67,611,19.558
+67,612,22.987
+67,613,19.304
+67,614,17.6106666666667
+67,615,18.1186666666667
+67,616,16.1713333333333
+67,617,18.288
+67,618,21.3783333333333
+67,619,23.9606666666667
+67,620,20.6163333333333
+67,621,16.7216666666667
+67,622,16.637
+67,623,16.4676666666667
+67,624,23.9183333333333
+67,625,18.5843333333333
+67,626,15.4516666666667
+67,627,22.3943333333333
+67,628,21.59
+67,629,19.431
+67,630,22.86
+67,631,24.8496666666667
+67,632,19.0076666666667
+67,633,19.558
+67,634,19.6003333333333
+67,635,15.4093333333333
+67,636,23.9606666666667
+67,637,16.637
+67,638,16.9333333333333
+67,639,16.383
+67,640,25.527
+67,641,16.51
+67,642,17.9916666666667
+67,643,16.6793333333333
+67,644,17.9493333333333
+67,645,15.5786666666667
+67,646,22.1403333333333
+67,647,21.3783333333333
+67,648,21.6323333333333
+67,649,22.6906666666667
+67,650,20.2353333333333
+67,651,17.0603333333333
+67,652,23.114
+67,653,18.669
+67,654,26.9663333333333
+67,655,16.8486666666667
+67,656,23.7066666666667
+67,657,21.8016666666667
+67,658,21.8863333333333
+67,659,18.4573333333333
+67,660,17.907
+67,661,19.8966666666667
+67,662,14.478
+67,663,17.3566666666667
+67,664,17.3566666666667
+67,665,20.193
+67,666,17.9916666666667
+67,667,19.0923333333333
+67,668,20.9973333333333
+67,669,17.4413333333333
+67,670,16.7216666666667
+67,671,19.1346666666667
+67,672,18.2033333333333
+67,673,20.6586666666667
+67,674,21.59
+67,675,19.6426666666667
+67,676,15.9596666666667
+67,677,19.2193333333333
+67,678,19.8543333333333
+67,679,22.987
+67,680,14.478
+67,681,22.5213333333333
+67,682,23.1563333333333
+67,683,19.812
+67,684,19.0076666666667
+67,685,17.8646666666667
+67,686,19.431
+67,687,17.653
+67,688,18.161
+67,689,17.3566666666667
+67,690,23.9606666666667
+67,691,17.6106666666667
+67,692,18.923
+67,693,20.6586666666667
+67,694,16.51
+67,695,19.05
+67,696,18.4573333333333
+67,697,13.208
+67,698,18.161
+67,699,18.4573333333333
+67,700,21.7593333333333
+67,701,17.78
+67,702,22.098
+67,703,24.2146666666667
+67,704,20.0236666666667
+67,705,24.003
+67,706,17.6106666666667
+67,707,20.3623333333333
+67,708,25.3153333333333
+67,709,24.638
+67,710,27.4743333333333
+67,711,18.3726666666667
+67,712,21.4206666666667
+67,713,22.1826666666667
+67,714,21.2936666666667
+67,715,20.193
+67,716,19.0923333333333
+67,717,18.2456666666667
+67,718,20.574
+67,719,23.368
+67,720,16.129
+67,721,25.0613333333333
+67,722,19.177
+67,723,22.9023333333333
+67,724,17.0603333333333
+67,725,16.764
+67,726,24.7226666666667
+67,727,25.4423333333333
+67,728,17.526
+67,729,21.463
+67,730,22.1826666666667
+67,731,21.59
+67,732,23.241
+67,733,18.923
+67,734,21.2513333333333
+67,735,18.796
+67,736,24.0453333333333
+67,737,14.9436666666667
+67,738,24.9766666666667
+67,739,19.2193333333333
+67,740,24.5956666666667
+67,741,20.3623333333333
+67,742,21.717
+67,743,15.5786666666667
+67,744,25.0613333333333
+67,745,22.7753333333333
+67,746,23.0716666666667
+67,747,19.0076666666667
+67,748,20.3623333333333
+67,749,17.018
+67,750,19.177
+67,751,21.8016666666667
+67,752,19.6003333333333
+67,753,17.8646666666667
+67,754,23.1563333333333
+67,755,17.399
+67,756,18.034
+67,757,19.939
+67,758,20.8703333333333
+67,759,19.177
+67,760,18.3303333333333
+67,761,22.6906666666667
+67,762,21.717
+67,763,17.9493333333333
+67,764,24.5533333333333
+67,765,23.0293333333333
+67,766,18.9653333333333
+67,767,20.193
+67,768,19.812
+67,769,17.653
+67,770,19.304
+67,771,18.8383333333333
+67,772,20.447
+67,773,22.9446666666667
+67,774,19.558
+67,775,21.59
+67,776,25.4423333333333
+67,777,20.3623333333333
+67,778,24.6803333333333
+67,779,17.7376666666667
+67,780,14.9013333333333
+67,781,17.4413333333333
+67,782,21.0396666666667
+67,783,15.9596666666667
+67,784,19.4733333333333
+67,785,22.4366666666667
+67,786,17.5683333333333
+67,787,21.8863333333333
+67,788,20.193
+67,789,25.9503333333333
+67,790,15.113
+67,791,13.716
+67,792,22.1403333333333
+67,793,19.8966666666667
+67,794,21.59
+67,795,19.685
+67,796,21.082
+67,797,17.6953333333333
+67,798,25.0613333333333
+67,799,17.018
+67,800,16.4676666666667
+67,801,27.432
+67,802,19.431
+67,803,18.9653333333333
+67,804,21.971
+67,805,17.399
+67,806,17.3143333333333
+67,807,22.098
+67,808,19.0076666666667
+67,809,22.9446666666667
+67,810,27.9823333333333
+67,811,24.1723333333333
+67,812,17.4836666666667
+67,813,20.066
+67,814,19.812
+67,815,17.4413333333333
+67,816,16.0443333333333
+67,817,18.2033333333333
+67,818,17.0603333333333
+67,819,20.2776666666667
+67,820,19.558
+67,821,17.907
+67,822,21.082
+67,823,18.5843333333333
+67,824,17.272
+67,825,20.701
+67,826,17.5683333333333
+67,827,19.3886666666667
+67,828,14.7743333333333
+67,829,18.034
+67,830,16.5523333333333
+67,831,17.9493333333333
+67,832,20.9126666666667
+67,833,19.1346666666667
+67,834,21.3783333333333
+67,835,17.6106666666667
+67,836,19.8966666666667
+67,837,18.415
+67,838,17.3143333333333
+67,839,18.4573333333333
+67,840,20.066
+67,841,17.9916666666667
+67,842,21.082
+67,843,17.6106666666667
+67,844,23.5796666666667
+67,845,21.59
+67,846,17.653
+67,847,16.8486666666667
+67,848,21.6323333333333
+67,849,20.5316666666667
+67,850,20.2353333333333
+67,851,19.2616666666667
+67,852,19.05
+67,853,18.415
+67,854,24.8073333333333
+67,855,24.2993333333333
+67,856,21.2936666666667
+67,857,20.701
+67,858,19.4733333333333
+67,859,20.193
+67,860,18.8383333333333
+67,861,19.685
+67,862,23.7066666666667
+67,863,18.0763333333333
+67,864,19.8966666666667
+67,865,18.288
+67,866,25.146
+67,867,20.32
+67,868,22.9446666666667
+67,869,23.368
+67,870,16.5946666666667
+67,871,25.2306666666667
+67,872,14.8166666666667
+67,873,18.8383333333333
+67,874,20.0236666666667
+67,875,19.558
+67,876,22.0133333333333
+67,877,18.5843333333333
+67,878,19.7696666666667
+67,879,24.13
+67,880,18.4573333333333
+67,881,16.4676666666667
+67,882,22.479
+67,883,19.7273333333333
+67,884,15.5786666666667
+67,885,20.2776666666667
+67,886,22.987
+67,887,19.7273333333333
+67,888,25.781
+67,889,18.0763333333333
+67,890,16.2983333333333
+67,891,27.7283333333333
+67,892,22.0556666666667
+67,893,22.4366666666667
+67,894,21.1243333333333
+67,895,20.9126666666667
+67,896,21.0396666666667
+67,897,19.558
+67,898,17.6953333333333
+67,899,24.8496666666667
+67,900,16.0443333333333
+67,901,22.479
+67,902,17.7376666666667
+67,903,21.082
+67,904,23.368
+67,905,16.0866666666667
+67,906,16.891
+67,907,16.002
+67,908,23.4526666666667
+67,909,19.431
+67,910,23.241
+67,911,15.6633333333333
+67,912,19.05
+67,913,23.4526666666667
+67,914,19.558
+67,915,23.368
+67,916,18.7113333333333
+67,917,20.9126666666667
+67,918,19.685
+67,919,26.2466666666667
+67,920,20.828
+67,921,22.6483333333333
+67,922,17.6106666666667
+67,923,21.6323333333333
+67,924,21.844
+67,925,20.6163333333333
+67,926,17.8646666666667
+67,927,23.7066666666667
+67,928,19.0923333333333
+67,929,22.2673333333333
+67,930,20.955
+67,931,17.4413333333333
+67,932,17.8646666666667
+67,933,18.7113333333333
+67,934,18.415
+67,935,21.5476666666667
+67,936,20.1083333333333
+67,937,25.3153333333333
+67,938,21.1243333333333
+67,939,18.0763333333333
+67,940,17.6106666666667
+67,941,18.9653333333333
+67,942,18.1186666666667
+67,943,19.431
+67,944,21.844
+67,945,22.6906666666667
+67,946,15.6633333333333
+67,947,18.1186666666667
+67,948,17.6106666666667
+67,949,20.828
+67,950,17.399
+67,951,20.3623333333333
+67,952,22.8176666666667
+67,953,18.669
+67,954,15.3246666666667
+67,955,17.2296666666667
+67,956,13.5043333333333
+67,957,24.7226666666667
+67,958,23.3256666666667
+67,959,18.6266666666667
+67,960,19.431
+67,961,24.3416666666667
+67,962,18.8806666666667
+67,963,20.3623333333333
+67,964,22.098
+67,965,19.0923333333333
+67,966,24.9766666666667
+67,967,22.3943333333333
+67,968,21.1243333333333
+67,969,15.2823333333333
+67,970,24.3416666666667
+67,971,18.034
+67,972,19.685
+67,973,18.4573333333333
+67,974,24.8073333333333
+67,975,17.8646666666667
+67,976,21.209
+67,977,19.1346666666667
+67,978,17.1873333333333
+67,979,18.7113333333333
+67,980,14.0546666666667
+67,981,21.336
+67,982,18.288
+67,983,18.4996666666667
+67,984,18.669
+67,985,21.2513333333333
+67,986,18.5843333333333
+67,987,23.1563333333333
+67,988,17.526
+67,989,24.892
+67,990,18.1186666666667
+67,991,17.4836666666667
+67,992,16.764
+67,993,22.606
+67,994,24.0876666666667
+67,995,18.288
+67,996,22.5213333333333
+67,997,18.669
+67,998,23.876
+67,999,23.1986666666667
+67,1000,17.1026666666667
+68,1,26.4371666666667
+68,2,28.2786666666667
+68,3,24.4898333333333
+68,4,28.4268333333333
+68,5,29.083
+68,6,32.0675
+68,7,31.3478333333333
+68,8,30.099
+68,9,29.3581666666667
+68,10,29.0618333333333
+68,11,29.8873333333333
+68,12,35.0943333333333
+68,13,25.9291666666667
+68,14,28.9983333333333
+68,15,32.9141666666667
+68,16,30.353
+68,17,32.7871666666667
+68,18,28.5115
+68,19,33.4433333333333
+68,20,32.3638333333333
+68,21,29.9085
+68,22,29.0406666666667
+68,23,40.1743333333333
+68,24,37.2321666666667
+68,25,30.3953333333333
+68,26,32.512
+68,27,26.2466666666667
+68,28,32.4061666666667
+68,29,30.7551666666667
+68,30,24.257
+68,31,27.1568333333333
+68,32,36.9781666666667
+68,33,29.3793333333333
+68,34,33.2316666666667
+68,35,24.5956666666667
+68,36,27.4955
+68,37,34.5228333333333
+68,38,31.7923333333333
+68,39,37.4015
+68,40,23.1351666666667
+68,41,33.8243333333333
+68,42,31.115
+68,43,30.4165
+68,44,27.6648333333333
+68,45,32.8083333333333
+68,46,33.7396666666667
+68,47,35.6023333333333
+68,48,28.321
+68,49,33.6973333333333
+68,50,32.639
+68,51,25.654
+68,52,30.5435
+68,53,27.0721666666667
+68,54,25.5481666666667
+68,55,32.2156666666667
+68,56,24.9555
+68,57,28.1305
+68,58,27.9611666666667
+68,59,34.9038333333333
+68,60,37.8883333333333
+68,61,32.2156666666667
+68,62,28.2575
+68,63,36.2161666666667
+68,64,32.893
+68,65,36.5125
+68,66,37.7401666666667
+68,67,31.7288333333333
+68,68,34.671
+68,69,33.9936666666667
+68,70,27.9823333333333
+68,71,29.6968333333333
+68,72,31.7711666666667
+68,73,33.147
+68,74,21.5688333333333
+68,75,35.0096666666667
+68,76,30.1625
+68,77,28.0035
+68,78,33.3163333333333
+68,79,34.163
+68,80,34.4381666666667
+68,81,23.4738333333333
+68,82,38.1423333333333
+68,83,35.2425
+68,84,27.7706666666667
+68,85,39.3488333333333
+68,86,23.2833333333333
+68,87,35.5811666666667
+68,88,30.5011666666667
+68,89,28.321
+68,90,32.0675
+68,91,31.8558333333333
+68,92,28.0035
+68,93,25.8233333333333
+68,94,35.5811666666667
+68,95,23.749
+68,96,33.6973333333333
+68,97,27.3896666666667
+68,98,30.3953333333333
+68,99,31.115
+68,100,31.1996666666667
+68,101,24.1511666666667
+68,102,25.7598333333333
+68,103,30.0778333333333
+68,104,29.21
+68,105,35.4965
+68,106,31.1573333333333
+68,107,30.5011666666667
+68,108,31.6865
+68,109,26.7546666666667
+68,110,27.6648333333333
+68,111,34.2476666666667
+68,112,31.4748333333333
+68,113,27.3896666666667
+68,114,35.4753333333333
+68,115,32.1521666666667
+68,116,34.5228333333333
+68,117,30.8186666666667
+68,118,32.7025
+68,119,33.655
+68,120,30.8398333333333
+68,121,22.7541666666667
+68,122,28.448
+68,123,35.8986666666667
+68,124,24.13
+68,125,29.0195
+68,126,31.115
+68,127,32.0251666666667
+68,128,37.2745
+68,129,31.5383333333333
+68,130,30.7975
+68,131,36.1103333333333
+68,132,31.9616666666667
+68,133,27.9188333333333
+68,134,27.559
+68,135,28.9136666666667
+68,136,36.5336666666667
+68,137,30.4376666666667
+68,138,26.2255
+68,139,32.004
+68,140,41.8253333333333
+68,141,27.4531666666667
+68,142,35.7081666666667
+68,143,29.1888333333333
+68,144,33.5068333333333
+68,145,32.1098333333333
+68,146,30.7975
+68,147,31.0938333333333
+68,148,30.3106666666667
+68,149,33.528
+68,150,27.5801666666667
+68,151,25.2306666666667
+68,152,25.5905
+68,153,36.6183333333333
+68,154,30.5011666666667
+68,155,38.735
+68,156,33.8666666666667
+68,157,29.1676666666667
+68,158,28.1305
+68,159,33.9725
+68,160,28.575
+68,161,29.5275
+68,162,30.6493333333333
+68,163,31.9616666666667
+68,164,36.5336666666667
+68,165,30.8186666666667
+68,166,32.0463333333333
+68,167,28.4903333333333
+68,168,34.8191666666667
+68,169,33.274
+68,170,30.6281666666667
+68,171,24.6803333333333
+68,172,26.8816666666667
+68,173,26.1196666666667
+68,174,28.575
+68,175,26.2255
+68,176,27.0933333333333
+68,177,31.5806666666667
+68,178,29.3581666666667
+68,179,30.988
+68,180,28.194
+68,181,27.6013333333333
+68,182,29.3581666666667
+68,183,33.0623333333333
+68,184,29.6333333333333
+68,185,30.1201666666667
+68,186,31.1361666666667
+68,187,30.0778333333333
+68,188,29.7815
+68,189,27.6648333333333
+68,190,26.416
+68,191,30.4165
+68,192,36.6606666666667
+68,193,32.3003333333333
+68,194,26.924
+68,195,31.7711666666667
+68,196,32.258
+68,197,28.1516666666667
+68,198,24.3416666666667
+68,199,32.0886666666667
+68,200,25.3788333333333
+68,201,26.5853333333333
+68,202,28.7443333333333
+68,203,27.5801666666667
+68,204,35.2636666666667
+68,205,29.9508333333333
+68,206,35.2636666666667
+68,207,35.0308333333333
+68,208,33.528
+68,209,33.8666666666667
+68,210,34.4593333333333
+68,211,32.766
+68,212,27.686
+68,213,29.591
+68,214,32.7025
+68,215,36.7241666666667
+68,216,29.6756666666667
+68,217,30.8398333333333
+68,218,31.9828333333333
+68,219,30.5011666666667
+68,220,29.1676666666667
+68,221,27.813
+68,222,31.6653333333333
+68,223,35.8775
+68,224,24.7861666666667
+68,225,33.2316666666667
+68,226,35.941
+68,227,34.925
+68,228,39.1795
+68,229,29.3158333333333
+68,230,31.5595
+68,231,33.9513333333333
+68,232,27.4108333333333
+68,233,25.8656666666667
+68,234,32.0675
+68,235,35.6235
+68,236,32.9565
+68,237,28.2151666666667
+68,238,28.9348333333333
+68,239,33.7608333333333
+68,240,28.0881666666667
+68,241,24.003
+68,242,34.8403333333333
+68,243,40.894
+68,244,39.6663333333333
+68,245,34.4805
+68,246,25.3788333333333
+68,247,28.3421666666667
+68,248,32.8718333333333
+68,249,35.56
+68,250,31.7288333333333
+68,251,35.4118333333333
+68,252,29.1041666666667
+68,253,33.401
+68,254,30.8186666666667
+68,255,29.0195
+68,256,21.9498333333333
+68,257,24.384
+68,258,25.4423333333333
+68,259,30.2048333333333
+68,260,22.7965
+68,261,36.1103333333333
+68,262,29.4005
+68,263,26.2043333333333
+68,264,27.9823333333333
+68,265,32.6601666666667
+68,266,28.8925
+68,267,36.1526666666667
+68,268,37.2956666666667
+68,269,28.5115
+68,270,27.8341666666667
+68,271,28.3845
+68,272,33.6126666666667
+68,273,33.8878333333333
+68,274,25.6116666666667
+68,275,34.0571666666667
+68,276,30.099
+68,277,33.8031666666667
+68,278,26.4583333333333
+68,279,31.1785
+68,280,27.4108333333333
+68,281,25.7386666666667
+68,282,28.4903333333333
+68,283,33.2528333333333
+68,284,30.7128333333333
+68,285,20.3835
+68,286,25.908
+68,287,30.353
+68,288,27.813
+68,289,34.1418333333333
+68,290,38.5021666666667
+68,291,33.147
+68,292,22.5848333333333
+68,293,34.5863333333333
+68,294,31.7711666666667
+68,295,30.3953333333333
+68,296,27.8765
+68,297,27.8553333333333
+68,298,28.1728333333333
+68,299,28.067
+68,300,31.623
+68,301,23.4103333333333
+68,302,30.3741666666667
+68,303,33.7185
+68,304,28.194
+68,305,30.5858333333333
+68,306,22.3943333333333
+68,307,31.0515
+68,308,30.9245
+68,309,32.766
+68,310,34.8403333333333
+68,311,38.6503333333333
+68,312,29.9508333333333
+68,313,30.734
+68,314,33.2105
+68,315,32.639
+68,316,28.7655
+68,317,35.2001666666667
+68,318,27.8553333333333
+68,319,31.8981666666667
+68,320,31.8558333333333
+68,321,27.9611666666667
+68,322,27.8765
+68,323,22.3096666666667
+68,324,32.3638333333333
+68,325,33.3586666666667
+68,326,35.8775
+68,327,28.7231666666667
+68,328,27.8765
+68,329,34.3746666666667
+68,330,28.956
+68,331,26.3101666666667
+68,332,32.9988333333333
+68,333,31.115
+68,334,26.0138333333333
+68,335,25.4635
+68,336,28.7866666666667
+68,337,29.0195
+68,338,34.8403333333333
+68,339,26.5853333333333
+68,340,33.528
+68,341,31.4536666666667
+68,342,34.2476666666667
+68,343,32.639
+68,344,31.496
+68,345,31.3055
+68,346,35.179
+68,347,33.4645
+68,348,24.5956666666667
+68,349,31.115
+68,350,23.368
+68,351,38.5233333333333
+68,352,26.3525
+68,353,29.4216666666667
+68,354,32.9776666666667
+68,355,22.9446666666667
+68,356,32.6601666666667
+68,357,27.4743333333333
+68,358,33.8031666666667
+68,359,31.115
+68,360,24.0876666666667
+68,361,34.2688333333333
+68,362,31.7711666666667
+68,363,31.115
+68,364,27.4743333333333
+68,365,27.8341666666667
+68,366,28.0246666666667
+68,367,27.686
+68,368,28.9771666666667
+68,369,31.6441666666667
+68,370,24.511
+68,371,26.7758333333333
+68,372,29.8661666666667
+68,373,34.7345
+68,374,30.1413333333333
+68,375,27.9823333333333
+68,376,28.7231666666667
+68,377,26.8393333333333
+68,378,36.0891666666667
+68,379,25.4635
+68,380,22.6483333333333
+68,381,29.718
+68,382,24.2781666666667
+68,383,31.877
+68,384,34.4381666666667
+68,385,32.639
+68,386,29.9508333333333
+68,387,31.3478333333333
+68,388,30.6705
+68,389,38.3328333333333
+68,390,30.7763333333333
+68,391,31.5595
+68,392,29.7603333333333
+68,393,27.2415
+68,394,29.6545
+68,395,30.1625
+68,396,28.9348333333333
+68,397,29.1888333333333
+68,398,25.8445
+68,399,28.9136666666667
+68,400,23.9395
+68,401,32.766
+68,402,31.1573333333333
+68,403,30.861
+68,404,30.1201666666667
+68,405,30.7763333333333
+68,406,33.0623333333333
+68,407,37.5073333333333
+68,408,26.162
+68,409,33.2951666666667
+68,410,34.8191666666667
+68,411,26.5006666666667
+68,412,34.0783333333333
+68,413,27.4743333333333
+68,414,29.464
+68,415,34.3535
+68,416,31.0938333333333
+68,417,29.6968333333333
+68,418,36.703
+68,419,25.6116666666667
+68,420,30.4588333333333
+68,421,26.0138333333333
+68,422,33.3163333333333
+68,423,30.3953333333333
+68,424,27.9188333333333
+68,425,34.3958333333333
+68,426,29.4851666666667
+68,427,28.4268333333333
+68,428,31.4113333333333
+68,429,27.2626666666667
+68,430,31.242
+68,431,26.2678333333333
+68,432,28.9348333333333
+68,433,32.7871666666667
+68,434,36.83
+68,435,21.717
+68,436,32.0886666666667
+68,437,33.4221666666667
+68,438,28.321
+68,439,35.4118333333333
+68,440,31.0091666666667
+68,441,31.5171666666667
+68,442,35.3483333333333
+68,443,27.559
+68,444,32.1733333333333
+68,445,32.3638333333333
+68,446,32.3003333333333
+68,447,34.8403333333333
+68,448,35.8563333333333
+68,449,33.02
+68,450,25.3153333333333
+68,451,30.3741666666667
+68,452,35.7293333333333
+68,453,31.0303333333333
+68,454,27.7283333333333
+68,455,28.0881666666667
+68,456,30.7128333333333
+68,457,23.7701666666667
+68,458,34.3323333333333
+68,459,26.1831666666667
+68,460,30.3741666666667
+68,461,31.2631666666667
+68,462,33.4645
+68,463,31.2208333333333
+68,464,27.3685
+68,465,30.2895
+68,466,31.369
+68,467,29.2735
+68,468,28.2151666666667
+68,469,30.099
+68,470,26.797
+68,471,30.0566666666667
+68,472,29.6756666666667
+68,473,32.9988333333333
+68,474,31.4113333333333
+68,475,36.6183333333333
+68,476,30.607
+68,477,34.4381666666667
+68,478,34.163
+68,479,31.7923333333333
+68,480,29.9508333333333
+68,481,29.1676666666667
+68,482,26.0773333333333
+68,483,31.496
+68,484,31.3901666666667
+68,485,29.9296666666667
+68,486,24.638
+68,487,34.2688333333333
+68,488,29.0406666666667
+68,489,25.6328333333333
+68,490,27.0298333333333
+68,491,34.2688333333333
+68,492,23.6643333333333
+68,493,27.432
+68,494,30.6493333333333
+68,495,33.4645
+68,496,34.7556666666667
+68,497,29.5063333333333
+68,498,30.099
+68,499,31.877
+68,500,34.9038333333333
+68,501,32.0251666666667
+68,502,33.2105
+68,503,27.0086666666667
+68,504,24.7438333333333
+68,505,28.5961666666667
+68,506,28.5538333333333
+68,507,30.4165
+68,508,33.8243333333333
+68,509,32.1945
+68,510,26.9663333333333
+68,511,20.066
+68,512,26.1831666666667
+68,513,28.5538333333333
+68,514,32.6178333333333
+68,515,26.8816666666667
+68,516,26.797
+68,517,30.099
+68,518,22.606
+68,519,28.3845
+68,520,28.829
+68,521,29.3793333333333
+68,522,34.9038333333333
+68,523,29.6545
+68,524,30.861
+68,525,26.9875
+68,526,30.2895
+68,527,33.909
+68,528,32.9776666666667
+68,529,19.4098333333333
+68,530,33.3586666666667
+68,531,30.1201666666667
+68,532,31.4325
+68,533,27.8976666666667
+68,534,33.9301666666667
+68,535,22.1191666666667
+68,536,32.639
+68,537,35.1366666666667
+68,538,30.099
+68,539,32.5543333333333
+68,540,24.7015
+68,541,30.5858333333333
+68,542,26.1196666666667
+68,543,26.9028333333333
+68,544,33.7185
+68,545,26.0138333333333
+68,546,29.972
+68,547,34.29
+68,548,33.1681666666667
+68,549,29.972
+68,550,43.0953333333333
+68,551,34.2476666666667
+68,552,27.5166666666667
+68,553,31.6653333333333
+68,554,26.3736666666667
+68,555,36.322
+68,556,27.2203333333333
+68,557,25.146
+68,558,32.6178333333333
+68,559,30.6916666666667
+68,560,30.861
+68,561,23.0928333333333
+68,562,24.8708333333333
+68,563,25.3576666666667
+68,564,28.7655
+68,565,31.9616666666667
+68,566,25.146
+68,567,28.0035
+68,568,25.7386666666667
+68,569,33.6973333333333
+68,570,27.8765
+68,571,26.289
+68,572,33.2316666666667
+68,573,31.877
+68,574,28.7655
+68,575,30.099
+68,576,28.321
+68,577,27.686
+68,578,29.6756666666667
+68,579,32.2156666666667
+68,580,28.3845
+68,581,25.7598333333333
+68,582,27.4955
+68,583,33.8666666666667
+68,584,24.892
+68,585,36.6395
+68,586,34.8191666666667
+68,587,36.4701666666667
+68,588,33.6338333333333
+68,589,33.3163333333333
+68,590,32.8718333333333
+68,591,32.0886666666667
+68,592,31.5806666666667
+68,593,30.2048333333333
+68,594,30.4588333333333
+68,595,30.607
+68,596,35.4965
+68,597,35.8775
+68,598,32.5755
+68,599,24.9555
+68,600,31.5595
+68,601,29.6333333333333
+68,602,29.1676666666667
+68,603,27.3685
+68,604,31.8135
+68,605,29.5486666666667
+68,606,27.9188333333333
+68,607,35.4541666666667
+68,608,30.6705
+68,609,33.909
+68,610,26.1408333333333
+68,611,32.4908333333333
+68,612,28.702
+68,613,35.9621666666667
+68,614,25.654
+68,615,22.7965
+68,616,33.8878333333333
+68,617,35.5811666666667
+68,618,35.5176666666667
+68,619,36.6183333333333
+68,620,32.1945
+68,621,32.1521666666667
+68,622,32.4273333333333
+68,623,24.1511666666667
+68,624,32.4696666666667
+68,625,27.4531666666667
+68,626,26.5006666666667
+68,627,25.4211666666667
+68,628,23.5796666666667
+68,629,31.0515
+68,630,37.0628333333333
+68,631,27.5166666666667
+68,632,37.084
+68,633,29.9085
+68,634,35.56
+68,635,32.7448333333333
+68,636,32.4908333333333
+68,637,27.6013333333333
+68,638,33.8455
+68,639,34.6921666666667
+68,640,31.8346666666667
+68,641,33.8455
+68,642,28.5115
+68,643,27.1991666666667
+68,644,29.972
+68,645,35.3271666666667
+68,646,34.7133333333333
+68,647,26.1831666666667
+68,648,26.035
+68,649,34.7345
+68,650,34.7133333333333
+68,651,28.2998333333333
+68,652,26.3736666666667
+68,653,31.5383333333333
+68,654,24.3416666666667
+68,655,22.5001666666667
+68,656,28.956
+68,657,34.6075
+68,658,24.7226666666667
+68,659,31.9828333333333
+68,660,31.6018333333333
+68,661,25.2518333333333
+68,662,30.9033333333333
+68,663,27.0086666666667
+68,664,27.9611666666667
+68,665,33.0623333333333
+68,666,30.9456666666667
+68,667,35.8986666666667
+68,668,22.8176666666667
+68,669,28.0458333333333
+68,670,28.3421666666667
+68,671,29.6756666666667
+68,672,24.4898333333333
+68,673,30.1836666666667
+68,674,35.9833333333333
+68,675,35.0731666666667
+68,676,30.5223333333333
+68,677,31.8558333333333
+68,678,25.5481666666667
+68,679,24.5745
+68,680,31.7288333333333
+68,681,35.1578333333333
+68,682,29.7391666666667
+68,683,31.3055
+68,684,34.8403333333333
+68,685,34.0783333333333
+68,686,32.9776666666667
+68,687,31.4113333333333
+68,688,28.2998333333333
+68,689,22.352
+68,690,35.2001666666667
+68,691,30.5646666666667
+68,692,32.4696666666667
+68,693,24.4475
+68,694,32.766
+68,695,34.0783333333333
+68,696,30.5223333333333
+68,697,33.3586666666667
+68,698,30.0143333333333
+68,699,28.2998333333333
+68,700,34.8615
+68,701,29.972
+68,702,29.6968333333333
+68,703,31.5383333333333
+68,704,26.3101666666667
+68,705,35.5811666666667
+68,706,31.8346666666667
+68,707,34.6075
+68,708,28.9348333333333
+68,709,34.6286666666667
+68,710,27.2838333333333
+68,711,33.782
+68,712,23.114
+68,713,35.6235
+68,714,37.4861666666667
+68,715,32.0251666666667
+68,716,29.2735
+68,717,36.2585
+68,718,27.6013333333333
+68,719,31.2208333333333
+68,720,27.9823333333333
+68,721,31.115
+68,722,33.1258333333333
+68,723,20.4893333333333
+68,724,29.0618333333333
+68,725,26.2466666666667
+68,726,25.6116666666667
+68,727,27.9823333333333
+68,728,32.1733333333333
+68,729,30.5858333333333
+68,730,31.2208333333333
+68,731,34.9885
+68,732,26.9028333333333
+68,733,38.9466666666667
+68,734,30.6493333333333
+68,735,22.5213333333333
+68,736,33.3375
+68,737,27.9611666666667
+68,738,22.8176666666667
+68,739,33.6973333333333
+68,740,32.004
+68,741,22.7118333333333
+68,742,27.0298333333333
+68,743,28.6173333333333
+68,744,27.6013333333333
+68,745,31.242
+68,746,27.4531666666667
+68,747,26.4583333333333
+68,748,37.9095
+68,749,31.4748333333333
+68,750,22.8811666666667
+68,751,28.2575
+68,752,32.3638333333333
+68,753,28.4691666666667
+68,754,36.2161666666667
+68,755,29.972
+68,756,25.9715
+68,757,29.4005
+68,758,28.3633333333333
+68,759,36.5125
+68,760,32.1733333333333
+68,761,29.8026666666667
+68,762,32.0675
+68,763,27.4955
+68,764,30.3318333333333
+68,765,32.9565
+68,766,30.2683333333333
+68,767,33.147
+68,768,26.543
+68,769,39.0101666666667
+68,770,33.655
+68,771,31.8135
+68,772,35.3271666666667
+68,773,35.7293333333333
+68,774,34.2265
+68,775,27.432
+68,776,30.5011666666667
+68,777,31.242
+68,778,34.3958333333333
+68,779,27.051
+68,780,29.337
+68,781,26.0561666666667
+68,782,34.29
+68,783,28.7443333333333
+68,784,36.9146666666667
+68,785,26.3948333333333
+68,786,27.9611666666667
+68,787,27.7495
+68,788,26.2678333333333
+68,789,27.8765
+68,790,30.2471666666667
+68,791,29.1888333333333
+68,792,31.0726666666667
+68,793,24.7015
+68,794,36.1526666666667
+68,795,27.2203333333333
+68,796,28.2998333333333
+68,797,31.0091666666667
+68,798,26.2255
+68,799,28.4268333333333
+68,800,34.7556666666667
+68,801,29.6756666666667
+68,802,27.559
+68,803,35.8775
+68,804,28.956
+68,805,27.813
+68,806,27.6013333333333
+68,807,27.8976666666667
+68,808,30.3318333333333
+68,809,23.9606666666667
+68,810,21.7593333333333
+68,811,25.7598333333333
+68,812,28.0458333333333
+68,813,35.7081666666667
+68,814,24.892
+68,815,27.8976666666667
+68,816,28.321
+68,817,28.9983333333333
+68,818,32.8295
+68,819,26.924
+68,820,30.4376666666667
+68,821,31.8135
+68,822,25.2306666666667
+68,823,32.7236666666667
+68,824,28.2151666666667
+68,825,33.3798333333333
+68,826,29.5063333333333
+68,827,33.3375
+68,828,24.1723333333333
+68,829,29.3793333333333
+68,830,26.6065
+68,831,32.1521666666667
+68,832,34.6286666666667
+68,833,33.6761666666667
+68,834,31.3055
+68,835,38.1846666666667
+68,836,28.4268333333333
+68,837,32.4273333333333
+68,838,24.3205
+68,839,30.6493333333333
+68,840,32.512
+68,841,28.2786666666667
+68,842,30.353
+68,843,29.3158333333333
+68,844,26.0773333333333
+68,845,30.8186666666667
+68,846,32.131
+68,847,40.2378333333333
+68,848,26.7758333333333
+68,849,28.5326666666667
+68,850,30.5646666666667
+68,851,28.1093333333333
+68,852,31.8135
+68,853,29.9508333333333
+68,854,27.051
+68,855,25.6116666666667
+68,856,36.449
+68,857,30.7551666666667
+68,858,26.1196666666667
+68,859,30.1413333333333
+68,860,33.5068333333333
+68,861,29.4851666666667
+68,862,25.9503333333333
+68,863,31.6441666666667
+68,864,28.5326666666667
+68,865,31.0303333333333
+68,866,29.1888333333333
+68,867,26.7123333333333
+68,868,28.8925
+68,869,34.163
+68,870,35.4118333333333
+68,871,27.1568333333333
+68,872,29.1041666666667
+68,873,30.4588333333333
+68,874,27.4955
+68,875,30.1413333333333
+68,876,25.8445
+68,877,30.8821666666667
+68,878,30.7975
+68,879,29.1465
+68,880,24.257
+68,881,30.0143333333333
+68,882,32.0463333333333
+68,883,23.368
+68,884,26.7758333333333
+68,885,26.8181666666667
+68,886,26.5641666666667
+68,887,34.7556666666667
+68,888,30.353
+68,889,24.1935
+68,890,27.8341666666667
+68,891,35.9621666666667
+68,892,36.9781666666667
+68,893,32.1733333333333
+68,894,27.7918333333333
+68,895,26.0773333333333
+68,896,33.3163333333333
+68,897,33.3798333333333
+68,898,31.7288333333333
+68,899,29.5275
+68,900,32.3003333333333
+68,901,30.3106666666667
+68,902,31.9616666666667
+68,903,28.321
+68,904,29.0618333333333
+68,905,34.2688333333333
+68,906,29.8026666666667
+68,907,31.4536666666667
+68,908,36.4701666666667
+68,909,26.3101666666667
+68,910,32.893
+68,911,28.9771666666667
+68,912,30.5858333333333
+68,913,32.766
+68,914,33.6126666666667
+68,915,35.5388333333333
+68,916,35.179
+68,917,31.3055
+68,918,30.5435
+68,919,26.1408333333333
+68,920,30.988
+68,921,28.7866666666667
+68,922,30.4588333333333
+68,923,31.75
+68,924,36.3643333333333
+68,925,24.7861666666667
+68,926,38.0153333333333
+68,927,34.9038333333333
+68,928,29.6333333333333
+68,929,31.5806666666667
+68,930,29.2735
+68,931,31.8346666666667
+68,932,31.7923333333333
+68,933,28.8078333333333
+68,934,29.1676666666667
+68,935,26.4583333333333
+68,936,29.4005
+68,937,31.4113333333333
+68,938,32.6813333333333
+68,939,29.6333333333333
+68,940,29.0618333333333
+68,941,34.2688333333333
+68,942,27.813
+68,943,30.7551666666667
+68,944,23.6643333333333
+68,945,37.1898333333333
+68,946,20.5316666666667
+68,947,29.6121666666667
+68,948,30.5858333333333
+68,949,31.7711666666667
+68,950,29.0195
+68,951,37.7825
+68,952,28.4903333333333
+68,953,31.3901666666667
+68,954,27.9188333333333
+68,955,32.2791666666667
+68,956,25.019
+68,957,31.3901666666667
+68,958,31.4748333333333
+68,959,30.3318333333333
+68,960,30.9033333333333
+68,961,28.6596666666667
+68,962,32.1733333333333
+68,963,28.702
+68,964,26.9028333333333
+68,965,35.1155
+68,966,35.3271666666667
+68,967,34.7133333333333
+68,968,26.5641666666667
+68,969,36.2161666666667
+68,970,25.8021666666667
+68,971,28.1093333333333
+68,972,36.1526666666667
+68,973,28.6385
+68,974,34.4593333333333
+68,975,28.8501666666667
+68,976,30.2471666666667
+68,977,33.4433333333333
+68,978,27.5378333333333
+68,979,26.4795
+68,980,29.2946666666667
+68,981,30.8398333333333
+68,982,29.2946666666667
+68,983,30.9668333333333
+68,984,27.9611666666667
+68,985,28.1728333333333
+68,986,33.1893333333333
+68,987,30.7763333333333
+68,988,34.5016666666667
+68,989,28.9136666666667
+68,990,32.4061666666667
+68,991,27.9823333333333
+68,992,26.2255
+68,993,29.972
+68,994,32.1098333333333
+68,995,28.2786666666667
+68,996,32.3215
+68,997,27.6013333333333
+68,998,29.8026666666667
+68,999,28.4056666666667
+68,1000,28.1516666666667
+69,1,45.3813333333333
+69,2,32.4400333333333
+69,3,30.8821666666667
+69,4,31.2885666666667
+69,5,31.4367333333333
+69,6,43.8615666666667
+69,7,35.9875666666667
+69,8,25.4211666666667
+69,9,31.3097333333333
+69,10,30.0143333333333
+69,11,32.3003333333333
+69,12,33.9132333333333
+69,13,31.0218666666667
+69,14,29.7264666666667
+69,15,33.2062666666667
+69,16,28.5115
+69,17,34.5905666666667
+69,18,40.7246666666667
+69,19,29.5148
+69,20,42.1047333333333
+69,21,23.1775
+69,22,35.2255666666667
+69,23,32.8760666666667
+69,24,21.5476666666667
+69,25,26.5260666666667
+69,26,36.9824
+69,27,35.7335666666667
+69,28,26.9875
+69,29,33.1681666666667
+69,30,34.5736333333333
+69,31,30.2556333333333
+69,32,36.6014
+69,33,34.3323333333333
+69,34,34.8911333333333
+69,35,37.8290666666667
+69,36,36.7241666666667
+69,37,46.736
+69,38,35.1959333333333
+69,39,47.6292333333333
+69,40,26.7843
+69,41,30.4884666666667
+69,42,42.6635333333333
+69,43,33.4052333333333
+69,44,30.8398333333333
+69,45,33.5999666666667
+69,46,24.9343333333333
+69,47,30.0609
+69,48,31.5933666666667
+69,49,26.162
+69,50,36.7876666666667
+69,51,31.2885666666667
+69,52,30.0609
+69,53,39.1879666666667
+69,54,22.8007333333333
+69,55,27.1187333333333
+69,56,37.5793
+69,57,29.0660666666667
+69,58,27.3515666666667
+69,59,34.1418333333333
+69,60,35.3525666666667
+69,61,28.0585333333333
+69,62,38.2312333333333
+69,63,25.7471333333333
+69,64,31.1785
+69,65,23.9395
+69,66,37.3210666666667
+69,67,24.3416666666667
+69,68,31.1615666666667
+69,69,33.9979
+69,70,35.941
+69,71,40.9151666666667
+69,72,39.8399
+69,73,31.3944
+69,74,34.4466333333333
+69,75,30.5011666666667
+69,76,39.4800666666667
+69,77,32.8083333333333
+69,78,34.3873666666667
+69,79,21.2301666666667
+69,80,34.4635666666667
+69,81,29.718
+69,82,39.1879666666667
+69,83,39.1075333333333
+69,84,26.4414
+69,85,29.7010666666667
+69,86,33.5915
+69,87,31.3901666666667
+69,88,29.9085
+69,89,34.036
+69,90,34.9673333333333
+69,91,32.9819
+69,92,33.5449333333333
+69,93,38.7561666666667
+69,94,43.3705
+69,95,36.6268
+69,96,41.6179
+69,97,34.7810666666667
+69,98,35.1832333333333
+69,99,31.7542333333333
+69,100,39.5435666666667
+69,101,35.4965
+69,102,39.497
+69,103,30.8821666666667
+69,104,36.8342333333333
+69,105,25.1121333333333
+69,106,40.3521333333333
+69,107,32.004
+69,108,36.9019666666667
+69,109,26.67
+69,110,31.8389
+69,111,30.2725666666667
+69,112,34.9927333333333
+69,113,25.2095
+69,114,28.4522333333333
+69,115,40.1616333333333
+69,116,34.1884
+69,117,30.6324
+69,118,27.9823333333333
+69,119,30.5477333333333
+69,120,38.5868333333333
+69,121,35.7505
+69,122,44.4119
+69,123,24.8158
+69,124,45.0088
+69,125,31.0938333333333
+69,126,33.02
+69,127,37.3041333333333
+69,128,40.0134666666667
+69,129,33.9132333333333
+69,130,34.0190666666667
+69,131,33.5957333333333
+69,132,33.1766333333333
+69,133,31.0557333333333
+69,134,31.9616666666667
+69,135,37.8248333333333
+69,136,41.3215666666667
+69,137,31.8262
+69,138,31.7288333333333
+69,139,33.401
+69,140,25.2137333333333
+69,141,36.7538
+69,142,33.8074
+69,143,33.0750333333333
+69,144,34.1460666666667
+69,145,31.0726666666667
+69,146,28.2363333333333
+69,147,35.2001666666667
+69,148,32.0717333333333
+69,149,31.6018333333333
+69,150,30.8186666666667
+69,151,32.7702333333333
+69,152,29.9762333333333
+69,153,38.5106333333333
+69,154,29.6756666666667
+69,155,38.7773333333333
+69,156,33.3840666666667
+69,157,32.5374
+69,158,28.7528
+69,159,37.6131666666667
+69,160,36.2288666666667
+69,161,38.4048
+69,162,46.0629
+69,163,26.6488333333333
+69,164,36.3008333333333
+69,165,42.3629666666667
+69,166,33.9005333333333
+69,167,31.1658
+69,168,35.8563333333333
+69,169,35.6065666666667
+69,170,33.2105
+69,171,37.0035666666667
+69,172,27.6902333333333
+69,173,35.0985666666667
+69,174,40.9659666666667
+69,175,30.0778333333333
+69,176,33.4306333333333
+69,177,27.0975666666667
+69,178,34.2773
+69,179,36.5548333333333
+69,180,26.6784666666667
+69,181,39.3954
+69,182,37.846
+69,183,31.9024
+69,184,28.2405666666667
+69,185,35.3949
+69,186,29.9381333333333
+69,187,38.9720666666667
+69,188,33.8539666666667
+69,189,24.0199333333333
+69,190,27.5801666666667
+69,191,27.2838333333333
+69,192,37.6936
+69,193,32.1183
+69,194,26.9155333333333
+69,195,42.6974
+69,196,30.6959
+69,197,43.2223333333333
+69,198,38.6545666666667
+69,199,40.6019
+69,200,31.2631666666667
+69,201,26.8393333333333
+69,202,36.5125
+69,203,34.2688333333333
+69,204,39.2472333333333
+69,205,28.8332333333333
+69,206,30.5858333333333
+69,207,33.5110666666667
+69,208,35.0139
+69,209,25.273
+69,210,28.2617333333333
+69,211,37.9349
+69,212,29.6587333333333
+69,213,32.3426666666667
+69,214,33.4645
+69,215,31.4833
+69,216,31.8346666666667
+69,217,26.6149666666667
+69,218,27.7283333333333
+69,219,36.3431666666667
+69,220,32.0463333333333
+69,221,34.4678
+69,222,31.6060666666667
+69,223,18.7113333333333
+69,224,29.5613666666667
+69,225,40.2886333333333
+69,226,28.6173333333333
+69,227,40.8516666666667
+69,228,35.1620666666667
+69,229,38.4005666666667
+69,230,42.4857333333333
+69,231,30.5858333333333
+69,232,39.1202333333333
+69,233,24.7480666666667
+69,234,26.5049
+69,235,36.7665
+69,236,34.4635666666667
+69,237,36.7495666666667
+69,238,35.6319666666667
+69,239,33.9725
+69,240,39.9669
+69,241,24.4686666666667
+69,242,39.2006666666667
+69,243,31.8389
+69,244,28.0331333333333
+69,245,34.4805
+69,246,28.0289
+69,247,38.989
+69,248,33.7015666666667
+69,249,38.5275666666667
+69,250,29.5148
+69,251,33.1681666666667
+69,252,38.1465666666667
+69,253,30.0566666666667
+69,254,25.5693333333333
+69,255,28.956
+69,256,30.6705
+69,257,27.6013333333333
+69,258,23.6855
+69,259,23.3087333333333
+69,260,35.1409
+69,261,34.0233
+69,262,32.0505666666667
+69,263,24.0453333333333
+69,264,34.6540666666667
+69,265,29.7603333333333
+69,266,43.6710666666667
+69,267,37.7232333333333
+69,268,30.7890333333333
+69,269,30.5011666666667
+69,270,34.7810666666667
+69,271,38.9593666666667
+69,272,29.4216666666667
+69,273,30.8229
+69,274,31.4833
+69,275,33.5364666666667
+69,276,32.7109666666667
+69,277,40.5553333333333
+69,278,37.3041333333333
+69,279,45.0723
+69,280,25.3873
+69,281,26.2509
+69,282,29.7010666666667
+69,283,28.3845
+69,284,29.0660666666667
+69,285,34.5270666666667
+69,286,37.4904
+69,287,36.3093
+69,288,43.6329666666667
+69,289,31.0769
+69,290,33.0030666666667
+69,291,30.8017333333333
+69,292,27.3727333333333
+69,293,37.3253
+69,294,37.3803333333333
+69,295,39.0990666666667
+69,296,44.4627
+69,297,34.0995
+69,298,36.3685666666667
+69,299,38.9678333333333
+69,300,34.6075
+69,301,29.4343666666667
+69,302,21.5688333333333
+69,303,45.3474666666667
+69,304,36.5209666666667
+69,305,29.7603333333333
+69,306,34.5482333333333
+69,307,33.0073
+69,308,40.6823333333333
+69,309,44.2849
+69,310,27.7325666666667
+69,311,29.5359666666667
+69,312,31.0515
+69,313,42.5704
+69,314,24.8962333333333
+69,315,41.8380333333333
+69,316,34.7853
+69,317,28.9179
+69,318,31.5468
+69,319,26.8647333333333
+69,320,27.6733
+69,321,30.9964666666667
+69,322,41.2877
+69,323,28.4691666666667
+69,324,38.0365
+69,325,28.8967333333333
+69,326,35.5896333333333
+69,327,34.9504
+69,328,39.6536333333333
+69,329,29.2142333333333
+69,330,31.0134
+69,331,49.6612333333333
+69,332,32.766
+69,333,33.5110666666667
+69,334,25.4042333333333
+69,335,39.3065
+69,336,33.0030666666667
+69,337,29.3158333333333
+69,338,31.0134
+69,339,38.0619
+69,340,37.1729
+69,341,35.9621666666667
+69,342,33.8920666666667
+69,343,30.48
+69,344,31.115
+69,345,36.4363
+69,346,38.1254
+69,347,32.258
+69,348,38.0238
+69,349,32.7067333333333
+69,350,33.4560333333333
+69,351,35.7801333333333
+69,352,38.0026333333333
+69,353,31.2081333333333
+69,354,33.5364666666667
+69,355,28.5326666666667
+69,356,30.4419
+69,357,30.1032333333333
+69,358,24.9851333333333
+69,359,30.4630666666667
+69,360,29.4301333333333
+69,361,24.8708333333333
+69,362,29.4936333333333
+69,363,32.4104
+69,364,25.8868333333333
+69,365,31.2250666666667
+69,366,36.2585
+69,367,38.3836333333333
+69,368,28.956
+69,369,23.3764666666667
+69,370,36.5336666666667
+69,371,33.0623333333333
+69,372,35.8732666666667
+69,373,35.306
+69,374,27.4785666666667
+69,375,32.8295
+69,376,43.1165
+69,377,32.4061666666667
+69,378,30.6493333333333
+69,379,36.322
+69,380,22.9489
+69,381,36.8342333333333
+69,382,31.6865
+69,383,29.0195
+69,384,28.9771666666667
+69,385,34.4212333333333
+69,386,35.9198333333333
+69,387,32.3299666666667
+69,388,32.7109666666667
+69,389,31.2801
+69,390,42.4391666666667
+69,391,31.4536666666667
+69,392,36.6395
+69,393,32.3088
+69,394,37.1771333333333
+69,395,34.8403333333333
+69,396,34.2265
+69,397,35.5388333333333
+69,398,33.2570666666667
+69,399,27.3092333333333
+69,400,37.3210666666667
+69,401,40.0558
+69,402,23.7320666666667
+69,403,26.6488333333333
+69,404,40.4114
+69,405,35.1366666666667
+69,406,28.8713333333333
+69,407,25.1544666666667
+69,408,34.0825666666667
+69,409,31.496
+69,410,40.3944666666667
+69,411,36.1823
+69,412,37.9349
+69,413,45.4321333333333
+69,414,25.527
+69,415,24.5364
+69,416,34.5186
+69,417,28.7274
+69,418,30.5646666666667
+69,419,33.4645
+69,420,28.1770666666667
+69,421,32.9776666666667
+69,422,40.5765
+69,423,32.1394666666667
+69,424,39.2895666666667
+69,425,31.0303333333333
+69,426,29.6333333333333
+69,427,40.9151666666667
+69,428,24.9343333333333
+69,429,45.6903666666667
+69,430,34.5355333333333
+69,431,26.1704666666667
+69,432,38.2566333333333
+69,433,39.7594666666667
+69,434,33.0454
+69,435,36.0299
+69,436,41.6856333333333
+69,437,28.321
+69,438,27.9442333333333
+69,439,37.7825
+69,440,33.2782333333333
+69,441,31.6907333333333
+69,442,26.1450666666667
+69,443,30.2471666666667
+69,444,33.6846333333333
+69,445,26.3313333333333
+69,446,41.8465
+69,447,26.5218333333333
+69,448,35.2001666666667
+69,449,31.369
+69,450,31.6695666666667
+69,451,39.9245666666667
+69,452,32.9819
+69,453,33.1258333333333
+69,454,37.3676333333333
+69,455,31.0769
+69,456,41.9354
+69,457,29.6968333333333
+69,458,37.9137333333333
+69,459,34.0825666666667
+69,460,30.988
+69,461,28.6469666666667
+69,462,36.8723333333333
+69,463,38.6926666666667
+69,464,30.9583666666667
+69,465,34.3746666666667
+69,466,34.8022333333333
+69,467,30.5011666666667
+69,468,43.053
+69,469,44.1240333333333
+69,470,30.3741666666667
+69,471,32.7490666666667
+69,472,30.1667333333333
+69,473,27.0340666666667
+69,474,32.131
+69,475,29.8026666666667
+69,476,32.1775666666667
+69,477,39.3996333333333
+69,478,34.9715666666667
+69,479,34.6117333333333
+69,480,29.7434
+69,481,38.6545666666667
+69,482,27.8003
+69,483,35.687
+69,484,31.0303333333333
+69,485,33.3840666666667
+69,486,37.2956666666667
+69,487,29.0449
+69,488,28.1728333333333
+69,489,30.4884666666667
+69,490,29.8873333333333
+69,491,32.4485
+69,492,34.3111666666667
+69,493,28.956
+69,494,38.7604
+69,495,25.4254
+69,496,28.5411333333333
+69,497,29.6037
+69,498,30.9075666666667
+69,499,23.1986666666667
+69,500,28.5538333333333
+69,501,28.8713333333333
+69,502,47.9890666666667
+69,503,31.6653333333333
+69,504,30.6112333333333
+69,505,31.5806666666667
+69,506,30.734
+69,507,33.8582
+69,508,29.0660666666667
+69,509,25.5566333333333
+69,510,34.0614
+69,511,27.3685
+69,512,40.2209
+69,513,36.7792
+69,514,38.2693333333333
+69,515,34.0190666666667
+69,516,25.2941666666667
+69,517,34.4678
+69,518,27.8849666666667
+69,519,31.6272333333333
+69,520,41.6602333333333
+69,521,26.6996333333333
+69,522,32.9226333333333
+69,523,35.1832333333333
+69,524,21.3190666666667
+69,525,30.2344666666667
+69,526,28.194
+69,527,36.2373333333333
+69,528,31.9616666666667
+69,529,31.2081333333333
+69,530,28.3040666666667
+69,531,33.1893333333333
+69,532,39.5224
+69,533,30.9668333333333
+69,534,36.3304666666667
+69,535,36.7072333333333
+69,536,36.7114666666667
+69,537,35.9875666666667
+69,538,30.1540333333333
+69,539,45.6141666666667
+69,540,28.2194
+69,541,38.4937
+69,542,36.1992333333333
+69,543,38.5021666666667
+69,544,38.3582333333333
+69,545,39.5901333333333
+69,546,27.7537333333333
+69,547,31.6653333333333
+69,548,31.9405
+69,549,28.0458333333333
+69,550,32.2199
+69,551,31.5637333333333
+69,552,36.7665
+69,553,23.6304666666667
+69,554,37.3083666666667
+69,555,28.7274
+69,556,28.6215666666667
+69,557,36.4278333333333
+69,558,30.7001333333333
+69,559,37.1305666666667
+69,560,24.3247333333333
+69,561,29.2523333333333
+69,562,37.2787333333333
+69,563,34.3323333333333
+69,564,31.7288333333333
+69,565,29.5486666666667
+69,566,29.5063333333333
+69,567,29.2354
+69,568,30.2302333333333
+69,569,33.0877333333333
+69,570,41.91
+69,571,28.5369
+69,572,35.5473
+69,573,31.115
+69,574,29.8492333333333
+69,575,33.401
+69,576,30.3953333333333
+69,577,24.2612333333333
+69,578,30.8229
+69,579,34.0021333333333
+69,580,36.9824
+69,581,34.3111666666667
+69,582,35.3314
+69,583,31.5849
+69,584,36.4363
+69,585,39.1795
+69,586,24.5152333333333
+69,587,39.8568333333333
+69,588,40.0896666666667
+69,589,31.2674
+69,590,34.8022333333333
+69,591,39.5605
+69,592,34.1291333333333
+69,593,29.8534666666667
+69,594,42.3502666666667
+69,595,45.3898
+69,596,39.3065
+69,597,34.8615
+69,598,34.0783333333333
+69,599,30.8186666666667
+69,600,27.432
+69,601,37.9518333333333
+69,602,34.7218
+69,603,29.5148
+69,604,32.3934666666667
+69,605,31.0515
+69,606,34.3365666666667
+69,607,31.2039
+69,608,34.9292333333333
+69,609,34.0021333333333
+69,610,35.6446666666667
+69,611,34.7387333333333
+69,612,34.3027
+69,613,35.2255666666667
+69,614,22.225
+69,615,38.4513666666667
+69,616,25.5693333333333
+69,617,40.5341666666667
+69,618,41.6390666666667
+69,619,34.0656333333333
+69,620,42.2105666666667
+69,621,39.0736666666667
+69,622,27.0764
+69,623,43.434
+69,624,32.8506666666667
+69,625,23.7532333333333
+69,626,35.3314
+69,627,32.5374
+69,628,31.1615666666667
+69,629,35.1451333333333
+69,630,29.5486666666667
+69,631,33.3586666666667
+69,632,31.1192333333333
+69,633,30.226
+69,634,35.179
+69,635,32.385
+69,636,28.9644666666667
+69,637,26.8901333333333
+69,638,32.2791666666667
+69,639,27.4997333333333
+69,640,31.3309
+69,641,36.5548333333333
+69,642,36.4278333333333
+69,643,30.7975
+69,644,31.0345666666667
+69,645,25.527
+69,646,33.5068333333333
+69,647,33.9598
+69,648,27.8976666666667
+69,649,37.8671666666667
+69,650,27.4404666666667
+69,651,38.1465666666667
+69,652,39.5224
+69,653,29.4259
+69,654,31.2462333333333
+69,655,29.4005
+69,656,34.9292333333333
+69,657,40.6865666666667
+69,658,38.6291666666667
+69,659,27.4362333333333
+69,660,45.2374
+69,661,34.2561333333333
+69,662,37.9772333333333
+69,663,35.1705333333333
+69,664,34.4212333333333
+69,665,30.607
+69,666,33.0454
+69,667,34.0783333333333
+69,668,37.8290666666667
+69,669,30.1074666666667
+69,670,38.6715
+69,671,38.481
+69,672,32.1521666666667
+69,673,25.0867333333333
+69,674,40.1785666666667
+69,675,32.3638333333333
+69,676,31.7288333333333
+69,677,34.6329
+69,678,30.1836666666667
+69,679,35.8817333333333
+69,680,25.4254
+69,681,33.8963
+69,682,28.6258
+69,683,31.3563
+69,684,29.2989
+69,685,28.6427333333333
+69,686,20.6205666666667
+69,687,30.2895
+69,688,28.3887333333333
+69,689,29.7857333333333
+69,690,25.019
+69,691,34.6752333333333
+69,692,34.6583
+69,693,36.1315
+69,694,34.671
+69,695,34.9334666666667
+69,696,38.0619
+69,697,33.1046666666667
+69,698,36.1569
+69,699,34.3958333333333
+69,700,28.956
+69,701,31.1658
+69,702,37.8883333333333
+69,703,30.5477333333333
+69,704,26.1281333333333
+69,705,31.2250666666667
+69,706,32.7236666666667
+69,707,30.9753
+69,708,29.4005
+69,709,39.3488333333333
+69,710,41.6602333333333
+69,711,27.4150666666667
+69,712,29.6799
+69,713,31.8389
+69,714,26.6742333333333
+69,715,33.4645
+69,716,37.4226666666667
+69,717,31.9532
+69,718,29.9974
+69,719,23.6431666666667
+69,720,25.5693333333333
+69,721,34.3154
+69,722,27.4743333333333
+69,723,39.5689666666667
+69,724,26.1704666666667
+69,725,40.5807333333333
+69,726,27.4447
+69,727,43.0995666666667
+69,728,43.4636333333333
+69,729,33.1724
+69,730,32.2834
+69,731,39.9880666666667
+69,732,32.5670333333333
+69,733,38.5021666666667
+69,734,27.6055666666667
+69,735,34.5948
+69,736,37.8375333333333
+69,737,28.9348333333333
+69,738,34.0995
+69,739,29.9762333333333
+69,740,46.7656333333333
+69,741,33.6338333333333
+69,742,27.1610666666667
+69,743,34.9927333333333
+69,744,33.0835
+69,745,34.925
+69,746,31.3097333333333
+69,747,42.1005
+69,748,36.0764666666667
+69,749,33.5915
+69,750,35.6531333333333
+69,751,40.0304
+69,752,38.2566333333333
+69,753,29.4047333333333
+69,754,38.7307666666667
+69,755,34.8615
+69,756,42.2317333333333
+69,757,24.5533333333333
+69,758,26.1874
+69,759,31.8346666666667
+69,760,33.0454
+69,761,29.0660666666667
+69,762,30.6747333333333
+69,763,34.163
+69,764,39.6494
+69,765,34.2053333333333
+69,766,27.5801666666667
+69,767,35.3102333333333
+69,768,28.7231666666667
+69,769,40.4114
+69,770,33.5576333333333
+69,771,29.8111333333333
+69,772,26.8054666666667
+69,773,35.2679
+69,774,33.1512333333333
+69,775,30.7551666666667
+69,776,34.4678
+69,777,33.6634666666667
+69,778,43.561
+69,779,30.9456666666667
+69,780,26.7165666666667
+69,781,33.2062666666667
+69,782,43.9293
+69,783,30.5731333333333
+69,784,37.7486333333333
+69,785,29.8661666666667
+69,786,38.6122333333333
+69,787,26.9748
+69,788,31.2885666666667
+69,789,23.8844666666667
+69,790,21.5053333333333
+69,791,32.8760666666667
+69,792,30.0778333333333
+69,793,30.2683333333333
+69,794,46.7021333333333
+69,795,31.5002333333333
+69,796,39.6917333333333
+69,797,40.7289
+69,798,34.544
+69,799,35.4541666666667
+69,800,25.8529666666667
+69,801,34.7133333333333
+69,802,30.8864
+69,803,29.3624
+69,804,36.1230333333333
+69,805,34.6625333333333
+69,806,28.2617333333333
+69,807,32.4104
+69,808,41.5967333333333
+69,809,34.6159666666667
+69,810,34.4593333333333
+69,811,36.3685666666667
+69,812,35.2679
+69,813,34.1884
+69,814,50.4486333333333
+69,815,34.3154
+69,816,35.2255666666667
+69,817,35.1832333333333
+69,818,23.5585
+69,819,44.4965666666667
+69,820,26.6954
+69,821,32.2156666666667
+69,822,34.6921666666667
+69,823,33.5491666666667
+69,824,39.8399
+69,825,37.4692333333333
+69,826,25.3449666666667
+69,827,35.6489
+69,828,36.83
+69,829,39.6663333333333
+69,830,28.3040666666667
+69,831,40.6865666666667
+69,832,26.0985
+69,833,32.131
+69,834,39.8653
+69,835,38.3963333333333
+69,836,32.4781333333333
+69,837,34.6286666666667
+69,838,38.9763
+69,839,31.6441666666667
+69,840,27.1356666666667
+69,841,32.2241333333333
+69,842,31.1361666666667
+69,843,39.0779
+69,844,34.6921666666667
+69,845,43.8615666666667
+69,846,24.5321666666667
+69,847,29.0025666666667
+69,848,34.1926333333333
+69,849,30.5054
+69,850,22.3562333333333
+69,851,39.3996333333333
+69,852,35.3314
+69,853,36.9400666666667
+69,854,37.7232333333333
+69,855,35.7928333333333
+69,856,41.2199666666667
+69,857,25.6836333333333
+69,858,26.8605
+69,859,34.6371333333333
+69,860,38.2693333333333
+69,861,42.3375666666667
+69,862,36.6183333333333
+69,863,34.7514333333333
+69,864,36.957
+69,865,38.7223
+69,866,35.3398666666667
+69,867,23.6643333333333
+69,868,30.2937333333333
+69,869,33.3417333333333
+69,870,43.4128333333333
+69,871,27.9103666666667
+69,872,34.3323333333333
+69,873,28.6173333333333
+69,874,25.5524
+69,875,36.4744
+69,876,30.861
+69,877,24.9385666666667
+69,878,35.052
+69,879,26.8605
+69,880,39.0567333333333
+69,881,32.9649666666667
+69,882,29.1930666666667
+69,883,35.5473
+69,884,31.6653333333333
+69,885,39.2091333333333
+69,886,30.5011666666667
+69,887,35.0562333333333
+69,888,32.4908333333333
+69,889,29.3158333333333
+69,890,29.7434
+69,891,34.5270666666667
+69,892,34.0402333333333
+69,893,38.3963333333333
+69,894,37.1051666666667
+69,895,36.7495666666667
+69,896,39.7171333333333
+69,897,30.9245
+69,898,35.7632
+69,899,29.4851666666667
+69,900,28.7655
+69,901,44.2595
+69,902,35.7801333333333
+69,903,34.5059
+69,904,24.1130666666667
+69,905,29.2735
+69,906,37.6385666666667
+69,907,34.5736333333333
+69,908,32.8083333333333
+69,909,34.5567
+69,910,38.8874
+69,911,23.9860666666667
+69,912,32.7533
+69,913,33.9809666666667
+69,914,27.6521333333333
+69,915,30.3149
+69,916,29.9974
+69,917,41.021
+69,918,32.5374
+69,919,34.6117333333333
+69,920,34.2307333333333
+69,921,34.8445666666667
+69,922,37.1094
+69,923,39.8568333333333
+69,924,33.3417333333333
+69,925,37.3591666666667
+69,926,35.6319666666667
+69,927,32.1818
+69,928,32.6051333333333
+69,929,25.0655666666667
+69,930,31.3901666666667
+69,931,40.6865666666667
+69,932,33.8328
+69,933,32.4315666666667
+69,934,34.5651666666667
+69,935,33.8497333333333
+69,936,34.1249
+69,937,41.2199666666667
+69,938,30.4927
+69,939,43.4382333333333
+69,940,25.5735666666667
+69,941,27.8384
+69,942,24.5829666666667
+69,943,33.8285666666667
+69,944,44.7548
+69,945,38.1254
+69,946,33.7227333333333
+69,947,26.1281333333333
+69,948,32.7871666666667
+69,949,28.2405666666667
+69,950,23.0759
+69,951,35.941
+69,952,39.4546666666667
+69,953,38.2524
+69,954,33.5364666666667
+69,955,35.1874666666667
+69,956,28.4268333333333
+69,957,28.8713333333333
+69,958,32.4696666666667
+69,959,26.8647333333333
+69,960,34.29
+69,961,39.2895666666667
+69,962,35.8817333333333
+69,963,36.0045
+69,964,33.1300666666667
+69,965,29.4682333333333
+69,966,31.6865
+69,967,32.0675
+69,968,32.131
+69,969,37.4311333333333
+69,970,29.1507333333333
+69,971,32.4358
+69,972,37.0247333333333
+69,973,28.6723666666667
+69,974,29.5698333333333
+69,975,39.9669
+69,976,44.9664666666667
+69,977,37.1390333333333
+69,978,39.2176
+69,979,36.8808
+69,980,22.4874666666667
+69,981,33.8285666666667
+69,982,34.0614
+69,983,33.6126666666667
+69,984,29.6545
+69,985,35.9537
+69,986,29.5063333333333
+69,987,34.7429666666667
+69,988,31.6865
+69,989,30.8398333333333
+69,990,30.7763333333333
+69,991,34.7429666666667
+69,992,35.5684666666667
+69,993,36.2246333333333
+69,994,40.4071666666667
+69,995,32.9776666666667
+69,996,33.9936666666667
+69,997,40.1574
+69,998,31.9828333333333
+69,999,31.7584666666667
+69,1000,31.2885666666667
+70,1,29.337
+70,2,22.8388333333333
+70,3,36.83
+70,4,34.0783333333333
+70,5,30.988
+70,6,28.9136666666667
+70,7,26.2255
+70,8,32.9353333333333
+70,9,37.2956666666667
+70,10,34.9885
+70,11,36.576
+70,12,30.9245
+70,13,29.8238333333333
+70,14,32.9141666666667
+70,15,32.4696666666667
+70,16,32.8295
+70,17,33.0835
+70,18,35.0943333333333
+70,19,28.1305
+70,20,36.8511666666667
+70,21,32.512
+70,22,34.8826666666667
+70,23,30.4588333333333
+70,24,32.893
+70,25,32.8506666666667
+70,26,32.385
+70,27,31.877
+70,28,29.8661666666667
+70,29,31.1785
+70,30,29.5486666666667
+70,31,28.956
+70,32,34.798
+70,33,31.369
+70,34,29.0618333333333
+70,35,37.6766666666667
+70,36,31.7923333333333
+70,37,33.401
+70,38,28.8501666666667
+70,39,32.0886666666667
+70,40,35.6658333333333
+70,41,28.4903333333333
+70,42,41.3173333333333
+70,43,29.083
+70,44,36.4913333333333
+70,45,32.3003333333333
+70,46,25.6963333333333
+70,47,39.3065
+70,48,34.2476666666667
+70,49,37.0628333333333
+70,50,31.5806666666667
+70,51,33.3586666666667
+70,52,33.5703333333333
+70,53,34.417
+70,54,37.5708333333333
+70,55,29.8238333333333
+70,56,35.8775
+70,57,27.3685
+70,58,35.1578333333333
+70,59,27.4531666666667
+70,60,33.9513333333333
+70,61,33.2528333333333
+70,62,36.3643333333333
+70,63,28.9771666666667
+70,64,40.64
+70,65,31.2208333333333
+70,66,35.9621666666667
+70,67,33.02
+70,68,32.4908333333333
+70,69,33.9725
+70,70,30.5435
+70,71,26.7546666666667
+70,72,35.7081666666667
+70,73,31.2843333333333
+70,74,33.6973333333333
+70,75,33.528
+70,76,24.2358333333333
+70,77,31.6653333333333
+70,78,34.9885
+70,79,28.1516666666667
+70,80,32.2156666666667
+70,81,36.6606666666667
+70,82,36.2585
+70,83,32.7236666666667
+70,84,33.8666666666667
+70,85,30.3106666666667
+70,86,35.6023333333333
+70,87,37.9306666666667
+70,88,33.2316666666667
+70,89,27.432
+70,90,32.6601666666667
+70,91,39.5393333333333
+70,92,29.845
+70,93,31.496
+70,94,29.6545
+70,95,34.4593333333333
+70,96,32.5966666666667
+70,97,34.4593333333333
+70,98,30.226
+70,99,27.1568333333333
+70,100,35.7081666666667
+70,101,35.7928333333333
+70,102,30.0143333333333
+70,103,31.496
+70,104,37.211
+70,105,29.6968333333333
+70,106,39.7298333333333
+70,107,30.099
+70,108,28.9771666666667
+70,109,30.226
+70,110,33.4645
+70,111,30.8821666666667
+70,112,40.0473333333333
+70,113,27.9188333333333
+70,114,29.8238333333333
+70,115,36.6395
+70,116,36.6183333333333
+70,117,33.2528333333333
+70,118,35.2636666666667
+70,119,36.5971666666667
+70,120,27.686
+70,121,38.1635
+70,122,32.639
+70,123,32.004
+70,124,34.2265
+70,125,34.3535
+70,126,32.9988333333333
+70,127,31.3055
+70,128,31.7711666666667
+70,129,41.4231666666667
+70,130,29.21
+70,131,26.4371666666667
+70,132,32.131
+70,133,32.5966666666667
+70,134,30.988
+70,135,38.3963333333333
+70,136,26.0138333333333
+70,137,30.2471666666667
+70,138,27.8976666666667
+70,139,26.924
+70,140,38.1
+70,141,27.7706666666667
+70,142,27.6648333333333
+70,143,32.0886666666667
+70,144,31.9405
+70,145,28.9136666666667
+70,146,35.2636666666667
+70,147,37.8671666666667
+70,148,42.545
+70,149,27.9611666666667
+70,150,32.1945
+70,151,36.9781666666667
+70,152,37.1051666666667
+70,153,34.6921666666667
+70,154,28.4268333333333
+70,155,40.4495
+70,156,33.147
+70,157,33.909
+70,158,32.7025
+70,159,32.7448333333333
+70,160,31.115
+70,161,25.4423333333333
+70,162,29.7603333333333
+70,163,34.671
+70,164,39.9415
+70,165,30.7128333333333
+70,166,38.9043333333333
+70,167,28.0458333333333
+70,168,29.9931666666667
+70,169,27.7495
+70,170,36.2161666666667
+70,171,39.2853333333333
+70,172,37.846
+70,173,36.1103333333333
+70,174,37.211
+70,175,33.3586666666667
+70,176,39.7933333333333
+70,177,35.3483333333333
+70,178,28.067
+70,179,32.8295
+70,180,31.4536666666667
+70,181,26.9663333333333
+70,182,27.2838333333333
+70,183,33.5703333333333
+70,184,36.6395
+70,185,44.1536666666667
+70,186,27.2415
+70,187,33.909
+70,188,30.099
+70,189,39.497
+70,190,32.4485
+70,191,32.0251666666667
+70,192,29.7603333333333
+70,193,31.0303333333333
+70,194,24.6591666666667
+70,195,29.1253333333333
+70,196,30.2895
+70,197,33.4433333333333
+70,198,35.56
+70,199,33.782
+70,200,35.6446666666667
+70,201,31.6018333333333
+70,202,43.4763333333333
+70,203,31.1996666666667
+70,204,27.7283333333333
+70,205,29.5063333333333
+70,206,36.957
+70,207,35.306
+70,208,28.0035
+70,209,31.4113333333333
+70,210,30.4588333333333
+70,211,29.2311666666667
+70,212,32.2156666666667
+70,213,42.672
+70,214,33.5915
+70,215,37.5285
+70,216,29.9931666666667
+70,217,34.9038333333333
+70,218,37.1051666666667
+70,219,26.2466666666667
+70,220,37.1898333333333
+70,221,33.4645
+70,222,32.004
+70,223,37.4226666666667
+70,224,30.861
+70,225,39.8356666666667
+70,226,37.2321666666667
+70,227,29.2523333333333
+70,228,29.2311666666667
+70,229,32.3003333333333
+70,230,30.099
+70,231,33.655
+70,232,30.2895
+70,233,30.2683333333333
+70,234,36.5336666666667
+70,235,28.2363333333333
+70,236,28.448
+70,237,32.5543333333333
+70,238,32.5331666666667
+70,239,30.7975
+70,240,31.9616666666667
+70,241,32.1733333333333
+70,242,30.7975
+70,243,39.3276666666667
+70,244,28.2363333333333
+70,245,32.766
+70,246,29.8873333333333
+70,247,36.195
+70,248,37.084
+70,249,41.8041666666667
+70,250,33.4856666666667
+70,251,33.6338333333333
+70,252,26.5006666666667
+70,253,28.829
+70,254,32.6178333333333
+70,255,33.02
+70,256,25.9503333333333
+70,257,29.2523333333333
+70,258,34.7133333333333
+70,259,33.4433333333333
+70,260,39.9838333333333
+70,261,36.449
+70,262,29.4216666666667
+70,263,24.6168333333333
+70,264,29.3158333333333
+70,265,31.0938333333333
+70,266,32.5755
+70,267,39.6451666666667
+70,268,35.687
+70,269,37.6766666666667
+70,270,33.7396666666667
+70,271,23.5161666666667
+70,272,32.9353333333333
+70,273,32.3426666666667
+70,274,39.9838333333333
+70,275,31.0091666666667
+70,276,27.178
+70,277,27.813
+70,278,33.909
+70,279,33.8878333333333
+70,280,27.7283333333333
+70,281,34.0148333333333
+70,282,36.6395
+70,283,30.226
+70,284,27.7283333333333
+70,285,40.8728333333333
+70,286,31.3901666666667
+70,287,29.2523333333333
+70,288,32.4061666666667
+70,289,33.0835
+70,290,33.4221666666667
+70,291,28.2151666666667
+70,292,24.8708333333333
+70,293,30.1413333333333
+70,294,30.0566666666667
+70,295,28.0881666666667
+70,296,37.6766666666667
+70,297,28.2575
+70,298,28.9136666666667
+70,299,34.544
+70,300,34.3535
+70,301,24.384
+70,302,30.4376666666667
+70,303,35.5388333333333
+70,304,29.6756666666667
+70,305,28.5115
+70,306,31.1573333333333
+70,307,40.9363333333333
+70,308,26.4583333333333
+70,309,31.7076666666667
+70,310,26.035
+70,311,30.4376666666667
+70,312,32.8718333333333
+70,313,32.004
+70,314,37.211
+70,315,33.7608333333333
+70,316,34.8191666666667
+70,317,29.3158333333333
+70,318,34.3111666666667
+70,319,30.1413333333333
+70,320,40.132
+70,321,27.559
+70,322,33.1258333333333
+70,323,41.6771666666667
+70,324,31.242
+70,325,25.908
+70,326,36.2373333333333
+70,327,37.8248333333333
+70,328,36.1526666666667
+70,329,38.5656666666667
+70,330,32.7236666666667
+70,331,32.6813333333333
+70,332,31.877
+70,333,33.9301666666667
+70,334,33.8666666666667
+70,335,44.958
+70,336,38.4386666666667
+70,337,32.8083333333333
+70,338,34.0783333333333
+70,339,35.8563333333333
+70,340,34.5863333333333
+70,341,28.6596666666667
+70,342,29.2946666666667
+70,343,40.005
+70,344,28.575
+70,345,24.4686666666667
+70,346,25.8656666666667
+70,347,24.0241666666667
+70,348,30.7975
+70,349,29.2946666666667
+70,350,31.496
+70,351,36.2373333333333
+70,352,32.004
+70,353,30.2048333333333
+70,354,32.3003333333333
+70,355,24.003
+70,356,35.052
+70,357,31.3055
+70,358,29.1041666666667
+70,359,41.402
+70,360,28.0881666666667
+70,361,31.1361666666667
+70,362,26.6276666666667
+70,363,35.1155
+70,364,29.9296666666667
+70,365,37.338
+70,366,36.4278333333333
+70,367,31.0938333333333
+70,368,28.194
+70,369,37.2745
+70,370,22.5848333333333
+70,371,29.2523333333333
+70,372,29.1465
+70,373,27.94
+70,374,36.1738333333333
+70,375,37.6343333333333
+70,376,34.5651666666667
+70,377,34.1418333333333
+70,378,29.8873333333333
+70,379,31.6865
+70,380,30.9033333333333
+70,381,33.4221666666667
+70,382,25.5693333333333
+70,383,31.7076666666667
+70,384,29.8661666666667
+70,385,30.099
+70,386,31.8135
+70,387,32.6178333333333
+70,388,31.8558333333333
+70,389,34.163
+70,390,31.5806666666667
+70,391,31.2843333333333
+70,392,31.5806666666667
+70,393,29.0406666666667
+70,394,32.8718333333333
+70,395,32.385
+70,396,34.036
+70,397,31.6018333333333
+70,398,33.3586666666667
+70,399,29.3581666666667
+70,400,33.6126666666667
+70,401,28.7866666666667
+70,402,27.7706666666667
+70,403,29.5698333333333
+70,404,37.8248333333333
+70,405,35.2001666666667
+70,406,31.115
+70,407,32.8718333333333
+70,408,32.9776666666667
+70,409,35.687
+70,410,35.2848333333333
+70,411,34.29
+70,412,33.5915
+70,413,31.115
+70,414,23.2621666666667
+70,415,31.8135
+70,416,27.5166666666667
+70,417,35.8986666666667
+70,418,40.4918333333333
+70,419,24.6168333333333
+70,420,34.9461666666667
+70,421,26.543
+70,422,35.179
+70,423,28.6596666666667
+70,424,38.735
+70,425,28.6385
+70,426,31.6653333333333
+70,427,36.703
+70,428,34.3746666666667
+70,429,34.798
+70,430,32.4485
+70,431,38.5656666666667
+70,432,28.9983333333333
+70,433,27.6225
+70,434,29.7391666666667
+70,435,36.83
+70,436,34.29
+70,437,32.8295
+70,438,31.75
+70,439,30.48
+70,440,23.9395
+70,441,27.8553333333333
+70,442,29.0195
+70,443,31.6653333333333
+70,444,33.528
+70,445,30.353
+70,446,29.0195
+70,447,33.4433333333333
+70,448,35.7928333333333
+70,449,35.1155
+70,450,34.6286666666667
+70,451,34.29
+70,452,35.0943333333333
+70,453,29.6968333333333
+70,454,35.0731666666667
+70,455,35.6446666666667
+70,456,34.7345
+70,457,35.56
+70,458,37.592
+70,459,32.893
+70,460,32.9141666666667
+70,461,37.973
+70,462,32.8506666666667
+70,463,35.7293333333333
+70,464,36.4066666666667
+70,465,32.0463333333333
+70,466,29.9508333333333
+70,467,24.1723333333333
+70,468,33.1046666666667
+70,469,34.8615
+70,470,35.7293333333333
+70,471,33.3163333333333
+70,472,27.9823333333333
+70,473,28.1516666666667
+70,474,28.067
+70,475,28.7655
+70,476,21.971
+70,477,29.718
+70,478,31.4748333333333
+70,479,36.8511666666667
+70,480,28.1516666666667
+70,481,37.5285
+70,482,33.909
+70,483,35.0096666666667
+70,484,32.512
+70,485,29.5698333333333
+70,486,28.0246666666667
+70,487,30.48
+70,488,33.274
+70,489,28.6173333333333
+70,490,27.4531666666667
+70,491,37.8883333333333
+70,492,33.5491666666667
+70,493,25.7598333333333
+70,494,31.369
+70,495,29.5275
+70,496,29.3793333333333
+70,497,26.9663333333333
+70,498,41.6136666666667
+70,499,31.496
+70,500,34.0995
+70,501,38.735
+70,502,36.9781666666667
+70,503,33.4221666666667
+70,504,36.449
+70,505,32.8295
+70,506,28.8925
+70,507,36.6183333333333
+70,508,33.02
+70,509,35.4118333333333
+70,510,31.6653333333333
+70,511,31.8135
+70,512,33.3586666666667
+70,513,26.9875
+70,514,30.2895
+70,515,37.6978333333333
+70,516,29.21
+70,517,32.004
+70,518,33.3375
+70,519,39.7298333333333
+70,520,25.781
+70,521,35.5176666666667
+70,522,27.9188333333333
+70,523,28.5961666666667
+70,524,29.5486666666667
+70,525,30.4376666666667
+70,526,25.8656666666667
+70,527,29.6545
+70,528,35.179
+70,529,31.7923333333333
+70,530,30.9456666666667
+70,531,29.6545
+70,532,28.1305
+70,533,31.2208333333333
+70,534,35.2213333333333
+70,535,28.7443333333333
+70,536,22.2673333333333
+70,537,34.5651666666667
+70,538,35.0308333333333
+70,539,38.8196666666667
+70,540,36.3431666666667
+70,541,31.2631666666667
+70,542,28.4903333333333
+70,543,34.0995
+70,544,42.9048333333333
+70,545,34.417
+70,546,30.7551666666667
+70,547,33.9513333333333
+70,548,34.3111666666667
+70,549,35.3483333333333
+70,550,38.7985
+70,551,37.211
+70,552,30.353
+70,553,35.941
+70,554,33.6761666666667
+70,555,32.9565
+70,556,30.988
+70,557,36.5971666666667
+70,558,27.4108333333333
+70,559,28.7231666666667
+70,560,38.5656666666667
+70,561,30.3106666666667
+70,562,30.9668333333333
+70,563,36.8935
+70,564,38.5021666666667
+70,565,28.194
+70,566,31.4325
+70,567,35.687
+70,568,32.7448333333333
+70,569,26.9663333333333
+70,570,35.56
+70,571,31.1573333333333
+70,572,28.3845
+70,573,36.2161666666667
+70,574,26.9663333333333
+70,575,38.7138333333333
+70,576,32.8083333333333
+70,577,34.6921666666667
+70,578,32.766
+70,579,33.528
+70,580,28.6596666666667
+70,581,29.464
+70,582,31.0938333333333
+70,583,29.845
+70,584,26.416
+70,585,36.195
+70,586,35.6446666666667
+70,587,28.5538333333333
+70,588,31.6865
+70,589,33.401
+70,590,32.1098333333333
+70,591,36.5971666666667
+70,592,33.6973333333333
+70,593,29.8026666666667
+70,594,30.0143333333333
+70,595,34.0571666666667
+70,596,31.7711666666667
+70,597,35.433
+70,598,32.893
+70,599,28.7655
+70,600,30.9456666666667
+70,601,31.4113333333333
+70,602,26.8181666666667
+70,603,30.9033333333333
+70,604,35.0308333333333
+70,605,29.6333333333333
+70,606,29.8026666666667
+70,607,25.5058333333333
+70,608,28.9348333333333
+70,609,38.1846666666667
+70,610,34.7133333333333
+70,611,31.0303333333333
+70,612,34.7768333333333
+70,613,31.1573333333333
+70,614,30.48
+70,615,30.2048333333333
+70,616,34.8826666666667
+70,617,32.0463333333333
+70,618,29.9508333333333
+70,619,32.5755
+70,620,31.496
+70,621,35.1366666666667
+70,622,34.5863333333333
+70,623,32.385
+70,624,30.6705
+70,625,37.5285
+70,626,36.576
+70,627,30.3741666666667
+70,628,31.6865
+70,629,31.8135
+70,630,32.893
+70,631,35.433
+70,632,27.7283333333333
+70,633,36.6606666666667
+70,634,34.4381666666667
+70,635,33.7185
+70,636,27.686
+70,637,33.8878333333333
+70,638,26.5218333333333
+70,639,33.2316666666667
+70,640,30.3318333333333
+70,641,29.591
+70,642,38.1635
+70,643,32.4061666666667
+70,644,36.7665
+70,645,36.0468333333333
+70,646,33.5703333333333
+70,647,35.5176666666667
+70,648,32.9353333333333
+70,649,31.7076666666667
+70,650,29.8238333333333
+70,651,31.7288333333333
+70,652,27.686
+70,653,34.8826666666667
+70,654,27.0721666666667
+70,655,31.1361666666667
+70,656,31.5806666666667
+70,657,33.2105
+70,658,35.8775
+70,659,40.4706666666667
+70,660,36.2796666666667
+70,661,26.6911666666667
+70,662,34.3111666666667
+70,663,33.6338333333333
+70,664,29.0195
+70,665,37.1263333333333
+70,666,31.3266666666667
+70,667,42.1428333333333
+70,668,32.6601666666667
+70,669,28.7866666666667
+70,670,31.7711666666667
+70,671,27.6013333333333
+70,672,32.3638333333333
+70,673,35.2001666666667
+70,674,34.4593333333333
+70,675,28.8078333333333
+70,676,30.4588333333333
+70,677,29.7815
+70,678,35.8563333333333
+70,679,35.3271666666667
+70,680,38.2693333333333
+70,681,35.2848333333333
+70,682,26.7335
+70,683,34.29
+70,684,40.2378333333333
+70,685,33.0623333333333
+70,686,32.4908333333333
+70,687,32.512
+70,688,32.2368333333333
+70,689,31.0938333333333
+70,690,35.2001666666667
+70,691,32.0463333333333
+70,692,25.7175
+70,693,42.0158333333333
+70,694,25.9715
+70,695,28.2575
+70,696,33.8666666666667
+70,697,26.7123333333333
+70,698,24.3416666666667
+70,699,37.2321666666667
+70,700,33.8455
+70,701,31.4113333333333
+70,702,37.465
+70,703,36.957
+70,704,29.6968333333333
+70,705,32.6178333333333
+70,706,32.8083333333333
+70,707,32.385
+70,708,31.5171666666667
+70,709,35.2001666666667
+70,710,37.592
+70,711,32.258
+70,712,25.9926666666667
+70,713,28.6385
+70,714,32.9565
+70,715,29.718
+70,716,40.7246666666667
+70,717,33.6761666666667
+70,718,31.496
+70,719,28.3633333333333
+70,720,36.6183333333333
+70,721,34.7345
+70,722,36.7665
+70,723,26.3101666666667
+70,724,40.3648333333333
+70,725,28.702
+70,726,32.512
+70,727,30.099
+70,728,26.2466666666667
+70,729,45.847
+70,730,36.3643333333333
+70,731,36.4701666666667
+70,732,37.4015
+70,733,36.4066666666667
+70,734,44.1325
+70,735,32.4908333333333
+70,736,33.9513333333333
+70,737,32.5966666666667
+70,738,33.3375
+70,739,29.3581666666667
+70,740,33.3375
+70,741,39.9626666666667
+70,742,37.5708333333333
+70,743,34.29
+70,744,34.1418333333333
+70,745,18.4573333333333
+70,746,32.004
+70,747,30.9033333333333
+70,748,29.8873333333333
+70,749,27.0933333333333
+70,750,30.2471666666667
+70,751,29.9931666666667
+70,752,32.512
+70,753,32.8506666666667
+70,754,30.226
+70,755,30.226
+70,756,27.3685
+70,757,35.8986666666667
+70,758,31.8135
+70,759,38.0576666666667
+70,760,34.5228333333333
+70,761,29.0195
+70,762,37.6131666666667
+70,763,34.5863333333333
+70,764,33.4645
+70,765,30.5435
+70,766,29.3158333333333
+70,767,35.0731666666667
+70,768,27.7071666666667
+70,769,34.417
+70,770,34.671
+70,771,34.29
+70,772,32.2156666666667
+70,773,33.8243333333333
+70,774,33.782
+70,775,38.4386666666667
+70,776,36.3431666666667
+70,777,37.1898333333333
+70,778,37.9941666666667
+70,779,28.1305
+70,780,30.3953333333333
+70,781,36.703
+70,782,29.2946666666667
+70,783,35.052
+70,784,36.449
+70,785,32.8506666666667
+70,786,32.0886666666667
+70,787,30.5435
+70,788,35.433
+70,789,29.464
+70,790,32.6178333333333
+70,791,40.767
+70,792,27.7283333333333
+70,793,35.0308333333333
+70,794,31.4748333333333
+70,795,32.1733333333333
+70,796,24.8708333333333
+70,797,27.4531666666667
+70,798,32.1098333333333
+70,799,33.0835
+70,800,33.5703333333333
+70,801,28.1093333333333
+70,802,31.8346666666667
+70,803,38.3963333333333
+70,804,35.0096666666667
+70,805,33.147
+70,806,36.0891666666667
+70,807,29.6756666666667
+70,808,33.1046666666667
+70,809,28.5961666666667
+70,810,25.4
+70,811,31.9616666666667
+70,812,33.274
+70,813,28.2998333333333
+70,814,32.131
+70,815,36.1315
+70,816,33.3163333333333
+70,817,28.3633333333333
+70,818,32.0675
+70,819,23.0928333333333
+70,820,36.9781666666667
+70,821,29.6756666666667
+70,822,34.6921666666667
+70,823,30.6705
+70,824,33.8666666666667
+70,825,33.782
+70,826,32.9776666666667
+70,827,31.9616666666667
+70,828,38.354
+70,829,28.829
+70,830,31.369
+70,831,33.0623333333333
+70,832,29.718
+70,833,27.813
+70,834,32.0463333333333
+70,835,25.7175
+70,836,29.9931666666667
+70,837,41.1903333333333
+70,838,38.1
+70,839,32.1945
+70,840,26.924
+70,841,24.8285
+70,842,31.6018333333333
+70,843,27.1568333333333
+70,844,34.3323333333333
+70,845,35.2636666666667
+70,846,36.6606666666667
+70,847,23.0928333333333
+70,848,40.1531666666667
+70,849,25.1671666666667
+70,850,30.3953333333333
+70,851,30.9033333333333
+70,852,33.3163333333333
+70,853,32.385
+70,854,31.9193333333333
+70,855,43.815
+70,856,24.4475
+70,857,29.083
+70,858,35.8563333333333
+70,859,34.7133333333333
+70,860,34.0783333333333
+70,861,32.5966666666667
+70,862,36.6606666666667
+70,863,33.0623333333333
+70,864,35.9833333333333
+70,865,35.56
+70,866,31.115
+70,867,30.1836666666667
+70,868,28.8078333333333
+70,869,31.5383333333333
+70,870,34.8826666666667
+70,871,35.052
+70,872,32.9988333333333
+70,873,33.02
+70,874,29.6333333333333
+70,875,32.258
+70,876,34.6498333333333
+70,877,35.7081666666667
+70,878,32.8506666666667
+70,879,29.9085
+70,880,36.1738333333333
+70,881,32.5331666666667
+70,882,24.8708333333333
+70,883,33.782
+70,884,28.8078333333333
+70,885,30.861
+70,886,32.2791666666667
+70,887,41.021
+70,888,30.0566666666667
+70,889,28.2151666666667
+70,890,30.2895
+70,891,32.893
+70,892,30.2471666666667
+70,893,27.3685
+70,894,36.449
+70,895,38.6503333333333
+70,896,34.4805
+70,897,29.591
+70,898,33.3163333333333
+70,899,35.6446666666667
+70,900,32.0251666666667
+70,901,28.7655
+70,902,31.7923333333333
+70,903,30.988
+70,904,34.544
+70,905,29.6333333333333
+70,906,30.4588333333333
+70,907,27.559
+70,908,28.448
+70,909,34.5863333333333
+70,910,35.2213333333333
+70,911,29.7603333333333
+70,912,36.1315
+70,913,32.4061666666667
+70,914,38.354
+70,915,31.3901666666667
+70,916,37.5496666666667
+70,917,36.449
+70,918,29.337
+70,919,34.671
+70,920,41.2961666666667
+70,921,32.639
+70,922,33.528
+70,923,29.4851666666667
+70,924,34.4593333333333
+70,925,32.3215
+70,926,26.4795
+70,927,34.5228333333333
+70,928,35.814
+70,929,33.3586666666667
+70,930,30.6493333333333
+70,931,36.195
+70,932,36.8511666666667
+70,933,26.8605
+70,934,25.6116666666667
+70,935,31.2843333333333
+70,936,29.6545
+70,937,32.0886666666667
+70,938,43.6456666666667
+70,939,37.465
+70,940,32.3426666666667
+70,941,26.7758333333333
+70,942,32.0675
+70,943,28.4268333333333
+70,944,28.448
+70,945,30.1201666666667
+70,946,32.512
+70,947,32.2368333333333
+70,948,27.8553333333333
+70,949,31.242
+70,950,33.8455
+70,951,36.4278333333333
+70,952,34.9673333333333
+70,953,32.2156666666667
+70,954,30.1836666666667
+70,955,38.9043333333333
+70,956,39.116
+70,957,33.6761666666667
+70,958,27.1145
+70,959,32.0463333333333
+70,960,34.5228333333333
+70,961,30.8398333333333
+70,962,39.5605
+70,963,30.5646666666667
+70,964,31.5383333333333
+70,965,34.3111666666667
+70,966,29.591
+70,967,32.6601666666667
+70,968,35.0308333333333
+70,969,31.1573333333333
+70,970,34.4593333333333
+70,971,32.3003333333333
+70,972,32.3426666666667
+70,973,33.3163333333333
+70,974,26.6488333333333
+70,975,28.7866666666667
+70,976,28.5326666666667
+70,977,34.6921666666667
+70,978,31.3266666666667
+70,979,33.147
+70,980,39.7086666666667
+70,981,27.4743333333333
+70,982,38.3963333333333
+70,983,34.4593333333333
+70,984,36.6606666666667
+70,985,31.877
+70,986,31.7076666666667
+70,987,25.0613333333333
+70,988,36.2373333333333
+70,989,33.1046666666667
+70,990,32.9776666666667
+70,991,30.5011666666667
+70,992,34.671
+70,993,36.4913333333333
+70,994,25.7175
+70,995,28.702
+70,996,36.0045
+70,997,30.0778333333333
+70,998,35.4541666666667
+70,999,42.6085
+70,1000,34.5228333333333
+71,1,27.051
+71,2,22.86
+71,3,20.8915
+71,4,21.9921666666667
+71,5,27.4743333333333
+71,6,19.304
+71,7,23.241
+71,8,23.2621666666667
+71,9,23.0716666666667
+71,10,24.384
+71,11,27.5378333333333
+71,12,27.4108333333333
+71,13,25.9291666666667
+71,14,29.9508333333333
+71,15,24.892
+71,16,21.8228333333333
+71,17,25.9291666666667
+71,18,22.606
+71,19,25.8656666666667
+71,20,20.5316666666667
+71,21,21.1878333333333
+71,22,26.3948333333333
+71,23,22.6906666666667
+71,24,26.1196666666667
+71,25,23.9395
+71,26,27.5801666666667
+71,27,21.8651666666667
+71,28,27.6013333333333
+71,29,25.1248333333333
+71,30,27.94
+71,31,22.0345
+71,32,24.0453333333333
+71,33,27.2203333333333
+71,34,22.8811666666667
+71,35,26.035
+71,36,21.6746666666667
+71,37,22.1403333333333
+71,38,26.3736666666667
+71,39,21.3148333333333
+71,40,19.6638333333333
+71,41,21.5688333333333
+71,42,25.0825
+71,43,26.162
+71,44,25.273
+71,45,23.622
+71,46,23.9183333333333
+71,47,18.8806666666667
+71,48,30.226
+71,49,24.2993333333333
+71,50,20.1083333333333
+71,51,29.8026666666667
+71,52,25.654
+71,53,21.2513333333333
+71,54,20.4893333333333
+71,55,23.0505
+71,56,19.1981666666667
+71,57,19.5791666666667
+71,58,31.369
+71,59,26.9663333333333
+71,60,26.289
+71,61,23.495
+71,62,25.6963333333333
+71,63,26.3101666666667
+71,64,19.3675
+71,65,26.543
+71,66,24.8285
+71,67,26.416
+71,68,25.5905
+71,69,18.5208333333333
+71,70,26.0773333333333
+71,71,21.6746666666667
+71,72,27.94
+71,73,19.8966666666667
+71,74,22.987
+71,75,18.923
+71,76,28.1093333333333
+71,77,24.6803333333333
+71,78,23.241
+71,79,20.5105
+71,80,27.7495
+71,81,32.8295
+71,82,26.0773333333333
+71,83,20.5105
+71,84,20.0448333333333
+71,85,17.5048333333333
+71,86,19.6003333333333
+71,87,25.2518333333333
+71,88,26.1408333333333
+71,89,25.5481666666667
+71,90,26.2043333333333
+71,91,27.9188333333333
+71,92,23.7066666666667
+71,93,27.8976666666667
+71,94,20.5316666666667
+71,95,19.6215
+71,96,19.0923333333333
+71,97,28.0458333333333
+71,98,23.6431666666667
+71,99,25.8233333333333
+71,100,26.7123333333333
+71,101,31.3901666666667
+71,102,16.9121666666667
+71,103,29.21
+71,104,30.2048333333333
+71,105,24.7861666666667
+71,106,30.226
+71,107,28.067
+71,108,27.0721666666667
+71,109,20.3411666666667
+71,110,25.9715
+71,111,17.6953333333333
+71,112,24.0665
+71,113,21.463
+71,114,23.2198333333333
+71,115,25.9926666666667
+71,116,17.6953333333333
+71,117,27.1991666666667
+71,118,22.1403333333333
+71,119,22.4366666666667
+71,120,25.4
+71,121,25.0825
+71,122,25.4635
+71,123,23.4738333333333
+71,124,19.2193333333333
+71,125,24.5745
+71,126,26.924
+71,127,22.4366666666667
+71,128,26.162
+71,129,27.0298333333333
+71,130,18.8171666666667
+71,131,24.9131666666667
+71,132,21.6746666666667
+71,133,28.8713333333333
+71,134,23.622
+71,135,26.162
+71,136,24.7438333333333
+71,137,29.1253333333333
+71,138,19.431
+71,139,19.7485
+71,140,17.9281666666667
+71,141,27.3261666666667
+71,142,32.0675
+71,143,31.8558333333333
+71,144,26.9663333333333
+71,145,27.6013333333333
+71,146,22.8176666666667
+71,147,31.5806666666667
+71,148,22.8176666666667
+71,149,27.4955
+71,150,21.9921666666667
+71,151,24.7226666666667
+71,152,21.8863333333333
+71,153,20.6163333333333
+71,154,29.5063333333333
+71,155,25.2306666666667
+71,156,23.749
+71,157,28.7655
+71,158,27.8553333333333
+71,159,22.3308333333333
+71,160,21.209
+71,161,20.8703333333333
+71,162,24.9978333333333
+71,163,22.8176666666667
+71,164,19.939
+71,165,27.8341666666667
+71,166,20.6375
+71,167,16.6793333333333
+71,168,21.844
+71,169,29.0195
+71,170,18.4785
+71,171,25.7598333333333
+71,172,27.0298333333333
+71,173,25.4635
+71,174,27.2203333333333
+71,175,27.1991666666667
+71,176,29.9296666666667
+71,177,23.0928333333333
+71,178,28.194
+71,179,28.6173333333333
+71,180,21.3995
+71,181,27.9188333333333
+71,182,24.2993333333333
+71,183,19.685
+71,184,18.3726666666667
+71,185,24.3628333333333
+71,186,23.3045
+71,187,23.5373333333333
+71,188,19.8966666666667
+71,189,22.225
+71,190,20.4046666666667
+71,191,19.177
+71,192,27.8341666666667
+71,193,26.0985
+71,194,21.9498333333333
+71,195,24.0453333333333
+71,196,30.3106666666667
+71,197,25.2518333333333
+71,198,25.8021666666667
+71,199,22.2461666666667
+71,200,25.2306666666667
+71,201,20.7856666666667
+71,202,25.0401666666667
+71,203,27.1568333333333
+71,204,18.8595
+71,205,27.8553333333333
+71,206,20.828
+71,207,23.749
+71,208,20.701
+71,209,23.2833333333333
+71,210,26.6488333333333
+71,211,27.813
+71,212,33.147
+71,213,22.606
+71,214,25.654
+71,215,22.5213333333333
+71,216,22.3096666666667
+71,217,29.2311666666667
+71,218,24.3416666666667
+71,219,25.6116666666667
+71,220,25.1883333333333
+71,221,23.1563333333333
+71,222,24.5745
+71,223,21.1878333333333
+71,224,24.9131666666667
+71,225,23.0716666666667
+71,226,22.4578333333333
+71,227,24.2358333333333
+71,228,26.7123333333333
+71,229,36.2161666666667
+71,230,23.1775
+71,231,25.7386666666667
+71,232,20.0871666666667
+71,233,23.2621666666667
+71,234,20.5316666666667
+71,235,25.0825
+71,236,23.3256666666667
+71,237,27.5166666666667
+71,238,25.7386666666667
+71,239,19.177
+71,240,30.2895
+71,241,24.892
+71,242,21.1455
+71,243,28.2575
+71,244,24.1935
+71,245,31.1785
+71,246,21.2513333333333
+71,247,24.257
+71,248,21.1243333333333
+71,249,22.3731666666667
+71,250,23.7913333333333
+71,251,23.7278333333333
+71,252,22.8388333333333
+71,253,25.3365
+71,254,29.083
+71,255,24.9978333333333
+71,256,30.6705
+71,257,26.7758333333333
+71,258,23.1351666666667
+71,259,22.0768333333333
+71,260,24.511
+71,261,21.5688333333333
+71,262,21.2513333333333
+71,263,24.3416666666667
+71,264,24.9343333333333
+71,265,26.8393333333333
+71,266,25.273
+71,267,24.9555
+71,268,25.7175
+71,269,29.6545
+71,270,25.3576666666667
+71,271,19.7061666666667
+71,272,19.1558333333333
+71,273,23.368
+71,274,21.6958333333333
+71,275,19.558
+71,276,22.7965
+71,277,28.575
+71,278,22.3731666666667
+71,279,29.845
+71,280,17.3566666666667
+71,281,21.0396666666667
+71,282,29.3158333333333
+71,283,24.4263333333333
+71,284,20.2776666666667
+71,285,24.3628333333333
+71,286,27.5166666666667
+71,287,25.527
+71,288,22.098
+71,289,26.5853333333333
+71,290,22.5848333333333
+71,291,22.5848333333333
+71,292,28.8501666666667
+71,293,21.1031666666667
+71,294,21.971
+71,295,26.2466666666667
+71,296,22.1826666666667
+71,297,20.066
+71,298,20.3411666666667
+71,299,28.8078333333333
+71,300,26.3736666666667
+71,301,26.035
+71,302,24.2146666666667
+71,303,24.4475
+71,304,21.5688333333333
+71,305,24.3416666666667
+71,306,19.1558333333333
+71,307,22.5213333333333
+71,308,25.4
+71,309,24.2781666666667
+71,310,25.1883333333333
+71,311,20.1718333333333
+71,312,23.368
+71,313,29.1676666666667
+71,314,23.3468333333333
+71,315,24.8285
+71,316,24.6803333333333
+71,317,26.4795
+71,318,23.4315
+71,319,20.3623333333333
+71,320,21.4418333333333
+71,321,29.2311666666667
+71,322,25.781
+71,323,24.4051666666667
+71,324,23.1563333333333
+71,325,22.606
+71,326,27.432
+71,327,23.7701666666667
+71,328,17.145
+71,329,19.6003333333333
+71,330,22.098
+71,331,19.7908333333333
+71,332,24.4686666666667
+71,333,29.5698333333333
+71,334,18.7536666666667
+71,335,22.9658333333333
+71,336,29.6333333333333
+71,337,22.352
+71,338,24.4475
+71,339,22.4366666666667
+71,340,22.0133333333333
+71,341,24.7226666666667
+71,342,23.9606666666667
+71,343,22.5425
+71,344,28.9983333333333
+71,345,25.6328333333333
+71,346,32.5966666666667
+71,347,18.6055
+71,348,27.9188333333333
+71,349,20.4046666666667
+71,350,20.7856666666667
+71,351,31.3901666666667
+71,352,20.8491666666667
+71,353,20.066
+71,354,31.4325
+71,355,29.7603333333333
+71,356,20.4046666666667
+71,357,27.8976666666667
+71,358,26.8393333333333
+71,359,26.0773333333333
+71,360,23.5585
+71,361,22.987
+71,362,24.6591666666667
+71,363,27.5378333333333
+71,364,24.7861666666667
+71,365,25.019
+71,366,20.1295
+71,367,26.2678333333333
+71,368,23.5373333333333
+71,369,27.0298333333333
+71,370,20.9973333333333
+71,371,26.5641666666667
+71,372,27.7071666666667
+71,373,23.9818333333333
+71,374,27.5378333333333
+71,375,18.9865
+71,376,26.6065
+71,377,16.764
+71,378,24.765
+71,379,26.416
+71,380,22.6906666666667
+71,381,20.0025
+71,382,22.1191666666667
+71,383,23.114
+71,384,23.241
+71,385,22.098
+71,386,26.67
+71,387,27.8341666666667
+71,388,26.2466666666667
+71,389,19.7485
+71,390,20.701
+71,391,27.5801666666667
+71,392,25.3153333333333
+71,393,32.4061666666667
+71,394,22.098
+71,395,25.0401666666667
+71,396,26.6276666666667
+71,397,26.2678333333333
+71,398,23.1775
+71,399,20.828
+71,400,24.9131666666667
+71,401,31.6018333333333
+71,402,28.1305
+71,403,19.1135
+71,404,17.9916666666667
+71,405,25.7386666666667
+71,406,23.4103333333333
+71,407,19.685
+71,408,20.1295
+71,409,24.3416666666667
+71,410,18.923
+71,411,25.4211666666667
+71,412,27.8553333333333
+71,413,25.3153333333333
+71,414,22.4578333333333
+71,415,22.0133333333333
+71,416,20.4893333333333
+71,417,17.1873333333333
+71,418,24.9131666666667
+71,419,22.9658333333333
+71,420,25.2095
+71,421,23.7278333333333
+71,422,22.3943333333333
+71,423,28.5538333333333
+71,424,22.8388333333333
+71,425,27.0298333333333
+71,426,30.0143333333333
+71,427,24.003
+71,428,23.0081666666667
+71,429,22.9446666666667
+71,430,24.638
+71,431,24.892
+71,432,22.7753333333333
+71,433,22.8388333333333
+71,434,24.6803333333333
+71,435,22.5213333333333
+71,436,27.8341666666667
+71,437,25.9926666666667
+71,438,21.4841666666667
+71,439,21.2301666666667
+71,440,20.2988333333333
+71,441,19.7908333333333
+71,442,19.7485
+71,443,25.2095
+71,444,20.5316666666667
+71,445,26.6911666666667
+71,446,25.1248333333333
+71,447,26.0138333333333
+71,448,23.0293333333333
+71,449,27.2838333333333
+71,450,19.2828333333333
+71,451,19.4521666666667
+71,452,22.7965
+71,453,23.1351666666667
+71,454,27.1145
+71,455,18.6266666666667
+71,456,32.5543333333333
+71,457,27.2626666666667
+71,458,24.5533333333333
+71,459,24.638
+71,460,25.2518333333333
+71,461,26.0985
+71,462,24.9343333333333
+71,463,21.9286666666667
+71,464,18.796
+71,465,24.0876666666667
+71,466,21.7805
+71,467,23.9606666666667
+71,468,21.1031666666667
+71,469,22.7965
+71,470,21.1666666666667
+71,471,17.1873333333333
+71,472,15.0495
+71,473,21.3148333333333
+71,474,25.8021666666667
+71,475,27.178
+71,476,21.6746666666667
+71,477,25.0825
+71,478,23.3256666666667
+71,479,22.0133333333333
+71,480,23.5585
+71,481,25.5481666666667
+71,482,27.305
+71,483,29.21
+71,484,21.844
+71,485,23.0293333333333
+71,486,25.1671666666667
+71,487,24.1935
+71,488,25.146
+71,489,19.5791666666667
+71,490,21.9498333333333
+71,491,22.0768333333333
+71,492,19.7696666666667
+71,493,27.2838333333333
+71,494,29.8238333333333
+71,495,20.0236666666667
+71,496,18.5843333333333
+71,497,21.336
+71,498,27.2415
+71,499,28.7231666666667
+71,500,25.6116666666667
+71,501,26.6065
+71,502,23.6431666666667
+71,503,24.2993333333333
+71,504,23.0716666666667
+71,505,22.2461666666667
+71,506,24.892
+71,507,20.8703333333333
+71,508,29.9085
+71,509,25.4423333333333
+71,510,19.7273333333333
+71,511,22.2885
+71,512,23.749
+71,513,26.2678333333333
+71,514,20.6798333333333
+71,515,22.8176666666667
+71,516,21.7593333333333
+71,517,22.352
+71,518,26.6065
+71,519,18.7536666666667
+71,520,25.5058333333333
+71,521,26.6488333333333
+71,522,26.2678333333333
+71,523,19.6003333333333
+71,524,31.3055
+71,525,27.3896666666667
+71,526,23.4526666666667
+71,527,19.4098333333333
+71,528,22.9235
+71,529,21.5688333333333
+71,530,23.1986666666667
+71,531,28.1305
+71,532,24.4051666666667
+71,533,17.6953333333333
+71,534,24.257
+71,535,22.5425
+71,536,20.0871666666667
+71,537,19.7061666666667
+71,538,22.2461666666667
+71,539,16.383
+71,540,25.7175
+71,541,21.2936666666667
+71,542,28.3845
+71,543,22.0768333333333
+71,544,28.6385
+71,545,19.0288333333333
+71,546,23.241
+71,547,24.5956666666667
+71,548,26.1831666666667
+71,549,26.3313333333333
+71,550,19.2193333333333
+71,551,21.3995
+71,552,26.035
+71,553,21.4841666666667
+71,554,25.0613333333333
+71,555,22.9658333333333
+71,556,26.5006666666667
+71,557,25.273
+71,558,22.225
+71,559,28.2575
+71,560,23.9818333333333
+71,561,25.4635
+71,562,21.9498333333333
+71,563,26.1196666666667
+71,564,22.352
+71,565,25.7175
+71,566,26.67
+71,567,25.4423333333333
+71,568,19.9601666666667
+71,569,20.574
+71,570,23.876
+71,571,27.0721666666667
+71,572,23.9818333333333
+71,573,25.1036666666667
+71,574,22.098
+71,575,25.8656666666667
+71,576,27.178
+71,577,25.908
+71,578,23.1563333333333
+71,579,27.7918333333333
+71,580,25.5693333333333
+71,581,29.972
+71,582,18.3515
+71,583,23.3256666666667
+71,584,23.2833333333333
+71,585,20.8491666666667
+71,586,18.8595
+71,587,27.813
+71,588,26.3313333333333
+71,589,23.2621666666667
+71,590,25.2306666666667
+71,591,31.623
+71,592,22.0768333333333
+71,593,25.273
+71,594,22.9235
+71,595,23.1351666666667
+71,596,27.9823333333333
+71,597,26.4583333333333
+71,598,29.3158333333333
+71,599,24.3205
+71,600,24.7438333333333
+71,601,19.5156666666667
+71,602,24.0876666666667
+71,603,27.8553333333333
+71,604,25.4211666666667
+71,605,23.5161666666667
+71,606,22.8811666666667
+71,607,24.6803333333333
+71,608,21.8016666666667
+71,609,26.1831666666667
+71,610,22.5001666666667
+71,611,20.2353333333333
+71,612,26.2255
+71,613,21.9286666666667
+71,614,22.4578333333333
+71,615,28.194
+71,616,28.7655
+71,617,24.5956666666667
+71,618,31.1996666666667
+71,619,18.2033333333333
+71,620,28.6808333333333
+71,621,22.5213333333333
+71,622,17.9705
+71,623,19.4733333333333
+71,624,23.1563333333333
+71,625,21.463
+71,626,23.1351666666667
+71,627,21.6746666666667
+71,628,26.0138333333333
+71,629,20.955
+71,630,32.004
+71,631,24.6168333333333
+71,632,26.7123333333333
+71,633,31.4536666666667
+71,634,22.225
+71,635,26.0985
+71,636,23.3256666666667
+71,637,22.479
+71,638,25.7598333333333
+71,639,20.3623333333333
+71,640,23.9818333333333
+71,641,20.7856666666667
+71,642,25.4846666666667
+71,643,28.448
+71,644,27.6648333333333
+71,645,27.1568333333333
+71,646,25.3788333333333
+71,647,26.2255
+71,648,22.2038333333333
+71,649,25.5905
+71,650,28.6173333333333
+71,651,22.9235
+71,652,28.7231666666667
+71,653,22.8388333333333
+71,654,24.003
+71,655,24.2358333333333
+71,656,21.2725
+71,657,26.6488333333333
+71,658,35.6658333333333
+71,659,23.368
+71,660,22.4366666666667
+71,661,21.6746666666667
+71,662,20.2353333333333
+71,663,26.3948333333333
+71,664,22.9658333333333
+71,665,22.7753333333333
+71,666,25.146
+71,667,21.9921666666667
+71,668,23.7066666666667
+71,669,25.7386666666667
+71,670,19.7696666666667
+71,671,20.9973333333333
+71,672,21.1878333333333
+71,673,31.0938333333333
+71,674,22.2461666666667
+71,675,25.3365
+71,676,22.3308333333333
+71,677,34.3535
+71,678,17.1238333333333
+71,679,21.2513333333333
+71,680,21.082
+71,681,28.575
+71,682,27.3261666666667
+71,683,28.2998333333333
+71,684,26.6911666666667
+71,685,22.7118333333333
+71,686,23.4315
+71,687,24.7861666666667
+71,688,24.4898333333333
+71,689,25.2941666666667
+71,690,22.2038333333333
+71,691,19.3463333333333
+71,692,24.2146666666667
+71,693,25.9715
+71,694,20.9338333333333
+71,695,31.0938333333333
+71,696,26.3948333333333
+71,697,22.0768333333333
+71,698,20.2776666666667
+71,699,21.9498333333333
+71,700,27.5801666666667
+71,701,27.4743333333333
+71,702,22.479
+71,703,22.9658333333333
+71,704,19.685
+71,705,22.2673333333333
+71,706,20.447
+71,707,24.8496666666667
+71,708,20.4046666666667
+71,709,27.5801666666667
+71,710,32.1733333333333
+71,711,24.1935
+71,712,24.2993333333333
+71,713,25.9291666666667
+71,714,22.225
+71,715,25.1883333333333
+71,716,23.1351666666667
+71,717,22.0768333333333
+71,718,22.479
+71,719,22.8811666666667
+71,720,23.6643333333333
+71,721,26.4795
+71,722,26.6065
+71,723,24.9131666666667
+71,724,21.2725
+71,725,23.6008333333333
+71,726,27.1568333333333
+71,727,19.939
+71,728,26.5218333333333
+71,729,26.9875
+71,730,25.6116666666667
+71,731,21.463
+71,732,25.527
+71,733,29.6756666666667
+71,734,21.8863333333333
+71,735,25.781
+71,736,30.7975
+71,737,18.0128333333333
+71,738,26.6488333333333
+71,739,21.8228333333333
+71,740,29.9296666666667
+71,741,32.8506666666667
+71,742,21.9075
+71,743,22.2461666666667
+71,744,24.7226666666667
+71,745,23.1351666666667
+71,746,21.7805
+71,747,15.8115
+71,748,27.1356666666667
+71,749,24.384
+71,750,27.1356666666667
+71,751,18.2245
+71,752,21.7593333333333
+71,753,24.0453333333333
+71,754,25.4211666666667
+71,755,32.512
+71,756,26.8816666666667
+71,757,27.0298333333333
+71,758,21.5476666666667
+71,759,21.8228333333333
+71,760,13.9911666666667
+71,761,19.3886666666667
+71,762,23.5373333333333
+71,763,20.9126666666667
+71,764,25.3365
+71,765,25.273
+71,766,24.7226666666667
+71,767,28.1093333333333
+71,768,26.4583333333333
+71,769,26.2678333333333
+71,770,28.4268333333333
+71,771,19.431
+71,772,20.6163333333333
+71,773,23.2621666666667
+71,774,22.4155
+71,775,24.4475
+71,776,29.9508333333333
+71,777,21.336
+71,778,20.32
+71,779,21.5265
+71,780,23.9395
+71,781,23.0928333333333
+71,782,21.4841666666667
+71,783,28.4691666666667
+71,784,21.9286666666667
+71,785,27.4531666666667
+71,786,22.479
+71,787,26.8393333333333
+71,788,30.734
+71,789,27.7071666666667
+71,790,23.0928333333333
+71,791,22.3731666666667
+71,792,25.2095
+71,793,20.6375
+71,794,22.3096666666667
+71,795,27.6648333333333
+71,796,18.3515
+71,797,23.2621666666667
+71,798,24.7438333333333
+71,799,31.6865
+71,800,20.9126666666667
+71,801,22.7965
+71,802,20.6163333333333
+71,803,34.3535
+71,804,21.8228333333333
+71,805,24.4686666666667
+71,806,21.8863333333333
+71,807,27.5166666666667
+71,808,24.7438333333333
+71,809,23.7278333333333
+71,810,21.2301666666667
+71,811,23.4526666666667
+71,812,21.6535
+71,813,18.2668333333333
+71,814,17.1026666666667
+71,815,29.1253333333333
+71,816,23.1563333333333
+71,817,22.3731666666667
+71,818,27.6225
+71,819,19.8543333333333
+71,820,29.083
+71,821,29.7815
+71,822,29.591
+71,823,28.6808333333333
+71,824,17.6741666666667
+71,825,28.2575
+71,826,24.0665
+71,827,26.543
+71,828,22.9023333333333
+71,829,24.0453333333333
+71,830,20.0025
+71,831,20.1718333333333
+71,832,19.1558333333333
+71,833,22.1403333333333
+71,834,15.6633333333333
+71,835,23.2198333333333
+71,836,23.622
+71,837,22.3096666666667
+71,838,27.0086666666667
+71,839,23.241
+71,840,26.162
+71,841,17.9493333333333
+71,842,29.083
+71,843,22.9023333333333
+71,844,25.9715
+71,845,25.4846666666667
+71,846,29.464
+71,847,23.2621666666667
+71,848,23.8971666666667
+71,849,23.9183333333333
+71,850,20.7221666666667
+71,851,18.2245
+71,852,20.3411666666667
+71,853,20.0025
+71,854,22.479
+71,855,17.0815
+71,856,29.8661666666667
+71,857,31.1361666666667
+71,858,24.4263333333333
+71,859,20.574
+71,860,27.1145
+71,861,27.4108333333333
+71,862,20.4258333333333
+71,863,24.5533333333333
+71,864,28.6596666666667
+71,865,29.21
+71,866,24.7861666666667
+71,867,19.9178333333333
+71,868,25.9926666666667
+71,869,16.637
+71,870,24.8073333333333
+71,871,17.3566666666667
+71,872,26.3525
+71,873,26.9451666666667
+71,874,29.1888333333333
+71,875,22.6906666666667
+71,876,17.6106666666667
+71,877,19.7696666666667
+71,878,22.2461666666667
+71,879,26.3313333333333
+71,880,29.845
+71,881,22.987
+71,882,25.3153333333333
+71,883,27.7071666666667
+71,884,24.8708333333333
+71,885,19.4733333333333
+71,886,27.2203333333333
+71,887,28.2998333333333
+71,888,19.5156666666667
+71,889,21.7805
+71,890,23.4315
+71,891,29.5698333333333
+71,892,20.8491666666667
+71,893,25.0825
+71,894,18.8171666666667
+71,895,24.4263333333333
+71,896,21.1666666666667
+71,897,27.0933333333333
+71,898,18.2245
+71,899,29.5486666666667
+71,900,28.0035
+71,901,26.924
+71,902,21.9286666666667
+71,903,26.3525
+71,904,28.194
+71,905,20.7645
+71,906,24.6168333333333
+71,907,25.6116666666667
+71,908,21.3995
+71,909,21.8016666666667
+71,910,22.4578333333333
+71,911,23.0293333333333
+71,912,21.7381666666667
+71,913,21.1666666666667
+71,914,21.4841666666667
+71,915,23.2833333333333
+71,916,26.0138333333333
+71,917,22.5425
+71,918,25.8233333333333
+71,919,30.6705
+71,920,21.082
+71,921,31.2843333333333
+71,922,27.2203333333333
+71,923,24.4686666666667
+71,924,17.3355
+71,925,25.6963333333333
+71,926,23.749
+71,927,26.9451666666667
+71,928,22.5001666666667
+71,929,25.5693333333333
+71,930,25.2095
+71,931,19.2405
+71,932,26.3313333333333
+71,933,28.4903333333333
+71,934,21.3995
+71,935,22.1403333333333
+71,936,20.7433333333333
+71,937,20.3835
+71,938,32.639
+71,939,21.2936666666667
+71,940,23.4315
+71,941,30.0566666666667
+71,942,23.9606666666667
+71,943,22.1826666666667
+71,944,22.2673333333333
+71,945,29.845
+71,946,20.574
+71,947,24.5321666666667
+71,948,26.543
+71,949,22.8388333333333
+71,950,27.5378333333333
+71,951,21.1455
+71,952,28.8501666666667
+71,953,24.5956666666667
+71,954,27.6013333333333
+71,955,25.0613333333333
+71,956,23.622
+71,957,23.114
+71,958,24.1935
+71,959,17.3778333333333
+71,960,28.0035
+71,961,27.0298333333333
+71,962,26.8816666666667
+71,963,23.8336666666667
+71,964,22.1615
+71,965,21.9498333333333
+71,966,24.8285
+71,967,21.8651666666667
+71,968,22.606
+71,969,27.686
+71,970,26.4583333333333
+71,971,25.2095
+71,972,22.9446666666667
+71,973,21.209
+71,974,26.4371666666667
+71,975,26.5641666666667
+71,976,22.8388333333333
+71,977,23.3256666666667
+71,978,23.9395
+71,979,25.3365
+71,980,25.5481666666667
+71,981,25.4635
+71,982,19.6638333333333
+71,983,21.9286666666667
+71,984,21.5053333333333
+71,985,25.4
+71,986,23.6431666666667
+71,987,25.2306666666667
+71,988,23.2833333333333
+71,989,26.9875
+71,990,19.9813333333333
+71,991,26.3313333333333
+71,992,34.6921666666667
+71,993,36.9781666666667
+71,994,20.7856666666667
+71,995,31.2843333333333
+71,996,26.0985
+71,997,24.4051666666667
+71,998,27.94
+71,999,33.4433333333333
+71,1000,26.5641666666667
+72,1,29.083
+72,2,24.003
+72,3,24.8496666666667
+72,4,28.7443333333333
+72,5,22.5636666666667
+72,6,25.654
+72,7,35.3906666666667
+72,8,25.2306666666667
+72,9,23.1563333333333
+72,10,23.1563333333333
+72,11,30.1836666666667
+72,12,24.7226666666667
+72,13,24.2993333333333
+72,14,27.2203333333333
+72,15,25.4846666666667
+72,16,29.7603333333333
+72,17,26.0773333333333
+72,18,29.718
+72,19,20.701
+72,20,21.6746666666667
+72,21,31.0726666666667
+72,22,32.1733333333333
+72,23,26.2466666666667
+72,24,21.6746666666667
+72,25,25.9926666666667
+72,26,28.4056666666667
+72,27,28.7866666666667
+72,28,28.2363333333333
+72,29,32.893
+72,30,23.1563333333333
+72,31,29.3793333333333
+72,32,23.5796666666667
+72,33,26.67
+72,34,21.9286666666667
+72,35,25.3576666666667
+72,36,19.431
+72,37,23.749
+72,38,25.908
+72,39,28.321
+72,40,25.781
+72,41,32.385
+72,42,26.3313333333333
+72,43,25.781
+72,44,21.5476666666667
+72,45,32.639
+72,46,27.6436666666667
+72,47,26.035
+72,48,21.844
+72,49,25.654
+72,50,25.654
+72,51,24.0453333333333
+72,52,27.5166666666667
+72,53,21.3783333333333
+72,54,27.686
+72,55,39.2006666666667
+72,56,22.0133333333333
+72,57,27.3473333333333
+72,58,27.6013333333333
+72,59,22.7753333333333
+72,60,32.512
+72,61,29.845
+72,62,29.1253333333333
+72,63,22.1826666666667
+72,64,24.0876666666667
+72,65,26.5853333333333
+72,66,28.9983333333333
+72,67,23.749
+72,68,28.6596666666667
+72,69,28.575
+72,70,29.3793333333333
+72,71,28.1516666666667
+72,72,20.7856666666667
+72,73,30.48
+72,74,25.4423333333333
+72,75,23.0293333333333
+72,76,26.5006666666667
+72,77,30.353
+72,78,26.4583333333333
+72,79,29.2946666666667
+72,80,27.2203333333333
+72,81,25.3576666666667
+72,82,26.543
+72,83,30.48
+72,84,26.9663333333333
+72,85,31.0726666666667
+72,86,30.988
+72,87,23.241
+72,88,32.0463333333333
+72,89,19.3463333333333
+72,90,24.892
+72,91,34.5016666666667
+72,92,28.2363333333333
+72,93,28.067
+72,94,21.717
+72,95,26.4583333333333
+72,96,24.257
+72,97,26.924
+72,98,30.6493333333333
+72,99,32.639
+72,100,30.607
+72,101,22.6483333333333
+72,102,31.369
+72,103,31.1573333333333
+72,104,23.8336666666667
+72,105,25.9926666666667
+72,106,27.0086666666667
+72,107,22.225
+72,108,25.908
+72,109,29.6756666666667
+72,110,33.782
+72,111,32.6813333333333
+72,112,27.0933333333333
+72,113,29.0406666666667
+72,114,31.1996666666667
+72,115,32.8506666666667
+72,116,29.464
+72,117,28.4903333333333
+72,118,30.607
+72,119,31.9193333333333
+72,120,30.099
+72,121,22.1826666666667
+72,122,24.0876666666667
+72,123,39.0313333333333
+72,124,28.7866666666667
+72,125,25.781
+72,126,26.2466666666667
+72,127,21.463
+72,128,32.7236666666667
+72,129,21.1243333333333
+72,130,28.4903333333333
+72,131,31.5806666666667
+72,132,27.94
+72,133,24.257
+72,134,21.336
+72,135,23.4526666666667
+72,136,31.2843333333333
+72,137,28.2786666666667
+72,138,26.416
+72,139,24.9343333333333
+72,140,29.7603333333333
+72,141,27.8976666666667
+72,142,30.6493333333333
+72,143,21.717
+72,144,28.2786666666667
+72,145,22.4366666666667
+72,146,21.6746666666667
+72,147,32.131
+72,148,25.4
+72,149,25.273
+72,150,26.162
+72,151,25.019
+72,152,23.749
+72,153,27.1356666666667
+72,154,29.5486666666667
+72,155,23.2833333333333
+72,156,25.1036666666667
+72,157,26.5006666666667
+72,158,23.7913333333333
+72,159,28.7443333333333
+72,160,29.972
+72,161,22.987
+72,162,31.6653333333333
+72,163,24.384
+72,164,29.6756666666667
+72,165,24.4263333333333
+72,166,26.7546666666667
+72,167,23.114
+72,168,28.8713333333333
+72,169,30.48
+72,170,25.0613333333333
+72,171,30.5223333333333
+72,172,34.163
+72,173,21.1243333333333
+72,174,22.352
+72,175,25.9503333333333
+72,176,25.3576666666667
+72,177,24.0453333333333
+72,178,25.1036666666667
+72,179,27.7706666666667
+72,180,23.7913333333333
+72,181,30.7763333333333
+72,182,30.607
+72,183,21.463
+72,184,29.591
+72,185,20.447
+72,186,26.543
+72,187,20.6586666666667
+72,188,26.035
+72,189,23.495
+72,190,28.575
+72,191,27.3473333333333
+72,192,30.1836666666667
+72,193,24.384
+72,194,29.0406666666667
+72,195,28.6596666666667
+72,196,26.3736666666667
+72,197,27.813
+72,198,30.48
+72,199,24.765
+72,200,22.733
+72,201,27.0086666666667
+72,202,24.0876666666667
+72,203,33.1046666666667
+72,204,26.7123333333333
+72,205,25.527
+72,206,29.1676666666667
+72,207,28.6173333333333
+72,208,23.0293333333333
+72,209,27.0086666666667
+72,210,28.702
+72,211,25.908
+72,212,21.336
+72,213,25.6963333333333
+72,214,23.114
+72,215,21.971
+72,216,27.5166666666667
+72,217,35.7293333333333
+72,218,33.0623333333333
+72,219,21.5053333333333
+72,220,31.8346666666667
+72,221,30.9033333333333
+72,222,34.671
+72,223,27.6436666666667
+72,224,30.0143333333333
+72,225,24.1723333333333
+72,226,32.893
+72,227,26.7123333333333
+72,228,29.1253333333333
+72,229,21.844
+72,230,24.6803333333333
+72,231,28.1093333333333
+72,232,27.0933333333333
+72,233,29.7603333333333
+72,234,23.6643333333333
+72,235,29.972
+72,236,26.162
+72,237,28.2786666666667
+72,238,26.3313333333333
+72,239,29.464
+72,240,21.2513333333333
+72,241,27.305
+72,242,30.734
+72,243,32.2156666666667
+72,244,31.6653333333333
+72,245,17.6953333333333
+72,246,25.1883333333333
+72,247,34.798
+72,248,27.2203333333333
+72,249,17.8646666666667
+72,250,26.9663333333333
+72,251,20.4893333333333
+72,252,25.654
+72,253,28.194
+72,254,31.877
+72,255,20.8703333333333
+72,256,26.3313333333333
+72,257,25.527
+72,258,26.797
+72,259,24.5956666666667
+72,260,26.0773333333333
+72,261,26.8816666666667
+72,262,21.844
+72,263,25.0613333333333
+72,264,21.971
+72,265,33.2316666666667
+72,266,28.3633333333333
+72,267,27.6436666666667
+72,268,30.3106666666667
+72,269,29.8873333333333
+72,270,26.2466666666667
+72,271,28.321
+72,272,28.1516666666667
+72,273,25.9503333333333
+72,274,40.513
+72,275,30.988
+72,276,27.4743333333333
+72,277,29.6756666666667
+72,278,24.3416666666667
+72,279,27.9823333333333
+72,280,30.2683333333333
+72,281,25.4846666666667
+72,282,28.321
+72,283,30.099
+72,284,28.575
+72,285,35.56
+72,286,29.4216666666667
+72,287,21.1666666666667
+72,288,31.75
+72,289,22.606
+72,290,26.2043333333333
+72,291,33.1046666666667
+72,292,20.7856666666667
+72,293,18.3726666666667
+72,294,22.9023333333333
+72,295,30.861
+72,296,24.9343333333333
+72,297,25.273
+72,298,31.3266666666667
+72,299,25.6116666666667
+72,300,28.0246666666667
+72,301,22.5636666666667
+72,302,32.2156666666667
+72,303,33.9513333333333
+72,304,25.019
+72,305,25.3576666666667
+72,306,37.6766666666667
+72,307,28.321
+72,308,26.6276666666667
+72,309,29.6756666666667
+72,310,28.8713333333333
+72,311,25.2306666666667
+72,312,25.6116666666667
+72,313,25.527
+72,314,27.9823333333333
+72,315,28.2786666666667
+72,316,28.6173333333333
+72,317,28.6173333333333
+72,318,22.9446666666667
+72,319,27.4743333333333
+72,320,28.702
+72,321,30.5223333333333
+72,322,28.321
+72,323,23.7913333333333
+72,324,27.305
+72,325,30.9033333333333
+72,326,23.5373333333333
+72,327,28.067
+72,328,25.2306666666667
+72,329,30.7763333333333
+72,330,26.4583333333333
+72,331,25.4
+72,332,30.6916666666667
+72,333,26.9663333333333
+72,334,25.8233333333333
+72,335,29.464
+72,336,24.3416666666667
+72,337,27.813
+72,338,21.2936666666667
+72,339,25.5693333333333
+72,340,22.0556666666667
+72,341,24.892
+72,342,33.655
+72,343,25.9503333333333
+72,344,24.5956666666667
+72,345,27.6436666666667
+72,346,20.2776666666667
+72,347,23.622
+72,348,24.7226666666667
+72,349,28.448
+72,350,33.0623333333333
+72,351,33.3163333333333
+72,352,29.1676666666667
+72,353,29.21
+72,354,28.5326666666667
+72,355,33.1893333333333
+72,356,28.4903333333333
+72,357,29.1676666666667
+72,358,25.4423333333333
+72,359,27.813
+72,360,25.146
+72,361,29.1253333333333
+72,362,30.734
+72,363,31.8346666666667
+72,364,31.5806666666667
+72,365,31.2843333333333
+72,366,26.67
+72,367,27.305
+72,368,31.8346666666667
+72,369,30.2683333333333
+72,370,35.433
+72,371,27.051
+72,372,29.8026666666667
+72,373,27.559
+72,374,23.622
+72,375,24.003
+72,376,28.9136666666667
+72,377,26.543
+72,378,24.4686666666667
+72,379,25.6963333333333
+72,380,22.5636666666667
+72,381,25.527
+72,382,27.7706666666667
+72,383,26.3313333333333
+72,384,32.1733333333333
+72,385,31.242
+72,386,30.353
+72,387,23.0293333333333
+72,388,21.082
+72,389,29.5063333333333
+72,390,33.3586666666667
+72,391,21.0396666666667
+72,392,35.6446666666667
+72,393,23.1563333333333
+72,394,30.2683333333333
+72,395,27.4743333333333
+72,396,29.4216666666667
+72,397,24.8496666666667
+72,398,23.3256666666667
+72,399,24.1723333333333
+72,400,32.1733333333333
+72,401,29.5063333333333
+72,402,24.511
+72,403,22.0133333333333
+72,404,26.0773333333333
+72,405,32.512
+72,406,35.179
+72,407,21.463
+72,408,23.0293333333333
+72,409,26.5006666666667
+72,410,26.9663333333333
+72,411,29.5486666666667
+72,412,24.2993333333333
+72,413,28.321
+72,414,30.9456666666667
+72,415,25.273
+72,416,27.6436666666667
+72,417,27.051
+72,418,28.6173333333333
+72,419,28.2363333333333
+72,420,24.4686666666667
+72,421,19.0076666666667
+72,422,28.9136666666667
+72,423,24.003
+72,424,33.4856666666667
+72,425,30.2683333333333
+72,426,26.543
+72,427,27.2626666666667
+72,428,26.797
+72,429,22.987
+72,430,30.48
+72,431,26.2466666666667
+72,432,25.019
+72,433,28.702
+72,434,22.9446666666667
+72,435,24.511
+72,436,25.4423333333333
+72,437,26.2043333333333
+72,438,22.733
+72,439,22.5636666666667
+72,440,20.6586666666667
+72,441,28.956
+72,442,23.7913333333333
+72,443,22.86
+72,444,23.1986666666667
+72,445,20.4046666666667
+72,446,29.2523333333333
+72,447,27.6436666666667
+72,448,33.0623333333333
+72,449,26.4583333333333
+72,450,26.6276666666667
+72,451,30.3106666666667
+72,452,26.8816666666667
+72,453,27.686
+72,454,22.733
+72,455,27.9823333333333
+72,456,21.8863333333333
+72,457,27.3473333333333
+72,458,28.702
+72,459,29.2946666666667
+72,460,24.13
+72,461,28.3633333333333
+72,462,23.749
+72,463,25.2306666666667
+72,464,28.194
+72,465,24.5956666666667
+72,466,37.719
+72,467,30.8186666666667
+72,468,28.9983333333333
+72,469,19.8543333333333
+72,470,23.2833333333333
+72,471,25.8233333333333
+72,472,22.0556666666667
+72,473,19.7273333333333
+72,474,32.131
+72,475,25.654
+72,476,29.7603333333333
+72,477,24.9343333333333
+72,478,30.988
+72,479,23.5373333333333
+72,480,31.4536666666667
+72,481,33.3586666666667
+72,482,31.9616666666667
+72,483,25.9926666666667
+72,484,27.8553333333333
+72,485,24.5533333333333
+72,486,27.7283333333333
+72,487,26.5853333333333
+72,488,29.6333333333333
+72,489,33.147
+72,490,19.2616666666667
+72,491,25.8656666666667
+72,492,29.464
+72,493,33.6973333333333
+72,494,25.9926666666667
+72,495,24.0453333333333
+72,496,30.5646666666667
+72,497,24.13
+72,498,31.1573333333333
+72,499,29.972
+72,500,30.1413333333333
+72,501,19.812
+72,502,21.9286666666667
+72,503,24.4263333333333
+72,504,29.1676666666667
+72,505,31.242
+72,506,30.48
+72,507,26.416
+72,508,34.163
+72,509,34.671
+72,510,24.0453333333333
+72,511,26.0773333333333
+72,512,31.1996666666667
+72,513,26.3313333333333
+72,514,20.6586666666667
+72,515,29.0406666666667
+72,516,28.7866666666667
+72,517,26.1196666666667
+72,518,26.416
+72,519,28.956
+72,520,25.8233333333333
+72,521,29.8873333333333
+72,522,36.4066666666667
+72,523,33.3163333333333
+72,524,32.3426666666667
+72,525,26.6276666666667
+72,526,30.0566666666667
+72,527,27.178
+72,528,26.3736666666667
+72,529,23.876
+72,530,33.3163333333333
+72,531,31.7076666666667
+72,532,23.5796666666667
+72,533,26.0773333333333
+72,534,24.1723333333333
+72,535,31.7923333333333
+72,536,27.686
+72,537,29.7603333333333
+72,538,37.5496666666667
+72,539,24.8073333333333
+72,540,27.6436666666667
+72,541,27.94
+72,542,29.0406666666667
+72,543,33.0623333333333
+72,544,21.336
+72,545,30.48
+72,546,29.337
+72,547,28.956
+72,548,16.637
+72,549,31.4113333333333
+72,550,25.5693333333333
+72,551,19.8966666666667
+72,552,26.7123333333333
+72,553,24.384
+72,554,28.575
+72,555,28.0246666666667
+72,556,24.7226666666667
+72,557,32.5543333333333
+72,558,24.0876666666667
+72,559,25.273
+72,560,25.2306666666667
+72,561,24.6803333333333
+72,562,28.321
+72,563,31.7076666666667
+72,564,31.9616666666667
+72,565,26.67
+72,566,26.5853333333333
+72,567,31.4536666666667
+72,568,27.9823333333333
+72,569,24.4263333333333
+72,570,23.368
+72,571,22.5213333333333
+72,572,24.384
+72,573,26.162
+72,574,30.2683333333333
+72,575,31.115
+72,576,24.9766666666667
+72,577,22.098
+72,578,30.607
+72,579,24.6803333333333
+72,580,30.0143333333333
+72,581,26.4583333333333
+72,582,29.8026666666667
+72,583,25.654
+72,584,30.1413333333333
+72,585,31.0726666666667
+72,586,29.6756666666667
+72,587,28.7443333333333
+72,588,28.6173333333333
+72,589,21.971
+72,590,27.0933333333333
+72,591,30.0143333333333
+72,592,24.2993333333333
+72,593,24.8496666666667
+72,594,27.1356666666667
+72,595,28.4056666666667
+72,596,29.8873333333333
+72,597,23.7066666666667
+72,598,32.7236666666667
+72,599,20.7433333333333
+72,600,25.4423333333333
+72,601,22.9023333333333
+72,602,27.1356666666667
+72,603,22.7753333333333
+72,604,23.9606666666667
+72,605,30.226
+72,606,29.464
+72,607,23.0293333333333
+72,608,27.9823333333333
+72,609,25.8656666666667
+72,610,29.972
+72,611,26.797
+72,612,28.5326666666667
+72,613,23.8336666666667
+72,614,27.4743333333333
+72,615,29.2946666666667
+72,616,26.7546666666667
+72,617,29.8873333333333
+72,618,27.432
+72,619,24.003
+72,620,37.4226666666667
+72,621,23.5796666666667
+72,622,34.9673333333333
+72,623,30.48
+72,624,29.083
+72,625,32.258
+72,626,29.8026666666667
+72,627,36.2373333333333
+72,628,28.2363333333333
+72,629,32.3426666666667
+72,630,22.5636666666667
+72,631,28.575
+72,632,24.5533333333333
+72,633,27.813
+72,634,24.003
+72,635,33.9513333333333
+72,636,30.861
+72,637,28.1516666666667
+72,638,27.0933333333333
+72,639,30.226
+72,640,31.1996666666667
+72,641,24.3416666666667
+72,642,24.257
+72,643,30.1413333333333
+72,644,27.9823333333333
+72,645,24.3416666666667
+72,646,24.765
+72,647,30.4376666666667
+72,648,24.1723333333333
+72,649,31.4536666666667
+72,650,29.21
+72,651,30.353
+72,652,33.6126666666667
+72,653,22.2673333333333
+72,654,22.1826666666667
+72,655,25.4
+72,656,24.8496666666667
+72,657,26.7123333333333
+72,658,28.1093333333333
+72,659,21.8016666666667
+72,660,33.0623333333333
+72,661,25.146
+72,662,28.321
+72,663,29.1253333333333
+72,664,24.638
+72,665,32.9353333333333
+72,666,33.3163333333333
+72,667,27.305
+72,668,28.9983333333333
+72,669,23.3256666666667
+72,670,31.0303333333333
+72,671,25.8233333333333
+72,672,29.2946666666667
+72,673,23.241
+72,674,25.1883333333333
+72,675,25.6963333333333
+72,676,25.5693333333333
+72,677,27.305
+72,678,27.1356666666667
+72,679,28.8713333333333
+72,680,21.0396666666667
+72,681,26.2466666666667
+72,682,30.861
+72,683,21.844
+72,684,23.368
+72,685,20.4893333333333
+72,686,29.337
+72,687,30.5646666666667
+72,688,26.8816666666667
+72,689,28.7866666666667
+72,690,24.0453333333333
+72,691,25.527
+72,692,17.9916666666667
+72,693,25.781
+72,694,38.6503333333333
+72,695,28.7443333333333
+72,696,29.1676666666667
+72,697,34.4593333333333
+72,698,25.9926666666667
+72,699,20.8703333333333
+72,700,31.369
+72,701,25.1036666666667
+72,702,23.368
+72,703,21.971
+72,704,26.416
+72,705,28.4903333333333
+72,706,33.7396666666667
+72,707,30.0143333333333
+72,708,27.8976666666667
+72,709,30.099
+72,710,26.3736666666667
+72,711,25.7386666666667
+72,712,27.813
+72,713,26.0773333333333
+72,714,27.5166666666667
+72,715,29.337
+72,716,24.3416666666667
+72,717,24.5956666666667
+72,718,26.035
+72,719,28.5326666666667
+72,720,25.146
+72,721,28.575
+72,722,27.5166666666667
+72,723,26.67
+72,724,31.0726666666667
+72,725,25.527
+72,726,24.4263333333333
+72,727,29.5063333333333
+72,728,28.7443333333333
+72,729,31.7923333333333
+72,730,27.3896666666667
+72,731,29.972
+72,732,26.2466666666667
+72,733,27.6013333333333
+72,734,25.6116666666667
+72,735,27.305
+72,736,30.353
+72,737,28.9136666666667
+72,738,27.5166666666667
+72,739,29.8026666666667
+72,740,26.5853333333333
+72,741,25.019
+72,742,24.8496666666667
+72,743,29.6333333333333
+72,744,29.6756666666667
+72,745,20.0236666666667
+72,746,18.923
+72,747,27.813
+72,748,23.9183333333333
+72,749,26.416
+72,750,26.67
+72,751,27.432
+72,752,32.4273333333333
+72,753,30.861
+72,754,28.4903333333333
+72,755,21.971
+72,756,25.146
+72,757,26.5006666666667
+72,758,31.877
+72,759,31.6653333333333
+72,760,25.6116666666667
+72,761,28.1516666666667
+72,762,26.924
+72,763,30.6493333333333
+72,764,27.9823333333333
+72,765,23.5373333333333
+72,766,29.845
+72,767,29.337
+72,768,23.4526666666667
+72,769,30.6493333333333
+72,770,23.5796666666667
+72,771,34.417
+72,772,33.7396666666667
+72,773,28.448
+72,774,28.956
+72,775,24.257
+72,776,25.6116666666667
+72,777,34.29
+72,778,27.1356666666667
+72,779,32.9776666666667
+72,780,31.8346666666667
+72,781,29.083
+72,782,24.8496666666667
+72,783,23.114
+72,784,28.0246666666667
+72,785,21.6323333333333
+72,786,31.3266666666667
+72,787,25.6963333333333
+72,788,19.3463333333333
+72,789,23.9183333333333
+72,790,26.5006666666667
+72,791,33.8243333333333
+72,792,30.9033333333333
+72,793,31.1573333333333
+72,794,25.0613333333333
+72,795,25.1883333333333
+72,796,21.7593333333333
+72,797,26.3313333333333
+72,798,30.8186666666667
+72,799,21.463
+72,800,26.9663333333333
+72,801,19.939
+72,802,27.3896666666667
+72,803,28.448
+72,804,30.3953333333333
+72,805,23.1563333333333
+72,806,27.94
+72,807,32.512
+72,808,25.781
+72,809,21.336
+72,810,25.4
+72,811,21.9286666666667
+72,812,21.463
+72,813,30.353
+72,814,25.5693333333333
+72,815,24.4263333333333
+72,816,23.1986666666667
+72,817,27.6436666666667
+72,818,27.9823333333333
+72,819,27.6013333333333
+72,820,30.4376666666667
+72,821,27.051
+72,822,24.003
+72,823,25.9503333333333
+72,824,25.5693333333333
+72,825,23.8336666666667
+72,826,30.48
+72,827,29.2523333333333
+72,828,23.749
+72,829,23.8336666666667
+72,830,29.8873333333333
+72,831,29.464
+72,832,31.5383333333333
+72,833,24.9343333333333
+72,834,26.035
+72,835,27.178
+72,836,25.1883333333333
+72,837,31.877
+72,838,26.9663333333333
+72,839,25.908
+72,840,31.7923333333333
+72,841,24.8073333333333
+72,842,29.2523333333333
+72,843,22.7753333333333
+72,844,22.5213333333333
+72,845,19.4733333333333
+72,846,23.5373333333333
+72,847,32.8506666666667
+72,848,33.8666666666667
+72,849,23.9183333333333
+72,850,27.5166666666667
+72,851,27.8553333333333
+72,852,29.2946666666667
+72,853,22.225
+72,854,28.5326666666667
+72,855,32.4273333333333
+72,856,25.8233333333333
+72,857,26.3313333333333
+72,858,30.4376666666667
+72,859,25.781
+72,860,26.8816666666667
+72,861,25.1036666666667
+72,862,31.623
+72,863,28.702
+72,864,20.6586666666667
+72,865,35.3906666666667
+72,866,22.8176666666667
+72,867,26.5853333333333
+72,868,30.3953333333333
+72,869,26.2043333333333
+72,870,33.8243333333333
+72,871,22.479
+72,872,25.654
+72,873,33.4433333333333
+72,874,23.114
+72,875,24.384
+72,876,25.9503333333333
+72,877,23.9606666666667
+72,878,29.3793333333333
+72,879,25.8656666666667
+72,880,26.7546666666667
+72,881,33.6973333333333
+72,882,25.7386666666667
+72,883,29.3793333333333
+72,884,31.5806666666667
+72,885,34.3746666666667
+72,886,30.3106666666667
+72,887,26.6276666666667
+72,888,24.8073333333333
+72,889,25.1883333333333
+72,890,25.6963333333333
+72,891,23.6643333333333
+72,892,29.5063333333333
+72,893,20.955
+72,894,23.5373333333333
+72,895,22.352
+72,896,23.0293333333333
+72,897,31.7923333333333
+72,898,26.2466666666667
+72,899,21.717
+72,900,31.115
+72,901,28.6596666666667
+72,902,32.1733333333333
+72,903,27.0933333333333
+72,904,25.3153333333333
+72,905,25.3576666666667
+72,906,29.21
+72,907,25.3153333333333
+72,908,23.1986666666667
+72,909,33.147
+72,910,22.3943333333333
+72,911,30.6916666666667
+72,912,20.574
+72,913,24.13
+72,914,22.86
+72,915,28.1093333333333
+72,916,28.1516666666667
+72,917,30.3953333333333
+72,918,29.8873333333333
+72,919,28.1093333333333
+72,920,27.9823333333333
+72,921,24.257
+72,922,19.3463333333333
+72,923,19.9813333333333
+72,924,26.416
+72,925,27.813
+72,926,27.051
+72,927,29.6756666666667
+72,928,30.5223333333333
+72,929,22.9446666666667
+72,930,26.9663333333333
+72,931,30.48
+72,932,23.8336666666667
+72,933,30.1413333333333
+72,934,34.4593333333333
+72,935,31.115
+72,936,26.797
+72,937,25.527
+72,938,26.289
+72,939,32.5966666666667
+72,940,26.8393333333333
+72,941,28.1516666666667
+72,942,28.321
+72,943,31.115
+72,944,22.8176666666667
+72,945,26.543
+72,946,21.2513333333333
+72,947,27.432
+72,948,27.813
+72,949,24.384
+72,950,25.146
+72,951,26.9663333333333
+72,952,28.1093333333333
+72,953,31.5383333333333
+72,954,32.639
+72,955,26.5006666666667
+72,956,24.0876666666667
+72,957,36.2796666666667
+72,958,31.5383333333333
+72,959,28.9983333333333
+72,960,31.0726666666667
+72,961,26.6276666666667
+72,962,28.2786666666667
+72,963,30.5223333333333
+72,964,30.0143333333333
+72,965,29.2946666666667
+72,966,25.6116666666667
+72,967,25.9926666666667
+72,968,24.5533333333333
+72,969,26.3313333333333
+72,970,27.6013333333333
+72,971,29.845
+72,972,33.3586666666667
+72,973,30.9033333333333
+72,974,28.7866666666667
+72,975,27.2203333333333
+72,976,25.3576666666667
+72,977,23.7913333333333
+72,978,24.4263333333333
+72,979,34.163
+72,980,27.8553333333333
+72,981,29.8873333333333
+72,982,25.6963333333333
+72,983,28.3633333333333
+72,984,23.241
+72,985,30.9456666666667
+72,986,25.654
+72,987,23.5796666666667
+72,988,26.7546666666667
+72,989,20.2353333333333
+72,990,27.5166666666667
+72,991,29.21
+72,992,25.527
+72,993,24.257
+72,994,25.527
+72,995,28.067
+72,996,25.3576666666667
+72,997,26.0773333333333
+72,998,29.3793333333333
+72,999,21.2513333333333
+72,1000,33.3163333333333
+73,1,36.6395
+73,2,29.3581666666667
+73,3,31.6441666666667
+73,4,25.3153333333333
+73,5,28.0035
+73,6,33.5915
+73,7,28.448
+73,8,34.925
+73,9,27.1356666666667
+73,10,38.0365
+73,11,28.6385
+73,12,31.0938333333333
+73,13,26.6488333333333
+73,14,28.2786666666667
+73,15,28.2363333333333
+73,16,24.257
+73,17,28.448
+73,18,36.1526666666667
+73,19,26.035
+73,20,28.067
+73,21,35.3271666666667
+73,22,36.5548333333333
+73,23,32.3426666666667
+73,24,29.7391666666667
+73,25,27.686
+73,26,24.0665
+73,27,27.4108333333333
+73,28,29.2523333333333
+73,29,37.973
+73,30,34.8191666666667
+73,31,21.3995
+73,32,22.5213333333333
+73,33,29.7391666666667
+73,34,33.2316666666667
+73,35,38.6291666666667
+73,36,26.416
+73,37,24.9343333333333
+73,38,33.8878333333333
+73,39,30.9456666666667
+73,40,39.1795
+73,41,27.3261666666667
+73,42,45.974
+73,43,31.2208333333333
+73,44,31.7288333333333
+73,45,29.0195
+73,46,33.6973333333333
+73,47,23.8125
+73,48,24.9978333333333
+73,49,36.8935
+73,50,18.4785
+73,51,29.1465
+73,52,33.1258333333333
+73,53,30.0566666666667
+73,54,29.7815
+73,55,24.5533333333333
+73,56,26.9028333333333
+73,57,35.8775
+73,58,33.0835
+73,59,29.083
+73,60,27.1356666666667
+73,61,34.3958333333333
+73,62,24.638
+73,63,31.6865
+73,64,29.9085
+73,65,30.099
+73,66,22.3308333333333
+73,67,26.4371666666667
+73,68,31.9193333333333
+73,69,22.606
+73,70,26.2043333333333
+73,71,35.9833333333333
+73,72,23.3468333333333
+73,73,27.1356666666667
+73,74,31.3478333333333
+73,75,28.448
+73,76,28.6173333333333
+73,77,25.7175
+73,78,38.862
+73,79,31.7711666666667
+73,80,31.7923333333333
+73,81,42.8836666666667
+73,82,32.131
+73,83,25.9503333333333
+73,84,30.1201666666667
+73,85,34.544
+73,86,29.0195
+73,87,23.6643333333333
+73,88,27.8341666666667
+73,89,20.4258333333333
+73,90,31.1996666666667
+73,91,24.4051666666667
+73,92,36.8511666666667
+73,93,29.9508333333333
+73,94,24.5533333333333
+73,95,30.5011666666667
+73,96,23.495
+73,97,23.9818333333333
+73,98,35.7505
+73,99,22.2461666666667
+73,100,25.8021666666667
+73,101,28.9348333333333
+73,102,31.7288333333333
+73,103,24.9978333333333
+73,104,33.0835
+73,105,28.0881666666667
+73,106,20.5951666666667
+73,107,24.2146666666667
+73,108,30.4165
+73,109,41.5925
+73,110,30.5011666666667
+73,111,31.7923333333333
+73,112,25.654
+73,113,36.195
+73,114,34.544
+73,115,33.7396666666667
+73,116,27.9188333333333
+73,117,28.8713333333333
+73,118,20.7221666666667
+73,119,31.0726666666667
+73,120,31.6865
+73,121,36.9781666666667
+73,122,23.6431666666667
+73,123,28.4056666666667
+73,124,28.6385
+73,125,30.607
+73,126,28.9348333333333
+73,127,41.5713333333333
+73,128,17.3355
+73,129,19.7061666666667
+73,130,26.924
+73,131,28.6173333333333
+73,132,24.9555
+73,133,19.0923333333333
+73,134,33.4221666666667
+73,135,26.1196666666667
+73,136,34.417
+73,137,28.4056666666667
+73,138,22.1403333333333
+73,139,30.6493333333333
+73,140,26.3101666666667
+73,141,24.8708333333333
+73,142,30.8398333333333
+73,143,31.9616666666667
+73,144,30.0143333333333
+73,145,32.0675
+73,146,37.0205
+73,147,31.0515
+73,148,29.5275
+73,149,28.8713333333333
+73,150,26.0561666666667
+73,151,38.1211666666667
+73,152,31.2208333333333
+73,153,35.7716666666667
+73,154,29.7815
+73,155,29.8873333333333
+73,156,28.0246666666667
+73,157,30.1413333333333
+73,158,29.4216666666667
+73,159,36.7665
+73,160,31.242
+73,161,28.0246666666667
+73,162,22.5848333333333
+73,163,26.0138333333333
+73,164,30.2895
+73,165,23.0928333333333
+73,166,27.2415
+73,167,28.0458333333333
+73,168,35.306
+73,169,36.6395
+73,170,27.3896666666667
+73,171,24.9766666666667
+73,172,24.6803333333333
+73,173,30.1413333333333
+73,174,34.671
+73,175,25.7175
+73,176,34.9885
+73,177,31.369
+73,178,31.7288333333333
+73,179,38.3751666666667
+73,180,31.3901666666667
+73,181,29.7815
+73,182,35.5811666666667
+73,183,33.2316666666667
+73,184,23.8336666666667
+73,185,28.0881666666667
+73,186,29.9085
+73,187,36.576
+73,188,25.1671666666667
+73,189,28.1093333333333
+73,190,23.4738333333333
+73,191,32.4485
+73,192,22.3731666666667
+73,193,27.8553333333333
+73,194,33.6338333333333
+73,195,37.1475
+73,196,30.5435
+73,197,35.0096666666667
+73,198,25.1883333333333
+73,199,26.289
+73,200,26.416
+73,201,20.2776666666667
+73,202,26.6488333333333
+73,203,30.9456666666667
+73,204,31.496
+73,205,22.2461666666667
+73,206,28.6808333333333
+73,207,34.036
+73,208,26.9663333333333
+73,209,22.7965
+73,210,31.4325
+73,211,23.1775
+73,212,29.2735
+73,213,31.3055
+73,214,41.021
+73,215,30.9456666666667
+73,216,26.6488333333333
+73,217,28.0035
+73,218,26.8181666666667
+73,219,31.1361666666667
+73,220,29.21
+73,221,22.9658333333333
+73,222,28.9771666666667
+73,223,29.4005
+73,224,28.5326666666667
+73,225,39.2853333333333
+73,226,27.9188333333333
+73,227,26.4371666666667
+73,228,26.6065
+73,229,29.2946666666667
+73,230,33.4433333333333
+73,231,32.7448333333333
+73,232,27.4531666666667
+73,233,31.5383333333333
+73,234,23.4738333333333
+73,235,32.5755
+73,236,36.3643333333333
+73,237,28.9348333333333
+73,238,31.242
+73,239,26.0138333333333
+73,240,31.0091666666667
+73,241,28.5115
+73,242,27.1145
+73,243,22.987
+73,244,33.2951666666667
+73,245,25.3365
+73,246,36.2796666666667
+73,247,29.8873333333333
+73,248,24.0453333333333
+73,249,28.575
+73,250,36.5336666666667
+73,251,25.1036666666667
+73,252,31.623
+73,253,39.5181666666667
+73,254,32.8083333333333
+73,255,33.4856666666667
+73,256,37.1475
+73,257,25.7598333333333
+73,258,23.6431666666667
+73,259,23.6431666666667
+73,260,20.9126666666667
+73,261,21.4418333333333
+73,262,22.2885
+73,263,34.29
+73,264,29.0406666666667
+73,265,31.0303333333333
+73,266,34.0571666666667
+73,267,30.7763333333333
+73,268,29.8238333333333
+73,269,34.1841666666667
+73,270,29.718
+73,271,25.3788333333333
+73,272,35.6023333333333
+73,273,34.417
+73,274,34.7345
+73,275,31.3055
+73,276,36.6395
+73,277,30.2048333333333
+73,278,35.2001666666667
+73,279,28.2575
+73,280,19.939
+73,281,22.479
+73,282,24.0453333333333
+73,283,37.1051666666667
+73,284,34.036
+73,285,41.529
+73,286,34.4381666666667
+73,287,25.8445
+73,288,26.5853333333333
+73,289,27.0933333333333
+73,290,29.591
+73,291,18.9865
+73,292,33.909
+73,293,25.6116666666667
+73,294,34.7556666666667
+73,295,27.8765
+73,296,27.559
+73,297,31.6865
+73,298,23.1775
+73,299,20.3835
+73,300,30.4376666666667
+73,301,31.3478333333333
+73,302,27.432
+73,303,33.401
+73,304,23.0928333333333
+73,305,26.035
+73,306,29.6121666666667
+73,307,25.146
+73,308,24.4686666666667
+73,309,28.8501666666667
+73,310,24.638
+73,311,32.7871666666667
+73,312,32.0886666666667
+73,313,34.2688333333333
+73,314,28.8713333333333
+73,315,26.416
+73,316,29.9508333333333
+73,317,26.2255
+73,318,23.9395
+73,319,34.4381666666667
+73,320,21.5053333333333
+73,321,32.9776666666667
+73,322,31.115
+73,323,29.6968333333333
+73,324,27.6013333333333
+73,325,35.2001666666667
+73,326,36.9146666666667
+73,327,26.1196666666667
+73,328,37.7825
+73,329,32.0886666666667
+73,330,32.8295
+73,331,31.0303333333333
+73,332,34.3535
+73,333,30.9245
+73,334,33.5703333333333
+73,335,39.5605
+73,336,29.4216666666667
+73,337,36.0256666666667
+73,338,25.4846666666667
+73,339,25.4423333333333
+73,340,25.2306666666667
+73,341,35.4753333333333
+73,342,27.3473333333333
+73,343,19.1558333333333
+73,344,27.9611666666667
+73,345,30.6916666666667
+73,346,28.6385
+73,347,27.8765
+73,348,21.3783333333333
+73,349,27.0933333333333
+73,350,33.7608333333333
+73,351,28.448
+73,352,31.8981666666667
+73,353,27.4955
+73,354,25.019
+73,355,38.3328333333333
+73,356,31.6018333333333
+73,357,27.3261666666667
+73,358,31.242
+73,359,28.194
+73,360,33.0411666666667
+73,361,23.9395
+73,362,28.575
+73,363,29.2311666666667
+73,364,28.8078333333333
+73,365,26.8816666666667
+73,366,28.3633333333333
+73,367,31.7288333333333
+73,368,35.7928333333333
+73,369,40.132
+73,370,24.2146666666667
+73,371,25.8233333333333
+73,372,27.6648333333333
+73,373,44.0266666666667
+73,374,22.9446666666667
+73,375,30.099
+73,376,23.622
+73,377,27.2838333333333
+73,378,24.4686666666667
+73,379,24.4686666666667
+73,380,32.7871666666667
+73,381,33.2316666666667
+73,382,34.417
+73,383,31.0303333333333
+73,384,30.2471666666667
+73,385,22.3308333333333
+73,386,34.9673333333333
+73,387,38.1423333333333
+73,388,29.9508333333333
+73,389,22.6695
+73,390,27.0721666666667
+73,391,31.5806666666667
+73,392,30.9245
+73,393,31.3055
+73,394,30.2471666666667
+73,395,33.2316666666667
+73,396,32.7871666666667
+73,397,27.2203333333333
+73,398,23.0505
+73,399,36.8088333333333
+73,400,23.0293333333333
+73,401,29.8873333333333
+73,402,27.3896666666667
+73,403,35.5388333333333
+73,404,25.8445
+73,405,37.1263333333333
+73,406,22.86
+73,407,27.8553333333333
+73,408,25.5693333333333
+73,409,33.6338333333333
+73,410,18.9018333333333
+73,411,30.1625
+73,412,39.1371666666667
+73,413,34.2053333333333
+73,414,40.4706666666667
+73,415,32.2368333333333
+73,416,29.2523333333333
+73,417,28.6173333333333
+73,418,34.8826666666667
+73,419,31.1573333333333
+73,420,33.2316666666667
+73,421,20.9338333333333
+73,422,27.1356666666667
+73,423,28.6385
+73,424,33.0623333333333
+73,425,27.1568333333333
+73,426,30.6281666666667
+73,427,26.4371666666667
+73,428,31.2843333333333
+73,429,32.9565
+73,430,15.4305
+73,431,18.542
+73,432,32.131
+73,433,40.767
+73,434,25.6328333333333
+73,435,31.5171666666667
+73,436,34.5863333333333
+73,437,32.1733333333333
+73,438,31.877
+73,439,31.6653333333333
+73,440,28.1516666666667
+73,441,22.6906666666667
+73,442,30.4588333333333
+73,443,31.5595
+73,444,34.8615
+73,445,32.1521666666667
+73,446,35.1578333333333
+73,447,35.5176666666667
+73,448,25.9926666666667
+73,449,42.926
+73,450,31.3266666666667
+73,451,26.1831666666667
+73,452,18.415
+73,453,31.2843333333333
+73,454,27.3473333333333
+73,455,33.3586666666667
+73,456,32.8718333333333
+73,457,28.8501666666667
+73,458,21.1666666666667
+73,459,35.8563333333333
+73,460,32.5966666666667
+73,461,27.4531666666667
+73,462,29.3581666666667
+73,463,24.638
+73,464,35.8986666666667
+73,465,20.0236666666667
+73,466,37.9941666666667
+73,467,25.4846666666667
+73,468,29.464
+73,469,36.449
+73,470,31.9828333333333
+73,471,32.5966666666667
+73,472,34.29
+73,473,33.9936666666667
+73,474,36.5125
+73,475,31.0938333333333
+73,476,36.4913333333333
+73,477,30.1413333333333
+73,478,25.1883333333333
+73,479,27.0933333333333
+73,480,27.7918333333333
+73,481,35.052
+73,482,31.7711666666667
+73,483,24.5956666666667
+73,484,31.115
+73,485,26.6488333333333
+73,486,26.3736666666667
+73,487,25.1248333333333
+73,488,27.1568333333333
+73,489,32.7448333333333
+73,490,29.9296666666667
+73,491,32.258
+73,492,35.814
+73,493,30.353
+73,494,35.0308333333333
+73,495,26.5006666666667
+73,496,30.353
+73,497,27.9823333333333
+73,498,25.1883333333333
+73,499,24.8073333333333
+73,500,38.5233333333333
+73,501,30.226
+73,502,19.7273333333333
+73,503,30.6916666666667
+73,504,24.511
+73,505,31.75
+73,506,32.7236666666667
+73,507,29.6121666666667
+73,508,34.29
+73,509,26.8181666666667
+73,510,24.9343333333333
+73,511,28.702
+73,512,28.829
+73,513,26.162
+73,514,25.527
+73,515,25.8233333333333
+73,516,29.6121666666667
+73,517,28.8713333333333
+73,518,26.2043333333333
+73,519,34.0571666666667
+73,520,33.401
+73,521,23.9395
+73,522,35.8986666666667
+73,523,28.6173333333333
+73,524,30.4588333333333
+73,525,19.7273333333333
+73,526,26.3525
+73,527,26.0985
+73,528,38.7773333333333
+73,529,33.3798333333333
+73,530,29.7391666666667
+73,531,28.1305
+73,532,26.7335
+73,533,33.6973333333333
+73,534,30.7975
+73,535,37.592
+73,536,25.9503333333333
+73,537,41.9946666666667
+73,538,31.4113333333333
+73,539,25.8445
+73,540,33.1046666666667
+73,541,18.161
+73,542,28.3421666666667
+73,543,31.7076666666667
+73,544,29.4005
+73,545,24.5745
+73,546,31.1573333333333
+73,547,44.577
+73,548,30.3106666666667
+73,549,35.56
+73,550,37.211
+73,551,26.3101666666667
+73,552,29.9508333333333
+73,553,37.8883333333333
+73,554,32.3003333333333
+73,555,34.4381666666667
+73,556,26.0561666666667
+73,557,27.2203333333333
+73,558,29.0618333333333
+73,559,29.21
+73,560,41.2961666666667
+73,561,35.9621666666667
+73,562,34.1418333333333
+73,563,23.749
+73,564,29.7815
+73,565,31.75
+73,566,31.9405
+73,567,28.194
+73,568,23.7278333333333
+73,569,34.6286666666667
+73,570,27.5166666666667
+73,571,28.9983333333333
+73,572,28.3633333333333
+73,573,32.6178333333333
+73,574,23.1986666666667
+73,575,33.0411666666667
+73,576,40.9998333333333
+73,577,22.0133333333333
+73,578,28.6173333333333
+73,579,30.7128333333333
+73,580,31.75
+73,581,19.6638333333333
+73,582,31.1361666666667
+73,583,32.9988333333333
+73,584,25.5693333333333
+73,585,30.7128333333333
+73,586,29.464
+73,587,26.6911666666667
+73,588,39.7721666666667
+73,589,34.6286666666667
+73,590,29.9931666666667
+73,591,24.511
+73,592,30.5435
+73,593,20.7645
+73,594,31.877
+73,595,30.3741666666667
+73,596,30.4588333333333
+73,597,30.8186666666667
+73,598,27.4531666666667
+73,599,30.2048333333333
+73,600,19.3675
+73,601,32.2156666666667
+73,602,29.972
+73,603,24.8073333333333
+73,604,35.4541666666667
+73,605,17.0391666666667
+73,606,30.3953333333333
+73,607,23.3468333333333
+73,608,31.8135
+73,609,34.2476666666667
+73,610,31.4748333333333
+73,611,28.194
+73,612,28.5326666666667
+73,613,25.654
+73,614,34.3535
+73,615,31.115
+73,616,29.5275
+73,617,33.8031666666667
+73,618,39.7086666666667
+73,619,28.9348333333333
+73,620,31.8135
+73,621,32.3638333333333
+73,622,34.5016666666667
+73,623,28.0246666666667
+73,624,36.8935
+73,625,35.8563333333333
+73,626,26.1196666666667
+73,627,27.7283333333333
+73,628,34.0783333333333
+73,629,32.4696666666667
+73,630,29.7391666666667
+73,631,38.0788333333333
+73,632,31.3478333333333
+73,633,28.3845
+73,634,25.1036666666667
+73,635,25.1036666666667
+73,636,33.8031666666667
+73,637,29.2735
+73,638,30.6705
+73,639,42.3968333333333
+73,640,32.7236666666667
+73,641,29.5698333333333
+73,642,28.2998333333333
+73,643,20.193
+73,644,31.6653333333333
+73,645,33.528
+73,646,28.0881666666667
+73,647,23.8971666666667
+73,648,25.9715
+73,649,32.893
+73,650,29.1676666666667
+73,651,30.5011666666667
+73,652,30.4165
+73,653,24.2358333333333
+73,654,26.1831666666667
+73,655,23.6431666666667
+73,656,37.5073333333333
+73,657,46.0375
+73,658,30.0566666666667
+73,659,24.1935
+73,660,29.0195
+73,661,42.291
+73,662,28.0246666666667
+73,663,33.5915
+73,664,29.5486666666667
+73,665,29.1041666666667
+73,666,36.1526666666667
+73,667,32.5966666666667
+73,668,43.0106666666667
+73,669,30.7975
+73,670,27.5378333333333
+73,671,24.0876666666667
+73,672,33.4856666666667
+73,673,22.6695
+73,674,35.56
+73,675,22.1403333333333
+73,676,43.1588333333333
+73,677,28.7443333333333
+73,678,28.8501666666667
+73,679,33.1046666666667
+73,680,34.29
+73,681,24.8496666666667
+73,682,24.6168333333333
+73,683,30.7551666666667
+73,684,32.8506666666667
+73,685,38.6715
+73,686,31.115
+73,687,31.623
+73,688,33.5068333333333
+73,689,32.1098333333333
+73,690,30.4376666666667
+73,691,27.8765
+73,692,31.8981666666667
+73,693,28.2998333333333
+73,694,31.623
+73,695,27.1145
+73,696,32.5755
+73,697,32.8295
+73,698,25.8868333333333
+73,699,26.924
+73,700,29.972
+73,701,25.019
+73,702,24.3416666666667
+73,703,26.9875
+73,704,19.4733333333333
+73,705,25.8445
+73,706,27.1991666666667
+73,707,31.1361666666667
+73,708,28.702
+73,709,34.0783333333333
+73,710,32.0251666666667
+73,711,27.1568333333333
+73,712,39.1583333333333
+73,713,22.9446666666667
+73,714,31.4325
+73,715,25.1248333333333
+73,716,24.4475
+73,717,29.083
+73,718,33.655
+73,719,35.6235
+73,720,37.1686666666667
+73,721,25.527
+73,722,25.654
+73,723,25.6116666666667
+73,724,34.6075
+73,725,26.6276666666667
+73,726,38.4598333333333
+73,727,31.8981666666667
+73,728,28.7231666666667
+73,729,20.9761666666667
+73,730,37.2533333333333
+73,731,27.7283333333333
+73,732,30.1413333333333
+73,733,33.4856666666667
+73,734,29.6333333333333
+73,735,25.9291666666667
+73,736,35.9198333333333
+73,737,25.781
+73,738,30.1413333333333
+73,739,29.1465
+73,740,26.2043333333333
+73,741,28.7655
+73,742,34.798
+73,743,33.2316666666667
+73,744,30.6281666666667
+73,745,39.7721666666667
+73,746,34.3746666666667
+73,747,33.909
+73,748,32.6178333333333
+73,749,37.1898333333333
+73,750,34.0995
+73,751,33.909
+73,752,34.2688333333333
+73,753,30.4165
+73,754,28.4268333333333
+73,755,33.7396666666667
+73,756,33.7396666666667
+73,757,36.6818333333333
+73,758,26.5006666666667
+73,759,26.797
+73,760,20.8491666666667
+73,761,23.749
+73,762,30.5011666666667
+73,763,25.6963333333333
+73,764,37.3803333333333
+73,765,32.2156666666667
+73,766,25.654
+73,767,41.0421666666667
+73,768,27.9823333333333
+73,769,34.5016666666667
+73,770,36.8511666666667
+73,771,34.0783333333333
+73,772,23.0081666666667
+73,773,30.0143333333333
+73,774,28.8501666666667
+73,775,40.5765
+73,776,25.8656666666667
+73,777,34.6921666666667
+73,778,35.7716666666667
+73,779,29.4851666666667
+73,780,37.5708333333333
+73,781,29.4851666666667
+73,782,26.6065
+73,783,27.1145
+73,784,23.9183333333333
+73,785,29.5275
+73,786,30.9668333333333
+73,787,28.9771666666667
+73,788,30.3741666666667
+73,789,37.4226666666667
+73,790,21.9286666666667
+73,791,25.3153333333333
+73,792,20.6375
+73,793,25.3576666666667
+73,794,26.797
+73,795,32.7871666666667
+73,796,34.0995
+73,797,33.147
+73,798,30.1413333333333
+73,799,24.0876666666667
+73,800,25.7598333333333
+73,801,21.7805
+73,802,32.9141666666667
+73,803,26.6911666666667
+73,804,36.8088333333333
+73,805,28.8713333333333
+73,806,34.3323333333333
+73,807,24.7015
+73,808,31.2843333333333
+73,809,28.8925
+73,810,28.2786666666667
+73,811,28.575
+73,812,23.9183333333333
+73,813,22.3308333333333
+73,814,32.512
+73,815,25.2095
+73,816,30.3318333333333
+73,817,30.9456666666667
+73,818,34.0148333333333
+73,819,25.1248333333333
+73,820,30.7551666666667
+73,821,33.782
+73,822,38.2905
+73,823,29.21
+73,824,31.5595
+73,825,28.3845
+73,826,31.6865
+73,827,27.9188333333333
+73,828,28.0246666666667
+73,829,32.0886666666667
+73,830,28.3421666666667
+73,831,19.8331666666667
+73,832,31.2843333333333
+73,833,34.3958333333333
+73,834,30.8186666666667
+73,835,34.163
+73,836,23.8125
+73,837,32.9141666666667
+73,838,24.4898333333333
+73,839,32.8083333333333
+73,840,26.416
+73,841,28.0246666666667
+73,842,34.8191666666667
+73,843,24.892
+73,844,27.6648333333333
+73,845,29.6545
+73,846,32.4696666666667
+73,847,24.6591666666667
+73,848,27.7918333333333
+73,849,23.6008333333333
+73,850,30.5223333333333
+73,851,27.3685
+73,852,23.7913333333333
+73,853,27.9188333333333
+73,854,25.4635
+73,855,22.8811666666667
+73,856,30.6281666666667
+73,857,24.4898333333333
+73,858,22.0345
+73,859,22.9235
+73,860,27.178
+73,861,35.6658333333333
+73,862,27.7071666666667
+73,863,34.8826666666667
+73,864,36.0256666666667
+73,865,23.4103333333333
+73,866,26.7123333333333
+73,867,33.3375
+73,868,27.7071666666667
+73,869,33.0411666666667
+73,870,24.9766666666667
+73,871,25.6751666666667
+73,872,23.5796666666667
+73,873,39.624
+73,874,31.1573333333333
+73,875,27.051
+73,876,30.8398333333333
+73,877,30.0778333333333
+73,878,34.7133333333333
+73,879,22.2461666666667
+73,880,33.02
+73,881,32.5331666666667
+73,882,28.829
+73,883,25.0401666666667
+73,884,35.306
+73,885,34.1206666666667
+73,886,30.2895
+73,887,30.1625
+73,888,28.321
+73,889,33.2528333333333
+73,890,28.7443333333333
+73,891,24.0241666666667
+73,892,30.9033333333333
+73,893,23.7913333333333
+73,894,35.0943333333333
+73,895,25.6328333333333
+73,896,26.7335
+73,897,32.893
+73,898,30.9033333333333
+73,899,35.3695
+73,900,26.0138333333333
+73,901,29.6756666666667
+73,902,33.1046666666667
+73,903,33.1046666666667
+73,904,25.9715
+73,905,26.289
+73,906,35.5811666666667
+73,907,22.3943333333333
+73,908,28.6596666666667
+73,909,35.5811666666667
+73,910,27.6225
+73,911,37.6978333333333
+73,912,28.2998333333333
+73,913,33.7185
+73,914,32.5755
+73,915,26.4583333333333
+73,916,30.7128333333333
+73,917,22.6695
+73,918,33.655
+73,919,23.7701666666667
+73,920,34.0148333333333
+73,921,26.416
+73,922,36.1526666666667
+73,923,28.194
+73,924,25.3576666666667
+73,925,25.6751666666667
+73,926,31.5595
+73,927,22.9235
+73,928,35.4753333333333
+73,929,34.0148333333333
+73,930,27.2838333333333
+73,931,27.0933333333333
+73,932,36.1315
+73,933,33.782
+73,934,25.8656666666667
+73,935,33.528
+73,936,32.004
+73,937,44.831
+73,938,30.861
+73,939,35.9621666666667
+73,940,25.8021666666667
+73,941,33.2528333333333
+73,942,29.21
+73,943,31.7711666666667
+73,944,26.9028333333333
+73,945,27.5378333333333
+73,946,29.972
+73,947,27.4955
+73,948,30.6281666666667
+73,949,21.6958333333333
+73,950,34.2265
+73,951,32.131
+73,952,26.5853333333333
+73,953,23.4738333333333
+73,954,24.5533333333333
+73,955,32.7448333333333
+73,956,28.321
+73,957,29.5063333333333
+73,958,28.1728333333333
+73,959,28.2151666666667
+73,960,30.0355
+73,961,31.2631666666667
+73,962,36.6395
+73,963,40.132
+73,964,43.0106666666667
+73,965,30.7763333333333
+73,966,39.7298333333333
+73,967,32.258
+73,968,32.1733333333333
+73,969,28.2151666666667
+73,970,18.923
+73,971,32.9141666666667
+73,972,31.8558333333333
+73,973,36.4066666666667
+73,974,27.6013333333333
+73,975,23.3468333333333
+73,976,35.6235
+73,977,36.3643333333333
+73,978,25.1671666666667
+73,979,33.2105
+73,980,25.9926666666667
+73,981,27.0086666666667
+73,982,28.6385
+73,983,38.6503333333333
+73,984,28.0035
+73,985,19.8543333333333
+73,986,28.7443333333333
+73,987,28.0035
+73,988,34.544
+73,989,35.6235
+73,990,24.3628333333333
+73,991,27.559
+73,992,27.5378333333333
+73,993,28.5538333333333
+73,994,31.5171666666667
+73,995,27.2838333333333
+73,996,45.4025
+73,997,21.2513333333333
+73,998,31.3478333333333
+73,999,33.0411666666667
+73,1000,28.448
+74,1,30.2895
+74,2,20.8068333333333
+74,3,24.9555
+74,4,23.1351666666667
+74,5,22.5848333333333
+74,6,33.9936666666667
+74,7,27.3261666666667
+74,8,29.7603333333333
+74,9,31.7711666666667
+74,10,30.3953333333333
+74,11,20.9761666666667
+74,12,28.8713333333333
+74,13,25.0825
+74,14,30.9245
+74,15,24.0876666666667
+74,16,22.5425
+74,17,19.1558333333333
+74,18,21.6535
+74,19,27.7495
+74,20,21.463
+74,21,26.1408333333333
+74,22,27.432
+74,23,23.7701666666667
+74,24,25.654
+74,25,21.6746666666667
+74,26,20.0236666666667
+74,27,27.3685
+74,28,26.9451666666667
+74,29,24.5321666666667
+74,30,23.7278333333333
+74,31,24.892
+74,32,23.3468333333333
+74,33,24.0453333333333
+74,34,20.574
+74,35,32.5755
+74,36,24.0665
+74,37,22.7965
+74,38,27.051
+74,39,22.2673333333333
+74,40,17.1661666666667
+74,41,22.2673333333333
+74,42,31.496
+74,43,22.098
+74,44,26.0561666666667
+74,45,25.8445
+74,46,23.0293333333333
+74,47,23.0293333333333
+74,48,24.7861666666667
+74,49,27.5166666666667
+74,50,20.1506666666667
+74,51,32.9565
+74,52,32.6813333333333
+74,53,26.1196666666667
+74,54,22.1615
+74,55,23.9606666666667
+74,56,27.8765
+74,57,24.0241666666667
+74,58,19.0288333333333
+74,59,28.6808333333333
+74,60,28.6596666666667
+74,61,23.5796666666667
+74,62,24.5533333333333
+74,63,26.2678333333333
+74,64,22.5213333333333
+74,65,24.5745
+74,66,25.0825
+74,67,32.9776666666667
+74,68,26.8816666666667
+74,69,23.7701666666667
+74,70,26.2255
+74,71,30.099
+74,72,21.7805
+74,73,29.845
+74,74,26.6065
+74,75,31.1996666666667
+74,76,24.2358333333333
+74,77,22.7541666666667
+74,78,20.066
+74,79,24.384
+74,80,26.924
+74,81,36.0891666666667
+74,82,24.5321666666667
+74,83,25.1671666666667
+74,84,21.971
+74,85,27.7283333333333
+74,86,26.543
+74,87,28.0246666666667
+74,88,21.4206666666667
+74,89,23.7913333333333
+74,90,31.496
+74,91,20.1295
+74,92,27.7495
+74,93,25.4211666666667
+74,94,23.3045
+74,95,27.0933333333333
+74,96,20.193
+74,97,33.0411666666667
+74,98,29.2523333333333
+74,99,20.2776666666667
+74,100,25.019
+74,101,31.242
+74,102,21.1243333333333
+74,103,26.7335
+74,104,24.638
+74,105,25.6963333333333
+74,106,23.8336666666667
+74,107,21.6323333333333
+74,108,28.3633333333333
+74,109,30.2471666666667
+74,110,25.5693333333333
+74,111,24.892
+74,112,25.5058333333333
+74,113,22.6906666666667
+74,114,26.0773333333333
+74,115,24.2993333333333
+74,116,29.9508333333333
+74,117,27.432
+74,118,27.9188333333333
+74,119,27.3261666666667
+74,120,25.9291666666667
+74,121,28.0881666666667
+74,122,27.8341666666667
+74,123,23.9395
+74,124,29.8026666666667
+74,125,36.83
+74,126,30.4376666666667
+74,127,25.2306666666667
+74,128,20.066
+74,129,21.4841666666667
+74,130,25.1671666666667
+74,131,26.0985
+74,132,22.4155
+74,133,22.7965
+74,134,26.924
+74,135,26.9875
+74,136,27.2415
+74,137,20.9973333333333
+74,138,29.718
+74,139,25.4423333333333
+74,140,40.5976666666667
+74,141,22.5213333333333
+74,142,25.4846666666667
+74,143,25.3365
+74,144,20.2988333333333
+74,145,27.3473333333333
+74,146,30.9668333333333
+74,147,30.734
+74,148,30.2471666666667
+74,149,24.8285
+74,150,27.4108333333333
+74,151,27.3261666666667
+74,152,23.8971666666667
+74,153,22.6483333333333
+74,154,18.8171666666667
+74,155,20.7221666666667
+74,156,26.9663333333333
+74,157,21.717
+74,158,26.3313333333333
+74,159,19.7485
+74,160,25.4423333333333
+74,161,28.9983333333333
+74,162,22.4366666666667
+74,163,22.987
+74,164,22.098
+74,165,25.8021666666667
+74,166,25.0613333333333
+74,167,28.8078333333333
+74,168,23.6855
+74,169,21.8863333333333
+74,170,27.0086666666667
+74,171,24.1511666666667
+74,172,24.7226666666667
+74,173,30.5435
+74,174,28.5961666666667
+74,175,25.8233333333333
+74,176,31.4748333333333
+74,177,20.7433333333333
+74,178,21.2513333333333
+74,179,25.4211666666667
+74,180,23.1351666666667
+74,181,21.463
+74,182,22.5848333333333
+74,183,28.2786666666667
+74,184,22.225
+74,185,23.6855
+74,186,32.8506666666667
+74,187,20.8491666666667
+74,188,22.6695
+74,189,22.2885
+74,190,26.3525
+74,191,31.8558333333333
+74,192,18.9865
+74,193,18.8595
+74,194,28.2363333333333
+74,195,22.1191666666667
+74,196,29.845
+74,197,29.0618333333333
+74,198,20.1718333333333
+74,199,27.4531666666667
+74,200,30.9033333333333
+74,201,16.0655
+74,202,17.2296666666667
+74,203,26.7335
+74,204,21.3995
+74,205,33.3163333333333
+74,206,22.5425
+74,207,21.5476666666667
+74,208,28.6596666666667
+74,209,25.0613333333333
+74,210,26.8816666666667
+74,211,25.3153333333333
+74,212,21.6746666666667
+74,213,22.5636666666667
+74,214,26.543
+74,215,27.6436666666667
+74,216,26.2466666666667
+74,217,25.7386666666667
+74,218,23.3256666666667
+74,219,27.8976666666667
+74,220,26.035
+74,221,21.2725
+74,222,25.4211666666667
+74,223,24.5533333333333
+74,224,25.2941666666667
+74,225,25.1883333333333
+74,226,25.8656666666667
+74,227,22.2038333333333
+74,228,24.3416666666667
+74,229,26.3948333333333
+74,230,19.6426666666667
+74,231,28.7231666666667
+74,232,30.353
+74,233,26.6488333333333
+74,234,26.3736666666667
+74,235,23.5373333333333
+74,236,32.4908333333333
+74,237,32.0886666666667
+74,238,31.9616666666667
+74,239,25.8868333333333
+74,240,20.447
+74,241,24.257
+74,242,24.4898333333333
+74,243,23.5373333333333
+74,244,25.2518333333333
+74,245,21.336
+74,246,30.3953333333333
+74,247,22.6906666666667
+74,248,24.6803333333333
+74,249,21.3783333333333
+74,250,22.2885
+74,251,27.7918333333333
+74,252,22.733
+74,253,21.7593333333333
+74,254,25.4846666666667
+74,255,21.0608333333333
+74,256,25.908
+74,257,20.5528333333333
+74,258,22.2885
+74,259,32.5755
+74,260,29.1041666666667
+74,261,32.004
+74,262,29.3158333333333
+74,263,27.5166666666667
+74,264,29.718
+74,265,27.2415
+74,266,27.7918333333333
+74,267,20.1718333333333
+74,268,24.9131666666667
+74,269,27.1145
+74,270,27.4955
+74,271,20.2353333333333
+74,272,31.0938333333333
+74,273,22.098
+74,274,27.4108333333333
+74,275,24.7226666666667
+74,276,23.368
+74,277,23.6643333333333
+74,278,22.098
+74,279,19.9813333333333
+74,280,31.4748333333333
+74,281,29.9296666666667
+74,282,22.987
+74,283,28.1305
+74,284,26.4583333333333
+74,285,26.4795
+74,286,26.5218333333333
+74,287,23.1563333333333
+74,288,27.4743333333333
+74,289,23.7701666666667
+74,290,23.5373333333333
+74,291,26.5006666666667
+74,292,18.3938333333333
+74,293,26.2043333333333
+74,294,22.4578333333333
+74,295,32.639
+74,296,25.6328333333333
+74,297,23.8125
+74,298,24.3416666666667
+74,299,28.3421666666667
+74,300,32.3638333333333
+74,301,25.1036666666667
+74,302,33.2528333333333
+74,303,25.5693333333333
+74,304,30.3741666666667
+74,305,26.1408333333333
+74,306,20.193
+74,307,27.4108333333333
+74,308,28.9136666666667
+74,309,29.4005
+74,310,28.4056666666667
+74,311,21.3148333333333
+74,312,26.9663333333333
+74,313,33.4221666666667
+74,314,30.6705
+74,315,28.3633333333333
+74,316,22.6483333333333
+74,317,26.2466666666667
+74,318,33.1681666666667
+74,319,17.3566666666667
+74,320,25.0825
+74,321,27.686
+74,322,28.6596666666667
+74,323,19.3463333333333
+74,324,27.5801666666667
+74,325,25.908
+74,326,17.6741666666667
+74,327,27.0933333333333
+74,328,22.8176666666667
+74,329,27.6225
+74,330,23.5373333333333
+74,331,26.4795
+74,332,29.0406666666667
+74,333,24.5956666666667
+74,334,27.7071666666667
+74,335,25.9926666666667
+74,336,25.3365
+74,337,25.3153333333333
+74,338,29.0195
+74,339,19.7273333333333
+74,340,34.7556666666667
+74,341,22.3731666666667
+74,342,26.5006666666667
+74,343,25.8868333333333
+74,344,23.876
+74,345,21.9286666666667
+74,346,28.2363333333333
+74,347,26.4583333333333
+74,348,16.764
+74,349,20.9126666666667
+74,350,29.7603333333333
+74,351,19.177
+74,352,24.8285
+74,353,26.0138333333333
+74,354,25.2518333333333
+74,355,30.7128333333333
+74,356,21.5053333333333
+74,357,23.5161666666667
+74,358,26.3101666666667
+74,359,24.9343333333333
+74,360,23.2198333333333
+74,361,26.7335
+74,362,25.1248333333333
+74,363,27.6225
+74,364,20.4258333333333
+74,365,30.2683333333333
+74,366,30.0355
+74,367,33.2951666666667
+74,368,18.2456666666667
+74,369,19.6426666666667
+74,370,27.1991666666667
+74,371,27.7283333333333
+74,372,26.2043333333333
+74,373,24.5745
+74,374,19.6638333333333
+74,375,23.9183333333333
+74,376,24.9343333333333
+74,377,28.829
+74,378,27.2626666666667
+74,379,25.0825
+74,380,34.29
+74,381,25.4635
+74,382,22.225
+74,383,40.0473333333333
+74,384,28.575
+74,385,27.5801666666667
+74,386,22.8176666666667
+74,387,22.8811666666667
+74,388,27.8976666666667
+74,389,23.8548333333333
+74,390,21.3571666666667
+74,391,27.3685
+74,392,25.8233333333333
+74,393,26.5218333333333
+74,394,24.8073333333333
+74,395,27.2626666666667
+74,396,32.0886666666667
+74,397,35.0308333333333
+74,398,25.5058333333333
+74,399,29.845
+74,400,30.5646666666667
+74,401,31.4325
+74,402,28.0881666666667
+74,403,25.7598333333333
+74,404,22.352
+74,405,26.5853333333333
+74,406,23.3891666666667
+74,407,21.5053333333333
+74,408,27.0721666666667
+74,409,26.1196666666667
+74,410,26.162
+74,411,25.1671666666667
+74,412,26.416
+74,413,28.3633333333333
+74,414,27.5378333333333
+74,415,24.765
+74,416,24.6803333333333
+74,417,21.3148333333333
+74,418,25.4211666666667
+74,419,27.4108333333333
+74,420,21.6323333333333
+74,421,25.146
+74,422,32.512
+74,423,24.9555
+74,424,22.9658333333333
+74,425,23.5796666666667
+74,426,24.3205
+74,427,25.7598333333333
+74,428,20.066
+74,429,28.0458333333333
+74,430,28.0881666666667
+74,431,25.2306666666667
+74,432,21.4206666666667
+74,433,27.0298333333333
+74,434,30.226
+74,435,26.035
+74,436,22.7118333333333
+74,437,28.3845
+74,438,23.6855
+74,439,27.5801666666667
+74,440,28.8713333333333
+74,441,24.7226666666667
+74,442,22.6695
+74,443,30.3106666666667
+74,444,25.1248333333333
+74,445,24.4898333333333
+74,446,26.5006666666667
+74,447,26.416
+74,448,29.0618333333333
+74,449,24.6591666666667
+74,450,22.6271666666667
+74,451,21.9075
+74,452,31.9616666666667
+74,453,27.8553333333333
+74,454,18.542
+74,455,21.2513333333333
+74,456,22.6906666666667
+74,457,22.0556666666667
+74,458,25.146
+74,459,20.955
+74,460,24.3205
+74,461,19.685
+74,462,24.1935
+74,463,22.5636666666667
+74,464,26.7335
+74,465,25.9503333333333
+74,466,25.6328333333333
+74,467,23.2621666666667
+74,468,28.702
+74,469,24.3205
+74,470,29.0195
+74,471,20.8491666666667
+74,472,22.1826666666667
+74,473,29.2946666666667
+74,474,28.3421666666667
+74,475,23.8548333333333
+74,476,23.5373333333333
+74,477,28.194
+74,478,23.2621666666667
+74,479,24.511
+74,480,26.0561666666667
+74,481,28.2363333333333
+74,482,25.0613333333333
+74,483,25.2095
+74,484,27.7071666666667
+74,485,20.8915
+74,486,25.8868333333333
+74,487,33.3798333333333
+74,488,32.2791666666667
+74,489,30.2895
+74,490,30.5011666666667
+74,491,36.1526666666667
+74,492,20.0236666666667
+74,493,23.0081666666667
+74,494,24.511
+74,495,26.67
+74,496,21.1455
+74,497,27.6436666666667
+74,498,28.6173333333333
+74,499,24.1723333333333
+74,500,30.5435
+74,501,27.7071666666667
+74,502,26.3101666666667
+74,503,30.607
+74,504,24.4898333333333
+74,505,22.2673333333333
+74,506,19.2828333333333
+74,507,24.638
+74,508,19.558
+74,509,17.5471666666667
+74,510,27.432
+74,511,24.5745
+74,512,26.9875
+74,513,30.3106666666667
+74,514,26.67
+74,515,23.6431666666667
+74,516,25.9926666666667
+74,517,22.5001666666667
+74,518,23.9818333333333
+74,519,32.258
+74,520,24.5745
+74,521,25.9291666666667
+74,522,28.3633333333333
+74,523,23.7066666666667
+74,524,18.3515
+74,525,24.8708333333333
+74,526,34.0995
+74,527,24.9343333333333
+74,528,26.5853333333333
+74,529,29.0195
+74,530,27.7071666666667
+74,531,23.3256666666667
+74,532,32.7871666666667
+74,533,24.511
+74,534,25.2095
+74,535,23.8548333333333
+74,536,25.5905
+74,537,20.6798333333333
+74,538,24.4686666666667
+74,539,25.1248333333333
+74,540,31.4113333333333
+74,541,25.6963333333333
+74,542,21.8228333333333
+74,543,27.3473333333333
+74,544,27.305
+74,545,23.6643333333333
+74,546,27.1991666666667
+74,547,33.2105
+74,548,30.1201666666667
+74,549,29.6968333333333
+74,550,27.051
+74,551,26.1408333333333
+74,552,24.9978333333333
+74,553,26.0985
+74,554,26.3948333333333
+74,555,26.9451666666667
+74,556,23.8336666666667
+74,557,24.6168333333333
+74,558,22.5636666666667
+74,559,21.6323333333333
+74,560,24.638
+74,561,26.9663333333333
+74,562,28.067
+74,563,23.1986666666667
+74,564,30.861
+74,565,24.003
+74,566,27.051
+74,567,30.0566666666667
+74,568,28.9348333333333
+74,569,24.8496666666667
+74,570,24.8073333333333
+74,571,23.7701666666667
+74,572,22.225
+74,573,27.3896666666667
+74,574,26.1196666666667
+74,575,22.5001666666667
+74,576,27.4531666666667
+74,577,31.496
+74,578,33.8243333333333
+74,579,20.6798333333333
+74,580,26.7335
+74,581,29.8873333333333
+74,582,25.7175
+74,583,26.9028333333333
+74,584,30.8398333333333
+74,585,28.5115
+74,586,21.8228333333333
+74,587,24.4051666666667
+74,588,32.7871666666667
+74,589,22.8811666666667
+74,590,23.4526666666667
+74,591,26.6911666666667
+74,592,30.8821666666667
+74,593,30.0355
+74,594,27.2203333333333
+74,595,26.5218333333333
+74,596,24.2993333333333
+74,597,25.1248333333333
+74,598,22.8811666666667
+74,599,26.5853333333333
+74,600,22.5636666666667
+74,601,24.4686666666667
+74,602,25.3788333333333
+74,603,26.3313333333333
+74,604,24.2781666666667
+74,605,27.7071666666667
+74,606,29.4216666666667
+74,607,31.496
+74,608,29.9085
+74,609,20.447
+74,610,24.7226666666667
+74,611,26.0985
+74,612,25.2941666666667
+74,613,23.0716666666667
+74,614,22.987
+74,615,25.5481666666667
+74,616,26.289
+74,617,24.765
+74,618,23.0716666666667
+74,619,23.7701666666667
+74,620,20.1295
+74,621,28.067
+74,622,26.9451666666667
+74,623,26.7546666666667
+74,624,34.417
+74,625,23.8336666666667
+74,626,22.7965
+74,627,23.9183333333333
+74,628,19.3886666666667
+74,629,24.3416666666667
+74,630,27.7706666666667
+74,631,21.2725
+74,632,25.8021666666667
+74,633,24.3416666666667
+74,634,24.257
+74,635,21.5476666666667
+74,636,29.4428333333333
+74,637,30.226
+74,638,22.0556666666667
+74,639,25.4
+74,640,29.7815
+74,641,24.9978333333333
+74,642,24.2993333333333
+74,643,25.4423333333333
+74,644,28.8078333333333
+74,645,28.6173333333333
+74,646,25.019
+74,647,23.8125
+74,648,31.4536666666667
+74,649,25.4
+74,650,23.114
+74,651,27.1991666666667
+74,652,26.9451666666667
+74,653,22.0556666666667
+74,654,23.5161666666667
+74,655,32.0251666666667
+74,656,24.1088333333333
+74,657,23.2198333333333
+74,658,29.2735
+74,659,25.5058333333333
+74,660,22.8811666666667
+74,661,21.0396666666667
+74,662,30.1836666666667
+74,663,25.6751666666667
+74,664,23.6643333333333
+74,665,24.2146666666667
+74,666,24.2358333333333
+74,667,26.6488333333333
+74,668,25.527
+74,669,30.226
+74,670,25.781
+74,671,27.1145
+74,672,21.8228333333333
+74,673,26.5853333333333
+74,674,23.4738333333333
+74,675,21.6958333333333
+74,676,24.384
+74,677,30.5858333333333
+74,678,25.1248333333333
+74,679,35.3695
+74,680,19.8966666666667
+74,681,25.1036666666667
+74,682,27.3261666666667
+74,683,23.368
+74,684,25.7175
+74,685,32.0463333333333
+74,686,23.7701666666667
+74,687,28.5115
+74,688,21.5053333333333
+74,689,22.2885
+74,690,25.4635
+74,691,14.7108333333333
+74,692,26.5218333333333
+74,693,23.8971666666667
+74,694,27.1568333333333
+74,695,21.2725
+74,696,20.3623333333333
+74,697,25.9926666666667
+74,698,23.7701666666667
+74,699,19.9601666666667
+74,700,23.876
+74,701,24.4051666666667
+74,702,24.6168333333333
+74,703,33.5915
+74,704,24.892
+74,705,24.257
+74,706,21.844
+74,707,27.8341666666667
+74,708,25.8233333333333
+74,709,27.7495
+74,710,21.844
+74,711,31.0303333333333
+74,712,23.3256666666667
+74,713,30.5858333333333
+74,714,33.1046666666667
+74,715,24.0876666666667
+74,716,31.9405
+74,717,24.5533333333333
+74,718,31.6018333333333
+74,719,22.8388333333333
+74,720,27.0298333333333
+74,721,23.0716666666667
+74,722,21.3571666666667
+74,723,27.5166666666667
+74,724,25.2095
+74,725,25.4211666666667
+74,726,20.2141666666667
+74,727,23.2198333333333
+74,728,23.8336666666667
+74,729,27.5166666666667
+74,730,26.3101666666667
+74,731,23.0081666666667
+74,732,25.3153333333333
+74,733,31.3055
+74,734,20.2565
+74,735,32.1733333333333
+74,736,26.3736666666667
+74,737,27.8553333333333
+74,738,29.6545
+74,739,25.654
+74,740,25.273
+74,741,21.1878333333333
+74,742,19.3463333333333
+74,743,27.8553333333333
+74,744,24.9131666666667
+74,745,24.4263333333333
+74,746,24.4686666666667
+74,747,28.1093333333333
+74,748,26.6488333333333
+74,749,27.2203333333333
+74,750,24.9978333333333
+74,751,25.1883333333333
+74,752,26.8816666666667
+74,753,29.4428333333333
+74,754,25.3153333333333
+74,755,27.051
+74,756,24.9131666666667
+74,757,25.4635
+74,758,24.2146666666667
+74,759,29.2311666666667
+74,760,32.0251666666667
+74,761,26.5218333333333
+74,762,26.7546666666667
+74,763,25.8445
+74,764,20.9338333333333
+74,765,25.2306666666667
+74,766,34.7556666666667
+74,767,26.1831666666667
+74,768,34.0571666666667
+74,769,25.4211666666667
+74,770,27.7283333333333
+74,771,27.7071666666667
+74,772,30.6705
+74,773,25.908
+74,774,33.1046666666667
+74,775,26.2466666666667
+74,776,24.4263333333333
+74,777,24.003
+74,778,37.8671666666667
+74,779,20.8703333333333
+74,780,22.3943333333333
+74,781,23.8548333333333
+74,782,24.765
+74,783,24.5956666666667
+74,784,30.1836666666667
+74,785,22.4366666666667
+74,786,24.1935
+74,787,28.1093333333333
+74,788,27.0933333333333
+74,789,21.9075
+74,790,21.7593333333333
+74,791,27.4955
+74,792,23.8125
+74,793,34.6498333333333
+74,794,21.6323333333333
+74,795,24.0876666666667
+74,796,24.3205
+74,797,22.4578333333333
+74,798,21.3571666666667
+74,799,24.8496666666667
+74,800,26.924
+74,801,20.6586666666667
+74,802,29.8661666666667
+74,803,28.5961666666667
+74,804,30.2471666666667
+74,805,29.3793333333333
+74,806,25.5905
+74,807,21.0396666666667
+74,808,25.5058333333333
+74,809,25.1248333333333
+74,810,22.0345
+74,811,32.131
+74,812,26.2255
+74,813,33.6973333333333
+74,814,21.9286666666667
+74,815,34.3746666666667
+74,816,28.1516666666667
+74,817,25.9291666666667
+74,818,23.6008333333333
+74,819,32.258
+74,820,27.1568333333333
+74,821,18.3726666666667
+74,822,22.8176666666667
+74,823,21.971
+74,824,26.8393333333333
+74,825,31.6441666666667
+74,826,22.2038333333333
+74,827,29.4216666666667
+74,828,25.781
+74,829,28.4691666666667
+74,830,27.4531666666667
+74,831,18.8383333333333
+74,832,28.575
+74,833,21.3571666666667
+74,834,21.59
+74,835,20.0448333333333
+74,836,27.8553333333333
+74,837,29.6121666666667
+74,838,34.1418333333333
+74,839,22.0345
+74,840,18.3726666666667
+74,841,27.2838333333333
+74,842,28.7866666666667
+74,843,27.9823333333333
+74,844,26.4795
+74,845,26.0985
+74,846,22.9023333333333
+74,847,22.4155
+74,848,25.273
+74,849,18.8383333333333
+74,850,30.9033333333333
+74,851,19.8755
+74,852,19.6003333333333
+74,853,28.5961666666667
+74,854,31.7076666666667
+74,855,23.6855
+74,856,27.8976666666667
+74,857,25.0825
+74,858,29.7603333333333
+74,859,23.495
+74,860,29.2311666666667
+74,861,20.574
+74,862,28.9771666666667
+74,863,32.2156666666667
+74,864,23.8971666666667
+74,865,24.4263333333333
+74,866,27.1356666666667
+74,867,25.5905
+74,868,25.146
+74,869,23.5585
+74,870,24.7861666666667
+74,871,24.765
+74,872,29.0618333333333
+74,873,21.6111666666667
+74,874,25.5693333333333
+74,875,23.0293333333333
+74,876,26.3313333333333
+74,877,23.7278333333333
+74,878,22.987
+74,879,26.2043333333333
+74,880,30.48
+74,881,21.9498333333333
+74,882,25.7386666666667
+74,883,20.9338333333333
+74,884,21.9921666666667
+74,885,24.511
+74,886,16.9756666666667
+74,887,30.3106666666667
+74,888,25.3576666666667
+74,889,25.1036666666667
+74,890,23.7701666666667
+74,891,25.4423333333333
+74,892,21.0608333333333
+74,893,24.3628333333333
+74,894,28.194
+74,895,19.6003333333333
+74,896,27.3685
+74,897,32.7236666666667
+74,898,26.5641666666667
+74,899,26.1408333333333
+74,900,31.2631666666667
+74,901,31.2631666666667
+74,902,30.6916666666667
+74,903,27.1568333333333
+74,904,20.7221666666667
+74,905,26.0138333333333
+74,906,24.8285
+74,907,22.3308333333333
+74,908,24.0876666666667
+74,909,19.2828333333333
+74,910,26.2678333333333
+74,911,30.3741666666667
+74,912,19.812
+74,913,26.543
+74,914,21.1878333333333
+74,915,20.7221666666667
+74,916,22.4155
+74,917,20.701
+74,918,24.9343333333333
+74,919,24.5321666666667
+74,920,32.0251666666667
+74,921,27.3473333333333
+74,922,27.1145
+74,923,28.4268333333333
+74,924,27.7283333333333
+74,925,25.4211666666667
+74,926,29.8661666666667
+74,927,20.7645
+74,928,21.3148333333333
+74,929,24.3628333333333
+74,930,25.4423333333333
+74,931,23.9395
+74,932,21.7805
+74,933,28.067
+74,934,28.2151666666667
+74,935,24.5745
+74,936,26.7123333333333
+74,937,27.6013333333333
+74,938,30.607
+74,939,24.6803333333333
+74,940,25.5905
+74,941,20.955
+74,942,30.9033333333333
+74,943,22.5848333333333
+74,944,24.8285
+74,945,36.5971666666667
+74,946,21.4841666666667
+74,947,22.352
+74,948,35.4541666666667
+74,949,21.844
+74,950,26.3736666666667
+74,951,23.114
+74,952,26.5641666666667
+74,953,29.6545
+74,954,21.971
+74,955,26.0773333333333
+74,956,21.9075
+74,957,22.2885
+74,958,26.8393333333333
+74,959,20.4681666666667
+74,960,25.146
+74,961,27.2415
+74,962,28.0035
+74,963,17.4413333333333
+74,964,25.4
+74,965,24.4051666666667
+74,966,22.225
+74,967,29.9508333333333
+74,968,26.7123333333333
+74,969,24.2993333333333
+74,970,29.6545
+74,971,25.1036666666667
+74,972,31.1785
+74,973,25.6328333333333
+74,974,23.4315
+74,975,23.8125
+74,976,25.6751666666667
+74,977,21.5476666666667
+74,978,19.9601666666667
+74,979,27.5378333333333
+74,980,30.0778333333333
+74,981,18.2033333333333
+74,982,29.5063333333333
+74,983,30.6705
+74,984,21.4418333333333
+74,985,20.6586666666667
+74,986,25.3788333333333
+74,987,19.6426666666667
+74,988,26.0773333333333
+74,989,29.2946666666667
+74,990,24.765
+74,991,25.2095
+74,992,27.5378333333333
+74,993,31.6865
+74,994,26.0561666666667
+74,995,24.9131666666667
+74,996,24.384
+74,997,24.7438333333333
+74,998,26.2043333333333
+74,999,24.765
+74,1000,29.591
+75,1,28.702
+75,2,21.6111666666667
+75,3,23.4315
+75,4,32.766
+75,5,20.447
+75,6,24.2358333333333
+75,7,26.9875
+75,8,30.0778333333333
+75,9,20.6163333333333
+75,10,24.8496666666667
+75,11,25.654
+75,12,26.543
+75,13,32.7871666666667
+75,14,25.3576666666667
+75,15,22.6695
+75,16,22.9446666666667
+75,17,22.1403333333333
+75,18,24.0241666666667
+75,19,23.368
+75,20,25.781
+75,21,21.8228333333333
+75,22,26.162
+75,23,26.3736666666667
+75,24,22.7118333333333
+75,25,28.067
+75,26,27.2415
+75,27,26.2466666666667
+75,28,22.7541666666667
+75,29,23.241
+75,30,20.2776666666667
+75,31,22.0345
+75,32,28.321
+75,33,23.6431666666667
+75,34,24.5956666666667
+75,35,24.3628333333333
+75,36,24.384
+75,37,24.1723333333333
+75,38,21.6746666666667
+75,39,27.686
+75,40,25.9291666666667
+75,41,27.7283333333333
+75,42,26.5641666666667
+75,43,22.6271666666667
+75,44,27.0721666666667
+75,45,31.0515
+75,46,25.1036666666667
+75,47,26.4583333333333
+75,48,21.3783333333333
+75,49,26.9875
+75,50,24.2781666666667
+75,51,26.9875
+75,52,22.225
+75,53,25.781
+75,54,22.7118333333333
+75,55,18.4996666666667
+75,56,23.4738333333333
+75,57,23.2833333333333
+75,58,21.9286666666667
+75,59,20.828
+75,60,20.5951666666667
+75,61,23.3468333333333
+75,62,25.8021666666667
+75,63,23.7913333333333
+75,64,26.543
+75,65,28.0246666666667
+75,66,23.9818333333333
+75,67,22.5425
+75,68,20.3835
+75,69,22.352
+75,70,23.0928333333333
+75,71,28.0035
+75,72,22.6906666666667
+75,73,29.0406666666667
+75,74,24.7226666666667
+75,75,18.669
+75,76,23.8971666666667
+75,77,28.0458333333333
+75,78,24.1723333333333
+75,79,26.2043333333333
+75,80,21.5688333333333
+75,81,27.0721666666667
+75,82,24.8708333333333
+75,83,21.2513333333333
+75,84,22.479
+75,85,28.702
+75,86,26.5006666666667
+75,87,22.606
+75,88,25.8445
+75,89,21.1243333333333
+75,90,20.1506666666667
+75,91,24.9131666666667
+75,92,17.8223333333333
+75,93,26.0985
+75,94,20.4046666666667
+75,95,30.2683333333333
+75,96,23.1775
+75,97,21.59
+75,98,23.4315
+75,99,28.1516666666667
+75,100,18.161
+75,101,21.5476666666667
+75,102,28.9348333333333
+75,103,25.4846666666667
+75,104,25.5693333333333
+75,105,27.4108333333333
+75,106,25.9926666666667
+75,107,23.6643333333333
+75,108,22.86
+75,109,19.0288333333333
+75,110,31.2843333333333
+75,111,22.0556666666667
+75,112,24.1511666666667
+75,113,31.0938333333333
+75,114,28.8078333333333
+75,115,21.5688333333333
+75,116,23.9183333333333
+75,117,22.1615
+75,118,24.4051666666667
+75,119,18.0128333333333
+75,120,19.4098333333333
+75,121,32.004
+75,122,25.4846666666667
+75,123,25.5058333333333
+75,124,22.0556666666667
+75,125,24.0876666666667
+75,126,24.6168333333333
+75,127,26.0985
+75,128,23.5585
+75,129,21.1666666666667
+75,130,18.2033333333333
+75,131,18.9018333333333
+75,132,21.2725
+75,133,22.9658333333333
+75,134,20.828
+75,135,22.6271666666667
+75,136,22.1615
+75,137,19.5368333333333
+75,138,25.3788333333333
+75,139,26.4795
+75,140,25.2518333333333
+75,141,26.797
+75,142,23.368
+75,143,25.2518333333333
+75,144,30.1413333333333
+75,145,28.7866666666667
+75,146,20.2141666666667
+75,147,24.765
+75,148,23.3468333333333
+75,149,23.749
+75,150,25.527
+75,151,19.8543333333333
+75,152,19.3886666666667
+75,153,23.0293333333333
+75,154,20.955
+75,155,26.0561666666667
+75,156,23.4738333333333
+75,157,22.4366666666667
+75,158,25.7175
+75,159,24.7226666666667
+75,160,28.0881666666667
+75,161,24.384
+75,162,26.0773333333333
+75,163,15.2823333333333
+75,164,27.7071666666667
+75,165,22.8176666666667
+75,166,24.13
+75,167,23.368
+75,168,16.6581666666667
+75,169,21.1455
+75,170,18.4996666666667
+75,171,25.3788333333333
+75,172,24.4475
+75,173,25.1036666666667
+75,174,27.1991666666667
+75,175,24.4475
+75,176,27.4955
+75,177,27.6225
+75,178,20.1083333333333
+75,179,23.3045
+75,180,22.5636666666667
+75,181,24.5956666666667
+75,182,25.4635
+75,183,20.2353333333333
+75,184,25.8233333333333
+75,185,24.1088333333333
+75,186,23.3045
+75,187,21.8016666666667
+75,188,27.8765
+75,189,23.114
+75,190,26.7758333333333
+75,191,26.7758333333333
+75,192,25.4211666666667
+75,193,20.193
+75,194,24.0876666666667
+75,195,25.2518333333333
+75,196,23.0293333333333
+75,197,26.8393333333333
+75,198,19.7696666666667
+75,199,20.2565
+75,200,22.5001666666667
+75,201,30.0355
+75,202,22.9658333333333
+75,203,18.9018333333333
+75,204,18.0975
+75,205,25.1036666666667
+75,206,24.8708333333333
+75,207,21.336
+75,208,25.3153333333333
+75,209,25.0825
+75,210,21.7381666666667
+75,211,27.9188333333333
+75,212,22.3731666666667
+75,213,24.8496666666667
+75,214,19.3675
+75,215,23.3045
+75,216,21.3148333333333
+75,217,25.5905
+75,218,20.9338333333333
+75,219,20.2353333333333
+75,220,26.8816666666667
+75,221,21.9286666666667
+75,222,27.6436666666667
+75,223,24.5956666666667
+75,224,19.7908333333333
+75,225,22.3096666666667
+75,226,23.241
+75,227,22.6483333333333
+75,228,22.7118333333333
+75,229,27.5166666666667
+75,230,22.2038333333333
+75,231,29.2735
+75,232,24.384
+75,233,20.32
+75,234,17.3355
+75,235,27.0086666666667
+75,236,22.4366666666667
+75,237,20.0871666666667
+75,238,26.7758333333333
+75,239,28.4691666666667
+75,240,29.1888333333333
+75,241,23.8125
+75,242,25.7386666666667
+75,243,25.2941666666667
+75,244,22.9446666666667
+75,245,27.8553333333333
+75,246,21.5688333333333
+75,247,28.7231666666667
+75,248,21.7381666666667
+75,249,28.3845
+75,250,21.717
+75,251,25.9715
+75,252,19.812
+75,253,27.3685
+75,254,23.3045
+75,255,24.892
+75,256,27.432
+75,257,22.225
+75,258,23.8336666666667
+75,259,27.1568333333333
+75,260,21.6746666666667
+75,261,26.8816666666667
+75,262,23.8548333333333
+75,263,24.9766666666667
+75,264,27.432
+75,265,23.2621666666667
+75,266,28.6385
+75,267,22.987
+75,268,21.5476666666667
+75,269,20.8703333333333
+75,270,23.3468333333333
+75,271,26.9663333333333
+75,272,21.717
+75,273,21.1031666666667
+75,274,20.7433333333333
+75,275,22.1403333333333
+75,276,26.6276666666667
+75,277,27.686
+75,278,29.7603333333333
+75,279,23.495
+75,280,20.0448333333333
+75,281,26.2043333333333
+75,282,24.2781666666667
+75,283,25.273
+75,284,25.5693333333333
+75,285,27.9188333333333
+75,286,24.1511666666667
+75,287,21.5053333333333
+75,288,28.2575
+75,289,27.813
+75,290,18.2245
+75,291,17.9705
+75,292,24.5745
+75,293,24.0241666666667
+75,294,25.1883333333333
+75,295,23.8125
+75,296,18.5208333333333
+75,297,24.9555
+75,298,20.2565
+75,299,20.3623333333333
+75,300,21.209
+75,301,18.6266666666667
+75,302,25.2306666666667
+75,303,23.7278333333333
+75,304,21.3148333333333
+75,305,28.0035
+75,306,20.2776666666667
+75,307,24.1935
+75,308,23.1351666666667
+75,309,29.337
+75,310,27.4108333333333
+75,311,26.9028333333333
+75,312,19.3463333333333
+75,313,23.6431666666667
+75,314,22.0133333333333
+75,315,24.6803333333333
+75,316,18.415
+75,317,24.1088333333333
+75,318,28.448
+75,319,28.7443333333333
+75,320,22.3943333333333
+75,321,27.559
+75,322,22.733
+75,323,27.686
+75,324,27.3896666666667
+75,325,22.1191666666667
+75,326,23.4103333333333
+75,327,26.4583333333333
+75,328,26.1408333333333
+75,329,27.2626666666667
+75,330,28.0246666666667
+75,331,21.844
+75,332,21.2936666666667
+75,333,22.5425
+75,334,26.416
+75,335,20.1718333333333
+75,336,22.1191666666667
+75,337,27.178
+75,338,22.5425
+75,339,23.2621666666667
+75,340,22.6695
+75,341,20.5528333333333
+75,342,25.2518333333333
+75,343,23.8125
+75,344,23.6431666666667
+75,345,22.9023333333333
+75,346,22.7541666666667
+75,347,28.9348333333333
+75,348,19.1558333333333
+75,349,23.6855
+75,350,18.923
+75,351,24.9978333333333
+75,352,25.6751666666667
+75,353,25.9291666666667
+75,354,22.0768333333333
+75,355,30.9456666666667
+75,356,24.003
+75,357,22.2461666666667
+75,358,26.2255
+75,359,22.8811666666667
+75,360,23.3045
+75,361,24.4051666666667
+75,362,21.2513333333333
+75,363,20.193
+75,364,18.9653333333333
+75,365,20.447
+75,366,27.6013333333333
+75,367,23.1775
+75,368,18.6478333333333
+75,369,24.6168333333333
+75,370,24.257
+75,371,26.5641666666667
+75,372,26.6911666666667
+75,373,20.955
+75,374,24.3628333333333
+75,375,25.6328333333333
+75,376,29.5486666666667
+75,377,22.5001666666667
+75,378,22.0133333333333
+75,379,23.7913333333333
+75,380,20.2776666666667
+75,381,23.876
+75,382,22.4578333333333
+75,383,21.844
+75,384,23.8971666666667
+75,385,24.7226666666667
+75,386,25.5693333333333
+75,387,18.6266666666667
+75,388,19.7485
+75,389,27.4743333333333
+75,390,24.2146666666667
+75,391,22.733
+75,392,24.638
+75,393,23.368
+75,394,22.9658333333333
+75,395,22.9446666666667
+75,396,25.7175
+75,397,22.3731666666667
+75,398,22.8176666666667
+75,399,23.1775
+75,400,24.0453333333333
+75,401,19.3675
+75,402,22.5425
+75,403,22.1403333333333
+75,404,27.4108333333333
+75,405,21.9921666666667
+75,406,21.1243333333333
+75,407,24.9343333333333
+75,408,18.5843333333333
+75,409,21.3995
+75,410,18.796
+75,411,22.7118333333333
+75,412,19.6215
+75,413,23.9818333333333
+75,414,26.035
+75,415,20.3623333333333
+75,416,26.7758333333333
+75,417,27.686
+75,418,29.1041666666667
+75,419,23.241
+75,420,24.7861666666667
+75,421,23.2198333333333
+75,422,22.5425
+75,423,24.3205
+75,424,27.4108333333333
+75,425,22.733
+75,426,31.369
+75,427,25.5058333333333
+75,428,24.5321666666667
+75,429,24.8496666666667
+75,430,22.7118333333333
+75,431,23.876
+75,432,21.3148333333333
+75,433,22.2038333333333
+75,434,25.5481666666667
+75,435,31.5806666666667
+75,436,22.5848333333333
+75,437,24.384
+75,438,29.0195
+75,439,24.8496666666667
+75,440,24.2146666666667
+75,441,25.1036666666667
+75,442,25.3365
+75,443,26.5641666666667
+75,444,25.4
+75,445,21.9498333333333
+75,446,23.368
+75,447,24.8073333333333
+75,448,25.8656666666667
+75,449,20.5105
+75,450,24.7015
+75,451,23.241
+75,452,25.8021666666667
+75,453,24.0665
+75,454,28.3845
+75,455,19.7485
+75,456,20.574
+75,457,28.1516666666667
+75,458,25.4423333333333
+75,459,28.6173333333333
+75,460,22.7541666666667
+75,461,21.2725
+75,462,24.9555
+75,463,22.5213333333333
+75,464,25.4846666666667
+75,465,27.4531666666667
+75,466,22.6906666666667
+75,467,22.9023333333333
+75,468,23.8971666666667
+75,469,20.5105
+75,470,22.6483333333333
+75,471,24.13
+75,472,28.321
+75,473,23.5796666666667
+75,474,21.8863333333333
+75,475,24.3628333333333
+75,476,23.876
+75,477,24.511
+75,478,20.0025
+75,479,24.511
+75,480,24.003
+75,481,24.2146666666667
+75,482,21.9075
+75,483,25.273
+75,484,26.4371666666667
+75,485,24.5745
+75,486,25.5058333333333
+75,487,20.2565
+75,488,22.1615
+75,489,18.8595
+75,490,13.7371666666667
+75,491,26.416
+75,492,25.5481666666667
+75,493,28.0246666666667
+75,494,21.5476666666667
+75,495,20.7433333333333
+75,496,25.6116666666667
+75,497,21.0396666666667
+75,498,22.4578333333333
+75,499,29.7815
+75,500,19.6638333333333
+75,501,23.8971666666667
+75,502,25.146
+75,503,23.7066666666667
+75,504,18.0128333333333
+75,505,24.511
+75,506,25.9291666666667
+75,507,20.7856666666667
+75,508,22.1615
+75,509,24.8285
+75,510,25.3153333333333
+75,511,22.2038333333333
+75,512,27.2626666666667
+75,513,26.5853333333333
+75,514,27.7071666666667
+75,515,25.0613333333333
+75,516,25.3576666666667
+75,517,24.8073333333333
+75,518,28.2363333333333
+75,519,24.7438333333333
+75,520,24.1935
+75,521,22.6483333333333
+75,522,25.908
+75,523,20.193
+75,524,29.8873333333333
+75,525,19.6638333333333
+75,526,26.0561666666667
+75,527,21.4206666666667
+75,528,28.194
+75,529,26.7758333333333
+75,530,24.2358333333333
+75,531,18.6478333333333
+75,532,19.0076666666667
+75,533,30.861
+75,534,22.2885
+75,535,26.289
+75,536,26.5218333333333
+75,537,22.733
+75,538,23.7913333333333
+75,539,22.4366666666667
+75,540,21.3783333333333
+75,541,24.5533333333333
+75,542,25.9926666666667
+75,543,23.368
+75,544,17.8435
+75,545,19.3886666666667
+75,546,16.2136666666667
+75,547,20.32
+75,548,26.2255
+75,549,31.0091666666667
+75,550,26.416
+75,551,27.2203333333333
+75,552,27.8341666666667
+75,553,19.6215
+75,554,29.083
+75,555,25.9926666666667
+75,556,29.4005
+75,557,22.7118333333333
+75,558,24.0665
+75,559,25.6963333333333
+75,560,23.9183333333333
+75,561,21.3571666666667
+75,562,24.257
+75,563,26.8393333333333
+75,564,23.1563333333333
+75,565,20.8491666666667
+75,566,25.273
+75,567,24.9766666666667
+75,568,25.7386666666667
+75,569,28.6173333333333
+75,570,25.4211666666667
+75,571,24.638
+75,572,22.7753333333333
+75,573,26.797
+75,574,23.6008333333333
+75,575,21.0608333333333
+75,576,25.146
+75,577,30.48
+75,578,24.8285
+75,579,22.225
+75,580,21.3148333333333
+75,581,24.7861666666667
+75,582,27.94
+75,583,24.4686666666667
+75,584,23.3891666666667
+75,585,24.6803333333333
+75,586,25.273
+75,587,25.9926666666667
+75,588,27.4531666666667
+75,589,25.6963333333333
+75,590,20.2353333333333
+75,591,20.9126666666667
+75,592,22.733
+75,593,23.4103333333333
+75,594,22.9235
+75,595,20.6586666666667
+75,596,18.0551666666667
+75,597,24.8496666666667
+75,598,18.161
+75,599,24.3628333333333
+75,600,27.3261666666667
+75,601,29.6968333333333
+75,602,17.5048333333333
+75,603,26.1831666666667
+75,604,22.1826666666667
+75,605,28.2786666666667
+75,606,23.9395
+75,607,26.7758333333333
+75,608,23.7066666666667
+75,609,28.3845
+75,610,21.3783333333333
+75,611,26.3736666666667
+75,612,27.7918333333333
+75,613,22.3731666666667
+75,614,24.9555
+75,615,23.114
+75,616,27.813
+75,617,27.4955
+75,618,27.94
+75,619,23.0081666666667
+75,620,17.3355
+75,621,22.7118333333333
+75,622,24.5956666666667
+75,623,26.9451666666667
+75,624,21.0185
+75,625,29.718
+75,626,26.1408333333333
+75,627,25.0613333333333
+75,628,19.304
+75,629,18.5843333333333
+75,630,24.0241666666667
+75,631,24.3205
+75,632,21.4206666666667
+75,633,21.0185
+75,634,24.7015
+75,635,23.0716666666667
+75,636,20.4893333333333
+75,637,25.1883333333333
+75,638,31.4748333333333
+75,639,23.0716666666667
+75,640,24.6803333333333
+75,641,21.5688333333333
+75,642,26.162
+75,643,30.9033333333333
+75,644,22.225
+75,645,22.606
+75,646,21.971
+75,647,25.0613333333333
+75,648,22.4366666666667
+75,649,23.622
+75,650,23.6643333333333
+75,651,25.1883333333333
+75,652,22.3308333333333
+75,653,27.4955
+75,654,21.59
+75,655,26.7758333333333
+75,656,25.9926666666667
+75,657,29.1041666666667
+75,658,25.781
+75,659,23.0081666666667
+75,660,23.3045
+75,661,24.1088333333333
+75,662,23.8548333333333
+75,663,22.7965
+75,664,29.7815
+75,665,22.7965
+75,666,22.7118333333333
+75,667,22.733
+75,668,23.1775
+75,669,25.527
+75,670,27.0933333333333
+75,671,25.5481666666667
+75,672,23.1986666666667
+75,673,27.559
+75,674,28.2998333333333
+75,675,26.6911666666667
+75,676,24.1511666666667
+75,677,22.0345
+75,678,22.1826666666667
+75,679,22.9446666666667
+75,680,30.6705
+75,681,22.7118333333333
+75,682,21.9075
+75,683,24.4686666666667
+75,684,25.8233333333333
+75,685,24.257
+75,686,22.733
+75,687,27.7918333333333
+75,688,30.353
+75,689,27.7071666666667
+75,690,21.7381666666667
+75,691,23.876
+75,692,21.336
+75,693,23.7701666666667
+75,694,25.273
+75,695,20.2141666666667
+75,696,23.3468333333333
+75,697,30.1201666666667
+75,698,26.4371666666667
+75,699,26.6065
+75,700,26.5218333333333
+75,701,24.3416666666667
+75,702,19.177
+75,703,25.4211666666667
+75,704,22.1615
+75,705,22.0133333333333
+75,706,21.2725
+75,707,22.1191666666667
+75,708,21.8016666666667
+75,709,24.003
+75,710,28.4056666666667
+75,711,24.892
+75,712,26.8181666666667
+75,713,21.7593333333333
+75,714,23.0716666666667
+75,715,22.6271666666667
+75,716,25.4635
+75,717,24.2781666666667
+75,718,22.0768333333333
+75,719,21.6958333333333
+75,720,28.2363333333333
+75,721,24.7438333333333
+75,722,25.8021666666667
+75,723,17.4625
+75,724,23.8971666666667
+75,725,23.8971666666667
+75,726,32.2791666666667
+75,727,25.273
+75,728,22.9446666666667
+75,729,27.4531666666667
+75,730,25.6751666666667
+75,731,19.2616666666667
+75,732,21.3571666666667
+75,733,21.0185
+75,734,27.0298333333333
+75,735,21.5053333333333
+75,736,24.6591666666667
+75,737,22.1403333333333
+75,738,21.2301666666667
+75,739,18.2668333333333
+75,740,25.1036666666667
+75,741,23.9183333333333
+75,742,23.876
+75,743,20.5316666666667
+75,744,26.5641666666667
+75,745,25.8021666666667
+75,746,26.7123333333333
+75,747,19.6638333333333
+75,748,28.702
+75,749,22.9023333333333
+75,750,25.9291666666667
+75,751,21.6746666666667
+75,752,20.5316666666667
+75,753,24.2358333333333
+75,754,18.161
+75,755,25.4635
+75,756,25.908
+75,757,28.9771666666667
+75,758,23.2198333333333
+75,759,24.3416666666667
+75,760,26.3525
+75,761,23.495
+75,762,25.2306666666667
+75,763,25.8445
+75,764,17.9705
+75,765,24.9978333333333
+75,766,27.2415
+75,767,21.6111666666667
+75,768,23.1775
+75,769,23.5585
+75,770,19.431
+75,771,27.9823333333333
+75,772,20.701
+75,773,23.9395
+75,774,21.3148333333333
+75,775,23.2833333333333
+75,776,17.2931666666667
+75,777,18.9653333333333
+75,778,23.8971666666667
+75,779,25.9503333333333
+75,780,23.7701666666667
+75,781,21.1878333333333
+75,782,27.3261666666667
+75,783,24.0665
+75,784,28.6385
+75,785,26.543
+75,786,31.2843333333333
+75,787,23.5373333333333
+75,788,21.9498333333333
+75,789,27.9188333333333
+75,790,22.4578333333333
+75,791,25.5058333333333
+75,792,24.1511666666667
+75,793,25.0825
+75,794,24.384
+75,795,21.7805
+75,796,22.6483333333333
+75,797,24.2358333333333
+75,798,21.6323333333333
+75,799,24.1723333333333
+75,800,18.8595
+75,801,23.7701666666667
+75,802,31.3478333333333
+75,803,22.1191666666667
+75,804,24.5321666666667
+75,805,32.4061666666667
+75,806,21.1455
+75,807,25.1671666666667
+75,808,23.5161666666667
+75,809,25.527
+75,810,29.2946666666667
+75,811,26.5853333333333
+75,812,25.1248333333333
+75,813,24.638
+75,814,24.4475
+75,815,22.4578333333333
+75,816,27.3261666666667
+75,817,27.7706666666667
+75,818,25.273
+75,819,22.4366666666667
+75,820,25.4211666666667
+75,821,29.4428333333333
+75,822,20.1295
+75,823,25.0613333333333
+75,824,21.1031666666667
+75,825,21.6323333333333
+75,826,23.4738333333333
+75,827,20.6586666666667
+75,828,24.8496666666667
+75,829,24.8496666666667
+75,830,21.1243333333333
+75,831,22.098
+75,832,24.2358333333333
+75,833,21.9075
+75,834,22.5636666666667
+75,835,21.6746666666667
+75,836,28.0035
+75,837,25.4423333333333
+75,838,21.3571666666667
+75,839,25.9715
+75,840,24.5321666666667
+75,841,26.797
+75,842,24.892
+75,843,24.6803333333333
+75,844,17.5471666666667
+75,845,20.3623333333333
+75,846,22.1403333333333
+75,847,26.4795
+75,848,26.543
+75,849,29.591
+75,850,26.9451666666667
+75,851,26.8605
+75,852,27.3261666666667
+75,853,21.9286666666667
+75,854,19.9601666666667
+75,855,32.0463333333333
+75,856,23.9395
+75,857,23.1775
+75,858,23.3256666666667
+75,859,22.5848333333333
+75,860,24.892
+75,861,23.2621666666667
+75,862,22.3943333333333
+75,863,24.4263333333333
+75,864,21.1666666666667
+75,865,26.543
+75,866,24.7861666666667
+75,867,20.5105
+75,868,21.7593333333333
+75,869,23.9818333333333
+75,870,21.971
+75,871,21.2725
+75,872,21.1455
+75,873,18.3303333333333
+75,874,25.7386666666667
+75,875,25.8021666666667
+75,876,24.9343333333333
+75,877,27.4743333333333
+75,878,21.8016666666667
+75,879,18.796
+75,880,26.3525
+75,881,25.6116666666667
+75,882,19.9813333333333
+75,883,23.495
+75,884,23.4738333333333
+75,885,23.5796666666667
+75,886,21.844
+75,887,27.4108333333333
+75,888,26.289
+75,889,21.717
+75,890,21.2725
+75,891,20.3411666666667
+75,892,30.3318333333333
+75,893,21.1455
+75,894,23.622
+75,895,24.384
+75,896,20.1295
+75,897,23.6643333333333
+75,898,25.5905
+75,899,19.4098333333333
+75,900,25.3153333333333
+75,901,23.749
+75,902,20.9973333333333
+75,903,19.8755
+75,904,18.796
+75,905,23.2833333333333
+75,906,27.6436666666667
+75,907,24.2146666666667
+75,908,19.4098333333333
+75,909,23.4315
+75,910,23.0928333333333
+75,911,23.4738333333333
+75,912,22.9235
+75,913,25.3576666666667
+75,914,24.6168333333333
+75,915,22.4366666666667
+75,916,27.3261666666667
+75,917,25.0825
+75,918,31.0938333333333
+75,919,22.2038333333333
+75,920,22.6483333333333
+75,921,22.6906666666667
+75,922,21.209
+75,923,25.7386666666667
+75,924,25.7386666666667
+75,925,27.051
+75,926,28.2998333333333
+75,927,24.1723333333333
+75,928,18.542
+75,929,26.6911666666667
+75,930,24.4475
+75,931,26.1408333333333
+75,932,30.6281666666667
+75,933,19.5791666666667
+75,934,24.9978333333333
+75,935,20.193
+75,936,24.5321666666667
+75,937,23.9606666666667
+75,938,27.6436666666667
+75,939,27.1568333333333
+75,940,17.018
+75,941,26.2678333333333
+75,942,30.607
+75,943,21.8016666666667
+75,944,22.3943333333333
+75,945,27.4108333333333
+75,946,25.6116666666667
+75,947,22.0556666666667
+75,948,29.8026666666667
+75,949,24.6591666666667
+75,950,27.051
+75,951,23.4738333333333
+75,952,28.956
+75,953,19.8543333333333
+75,954,25.9926666666667
+75,955,21.9286666666667
+75,956,20.828
+75,957,23.5161666666667
+75,958,21.2936666666667
+75,959,21.8863333333333
+75,960,27.7495
+75,961,20.0025
+75,962,23.8125
+75,963,19.0288333333333
+75,964,25.3788333333333
+75,965,23.3256666666667
+75,966,28.5961666666667
+75,967,27.6225
+75,968,22.3308333333333
+75,969,27.686
+75,970,23.4315
+75,971,21.4418333333333
+75,972,27.4531666666667
+75,973,22.7965
+75,974,19.2405
+75,975,27.8976666666667
+75,976,26.2043333333333
+75,977,19.6215
+75,978,27.305
+75,979,25.9291666666667
+75,980,23.2621666666667
+75,981,19.5368333333333
+75,982,24.8496666666667
+75,983,20.2141666666667
+75,984,26.3313333333333
+75,985,26.8605
+75,986,23.8971666666667
+75,987,26.5006666666667
+75,988,24.6168333333333
+75,989,25.6328333333333
+75,990,29.4005
+75,991,19.0288333333333
+75,992,21.8651666666667
+75,993,17.1873333333333
+75,994,23.114
+75,995,19.9178333333333
+75,996,22.4578333333333
+75,997,26.3525
+75,998,21.6746666666667
+75,999,27.5378333333333
+75,1000,18.7536666666667
+76,1,24.7861666666667
+76,2,38.735
+76,3,29.1888333333333
+76,4,28.2363333333333
+76,5,31.6653333333333
+76,6,20.1506666666667
+76,7,29.1041666666667
+76,8,28.9348333333333
+76,9,25.6116666666667
+76,10,25.527
+76,11,29.7815
+76,12,27.4955
+76,13,24.8708333333333
+76,14,25.6963333333333
+76,15,21.2301666666667
+76,16,26.6276666666667
+76,17,21.209
+76,18,27.305
+76,19,31.115
+76,20,23.9395
+76,21,26.4371666666667
+76,22,25.2306666666667
+76,23,30.1625
+76,24,31.9828333333333
+76,25,27.94
+76,26,28.7655
+76,27,22.733
+76,28,23.8548333333333
+76,29,25.146
+76,30,22.4366666666667
+76,31,23.3891666666667
+76,32,24.8073333333333
+76,33,26.1196666666667
+76,34,23.1351666666667
+76,35,28.3633333333333
+76,36,27.9823333333333
+76,37,29.083
+76,38,22.1826666666667
+76,39,21.2725
+76,40,25.2518333333333
+76,41,28.0458333333333
+76,42,28.7231666666667
+76,43,25.2518333333333
+76,44,16.2136666666667
+76,45,22.6906666666667
+76,46,28.2998333333333
+76,47,26.7546666666667
+76,48,25.5905
+76,49,28.829
+76,50,29.6333333333333
+76,51,19.8966666666667
+76,52,20.574
+76,53,28.194
+76,54,22.8388333333333
+76,55,24.4263333333333
+76,56,30.48
+76,57,37.5073333333333
+76,58,25.8445
+76,59,27.813
+76,60,24.9343333333333
+76,61,31.0091666666667
+76,62,26.924
+76,63,29.4216666666667
+76,64,30.099
+76,65,29.8026666666667
+76,66,32.8506666666667
+76,67,30.5858333333333
+76,68,29.0406666666667
+76,69,32.5966666666667
+76,70,31.1996666666667
+76,71,23.495
+76,72,29.1676666666667
+76,73,22.987
+76,74,28.321
+76,75,26.9663333333333
+76,76,31.2631666666667
+76,77,28.0458333333333
+76,78,18.2245
+76,79,16.256
+76,80,27.813
+76,81,29.337
+76,82,24.2146666666667
+76,83,26.9663333333333
+76,84,25.781
+76,85,36.6606666666667
+76,86,23.2621666666667
+76,87,28.3845
+76,88,21.5053333333333
+76,89,25.527
+76,90,33.1893333333333
+76,91,24.4263333333333
+76,92,25.273
+76,93,33.147
+76,94,25.9503333333333
+76,95,25.5905
+76,96,32.5543333333333
+76,97,27.8553333333333
+76,98,26.9028333333333
+76,99,31.0726666666667
+76,100,20.828
+76,101,25.6328333333333
+76,102,23.1351666666667
+76,103,28.8925
+76,104,24.892
+76,105,27.7283333333333
+76,106,30.1413333333333
+76,107,25.1671666666667
+76,108,23.749
+76,109,27.686
+76,110,27.6225
+76,111,26.6276666666667
+76,112,20.828
+76,113,25.4846666666667
+76,114,30.861
+76,115,25.5058333333333
+76,116,21.0396666666667
+76,117,25.3365
+76,118,28.1516666666667
+76,119,29.972
+76,120,28.2575
+76,121,24.6168333333333
+76,122,16.6793333333333
+76,123,24.5533333333333
+76,124,32.0675
+76,125,34.417
+76,126,34.1418333333333
+76,127,24.6591666666667
+76,128,32.8506666666667
+76,129,33.1258333333333
+76,130,26.7546666666667
+76,131,29.7603333333333
+76,132,24.6803333333333
+76,133,28.2786666666667
+76,134,26.67
+76,135,20.9338333333333
+76,136,22.5213333333333
+76,137,34.798
+76,138,24.4475
+76,139,27.4108333333333
+76,140,24.9978333333333
+76,141,29.0195
+76,142,25.6116666666667
+76,143,29.337
+76,144,30.7763333333333
+76,145,22.0133333333333
+76,146,30.1413333333333
+76,147,25.1248333333333
+76,148,27.5378333333333
+76,149,31.3266666666667
+76,150,27.9611666666667
+76,151,27.686
+76,152,34.5016666666667
+76,153,29.1676666666667
+76,154,23.8971666666667
+76,155,20.3623333333333
+76,156,22.9023333333333
+76,157,29.0195
+76,158,26.9451666666667
+76,159,23.368
+76,160,29.718
+76,161,25.781
+76,162,27.8341666666667
+76,163,23.1775
+76,164,25.6116666666667
+76,165,26.924
+76,166,30.0778333333333
+76,167,28.4691666666667
+76,168,22.9023333333333
+76,169,22.8176666666667
+76,170,25.0401666666667
+76,171,26.797
+76,172,22.987
+76,173,24.5533333333333
+76,174,28.9136666666667
+76,175,24.003
+76,176,19.3463333333333
+76,177,26.5006666666667
+76,178,27.686
+76,179,26.5641666666667
+76,180,28.1728333333333
+76,181,22.7541666666667
+76,182,26.5853333333333
+76,183,29.2946666666667
+76,184,24.2146666666667
+76,185,30.3953333333333
+76,186,25.3576666666667
+76,187,26.9875
+76,188,26.0985
+76,189,26.416
+76,190,21.9498333333333
+76,191,24.8708333333333
+76,192,18.9018333333333
+76,193,30.226
+76,194,29.9085
+76,195,24.9978333333333
+76,196,22.6483333333333
+76,197,26.4583333333333
+76,198,24.3628333333333
+76,199,31.4113333333333
+76,200,27.8553333333333
+76,201,22.987
+76,202,25.8021666666667
+76,203,25.6328333333333
+76,204,25.4423333333333
+76,205,34.2265
+76,206,35.0731666666667
+76,207,29.6756666666667
+76,208,30.6493333333333
+76,209,30.861
+76,210,28.2998333333333
+76,211,24.0876666666667
+76,212,23.6855
+76,213,22.7753333333333
+76,214,31.6441666666667
+76,215,32.3215
+76,216,23.0293333333333
+76,217,23.7913333333333
+76,218,28.5538333333333
+76,219,23.8336666666667
+76,220,23.749
+76,221,25.8656666666667
+76,222,33.147
+76,223,24.511
+76,224,28.4268333333333
+76,225,32.5331666666667
+76,226,23.7278333333333
+76,227,31.0091666666667
+76,228,29.7603333333333
+76,229,20.7856666666667
+76,230,28.0881666666667
+76,231,28.5326666666667
+76,232,30.9033333333333
+76,233,28.5961666666667
+76,234,22.2673333333333
+76,235,28.1093333333333
+76,236,26.5853333333333
+76,237,27.432
+76,238,23.6855
+76,239,22.1403333333333
+76,240,27.9823333333333
+76,241,24.4686666666667
+76,242,30.861
+76,243,32.3638333333333
+76,244,32.8083333333333
+76,245,26.035
+76,246,22.3731666666667
+76,247,28.6596666666667
+76,248,20.3411666666667
+76,249,25.4635
+76,250,22.4155
+76,251,27.3896666666667
+76,252,28.194
+76,253,25.4
+76,254,31.1573333333333
+76,255,33.8243333333333
+76,256,30.0566666666667
+76,257,28.9983333333333
+76,258,30.0778333333333
+76,259,20.32
+76,260,26.8181666666667
+76,261,21.8016666666667
+76,262,24.3205
+76,263,22.5636666666667
+76,264,24.3416666666667
+76,265,27.8976666666667
+76,266,35.9621666666667
+76,267,23.5585
+76,268,26.289
+76,269,28.9136666666667
+76,270,30.5646666666667
+76,271,32.3426666666667
+76,272,27.7706666666667
+76,273,24.384
+76,274,26.8605
+76,275,21.5053333333333
+76,276,27.813
+76,277,24.2993333333333
+76,278,17.1026666666667
+76,279,34.163
+76,280,26.2678333333333
+76,281,26.9028333333333
+76,282,24.5321666666667
+76,283,28.3421666666667
+76,284,22.6483333333333
+76,285,27.7495
+76,286,22.0133333333333
+76,287,25.3153333333333
+76,288,25.273
+76,289,23.9818333333333
+76,290,29.591
+76,291,26.6911666666667
+76,292,29.6121666666667
+76,293,32.258
+76,294,26.9875
+76,295,27.1991666666667
+76,296,27.686
+76,297,18.9653333333333
+76,298,21.1243333333333
+76,299,26.3525
+76,300,26.7546666666667
+76,301,25.3788333333333
+76,302,25.654
+76,303,30.0143333333333
+76,304,28.1305
+76,305,25.654
+76,306,27.813
+76,307,32.512
+76,308,27.2203333333333
+76,309,26.0138333333333
+76,310,33.6126666666667
+76,311,27.5801666666667
+76,312,24.0876666666667
+76,313,27.7706666666667
+76,314,23.876
+76,315,28.7866666666667
+76,316,31.2208333333333
+76,317,30.1836666666667
+76,318,25.527
+76,319,28.4903333333333
+76,320,25.6963333333333
+76,321,21.1455
+76,322,28.7655
+76,323,22.7965
+76,324,26.543
+76,325,27.4108333333333
+76,326,27.2415
+76,327,25.7386666666667
+76,328,28.5538333333333
+76,329,29.8661666666667
+76,330,22.0556666666667
+76,331,27.813
+76,332,22.7965
+76,333,27.1568333333333
+76,334,28.6596666666667
+76,335,33.9513333333333
+76,336,21.3783333333333
+76,337,27.7918333333333
+76,338,28.9983333333333
+76,339,32.5966666666667
+76,340,24.8073333333333
+76,341,28.575
+76,342,23.0505
+76,343,27.1145
+76,344,25.8445
+76,345,24.511
+76,346,21.9921666666667
+76,347,29.9931666666667
+76,348,27.8553333333333
+76,349,33.8878333333333
+76,350,23.5373333333333
+76,351,26.2678333333333
+76,352,22.9658333333333
+76,353,27.1145
+76,354,25.2518333333333
+76,355,30.5223333333333
+76,356,26.0561666666667
+76,357,27.3896666666667
+76,358,19.7696666666667
+76,359,26.1408333333333
+76,360,31.2843333333333
+76,361,26.6488333333333
+76,362,33.9936666666667
+76,363,27.2203333333333
+76,364,36.4066666666667
+76,365,29.0618333333333
+76,366,30.6493333333333
+76,367,16.3195
+76,368,22.1826666666667
+76,369,24.2781666666667
+76,370,24.6591666666667
+76,371,28.0458333333333
+76,372,25.7175
+76,373,27.0933333333333
+76,374,30.353
+76,375,22.352
+76,376,21.1455
+76,377,27.1145
+76,378,25.0825
+76,379,26.9028333333333
+76,380,26.543
+76,381,28.7866666666667
+76,382,26.3948333333333
+76,383,29.083
+76,384,33.6973333333333
+76,385,25.2095
+76,386,30.099
+76,387,23.7278333333333
+76,388,25.5481666666667
+76,389,30.099
+76,390,25.3153333333333
+76,391,24.3416666666667
+76,392,21.7593333333333
+76,393,28.5326666666667
+76,394,24.3205
+76,395,32.0675
+76,396,33.7185
+76,397,24.5533333333333
+76,398,23.3256666666667
+76,399,27.1991666666667
+76,400,26.3101666666667
+76,401,20.828
+76,402,27.0086666666667
+76,403,24.1935
+76,404,24.4263333333333
+76,405,25.4211666666667
+76,406,29.2946666666667
+76,407,23.5373333333333
+76,408,26.543
+76,409,25.527
+76,410,23.749
+76,411,28.3845
+76,412,22.5001666666667
+76,413,25.019
+76,414,24.765
+76,415,22.7965
+76,416,25.4
+76,417,29.1041666666667
+76,418,28.0881666666667
+76,419,24.6591666666667
+76,420,24.9131666666667
+76,421,27.305
+76,422,23.8336666666667
+76,423,27.6436666666667
+76,424,32.8718333333333
+76,425,22.5848333333333
+76,426,22.1826666666667
+76,427,18.9865
+76,428,31.496
+76,429,29.0406666666667
+76,430,29.7603333333333
+76,431,28.7443333333333
+76,432,31.3901666666667
+76,433,33.6761666666667
+76,434,28.3421666666667
+76,435,27.6648333333333
+76,436,25.781
+76,437,30.9033333333333
+76,438,22.1191666666667
+76,439,20.955
+76,440,21.7593333333333
+76,441,25.9503333333333
+76,442,20.9973333333333
+76,443,21.336
+76,444,31.7288333333333
+76,445,28.0246666666667
+76,446,27.7283333333333
+76,447,24.9131666666667
+76,448,28.702
+76,449,24.765
+76,450,22.352
+76,451,29.3158333333333
+76,452,28.9136666666667
+76,453,30.099
+76,454,21.8228333333333
+76,455,37.0205
+76,456,26.2466666666667
+76,457,29.1041666666667
+76,458,27.813
+76,459,28.2575
+76,460,24.3628333333333
+76,461,26.6488333333333
+76,462,25.4423333333333
+76,463,27.5801666666667
+76,464,23.6855
+76,465,33.5068333333333
+76,466,22.2461666666667
+76,467,22.1191666666667
+76,468,23.6431666666667
+76,469,31.6653333333333
+76,470,27.7706666666667
+76,471,20.9761666666667
+76,472,28.5961666666667
+76,473,27.8976666666667
+76,474,27.5378333333333
+76,475,27.7706666666667
+76,476,29.3158333333333
+76,477,35.8351666666667
+76,478,23.4315
+76,479,27.2415
+76,480,20.9338333333333
+76,481,25.6116666666667
+76,482,27.5801666666667
+76,483,30.2895
+76,484,21.9921666666667
+76,485,22.3943333333333
+76,486,33.8666666666667
+76,487,38.6291666666667
+76,488,27.94
+76,489,27.0086666666667
+76,490,29.464
+76,491,25.5693333333333
+76,492,37.8248333333333
+76,493,24.9766666666667
+76,494,31.75
+76,495,28.4903333333333
+76,496,27.559
+76,497,23.2198333333333
+76,498,24.2781666666667
+76,499,30.6281666666667
+76,500,26.8181666666667
+76,501,24.7015
+76,502,25.146
+76,503,25.8233333333333
+76,504,32.0886666666667
+76,505,30.353
+76,506,20.3411666666667
+76,507,33.9513333333333
+76,508,30.099
+76,509,23.8548333333333
+76,510,30.1201666666667
+76,511,25.9291666666667
+76,512,20.8915
+76,513,27.1568333333333
+76,514,29.7391666666667
+76,515,26.9028333333333
+76,516,29.972
+76,517,27.178
+76,518,30.2683333333333
+76,519,25.3153333333333
+76,520,25.9926666666667
+76,521,24.892
+76,522,26.3525
+76,523,21.5265
+76,524,27.9188333333333
+76,525,17.6741666666667
+76,526,22.1615
+76,527,29.972
+76,528,28.194
+76,529,23.1775
+76,530,26.7123333333333
+76,531,38.9678333333333
+76,532,33.4433333333333
+76,533,30.5223333333333
+76,534,25.908
+76,535,27.7706666666667
+76,536,30.1201666666667
+76,537,31.369
+76,538,21.336
+76,539,27.305
+76,540,36.3643333333333
+76,541,31.9616666666667
+76,542,30.1836666666667
+76,543,23.622
+76,544,20.8915
+76,545,28.1728333333333
+76,546,27.7918333333333
+76,547,20.7645
+76,548,26.9663333333333
+76,549,25.4846666666667
+76,550,24.2781666666667
+76,551,32.3003333333333
+76,552,29.6545
+76,553,26.543
+76,554,28.7655
+76,555,34.2476666666667
+76,556,23.7066666666667
+76,557,30.6281666666667
+76,558,25.5905
+76,559,28.2786666666667
+76,560,24.9131666666667
+76,561,25.4
+76,562,28.6173333333333
+76,563,21.1031666666667
+76,564,26.4795
+76,565,22.479
+76,566,29.4428333333333
+76,567,21.5053333333333
+76,568,23.9606666666667
+76,569,26.2255
+76,570,24.638
+76,571,26.7335
+76,572,26.6276666666667
+76,573,22.9235
+76,574,31.4325
+76,575,24.0665
+76,576,24.7226666666667
+76,577,27.7283333333333
+76,578,25.4
+76,579,32.4696666666667
+76,580,24.5321666666667
+76,581,26.3736666666667
+76,582,30.0143333333333
+76,583,29.6968333333333
+76,584,25.3788333333333
+76,585,24.6591666666667
+76,586,28.2575
+76,587,36.2373333333333
+76,588,28.9771666666667
+76,589,26.2043333333333
+76,590,26.0773333333333
+76,591,21.2513333333333
+76,592,29.9931666666667
+76,593,28.0458333333333
+76,594,30.9033333333333
+76,595,25.7175
+76,596,29.2946666666667
+76,597,26.8181666666667
+76,598,23.7278333333333
+76,599,28.1305
+76,600,25.5481666666667
+76,601,24.765
+76,602,28.6385
+76,603,27.5801666666667
+76,604,21.8863333333333
+76,605,31.2843333333333
+76,606,27.6225
+76,607,20.5316666666667
+76,608,20.0236666666667
+76,609,23.1775
+76,610,24.2781666666667
+76,611,27.94
+76,612,22.7541666666667
+76,613,32.0886666666667
+76,614,23.9183333333333
+76,615,23.876
+76,616,23.3891666666667
+76,617,20.0025
+76,618,23.9183333333333
+76,619,25.3365
+76,620,31.0091666666667
+76,621,21.3995
+76,622,27.0086666666667
+76,623,27.305
+76,624,30.9033333333333
+76,625,29.0618333333333
+76,626,32.5966666666667
+76,627,26.9875
+76,628,34.5016666666667
+76,629,19.7061666666667
+76,630,26.8181666666667
+76,631,30.3106666666667
+76,632,31.9405
+76,633,26.8181666666667
+76,634,30.8821666666667
+76,635,24.1088333333333
+76,636,35.052
+76,637,20.0448333333333
+76,638,26.1831666666667
+76,639,26.9663333333333
+76,640,23.2621666666667
+76,641,26.0561666666667
+76,642,20.5528333333333
+76,643,33.7396666666667
+76,644,30.48
+76,645,35.2213333333333
+76,646,27.0086666666667
+76,647,28.8078333333333
+76,648,27.8341666666667
+76,649,29.6756666666667
+76,650,35.2213333333333
+76,651,26.3736666666667
+76,652,25.6751666666667
+76,653,32.9141666666667
+76,654,26.4795
+76,655,26.8181666666667
+76,656,24.4475
+76,657,24.511
+76,658,27.6225
+76,659,28.7866666666667
+76,660,25.1248333333333
+76,661,27.1568333333333
+76,662,20.2565
+76,663,32.2368333333333
+76,664,33.274
+76,665,31.115
+76,666,26.2255
+76,667,22.1826666666667
+76,668,28.9983333333333
+76,669,25.0613333333333
+76,670,22.1615
+76,671,24.5956666666667
+76,672,27.686
+76,673,23.7066666666667
+76,674,25.6116666666667
+76,675,24.384
+76,676,23.0505
+76,677,25.4211666666667
+76,678,25.1248333333333
+76,679,22.098
+76,680,27.1991666666667
+76,681,28.1516666666667
+76,682,27.686
+76,683,20.6798333333333
+76,684,25.8445
+76,685,29.5698333333333
+76,686,29.4005
+76,687,30.5646666666667
+76,688,28.7866666666667
+76,689,26.2043333333333
+76,690,31.877
+76,691,30.607
+76,692,21.3783333333333
+76,693,31.8981666666667
+76,694,30.9668333333333
+76,695,26.5853333333333
+76,696,22.733
+76,697,30.0778333333333
+76,698,27.4743333333333
+76,699,29.6756666666667
+76,700,23.6431666666667
+76,701,30.1413333333333
+76,702,22.3308333333333
+76,703,28.321
+76,704,18.7113333333333
+76,705,24.0241666666667
+76,706,22.2461666666667
+76,707,19.177
+76,708,27.8765
+76,709,26.6276666666667
+76,710,25.146
+76,711,30.6493333333333
+76,712,27.5378333333333
+76,713,22.3096666666667
+76,714,26.6488333333333
+76,715,30.4165
+76,716,32.9141666666667
+76,717,26.7546666666667
+76,718,23.3256666666667
+76,719,28.5115
+76,720,26.2255
+76,721,26.8393333333333
+76,722,26.2678333333333
+76,723,21.2513333333333
+76,724,34.671
+76,725,26.0561666666667
+76,726,26.8181666666667
+76,727,20.066
+76,728,29.8026666666667
+76,729,34.29
+76,730,25.9926666666667
+76,731,39.4123333333333
+76,732,27.6648333333333
+76,733,26.2043333333333
+76,734,24.4263333333333
+76,735,25.4635
+76,736,20.5316666666667
+76,737,35.56
+76,738,22.5425
+76,739,27.6436666666667
+76,740,30.4588333333333
+76,741,26.7123333333333
+76,742,24.1723333333333
+76,743,19.558
+76,744,26.6276666666667
+76,745,26.1408333333333
+76,746,26.3736666666667
+76,747,26.8816666666667
+76,748,25.781
+76,749,31.4536666666667
+76,750,27.4743333333333
+76,751,25.5058333333333
+76,752,29.1676666666667
+76,753,23.876
+76,754,27.2626666666667
+76,755,29.591
+76,756,33.7396666666667
+76,757,26.162
+76,758,28.9771666666667
+76,759,28.8925
+76,760,24.1935
+76,761,29.337
+76,762,24.638
+76,763,25.781
+76,764,21.8863333333333
+76,765,28.702
+76,766,24.0665
+76,767,25.6963333333333
+76,768,18.5208333333333
+76,769,21.8863333333333
+76,770,31.877
+76,771,24.8708333333333
+76,772,28.9771666666667
+76,773,24.257
+76,774,24.0665
+76,775,23.7066666666667
+76,776,34.798
+76,777,28.2363333333333
+76,778,33.0623333333333
+76,779,25.0613333333333
+76,780,24.7438333333333
+76,781,24.8708333333333
+76,782,24.2781666666667
+76,783,39.9838333333333
+76,784,25.2941666666667
+76,785,25.4635
+76,786,30.1413333333333
+76,787,22.7753333333333
+76,788,24.8496666666667
+76,789,27.4955
+76,790,23.4315
+76,791,27.0721666666667
+76,792,21.9921666666667
+76,793,28.8501666666667
+76,794,24.5533333333333
+76,795,24.6168333333333
+76,796,27.9188333333333
+76,797,22.9235
+76,798,22.0345
+76,799,28.6173333333333
+76,800,21.9498333333333
+76,801,22.733
+76,802,27.1568333333333
+76,803,25.7386666666667
+76,804,22.7118333333333
+76,805,24.9555
+76,806,23.0293333333333
+76,807,31.496
+76,808,29.3581666666667
+76,809,27.3896666666667
+76,810,23.7066666666667
+76,811,29.9508333333333
+76,812,33.6126666666667
+76,813,21.8016666666667
+76,814,27.94
+76,815,35.0096666666667
+76,816,22.3308333333333
+76,817,32.4908333333333
+76,818,32.0463333333333
+76,819,25.5905
+76,820,28.067
+76,821,22.4578333333333
+76,822,19.8331666666667
+76,823,31.6653333333333
+76,824,20.0236666666667
+76,825,29.3158333333333
+76,826,25.781
+76,827,26.0138333333333
+76,828,27.4531666666667
+76,829,32.9988333333333
+76,830,22.5425
+76,831,28.8501666666667
+76,832,26.2678333333333
+76,833,27.5166666666667
+76,834,26.1831666666667
+76,835,36.5336666666667
+76,836,24.511
+76,837,26.2043333333333
+76,838,28.5538333333333
+76,839,26.3313333333333
+76,840,20.4258333333333
+76,841,30.5435
+76,842,30.8186666666667
+76,843,27.1991666666667
+76,844,35.814
+76,845,20.9761666666667
+76,846,24.257
+76,847,28.4691666666667
+76,848,29.1465
+76,849,28.9348333333333
+76,850,30.2895
+76,851,21.0185
+76,852,20.6375
+76,853,27.5166666666667
+76,854,18.034
+76,855,20.8915
+76,856,33.528
+76,857,24.7226666666667
+76,858,25.527
+76,859,22.7541666666667
+76,860,30.099
+76,861,23.8336666666667
+76,862,15.5998333333333
+76,863,33.4856666666667
+76,864,23.7066666666667
+76,865,26.8605
+76,866,24.9766666666667
+76,867,29.6333333333333
+76,868,28.7231666666667
+76,869,25.5905
+76,870,21.5476666666667
+76,871,26.7335
+76,872,25.8656666666667
+76,873,23.6008333333333
+76,874,22.1615
+76,875,23.4526666666667
+76,876,26.3948333333333
+76,877,25.8445
+76,878,25.3153333333333
+76,879,26.3525
+76,880,28.1516666666667
+76,881,27.0086666666667
+76,882,30.9245
+76,883,31.0726666666667
+76,884,28.7866666666667
+76,885,28.4691666666667
+76,886,35.306
+76,887,33.5068333333333
+76,888,24.9766666666667
+76,889,26.2678333333333
+76,890,29.1465
+76,891,27.8553333333333
+76,892,26.9663333333333
+76,893,21.8228333333333
+76,894,31.115
+76,895,31.9405
+76,896,33.7185
+76,897,24.0665
+76,898,24.4263333333333
+76,899,24.5321666666667
+76,900,30.8398333333333
+76,901,24.003
+76,902,27.7283333333333
+76,903,23.368
+76,904,28.1093333333333
+76,905,25.8656666666667
+76,906,25.4
+76,907,29.21
+76,908,23.1775
+76,909,27.6013333333333
+76,910,29.6333333333333
+76,911,26.8816666666667
+76,912,34.036
+76,913,23.5585
+76,914,23.0716666666667
+76,915,32.2368333333333
+76,916,20.2353333333333
+76,917,32.5755
+76,918,22.6483333333333
+76,919,20.7856666666667
+76,920,22.0133333333333
+76,921,33.528
+76,922,25.1248333333333
+76,923,29.21
+76,924,30.353
+76,925,23.7701666666667
+76,926,20.6798333333333
+76,927,28.702
+76,928,21.2936666666667
+76,929,23.2833333333333
+76,930,23.7701666666667
+76,931,33.0623333333333
+76,932,20.955
+76,933,24.0241666666667
+76,934,23.0505
+76,935,24.4475
+76,936,30.4376666666667
+76,937,21.6323333333333
+76,938,30.6916666666667
+76,939,22.9658333333333
+76,940,23.1351666666667
+76,941,29.3581666666667
+76,942,29.4428333333333
+76,943,26.289
+76,944,20.9973333333333
+76,945,26.162
+76,946,24.1088333333333
+76,947,33.8455
+76,948,21.4206666666667
+76,949,31.623
+76,950,23.2198333333333
+76,951,28.4056666666667
+76,952,20.0448333333333
+76,953,26.1831666666667
+76,954,27.1145
+76,955,27.2203333333333
+76,956,22.6906666666667
+76,957,27.9823333333333
+76,958,27.432
+76,959,23.3045
+76,960,20.9761666666667
+76,961,21.4841666666667
+76,962,20.7856666666667
+76,963,32.1733333333333
+76,964,24.257
+76,965,25.6116666666667
+76,966,28.2151666666667
+76,967,24.9343333333333
+76,968,30.9668333333333
+76,969,29.718
+76,970,24.7861666666667
+76,971,22.2038333333333
+76,972,23.5796666666667
+76,973,32.5543333333333
+76,974,26.3736666666667
+76,975,31.5595
+76,976,26.6276666666667
+76,977,32.8083333333333
+76,978,28.3633333333333
+76,979,31.4748333333333
+76,980,30.5223333333333
+76,981,37.0416666666667
+76,982,28.194
+76,983,25.4846666666667
+76,984,27.6648333333333
+76,985,26.2043333333333
+76,986,33.4221666666667
+76,987,27.051
+76,988,24.8708333333333
+76,989,32.9776666666667
+76,990,27.2626666666667
+76,991,21.4418333333333
+76,992,26.67
+76,993,34.0783333333333
+76,994,23.9606666666667
+76,995,23.0928333333333
+76,996,24.003
+76,997,29.8026666666667
+76,998,27.0721666666667
+76,999,31.9405
+76,1000,25.5905
+77,1,29.1676666666667
+77,2,29.2311666666667
+77,3,32.5331666666667
+77,4,20.7856666666667
+77,5,30.3106666666667
+77,6,20.828
+77,7,29.6756666666667
+77,8,25.8868333333333
+77,9,28.8713333333333
+77,10,26.0138333333333
+77,11,33.8031666666667
+77,12,29.8238333333333
+77,13,29.3581666666667
+77,14,25.6328333333333
+77,15,34.2476666666667
+77,16,23.749
+77,17,28.8078333333333
+77,18,26.2466666666667
+77,19,32.7448333333333
+77,20,32.3638333333333
+77,21,32.9565
+77,22,32.1733333333333
+77,23,31.1361666666667
+77,24,27.3896666666667
+77,25,27.2203333333333
+77,26,30.8821666666667
+77,27,29.337
+77,28,29.1041666666667
+77,29,34.4593333333333
+77,30,30.6281666666667
+77,31,26.162
+77,32,26.416
+77,33,31.877
+77,34,35.3906666666667
+77,35,22.987
+77,36,25.2941666666667
+77,37,29.7815
+77,38,22.352
+77,39,27.7071666666667
+77,40,28.5961666666667
+77,41,30.607
+77,42,26.5218333333333
+77,43,27.1991666666667
+77,44,31.0938333333333
+77,45,31.6018333333333
+77,46,29.5275
+77,47,29.4851666666667
+77,48,27.94
+77,49,24.2993333333333
+77,50,36.2585
+77,51,32.512
+77,52,28.5326666666667
+77,53,23.4526666666667
+77,54,24.5745
+77,55,28.3633333333333
+77,56,22.5636666666667
+77,57,31.7076666666667
+77,58,26.543
+77,59,30.4165
+77,60,32.2156666666667
+77,61,30.8821666666667
+77,62,29.4216666666667
+77,63,29.6333333333333
+77,64,32.004
+77,65,28.0246666666667
+77,66,28.2363333333333
+77,67,30.5435
+77,68,29.7603333333333
+77,69,31.496
+77,70,29.5063333333333
+77,71,28.8501666666667
+77,72,31.9828333333333
+77,73,32.2368333333333
+77,74,32.9565
+77,75,21.6323333333333
+77,76,32.9988333333333
+77,77,32.4908333333333
+77,78,29.0618333333333
+77,79,21.463
+77,80,27.1356666666667
+77,81,25.6963333333333
+77,82,31.5383333333333
+77,83,24.9766666666667
+77,84,22.4578333333333
+77,85,30.2471666666667
+77,86,31.4748333333333
+77,87,27.2626666666667
+77,88,34.2265
+77,89,23.622
+77,90,28.4903333333333
+77,91,25.5693333333333
+77,92,29.845
+77,93,29.0618333333333
+77,94,23.5796666666667
+77,95,23.5796666666667
+77,96,29.9085
+77,97,29.718
+77,98,28.321
+77,99,20.1083333333333
+77,100,31.8558333333333
+77,101,24.9131666666667
+77,102,28.8078333333333
+77,103,30.7975
+77,104,30.2683333333333
+77,105,25.2941666666667
+77,106,26.9663333333333
+77,107,29.3793333333333
+77,108,36.5971666666667
+77,109,36.0256666666667
+77,110,36.83
+77,111,25.8656666666667
+77,112,32.385
+77,113,31.242
+77,114,31.115
+77,115,25.3153333333333
+77,116,26.1196666666667
+77,117,24.8285
+77,118,28.194
+77,119,27.9823333333333
+77,120,25.527
+77,121,28.5538333333333
+77,122,26.0561666666667
+77,123,33.8878333333333
+77,124,29.1676666666667
+77,125,26.924
+77,126,29.7603333333333
+77,127,25.2518333333333
+77,128,28.4056666666667
+77,129,28.2786666666667
+77,130,27.432
+77,131,27.1991666666667
+77,132,30.4588333333333
+77,133,33.7608333333333
+77,134,25.4
+77,135,30.226
+77,136,26.543
+77,137,27.9188333333333
+77,138,29.7391666666667
+77,139,24.9131666666667
+77,140,29.337
+77,141,29.9931666666667
+77,142,33.9513333333333
+77,143,25.0825
+77,144,29.0406666666667
+77,145,26.7546666666667
+77,146,25.5905
+77,147,26.0985
+77,148,29.972
+77,149,33.5703333333333
+77,150,27.4955
+77,151,30.226
+77,152,27.2203333333333
+77,153,26.543
+77,154,23.749
+77,155,28.2786666666667
+77,156,27.3473333333333
+77,157,22.1615
+77,158,24.5956666666667
+77,159,25.5058333333333
+77,160,31.8981666666667
+77,161,30.6916666666667
+77,162,29.2946666666667
+77,163,27.6013333333333
+77,164,26.7123333333333
+77,165,27.5378333333333
+77,166,28.702
+77,167,25.3365
+77,168,30.5223333333333
+77,169,30.988
+77,170,23.6008333333333
+77,171,27.305
+77,172,28.2575
+77,173,34.3746666666667
+77,174,35.6658333333333
+77,175,22.6695
+77,176,27.2838333333333
+77,177,29.2946666666667
+77,178,26.3736666666667
+77,179,21.4206666666667
+77,180,25.2941666666667
+77,181,32.8295
+77,182,24.511
+77,183,25.6963333333333
+77,184,26.8393333333333
+77,185,26.3736666666667
+77,186,28.1305
+77,187,27.5166666666667
+77,188,33.1258333333333
+77,189,25.5693333333333
+77,190,28.0458333333333
+77,191,31.75
+77,192,27.0086666666667
+77,193,28.2363333333333
+77,194,24.8285
+77,195,27.5166666666667
+77,196,32.004
+77,197,29.8026666666667
+77,198,23.9818333333333
+77,199,31.3901666666667
+77,200,27.7706666666667
+77,201,29.3158333333333
+77,202,33.8031666666667
+77,203,31.8135
+77,204,33.1046666666667
+77,205,25.781
+77,206,32.1945
+77,207,29.1253333333333
+77,208,31.0091666666667
+77,209,29.1465
+77,210,25.8233333333333
+77,211,28.1516666666667
+77,212,24.1935
+77,213,30.734
+77,214,27.94
+77,215,28.8078333333333
+77,216,29.3581666666667
+77,217,28.3421666666667
+77,218,24.2358333333333
+77,219,32.8083333333333
+77,220,30.48
+77,221,25.6328333333333
+77,222,28.2151666666667
+77,223,29.337
+77,224,30.4165
+77,225,24.7438333333333
+77,226,23.4738333333333
+77,227,27.4531666666667
+77,228,30.6493333333333
+77,229,30.3318333333333
+77,230,27.9611666666667
+77,231,27.2626666666667
+77,232,26.8393333333333
+77,233,27.4108333333333
+77,234,31.0726666666667
+77,235,29.4851666666667
+77,236,29.6545
+77,237,28.2998333333333
+77,238,29.2311666666667
+77,239,27.8976666666667
+77,240,27.8976666666667
+77,241,23.8548333333333
+77,242,30.48
+77,243,28.829
+77,244,23.1775
+77,245,26.8605
+77,246,29.3158333333333
+77,247,29.7391666666667
+77,248,27.6648333333333
+77,249,31.115
+77,250,26.9028333333333
+77,251,28.6173333333333
+77,252,29.7391666666667
+77,253,25.4
+77,254,31.4536666666667
+77,255,33.1893333333333
+77,256,27.3896666666667
+77,257,26.035
+77,258,27.7071666666667
+77,259,27.1991666666667
+77,260,28.1516666666667
+77,261,29.464
+77,262,25.2941666666667
+77,263,26.4795
+77,264,26.4371666666667
+77,265,26.9451666666667
+77,266,25.2941666666667
+77,267,26.9451666666667
+77,268,26.2466666666667
+77,269,22.1826666666667
+77,270,28.0246666666667
+77,271,29.718
+77,272,27.8553333333333
+77,273,26.9451666666667
+77,274,29.2735
+77,275,20.4681666666667
+77,276,26.7546666666667
+77,277,23.0081666666667
+77,278,26.5006666666667
+77,279,27.9188333333333
+77,280,21.8016666666667
+77,281,23.622
+77,282,23.5796666666667
+77,283,28.5115
+77,284,28.2151666666667
+77,285,31.5806666666667
+77,286,31.8346666666667
+77,287,26.4583333333333
+77,288,24.5745
+77,289,30.9668333333333
+77,290,28.1516666666667
+77,291,27.7495
+77,292,28.194
+77,293,30.2471666666667
+77,294,31.9828333333333
+77,295,29.9085
+77,296,27.4743333333333
+77,297,28.9136666666667
+77,298,30.3106666666667
+77,299,29.9931666666667
+77,300,26.162
+77,301,28.5961666666667
+77,302,23.9818333333333
+77,303,25.8656666666667
+77,304,26.6488333333333
+77,305,31.3901666666667
+77,306,29.1041666666667
+77,307,25.6963333333333
+77,308,30.7763333333333
+77,309,34.6075
+77,310,28.194
+77,311,29.5698333333333
+77,312,30.4588333333333
+77,313,34.6075
+77,314,29.1676666666667
+77,315,30.4588333333333
+77,316,26.543
+77,317,29.6121666666667
+77,318,32.639
+77,319,24.9131666666667
+77,320,34.7556666666667
+77,321,30.2683333333333
+77,322,24.765
+77,323,28.0458333333333
+77,324,28.448
+77,325,33.9301666666667
+77,326,30.4588333333333
+77,327,29.3793333333333
+77,328,27.1145
+77,329,31.7288333333333
+77,330,27.8553333333333
+77,331,27.6225
+77,332,32.4696666666667
+77,333,22.3943333333333
+77,334,27.6225
+77,335,28.5326666666667
+77,336,29.2735
+77,337,29.5063333333333
+77,338,32.0463333333333
+77,339,25.8233333333333
+77,340,27.051
+77,341,21.9286666666667
+77,342,32.0463333333333
+77,343,33.6973333333333
+77,344,24.257
+77,345,31.3055
+77,346,31.5383333333333
+77,347,31.8346666666667
+77,348,27.7918333333333
+77,349,33.0623333333333
+77,350,26.8605
+77,351,19.05
+77,352,30.9245
+77,353,26.289
+77,354,27.0933333333333
+77,355,32.5331666666667
+77,356,23.5796666666667
+77,357,26.9451666666667
+77,358,33.0623333333333
+77,359,29.4428333333333
+77,360,24.9131666666667
+77,361,29.3793333333333
+77,362,27.7706666666667
+77,363,24.7226666666667
+77,364,31.7288333333333
+77,365,27.4531666666667
+77,366,34.6498333333333
+77,367,33.8455
+77,368,28.8501666666667
+77,369,26.1408333333333
+77,370,29.4005
+77,371,27.7071666666667
+77,372,24.6168333333333
+77,373,25.4211666666667
+77,374,28.4903333333333
+77,375,25.8868333333333
+77,376,29.591
+77,377,28.3633333333333
+77,378,34.5863333333333
+77,379,25.5481666666667
+77,380,25.5693333333333
+77,381,31.2208333333333
+77,382,27.0721666666667
+77,383,25.273
+77,384,31.0726666666667
+77,385,25.0613333333333
+77,386,25.5481666666667
+77,387,28.9771666666667
+77,388,28.5538333333333
+77,389,23.7701666666667
+77,390,31.4325
+77,391,28.4056666666667
+77,392,31.0515
+77,393,29.9085
+77,394,28.8078333333333
+77,395,32.0463333333333
+77,396,28.5961666666667
+77,397,34.6921666666667
+77,398,27.5166666666667
+77,399,23.3468333333333
+77,400,27.813
+77,401,23.9183333333333
+77,402,36.3643333333333
+77,403,27.2415
+77,404,26.7123333333333
+77,405,25.8233333333333
+77,406,34.1206666666667
+77,407,21.971
+77,408,30.4165
+77,409,32.512
+77,410,28.1093333333333
+77,411,29.6756666666667
+77,412,25.3365
+77,413,28.3421666666667
+77,414,35.433
+77,415,21.8016666666667
+77,416,26.0561666666667
+77,417,26.543
+77,418,30.3106666666667
+77,419,29.7391666666667
+77,420,25.6751666666667
+77,421,29.591
+77,422,26.5006666666667
+77,423,31.3266666666667
+77,424,32.0886666666667
+77,425,27.8341666666667
+77,426,24.2146666666667
+77,427,30.0778333333333
+77,428,33.02
+77,429,27.4108333333333
+77,430,27.051
+77,431,24.892
+77,432,36.4913333333333
+77,433,30.3318333333333
+77,434,33.274
+77,435,33.9936666666667
+77,436,29.5275
+77,437,27.0086666666667
+77,438,30.0143333333333
+77,439,30.4165
+77,440,29.845
+77,441,29.6968333333333
+77,442,31.7923333333333
+77,443,37.5496666666667
+77,444,27.4531666666667
+77,445,23.4738333333333
+77,446,28.702
+77,447,24.9343333333333
+77,448,28.7443333333333
+77,449,32.0886666666667
+77,450,29.5486666666667
+77,451,31.5171666666667
+77,452,39.7298333333333
+77,453,32.893
+77,454,31.5806666666667
+77,455,30.9456666666667
+77,456,30.1413333333333
+77,457,28.7231666666667
+77,458,26.4583333333333
+77,459,25.5905
+77,460,31.1996666666667
+77,461,26.9875
+77,462,22.3308333333333
+77,463,28.6385
+77,464,27.432
+77,465,28.7655
+77,466,30.2048333333333
+77,467,29.337
+77,468,24.4475
+77,469,25.273
+77,470,24.2781666666667
+77,471,28.3633333333333
+77,472,23.8336666666667
+77,473,34.1841666666667
+77,474,31.9616666666667
+77,475,27.3896666666667
+77,476,27.1568333333333
+77,477,33.1258333333333
+77,478,25.273
+77,479,32.5755
+77,480,33.6973333333333
+77,481,33.655
+77,482,25.5693333333333
+77,483,27.6013333333333
+77,484,23.4315
+77,485,32.1733333333333
+77,486,25.6963333333333
+77,487,27.3896666666667
+77,488,31.2208333333333
+77,489,30.1625
+77,490,29.718
+77,491,25.7386666666667
+77,492,28.4903333333333
+77,493,30.5646666666667
+77,494,23.495
+77,495,32.2368333333333
+77,496,26.5218333333333
+77,497,19.177
+77,498,34.1841666666667
+77,499,27.8341666666667
+77,500,30.7763333333333
+77,501,30.2471666666667
+77,502,22.3731666666667
+77,503,23.8125
+77,504,30.9668333333333
+77,505,33.1258333333333
+77,506,26.7546666666667
+77,507,31.5806666666667
+77,508,32.8718333333333
+77,509,28.0881666666667
+77,510,32.4061666666667
+77,511,26.543
+77,512,26.4583333333333
+77,513,32.9565
+77,514,26.7546666666667
+77,515,26.3313333333333
+77,516,27.0721666666667
+77,517,30.7975
+77,518,29.4851666666667
+77,519,31.496
+77,520,21.9498333333333
+77,521,34.0148333333333
+77,522,33.8031666666667
+77,523,28.0035
+77,524,27.051
+77,525,24.9978333333333
+77,526,28.7443333333333
+77,527,28.3633333333333
+77,528,27.9188333333333
+77,529,27.6013333333333
+77,530,33.2316666666667
+77,531,27.0721666666667
+77,532,29.4216666666667
+77,533,29.4216666666667
+77,534,29.464
+77,535,31.5595
+77,536,29.337
+77,537,27.7495
+77,538,27.7495
+77,539,27.8976666666667
+77,540,32.9565
+77,541,29.9508333333333
+77,542,30.1413333333333
+77,543,23.5585
+77,544,26.4583333333333
+77,545,29.1676666666667
+77,546,26.5641666666667
+77,547,27.3261666666667
+77,548,36.4278333333333
+77,549,30.2048333333333
+77,550,27.8341666666667
+77,551,28.4268333333333
+77,552,30.3741666666667
+77,553,31.0726666666667
+77,554,31.115
+77,555,22.098
+77,556,32.1521666666667
+77,557,30.099
+77,558,25.3576666666667
+77,559,36.0468333333333
+77,560,23.495
+77,561,31.5595
+77,562,31.8135
+77,563,34.1841666666667
+77,564,28.4691666666667
+77,565,20.3835
+77,566,27.3473333333333
+77,567,29.4851666666667
+77,568,27.4743333333333
+77,569,25.019
+77,570,28.2151666666667
+77,571,25.5693333333333
+77,572,34.9038333333333
+77,573,28.6596666666667
+77,574,32.5543333333333
+77,575,29.1041666666667
+77,576,32.0251666666667
+77,577,25.4
+77,578,25.2095
+77,579,31.4536666666667
+77,580,28.9136666666667
+77,581,28.1093333333333
+77,582,29.0406666666667
+77,583,29.8026666666667
+77,584,33.1681666666667
+77,585,24.5745
+77,586,25.8868333333333
+77,587,20.8703333333333
+77,588,27.8341666666667
+77,589,28.7443333333333
+77,590,24.8073333333333
+77,591,23.1775
+77,592,35.7505
+77,593,29.7391666666667
+77,594,31.9193333333333
+77,595,27.5801666666667
+77,596,25.273
+77,597,28.9771666666667
+77,598,34.3958333333333
+77,599,31.6018333333333
+77,600,23.3891666666667
+77,601,36.9146666666667
+77,602,30.3318333333333
+77,603,25.4211666666667
+77,604,26.8816666666667
+77,605,23.6431666666667
+77,606,27.9823333333333
+77,607,27.0933333333333
+77,608,28.9136666666667
+77,609,28.8078333333333
+77,610,32.0463333333333
+77,611,24.9555
+77,612,25.3788333333333
+77,613,29.9085
+77,614,24.9978333333333
+77,615,29.8238333333333
+77,616,26.8181666666667
+77,617,32.4908333333333
+77,618,35.9621666666667
+77,619,27.7283333333333
+77,620,32.2368333333333
+77,621,27.7706666666667
+77,622,30.2048333333333
+77,623,22.0133333333333
+77,624,27.7071666666667
+77,625,27.5166666666667
+77,626,33.02
+77,627,29.4851666666667
+77,628,31.6018333333333
+77,629,27.4108333333333
+77,630,27.4955
+77,631,28.2363333333333
+77,632,23.6431666666667
+77,633,25.273
+77,634,25.6751666666667
+77,635,26.797
+77,636,32.9988333333333
+77,637,21.9921666666667
+77,638,26.5218333333333
+77,639,34.7345
+77,640,25.6328333333333
+77,641,32.9776666666667
+77,642,27.4531666666667
+77,643,30.9245
+77,644,29.3158333333333
+77,645,29.8026666666667
+77,646,27.6013333333333
+77,647,26.8605
+77,648,21.1243333333333
+77,649,34.2476666666667
+77,650,31.7288333333333
+77,651,28.6808333333333
+77,652,28.7231666666667
+77,653,29.5698333333333
+77,654,29.1465
+77,655,25.8233333333333
+77,656,30.4165
+77,657,28.194
+77,658,27.3261666666667
+77,659,26.543
+77,660,25.8445
+77,661,28.6596666666667
+77,662,34.163
+77,663,32.639
+77,664,21.844
+77,665,25.3153333333333
+77,666,26.4583333333333
+77,667,36.9146666666667
+77,668,27.4531666666667
+77,669,34.3111666666667
+77,670,28.5326666666667
+77,671,22.3943333333333
+77,672,30.0778333333333
+77,673,26.1408333333333
+77,674,22.1191666666667
+77,675,30.1413333333333
+77,676,22.987
+77,677,27.0298333333333
+77,678,22.3731666666667
+77,679,26.5641666666667
+77,680,29.2735
+77,681,25.0825
+77,682,29.9931666666667
+77,683,31.8981666666667
+77,684,26.5853333333333
+77,685,32.1098333333333
+77,686,29.6333333333333
+77,687,28.1305
+77,688,28.4691666666667
+77,689,22.1615
+77,690,30.1836666666667
+77,691,31.2208333333333
+77,692,29.1465
+77,693,26.162
+77,694,30.9245
+77,695,26.3525
+77,696,24.2358333333333
+77,697,31.75
+77,698,25.4846666666667
+77,699,29.1041666666667
+77,700,30.2683333333333
+77,701,24.9555
+77,702,22.7965
+77,703,30.9668333333333
+77,704,22.733
+77,705,29.6968333333333
+77,706,21.1455
+77,707,26.0561666666667
+77,708,20.8703333333333
+77,709,29.6121666666667
+77,710,27.051
+77,711,25.2095
+77,712,30.734
+77,713,26.9451666666667
+77,714,19.1981666666667
+77,715,27.6013333333333
+77,716,25.9503333333333
+77,717,26.8605
+77,718,26.924
+77,719,26.3101666666667
+77,720,25.3576666666667
+77,721,23.622
+77,722,26.7335
+77,723,32.512
+77,724,32.4908333333333
+77,725,33.2316666666667
+77,726,29.337
+77,727,31.75
+77,728,31.5383333333333
+77,729,25.0825
+77,730,28.0246666666667
+77,731,28.5538333333333
+77,732,27.0086666666667
+77,733,28.702
+77,734,23.9818333333333
+77,735,31.8981666666667
+77,736,32.8506666666667
+77,737,24.3205
+77,738,27.7283333333333
+77,739,27.0933333333333
+77,740,26.8605
+77,741,29.0195
+77,742,31.8558333333333
+77,743,34.8615
+77,744,31.496
+77,745,26.289
+77,746,32.0886666666667
+77,747,28.5538333333333
+77,748,22.3308333333333
+77,749,30.6493333333333
+77,750,25.3576666666667
+77,751,29.6333333333333
+77,752,25.6751666666667
+77,753,28.8925
+77,754,31.7076666666667
+77,755,28.3633333333333
+77,756,26.4795
+77,757,31.5171666666667
+77,758,29.591
+77,759,31.4325
+77,760,36.4066666666667
+77,761,25.8021666666667
+77,762,21.1878333333333
+77,763,27.8765
+77,764,28.4268333333333
+77,765,28.7231666666667
+77,766,28.702
+77,767,27.0298333333333
+77,768,30.2683333333333
+77,769,29.6333333333333
+77,770,20.9761666666667
+77,771,25.781
+77,772,29.6545
+77,773,31.0938333333333
+77,774,29.972
+77,775,25.8656666666667
+77,776,26.7335
+77,777,29.7391666666667
+77,778,29.6333333333333
+77,779,30.2895
+77,780,29.7603333333333
+77,781,28.1305
+77,782,24.511
+77,783,34.9673333333333
+77,784,25.3788333333333
+77,785,33.3586666666667
+77,786,31.115
+77,787,20.4893333333333
+77,788,27.6648333333333
+77,789,29.5486666666667
+77,790,29.2311666666667
+77,791,31.4113333333333
+77,792,24.3416666666667
+77,793,29.5275
+77,794,27.3261666666667
+77,795,36.3431666666667
+77,796,29.083
+77,797,27.8976666666667
+77,798,38.0576666666667
+77,799,27.3473333333333
+77,800,24.5956666666667
+77,801,24.8073333333333
+77,802,26.9028333333333
+77,803,26.5641666666667
+77,804,30.1625
+77,805,25.8021666666667
+77,806,25.2095
+77,807,29.083
+77,808,32.5331666666667
+77,809,27.3261666666667
+77,810,32.6178333333333
+77,811,26.6488333333333
+77,812,29.21
+77,813,26.67
+77,814,31.7711666666667
+77,815,32.004
+77,816,27.9823333333333
+77,817,27.2626666666667
+77,818,27.0933333333333
+77,819,25.3788333333333
+77,820,30.3318333333333
+77,821,25.5905
+77,822,30.9245
+77,823,26.6911666666667
+77,824,26.3101666666667
+77,825,28.9771666666667
+77,826,30.1413333333333
+77,827,26.7758333333333
+77,828,27.1356666666667
+77,829,28.448
+77,830,25.7598333333333
+77,831,29.6545
+77,832,30.0778333333333
+77,833,27.8765
+77,834,29.718
+77,835,30.5223333333333
+77,836,33.9936666666667
+77,837,27.9611666666667
+77,838,32.4485
+77,839,24.6591666666667
+77,840,34.0995
+77,841,28.1516666666667
+77,842,25.5481666666667
+77,843,26.7123333333333
+77,844,29.1888333333333
+77,845,28.9136666666667
+77,846,22.6695
+77,847,27.9611666666667
+77,848,27.2415
+77,849,27.4108333333333
+77,850,27.3685
+77,851,30.2895
+77,852,26.162
+77,853,28.6808333333333
+77,854,28.4056666666667
+77,855,21.971
+77,856,28.0035
+77,857,28.4268333333333
+77,858,25.146
+77,859,23.7066666666667
+77,860,23.5796666666667
+77,861,29.2946666666667
+77,862,28.7866666666667
+77,863,30.1201666666667
+77,864,30.861
+77,865,31.4325
+77,866,26.3525
+77,867,31.7288333333333
+77,868,27.0933333333333
+77,869,35.1366666666667
+77,870,29.8661666666667
+77,871,29.8026666666667
+77,872,31.6018333333333
+77,873,31.8981666666667
+77,874,22.7965
+77,875,27.178
+77,876,27.2626666666667
+77,877,26.7546666666667
+77,878,29.1465
+77,879,31.5806666666667
+77,880,29.9296666666667
+77,881,31.2843333333333
+77,882,29.6756666666667
+77,883,26.4583333333333
+77,884,33.8666666666667
+77,885,36.6395
+77,886,30.9033333333333
+77,887,31.8135
+77,888,29.1465
+77,889,26.5641666666667
+77,890,32.8506666666667
+77,891,24.2146666666667
+77,892,32.3426666666667
+77,893,31.6018333333333
+77,894,28.1093333333333
+77,895,29.2311666666667
+77,896,27.2203333333333
+77,897,26.3101666666667
+77,898,18.7536666666667
+77,899,28.0246666666667
+77,900,30.0143333333333
+77,901,27.2415
+77,902,33.8878333333333
+77,903,25.7598333333333
+77,904,25.4846666666667
+77,905,33.8878333333333
+77,906,30.3318333333333
+77,907,32.385
+77,908,25.3153333333333
+77,909,33.4645
+77,910,29.1888333333333
+77,911,25.654
+77,912,29.5698333333333
+77,913,26.5853333333333
+77,914,34.671
+77,915,27.3896666666667
+77,916,29.7391666666667
+77,917,23.0081666666667
+77,918,35.6658333333333
+77,919,36.1738333333333
+77,920,30.4376666666667
+77,921,31.0091666666667
+77,922,34.4381666666667
+77,923,29.464
+77,924,23.876
+77,925,26.416
+77,926,33.8031666666667
+77,927,25.9715
+77,928,22.7965
+77,929,22.5213333333333
+77,930,29.8238333333333
+77,931,28.2575
+77,932,25.4
+77,933,30.4588333333333
+77,934,20.6163333333333
+77,935,29.6545
+77,936,35.7505
+77,937,26.0561666666667
+77,938,28.8925
+77,939,25.5905
+77,940,28.067
+77,941,33.909
+77,942,25.9715
+77,943,27.0721666666667
+77,944,29.972
+77,945,30.9245
+77,946,31.4748333333333
+77,947,30.0566666666667
+77,948,27.3473333333333
+77,949,29.9508333333333
+77,950,31.0091666666667
+77,951,24.3416666666667
+77,952,25.1036666666667
+77,953,30.9668333333333
+77,954,30.9033333333333
+77,955,31.0303333333333
+77,956,25.273
+77,957,28.8713333333333
+77,958,30.5646666666667
+77,959,29.7815
+77,960,35.687
+77,961,25.9503333333333
+77,962,34.2476666666667
+77,963,34.2053333333333
+77,964,30.2048333333333
+77,965,28.0458333333333
+77,966,26.9028333333333
+77,967,29.6545
+77,968,35.1366666666667
+77,969,27.2203333333333
+77,970,32.6813333333333
+77,971,30.9033333333333
+77,972,27.1991666666667
+77,973,34.036
+77,974,23.495
+77,975,23.368
+77,976,18.3726666666667
+77,977,28.9771666666667
+77,978,33.655
+77,979,28.575
+77,980,27.178
+77,981,24.7861666666667
+77,982,27.3896666666667
+77,983,32.2156666666667
+77,984,27.4108333333333
+77,985,28.5115
+77,986,27.2626666666667
+77,987,22.0556666666667
+77,988,32.1521666666667
+77,989,28.702
+77,990,25.527
+77,991,29.4428333333333
+77,992,26.924
+77,993,24.1723333333333
+77,994,30.3741666666667
+77,995,30.4588333333333
+77,996,24.5956666666667
+77,997,30.7128333333333
+77,998,29.0195
+77,999,24.9766666666667
+77,1000,30.607
+78,1,31.3563
+78,2,36.3474
+78,3,27.4531666666667
+78,4,43.2308
+78,5,38.4132666666667
+78,6,36.0087333333333
+78,7,30.7805666666667
+78,8,33.5703333333333
+78,9,38.1042333333333
+78,10,29.8069
+78,11,34.0783333333333
+78,12,39.7806333333333
+78,13,33.6380666666667
+78,14,31.1192333333333
+78,15,30.2090666666667
+78,16,32.4527333333333
+78,17,24.1935
+78,18,28.6850666666667
+78,19,30.5308
+78,20,39.4800666666667
+78,21,29.4682333333333
+78,22,32.3215
+78,23,34.7599
+78,24,32.512
+78,25,36.4532333333333
+78,26,39.1244666666667
+78,27,32.0717333333333
+78,28,37.9137333333333
+78,29,33.0623333333333
+78,30,38.0153333333333
+78,31,31.0599666666667
+78,32,30.0820666666667
+78,33,30.9033333333333
+78,34,33.4941333333333
+78,35,29.8915666666667
+78,36,26.8181666666667
+78,37,34.1503
+78,38,24.1088333333333
+78,39,26.6911666666667
+78,40,40.6188333333333
+78,41,23.368
+78,42,37.8375333333333
+78,43,25.5693333333333
+78,44,26.9451666666667
+78,45,34.3789
+78,46,26.5768666666667
+78,47,30.3360666666667
+78,48,30.8229
+78,49,23.5627333333333
+78,50,37.1094
+78,51,25.9164666666667
+78,52,34.9080666666667
+78,53,37.2448666666667
+78,54,31.5849
+78,55,43.0149
+78,56,31.4367333333333
+78,57,31.8558333333333
+78,58,36.4532333333333
+78,59,36.7453333333333
+78,60,28.9179
+78,61,31.8812333333333
+78,62,34.5016666666667
+78,63,26.2678333333333
+78,64,30.4292
+78,65,26.6573
+78,66,32.0675
+78,67,31.3944
+78,68,27.3896666666667
+78,69,32.4061666666667
+78,70,28.8501666666667
+78,71,31.6103
+78,72,34.8869
+78,73,38.9466666666667
+78,74,27.5463
+78,75,30.8271333333333
+78,76,34.9885
+78,77,36.1611333333333
+78,78,33.7862333333333
+78,79,29.8407666666667
+78,80,39.6917333333333
+78,81,36.4998
+78,82,32.7321333333333
+78,83,33.4518
+78,84,33.6380666666667
+78,85,32.5797333333333
+78,86,32.5839666666667
+78,87,31.1023
+78,88,26.7335
+78,89,29.9593
+78,90,37.7401666666667
+78,91,33.9725
+78,92,34.5270666666667
+78,93,37.2999
+78,94,36.2204
+78,95,34.8488
+78,96,30.8906333333333
+78,97,36.0045
+78,98,31.2293
+78,99,26.5684
+78,100,42.0878
+78,101,29.21
+78,102,35.6277333333333
+78,103,31.4706
+78,104,27.0298333333333
+78,105,26.7335
+78,106,29.6587333333333
+78,107,29.3878
+78,108,33.4179333333333
+78,109,31.9659
+78,110,34.8488
+78,111,31.2674
+78,112,35.7124
+78,113,34.6752333333333
+78,114,31.1615666666667
+78,115,41.3215666666667
+78,116,37.6682
+78,117,33.0242333333333
+78,118,32.7236666666667
+78,119,27.3515666666667
+78,120,37.1178666666667
+78,121,35.7378
+78,122,35.0816333333333
+78,123,39.3488333333333
+78,124,29.8661666666667
+78,125,21.1455
+78,126,30.4630666666667
+78,127,30.1201666666667
+78,128,32.8506666666667
+78,129,34.4254666666667
+78,130,37.5750666666667
+78,131,32.7914
+78,132,29.3412333333333
+78,133,38.8450666666667
+78,134,30.0439666666667
+78,135,46.3888666666667
+78,136,23.2833333333333
+78,137,28.9475333333333
+78,138,33.2994
+78,139,28.1135666666667
+78,140,30.3403
+78,141,33.9513333333333
+78,142,38.3963333333333
+78,143,35.2848333333333
+78,144,28.1813
+78,145,27.4193
+78,146,40.2632333333333
+78,147,21.7805
+78,148,23.2833333333333
+78,149,31.1785
+78,150,33.1258333333333
+78,151,23.8125
+78,152,31.7923333333333
+78,153,37.6893666666667
+78,154,29.6587333333333
+78,155,29.0618333333333
+78,156,36.3431666666667
+78,157,32.6517
+78,158,26.1831666666667
+78,159,32.0929
+78,160,25.4931333333333
+78,161,31.1361666666667
+78,162,30.9541333333333
+78,163,36.2796666666667
+78,164,34.1418333333333
+78,165,32.7279
+78,166,38.9297333333333
+78,167,34.9927333333333
+78,168,44.6024
+78,169,23.1394
+78,170,34.6498333333333
+78,171,31.9278
+78,172,38.9932333333333
+78,173,32.3638333333333
+78,174,38.9085666666667
+78,175,33.6126666666667
+78,176,27.3769666666667
+78,177,28.5623
+78,178,37.4269
+78,179,29.2142333333333
+78,180,22.9277333333333
+78,181,36.4701666666667
+78,182,29.7010666666667
+78,183,26.7419666666667
+78,184,43.9547
+78,185,37.3041333333333
+78,186,24.4729
+78,187,34.1672333333333
+78,188,36.8765666666667
+78,189,30.5731333333333
+78,190,29.7391666666667
+78,191,42.5238333333333
+78,192,27.8384
+78,193,44.9834
+78,194,30.2090666666667
+78,195,29.5359666666667
+78,196,28.6215666666667
+78,197,27.5209
+78,198,28.4353
+78,199,34.8403333333333
+78,200,31.0557333333333
+78,201,29.0237333333333
+78,202,32.4696666666667
+78,203,37.1475
+78,204,27.9611666666667
+78,205,32.7279
+78,206,34.0021333333333
+78,207,39.6959666666667
+78,208,23.5669666666667
+78,209,34.7006333333333
+78,210,27.3388666666667
+78,211,32.1140666666667
+78,212,33.0708
+78,213,34.1926333333333
+78,214,24.7946333333333
+78,215,35.9875666666667
+78,216,29.1549666666667
+78,217,29.3412333333333
+78,218,28.2151666666667
+78,219,30.3572333333333
+78,220,23.0759
+78,221,23.0124
+78,222,32.3215
+78,223,38.4598333333333
+78,224,29.2354
+78,225,32.5755
+78,226,33.7015666666667
+78,227,34.9038333333333
+78,228,37.7613333333333
+78,229,27.9738666666667
+78,230,38.8874
+78,231,31.0853666666667
+78,232,27.3896666666667
+78,233,31.9405
+78,234,39.5224
+78,235,26.2170333333333
+78,236,26.1408333333333
+78,237,35.4541666666667
+78,238,24.7226666666667
+78,239,26.289
+78,240,21.2725
+78,241,43.7557333333333
+78,242,32.2368333333333
+78,243,28.194
+78,244,32.4739
+78,245,39.1795
+78,246,29.4005
+78,247,34.7853
+78,248,33.6380666666667
+78,249,22.5213333333333
+78,250,28.1516666666667
+78,251,30.4249666666667
+78,252,35.9621666666667
+78,253,24.1088333333333
+78,254,32.1945
+78,255,37.6258666666667
+78,256,29.9508333333333
+78,257,29.5105666666667
+78,258,25.9715
+78,259,36.3262333333333
+78,260,37.3845666666667
+78,261,30.9075666666667
+78,262,35.1028
+78,263,26.6276666666667
+78,264,30.9922333333333
+78,265,33.4264
+78,266,33.7227333333333
+78,267,26.3186333333333
+78,268,31.6738
+78,269,29.6756666666667
+78,270,30.6578
+78,271,30.5689
+78,272,27.7918333333333
+78,273,29.5021
+78,274,33.7015666666667
+78,275,30.0651333333333
+78,276,35.6277333333333
+78,277,35.1409
+78,278,34.4508666666667
+78,279,33.7904666666667
+78,280,27.3727333333333
+78,281,31.5383333333333
+78,282,28.6639
+78,283,34.2265
+78,284,35.1155
+78,285,39.7086666666667
+78,286,34.9165333333333
+78,287,25.8233333333333
+78,288,35.3314
+78,289,33.1385333333333
+78,290,34.7810666666667
+78,291,36.0468333333333
+78,292,41.0929666666667
+78,293,35.4838
+78,294,31.4325
+78,295,41.0294666666667
+78,296,33.5068333333333
+78,297,27.94
+78,298,34.5567
+78,299,35.7166333333333
+78,300,33.5534
+78,301,35.4033666666667
+78,302,31.9870666666667
+78,303,29.8704
+78,304,37.8756333333333
+78,305,34.5482333333333
+78,306,38.1084666666667
+78,307,34.2095666666667
+78,308,41.8295666666667
+78,309,36.3474
+78,310,32.8760666666667
+78,311,29.464
+78,312,29.4513
+78,313,25.4677333333333
+78,314,37.5115666666667
+78,315,34.5355333333333
+78,316,35.9452333333333
+78,317,41.8888333333333
+78,318,33.6211333333333
+78,319,24.2781666666667
+78,320,27.2838333333333
+78,321,28.0754666666667
+78,322,30.8652333333333
+78,323,30.0143333333333
+78,324,37.7232333333333
+78,325,41.0252333333333
+78,326,33.0877333333333
+78,327,34.7387333333333
+78,328,34.8699666666667
+78,329,34.3154
+78,330,25.2095
+78,331,39.5943666666667
+78,332,30.1455666666667
+78,333,26.1831666666667
+78,334,29.3031333333333
+78,335,31.1615666666667
+78,336,30.1455666666667
+78,337,33.4475666666667
+78,338,39.1710333333333
+78,339,34.7345
+78,340,33.5153
+78,341,31.8558333333333
+78,342,35.7378
+78,343,34.9038333333333
+78,344,32.0251666666667
+78,345,37.5285
+78,346,23.2029
+78,347,29.4470666666667
+78,348,41.6390666666667
+78,349,28.6427333333333
+78,350,37.8502333333333
+78,351,31.7923333333333
+78,352,33.3671333333333
+78,353,35.9706333333333
+78,354,24.3416666666667
+78,355,19.8797333333333
+78,356,35.4118333333333
+78,357,35.5557666666667
+78,358,28.8713333333333
+78,359,30.353
+78,360,25.7937
+78,361,24.4729
+78,362,24.3416666666667
+78,363,29.8915666666667
+78,364,31.3097333333333
+78,365,37.8714
+78,366,38.0195666666667
+78,367,37.338
+78,368,29.5359666666667
+78,369,24.1554
+78,370,34.5270666666667
+78,371,22.098
+78,372,30.5435
+78,373,33.7650666666667
+78,374,23.9479666666667
+78,375,35.6319666666667
+78,376,38.0788333333333
+78,377,42.5407666666667
+78,378,28.2194
+78,379,31.3097333333333
+78,380,22.6695
+78,381,44.8564
+78,382,35.4160666666667
+78,383,25.0274666666667
+78,384,26.5260666666667
+78,385,31.5214
+78,386,27.1060333333333
+78,387,33.4645
+78,388,33.3544333333333
+78,389,32.8506666666667
+78,390,20.4681666666667
+78,391,33.9428666666667
+78,392,24.3459
+78,393,28.5157333333333
+78,394,38.9509
+78,395,30.5858333333333
+78,396,26.035
+78,397,34.9504
+78,398,30.4503666666667
+78,399,37.9772333333333
+78,400,30.3995666666667
+78,401,30.7805666666667
+78,402,36.1992333333333
+78,403,31.0303333333333
+78,404,27.1822333333333
+78,405,34.1206666666667
+78,406,43.2308
+78,407,40.1531666666667
+78,408,25.7386666666667
+78,409,35.3568
+78,410,33.7904666666667
+78,411,33.4687333333333
+78,412,38.2312333333333
+78,413,39.1795
+78,414,31.8600666666667
+78,415,33.4094666666667
+78,416,32.9776666666667
+78,417,42.0243
+78,418,32.7490666666667
+78,419,38.5572
+78,420,27.4404666666667
+78,421,34.4381666666667
+78,422,35.7970666666667
+78,423,31.6484
+78,424,34.3535
+78,425,32.6898
+78,426,35.1620666666667
+78,427,31.7288333333333
+78,428,32.512
+78,429,36.9019666666667
+78,430,33.0030666666667
+78,431,33.2824666666667
+78,432,26.8689666666667
+78,433,38.1846666666667
+78,434,33.147
+78,435,34.9461666666667
+78,436,30.2556333333333
+78,437,40.7331333333333
+78,438,22.4620666666667
+78,439,28.2617333333333
+78,440,35.3568
+78,441,34.5694
+78,442,38.2481666666667
+78,443,34.1249
+78,444,42.6339
+78,445,26.8647333333333
+78,446,27.432
+78,447,21.9752333333333
+78,448,25.2518333333333
+78,449,30.5646666666667
+78,450,37.1940666666667
+78,451,27.7071666666667
+78,452,40.7627666666667
+78,453,37.6597333333333
+78,454,31.0726666666667
+78,455,34.9504
+78,456,23.5246333333333
+78,457,31.5976
+78,458,43.0953333333333
+78,459,29.7603333333333
+78,460,34.3746666666667
+78,461,30.607
+78,462,31.6865
+78,463,35.6743
+78,464,38.6503333333333
+78,465,30.3191333333333
+78,466,26.2085666666667
+78,467,34.0487
+78,468,36.3008333333333
+78,469,37.6385666666667
+78,470,36.0045
+78,471,38.8450666666667
+78,472,33.3417333333333
+78,473,27.1399
+78,474,36.3474
+78,475,38.8958666666667
+78,476,27.9019
+78,477,28.9898666666667
+78,478,35.2763666666667
+78,479,25.8233333333333
+78,480,31.3351333333333
+78,481,30.7805666666667
+78,482,31.4409666666667
+78,483,28.8755666666667
+78,484,35.5303666666667
+78,485,35.6277333333333
+78,486,38.3413
+78,487,33.9767333333333
+78,488,35.8055333333333
+78,489,31.7161333333333
+78,490,33.8709
+78,491,38.4725333333333
+78,492,32.1733333333333
+78,493,26.6107333333333
+78,494,29.5571333333333
+78,495,31.6314666666667
+78,496,26.9494
+78,497,28.3083
+78,498,27.5039666666667
+78,499,28.6808333333333
+78,500,32.0675
+78,501,41.0294666666667
+78,502,32.2368333333333
+78,503,29.6164
+78,504,24.8750666666667
+78,505,32.5755
+78,506,34.4635666666667
+78,507,32.0505666666667
+78,508,38.1931333333333
+78,509,24.7692333333333
+78,510,27.6013333333333
+78,511,32.7702333333333
+78,512,28.7062333333333
+78,513,40.4495
+78,514,32.5839666666667
+78,515,33.5364666666667
+78,516,30.8483
+78,517,34.1841666666667
+78,518,39.3488333333333
+78,519,31.6484
+78,520,27.0340666666667
+78,521,22.1826666666667
+78,522,24.9978333333333
+78,523,34.1418333333333
+78,524,28.194
+78,525,37.5581333333333
+78,526,34.4466333333333
+78,527,30.9668333333333
+78,528,30.3445333333333
+78,529,26.6319
+78,530,28.702
+78,531,35.814
+78,532,36.1357333333333
+78,533,31.4536666666667
+78,534,33.6761666666667
+78,535,27.4955
+78,536,26.4625666666667
+78,537,38.8196666666667
+78,538,38.0619
+78,539,33.4814333333333
+78,540,28.3083
+78,541,27.4235333333333
+78,542,35.6743
+78,543,32.4739
+78,544,30.3149
+78,545,30.1455666666667
+78,546,28.0289
+78,547,28.7485666666667
+78,548,37.5793
+78,549,36.9189
+78,550,32.9395666666667
+78,551,33.3798333333333
+78,552,32.1945
+78,553,37.0416666666667
+78,554,37.4861666666667
+78,555,31.1573333333333
+78,556,33.4264
+78,557,31.496
+78,558,33.2528333333333
+78,559,34.5016666666667
+78,560,39.3742333333333
+78,561,40.9913666666667
+78,562,38.7561666666667
+78,563,34.1037333333333
+78,564,28.3548666666667
+78,565,30.4461333333333
+78,566,27.3473333333333
+78,567,34.4297
+78,568,26.8605
+78,569,34.5016666666667
+78,570,30.6747333333333
+78,571,36.6903
+78,572,24.3628333333333
+78,573,32.639
+78,574,39.1456333333333
+78,575,33.1089
+78,576,31.1023
+78,577,33.7608333333333
+78,578,32.0675
+78,579,38.5445
+78,580,32.6686333333333
+78,581,30.1286333333333
+78,582,47.0577333333333
+78,583,28.5707666666667
+78,584,28.6385
+78,585,28.0458333333333
+78,586,29.5486666666667
+78,587,27.0340666666667
+78,588,26.6954
+78,589,36.0934
+78,590,37.8841
+78,591,27.5801666666667
+78,592,30.9456666666667
+78,593,27.0298333333333
+78,594,37.9306666666667
+78,595,30.6324
+78,596,34.4847333333333
+78,597,32.4739
+78,598,37.9814666666667
+78,599,35.5642333333333
+78,600,31.9405
+78,601,30.1498
+78,602,33.0115333333333
+78,603,37.3761
+78,604,27.6648333333333
+78,605,34.7218
+78,606,34.6117333333333
+78,607,27.0975666666667
+78,608,35.1620666666667
+78,609,38.3963333333333
+78,610,36.5971666666667
+78,611,36.4193666666667
+78,612,32.2241333333333
+78,613,31.496
+78,614,32.6813333333333
+78,615,23.8336666666667
+78,616,26.1281333333333
+78,617,22.1615
+78,618,34.4593333333333
+78,619,32.6601666666667
+78,620,30.1244
+78,621,30.6916666666667
+78,622,37.1940666666667
+78,623,23.8125
+78,624,40.8305
+78,625,34.9038333333333
+78,626,19.4098333333333
+78,627,31.1192333333333
+78,628,42.8413333333333
+78,629,36.322
+78,630,30.8694666666667
+78,631,40.4114
+78,632,33.1512333333333
+78,633,32.0505666666667
+78,634,32.9395666666667
+78,635,36.8596333333333
+78,636,40.2251333333333
+78,637,32.7871666666667
+78,638,30.9499
+78,639,31.7076666666667
+78,640,29.5105666666667
+78,641,32.6432333333333
+78,642,34.5651666666667
+78,643,39.3911666666667
+78,644,34.3577333333333
+78,645,28.7485666666667
+78,646,31.0303333333333
+78,647,23.5415666666667
+78,648,38.4217333333333
+78,649,35.4160666666667
+78,650,21.2513333333333
+78,651,41.8676666666667
+78,652,31.0557333333333
+78,653,27.9188333333333
+78,654,28.321
+78,655,32.6432333333333
+78,656,38.227
+78,657,35.2890666666667
+78,658,35.5854
+78,659,35.8986666666667
+78,660,33.5999666666667
+78,661,31.496
+78,662,31.6907333333333
+78,663,21.5942333333333
+78,664,33.7396666666667
+78,665,31.0345666666667
+78,666,40.7712333333333
+78,667,29.4089666666667
+78,668,30.1879
+78,669,22.4620666666667
+78,670,34.1249
+78,671,37.0035666666667
+78,672,27.5166666666667
+78,673,32.0251666666667
+78,674,27.3727333333333
+78,675,29.1041666666667
+78,676,42.9048333333333
+78,677,28.0458333333333
+78,678,37.4988666666667
+78,679,24.0114666666667
+78,680,32.6813333333333
+78,681,36.322
+78,682,26.0985
+78,683,32.3426666666667
+78,684,38.0195666666667
+78,685,38.8704666666667
+78,686,38.6969
+78,687,32.3511333333333
+78,688,34.2476666666667
+78,689,36.1992333333333
+78,690,30.9710666666667
+78,691,36.4744
+78,692,32.512
+78,693,30.6281666666667
+78,694,24.7269
+78,695,29.2142333333333
+78,696,34.0825666666667
+78,697,33.7566
+78,698,29.7645666666667
+78,699,21.6789
+78,700,27.9611666666667
+78,701,30.4842333333333
+78,702,38.6334
+78,703,34.2053333333333
+78,704,42.9937333333333
+78,705,23.8971666666667
+78,706,29.9423666666667
+78,707,28.0881666666667
+78,708,32.9903666666667
+78,709,32.4950666666667
+78,710,33.5110666666667
+78,711,34.4466333333333
+78,712,34.925
+78,713,28.8713333333333
+78,714,32.3511333333333
+78,715,35.6065666666667
+78,716,32.2199
+78,717,33.782
+78,718,29.5529
+78,719,33.2994
+78,720,33.8074
+78,721,25.3788333333333
+78,722,24.1765666666667
+78,723,35.1832333333333
+78,724,26.9324666666667
+78,725,28.2617333333333
+78,726,35.1366666666667
+78,727,37.338
+78,728,26.3779
+78,729,33.7396666666667
+78,730,32.1352333333333
+78,731,35.8648
+78,732,24.3035666666667
+78,733,33.2401333333333
+78,734,31.5637333333333
+78,735,33.9132333333333
+78,736,27.9061333333333
+78,737,37.1305666666667
+78,738,29.5740666666667
+78,739,37.2787333333333
+78,740,36.5379
+78,741,28.9644666666667
+78,742,36.0722333333333
+78,743,21.7593333333333
+78,744,27.3134666666667
+78,745,29.5740666666667
+78,746,31.6314666666667
+78,747,32.9988333333333
+78,748,29.8915666666667
+78,749,24.4898333333333
+78,750,37.9560666666667
+78,751,35.9494666666667
+78,752,29.4216666666667
+78,753,34.6286666666667
+78,754,35.8351666666667
+78,755,33.7227333333333
+78,756,30.5223333333333
+78,757,28.7485666666667
+78,758,36.6860666666667
+78,759,30.3953333333333
+78,760,33.3883
+78,761,29.2735
+78,762,30.9710666666667
+78,763,31.1785
+78,764,36.6098666666667
+78,765,29.6629666666667
+78,766,33.4264
+78,767,33.4221666666667
+78,768,32.6432333333333
+78,769,39.7975666666667
+78,770,27.1018
+78,771,31.3563
+78,772,33.1089
+78,773,31.2674
+78,774,36.5336666666667
+78,775,28.8247666666667
+78,776,29.5486666666667
+78,777,30.5646666666667
+78,778,23.2240666666667
+78,779,32.7025
+78,780,37.0882333333333
+78,781,35.2467333333333
+78,782,30.6705
+78,783,33.9513333333333
+78,784,28.3718
+78,785,32.2876333333333
+78,786,29.4470666666667
+78,787,36.7072333333333
+78,788,33.147
+78,789,34.4678
+78,790,34.1460666666667
+78,791,34.9080666666667
+78,792,32.9184
+78,793,33.1512333333333
+78,794,29.8492333333333
+78,795,28.3421666666667
+78,796,29.9169666666667
+78,797,32.8295
+78,798,35.5854
+78,799,26.1281333333333
+78,800,29.0195
+78,801,35.9283
+78,802,42.926
+78,803,30.6747333333333
+78,804,28.4099
+78,805,34.5016666666667
+78,806,27.9654
+78,807,36.1569
+78,808,36.6268
+78,809,26.4837333333333
+78,810,30.3953333333333
+78,811,34.2730666666667
+78,812,30.8737
+78,813,33.6973333333333
+78,814,28.5792333333333
+78,815,35.4795666666667
+78,816,36.2839
+78,817,32.1394666666667
+78,818,29.7010666666667
+78,819,32.1733333333333
+78,820,38.8408333333333
+78,821,39.3996333333333
+78,822,28.2659666666667
+78,823,38.6503333333333
+78,824,26.5260666666667
+78,825,23.749
+78,826,30.2768
+78,827,39.4843
+78,828,33.1935666666667
+78,829,37.6809
+78,830,37.9941666666667
+78,831,29.3243
+78,832,32.2876333333333
+78,833,24.3459
+78,834,38.6926666666667
+78,835,22.6737333333333
+78,836,37.6385666666667
+78,837,35.8013
+78,838,32.131
+78,839,26.797
+78,840,32.9014666666667
+78,841,38.7858
+78,842,29.9085
+78,843,34.1037333333333
+78,844,35.9875666666667
+78,845,37.5327333333333
+78,846,32.6601666666667
+78,847,33.6169
+78,848,28.0458333333333
+78,849,35.4118333333333
+78,850,37.973
+78,851,26.1831666666667
+78,852,32.7533
+78,853,25.6751666666667
+78,854,33.147
+78,855,40.4833666666667
+78,856,35.7716666666667
+78,857,34.9292333333333
+78,858,30.1455666666667
+78,859,30.9118
+78,860,33.1554666666667
+78,861,29.6756666666667
+78,862,29.3412333333333
+78,863,39.1668
+78,864,26.4371666666667
+78,865,35.0985666666667
+78,866,30.1244
+78,867,31.4325
+78,868,35.4626333333333
+78,869,36.7538
+78,870,30.0355
+78,871,30.7594
+78,872,39.8610666666667
+78,873,29.8661666666667
+78,874,26.7631333333333
+78,875,34.8911333333333
+78,876,27.432
+78,877,24.7861666666667
+78,878,36.2627333333333
+78,879,30.2133
+78,880,23.4780666666667
+78,881,34.7810666666667
+78,882,32.6136
+78,883,36.4617
+78,884,23.3468333333333
+78,885,37.2406333333333
+78,886,32.5839666666667
+78,887,31.3351333333333
+78,888,30.1201666666667
+78,889,29.6333333333333
+78,890,25.0613333333333
+78,891,32.7279
+78,892,27.0086666666667
+78,893,26.5260666666667
+78,894,26.3186333333333
+78,895,32.7321333333333
+78,896,37.4692333333333
+78,897,33.1554666666667
+78,898,47.0619666666667
+78,899,28.9221333333333
+78,900,36.1442
+78,901,31.8177333333333
+78,902,25.8572
+78,903,30.3191333333333
+78,904,36.2373333333333
+78,905,37.6978333333333
+78,906,33.2359
+78,907,27.1145
+78,908,30.5308
+78,909,29.7010666666667
+78,910,31.9278
+78,911,35.8182333333333
+78,912,35.5388333333333
+78,913,27.7325666666667
+78,914,30.7932666666667
+78,915,30.5096333333333
+78,916,26.543
+78,917,31.369
+78,918,34.2349666666667
+78,919,30.3149
+78,920,28.3845
+78,921,35.9283
+78,922,30.2048333333333
+78,923,36.9993333333333
+78,924,34.5905666666667
+78,925,37.3676333333333
+78,926,32.6178333333333
+78,927,27.3515666666667
+78,928,30.1286333333333
+78,929,35.5430666666667
+78,930,31.2250666666667
+78,931,32.7490666666667
+78,932,29.1973
+78,933,25.7429
+78,934,24.8115666666667
+78,935,30.3614666666667
+78,936,32.3511333333333
+78,937,33.1978
+78,938,28.4141333333333
+78,939,27.1145
+78,940,33.0835
+78,941,39.8610666666667
+78,942,30.2090666666667
+78,943,32.1352333333333
+78,944,29.5148
+78,945,28.6850666666667
+78,946,31.2631666666667
+78,947,34.1206666666667
+78,948,28.9390666666667
+78,949,29.1676666666667
+78,950,37.0882333333333
+78,951,36.2204
+78,952,39.7594666666667
+78,953,35.6065666666667
+78,954,33.8243333333333
+78,955,35.3525666666667
+78,956,40.0727333333333
+78,957,34.2095666666667
+78,958,40.2886333333333
+78,959,31.9108666666667
+78,960,36.1823
+78,961,28.9348333333333
+78,962,39.3911666666667
+78,963,29.1676666666667
+78,964,27.7749
+78,965,32.6855666666667
+78,966,33.4052333333333
+78,967,31.0938333333333
+78,968,27.5801666666667
+78,969,36.3558666666667
+78,970,29.3454666666667
+78,971,34.7006333333333
+78,972,36.5379
+78,973,36.0891666666667
+78,974,36.1145666666667
+78,975,37.3803333333333
+78,976,41.2919333333333
+78,977,31.2843333333333
+78,978,39.7975666666667
+78,979,33.8074
+78,980,25.4677333333333
+78,981,38.7392333333333
+78,982,30.6705
+78,983,35.4372333333333
+78,984,38.8916333333333
+78,985,35.3441
+78,986,32.2622333333333
+78,987,32.6601666666667
+78,988,32.6644
+78,989,40.8770666666667
+78,990,34.3577333333333
+78,991,36.1823
+78,992,32.9776666666667
+78,993,26.0392333333333
+78,994,33.8031666666667
+78,995,35.9833333333333
+78,996,38.481
+78,997,35.9494666666667
+78,998,29.7264666666667
+78,999,38.5233333333333
+78,1000,35.0604666666667
+79,1,24.9343333333333
+79,2,35.5388333333333
+79,3,31.3901666666667
+79,4,27.7706666666667
+79,5,26.289
+79,6,28.575
+79,7,30.734
+79,8,31.496
+79,9,21.2513333333333
+79,10,26.1408333333333
+79,11,27.6225
+79,12,32.2368333333333
+79,13,27.4955
+79,14,24.8073333333333
+79,15,34.036
+79,16,29.2311666666667
+79,17,32.1945
+79,18,23.7066666666667
+79,19,34.671
+79,20,27.1568333333333
+79,21,25.5058333333333
+79,22,25.273
+79,23,25.8445
+79,24,33.2951666666667
+79,25,26.9028333333333
+79,26,28.0881666666667
+79,27,23.8548333333333
+79,28,22.7965
+79,29,23.7066666666667
+79,30,30.5646666666667
+79,31,32.258
+79,32,28.0458333333333
+79,33,25.019
+79,34,35.2001666666667
+79,35,26.5218333333333
+79,36,30.9033333333333
+79,37,27.305
+79,38,24.384
+79,39,23.3256666666667
+79,40,20.6163333333333
+79,41,27.5801666666667
+79,42,25.5058333333333
+79,43,34.3958333333333
+79,44,26.0138333333333
+79,45,28.2363333333333
+79,46,26.5006666666667
+79,47,31.3478333333333
+79,48,27.6225
+79,49,21.1031666666667
+79,50,22.3731666666667
+79,51,22.3943333333333
+79,52,28.9983333333333
+79,53,30.9245
+79,54,25.908
+79,55,26.3101666666667
+79,56,29.464
+79,57,28.0458333333333
+79,58,27.8341666666667
+79,59,23.5796666666667
+79,60,24.5321666666667
+79,61,28.3845
+79,62,28.5326666666667
+79,63,25.7386666666667
+79,64,30.7128333333333
+79,65,31.1996666666667
+79,66,32.4908333333333
+79,67,21.9075
+79,68,26.6911666666667
+79,69,28.1305
+79,70,26.3948333333333
+79,71,28.6596666666667
+79,72,23.368
+79,73,19.7908333333333
+79,74,23.2833333333333
+79,75,29.0195
+79,76,30.6493333333333
+79,77,24.4051666666667
+79,78,27.3261666666667
+79,79,20.5528333333333
+79,80,31.6018333333333
+79,81,25.908
+79,82,31.4325
+79,83,29.6121666666667
+79,84,25.6963333333333
+79,85,27.9188333333333
+79,86,22.098
+79,87,23.8125
+79,88,24.6803333333333
+79,89,32.639
+79,90,25.4211666666667
+79,91,26.6276666666667
+79,92,29.8238333333333
+79,93,30.8398333333333
+79,94,25.8021666666667
+79,95,33.2316666666667
+79,96,25.6963333333333
+79,97,30.0355
+79,98,30.9033333333333
+79,99,29.5275
+79,100,28.3633333333333
+79,101,22.9658333333333
+79,102,29.8026666666667
+79,103,28.8713333333333
+79,104,27.6225
+79,105,29.083
+79,106,26.7335
+79,107,27.051
+79,108,31.5595
+79,109,30.2471666666667
+79,110,26.162
+79,111,30.2683333333333
+79,112,22.4155
+79,113,27.559
+79,114,29.845
+79,115,28.829
+79,116,24.2358333333333
+79,117,31.0515
+79,118,26.3736666666667
+79,119,30.2048333333333
+79,120,32.5331666666667
+79,121,28.9771666666667
+79,122,24.9555
+79,123,28.067
+79,124,25.7175
+79,125,26.2043333333333
+79,126,27.5801666666667
+79,127,30.2683333333333
+79,128,25.0613333333333
+79,129,23.0716666666667
+79,130,34.163
+79,131,28.1093333333333
+79,132,33.8455
+79,133,29.2946666666667
+79,134,33.8666666666667
+79,135,24.3628333333333
+79,136,30.1836666666667
+79,137,31.8346666666667
+79,138,29.9085
+79,139,32.6601666666667
+79,140,25.4635
+79,141,33.7396666666667
+79,142,26.416
+79,143,31.6865
+79,144,31.7076666666667
+79,145,26.3101666666667
+79,146,34.3958333333333
+79,147,33.401
+79,148,36.4701666666667
+79,149,22.7965
+79,150,27.6436666666667
+79,151,32.0886666666667
+79,152,27.9188333333333
+79,153,29.2311666666667
+79,154,32.004
+79,155,29.3793333333333
+79,156,30.48
+79,157,28.4268333333333
+79,158,25.5693333333333
+79,159,27.051
+79,160,25.6963333333333
+79,161,28.0246666666667
+79,162,33.4221666666667
+79,163,32.0463333333333
+79,164,31.0303333333333
+79,165,32.0886666666667
+79,166,30.2895
+79,167,32.2368333333333
+79,168,28.2363333333333
+79,169,30.9456666666667
+79,170,30.6705
+79,171,28.9348333333333
+79,172,27.7918333333333
+79,173,26.67
+79,174,27.6013333333333
+79,175,30.8186666666667
+79,176,28.0035
+79,177,28.5115
+79,178,24.5321666666667
+79,179,29.2946666666667
+79,180,23.8336666666667
+79,181,28.575
+79,182,25.7598333333333
+79,183,22.352
+79,184,24.8285
+79,185,27.3473333333333
+79,186,27.8553333333333
+79,187,26.162
+79,188,20.2353333333333
+79,189,28.2151666666667
+79,190,29.7815
+79,191,26.6911666666667
+79,192,22.5848333333333
+79,193,31.5806666666667
+79,194,20.8915
+79,195,30.6916666666667
+79,196,29.9931666666667
+79,197,26.924
+79,198,28.2575
+79,199,34.2688333333333
+79,200,29.7603333333333
+79,201,24.13
+79,202,28.4691666666667
+79,203,27.1356666666667
+79,204,26.3948333333333
+79,205,24.0241666666667
+79,206,25.5905
+79,207,24.4051666666667
+79,208,22.3308333333333
+79,209,34.0995
+79,210,23.6431666666667
+79,211,25.4211666666667
+79,212,29.1676666666667
+79,213,27.0933333333333
+79,214,26.1831666666667
+79,215,31.2208333333333
+79,216,30.1836666666667
+79,217,29.9085
+79,218,27.3685
+79,219,31.3478333333333
+79,220,24.0876666666667
+79,221,29.8026666666667
+79,222,27.178
+79,223,27.813
+79,224,30.353
+79,225,24.4898333333333
+79,226,37.6131666666667
+79,227,27.0298333333333
+79,228,30.48
+79,229,27.432
+79,230,28.1305
+79,231,31.5171666666667
+79,232,26.7335
+79,233,28.7443333333333
+79,234,24.003
+79,235,25.2095
+79,236,38.3751666666667
+79,237,30.5011666666667
+79,238,29.6121666666667
+79,239,22.9446666666667
+79,240,28.9983333333333
+79,241,27.3896666666667
+79,242,23.9183333333333
+79,243,28.956
+79,244,31.0938333333333
+79,245,31.2208333333333
+79,246,27.9188333333333
+79,247,24.7438333333333
+79,248,27.559
+79,249,31.4113333333333
+79,250,21.3783333333333
+79,251,29.2735
+79,252,23.7913333333333
+79,253,26.797
+79,254,26.162
+79,255,24.892
+79,256,30.6916666666667
+79,257,33.8666666666667
+79,258,28.956
+79,259,31.1785
+79,260,25.146
+79,261,38.5445
+79,262,27.8976666666667
+79,263,29.2523333333333
+79,264,24.1088333333333
+79,265,29.1465
+79,266,29.1676666666667
+79,267,30.1413333333333
+79,268,28.3421666666667
+79,269,27.7706666666667
+79,270,28.3633333333333
+79,271,29.845
+79,272,22.5636666666667
+79,273,26.2678333333333
+79,274,34.1206666666667
+79,275,29.0618333333333
+79,276,26.9451666666667
+79,277,26.3313333333333
+79,278,27.8976666666667
+79,279,24.6168333333333
+79,280,29.0195
+79,281,36.5548333333333
+79,282,24.511
+79,283,23.9606666666667
+79,284,23.2621666666667
+79,285,31.3266666666667
+79,286,30.1413333333333
+79,287,24.8285
+79,288,27.3473333333333
+79,289,24.9555
+79,290,31.7711666666667
+79,291,31.3478333333333
+79,292,27.0298333333333
+79,293,25.3576666666667
+79,294,28.5961666666667
+79,295,26.3948333333333
+79,296,25.7386666666667
+79,297,23.3891666666667
+79,298,30.3953333333333
+79,299,31.8981666666667
+79,300,26.0561666666667
+79,301,26.6488333333333
+79,302,22.1191666666667
+79,303,26.8393333333333
+79,304,27.5166666666667
+79,305,29.8661666666667
+79,306,27.9611666666667
+79,307,32.4485
+79,308,28.9983333333333
+79,309,33.6973333333333
+79,310,27.4531666666667
+79,311,28.6173333333333
+79,312,35.1578333333333
+79,313,26.6488333333333
+79,314,30.7763333333333
+79,315,27.7918333333333
+79,316,31.6441666666667
+79,317,27.6436666666667
+79,318,24.4686666666667
+79,319,30.6493333333333
+79,320,30.6493333333333
+79,321,30.2683333333333
+79,322,26.5218333333333
+79,323,31.0938333333333
+79,324,33.7608333333333
+79,325,26.8181666666667
+79,326,27.7071666666667
+79,327,26.5853333333333
+79,328,29.2311666666667
+79,329,25.8021666666667
+79,330,26.543
+79,331,24.2358333333333
+79,332,24.1723333333333
+79,333,30.988
+79,334,29.7603333333333
+79,335,29.2523333333333
+79,336,30.1625
+79,337,19.558
+79,338,26.6488333333333
+79,339,27.4743333333333
+79,340,31.6653333333333
+79,341,28.5115
+79,342,31.1361666666667
+79,343,35.7716666666667
+79,344,27.0721666666667
+79,345,21.6323333333333
+79,346,26.7335
+79,347,29.4216666666667
+79,348,26.9875
+79,349,29.3793333333333
+79,350,29.8238333333333
+79,351,27.0298333333333
+79,352,28.067
+79,353,26.9875
+79,354,26.035
+79,355,28.4691666666667
+79,356,30.353
+79,357,29.3581666666667
+79,358,23.622
+79,359,29.1676666666667
+79,360,30.9668333333333
+79,361,28.6596666666667
+79,362,26.3101666666667
+79,363,27.813
+79,364,31.7711666666667
+79,365,27.0086666666667
+79,366,28.8925
+79,367,35.2213333333333
+79,368,27.2626666666667
+79,369,24.7015
+79,370,25.019
+79,371,27.686
+79,372,32.5755
+79,373,31.0938333333333
+79,374,33.7185
+79,375,28.3633333333333
+79,376,28.067
+79,377,27.3261666666667
+79,378,28.8925
+79,379,28.6385
+79,380,28.4903333333333
+79,381,28.067
+79,382,24.9555
+79,383,26.4795
+79,384,30.8821666666667
+79,385,33.1046666666667
+79,386,27.7495
+79,387,26.3736666666667
+79,388,23.6855
+79,389,22.9023333333333
+79,390,25.8233333333333
+79,391,27.7918333333333
+79,392,30.9456666666667
+79,393,22.7118333333333
+79,394,24.3205
+79,395,24.7015
+79,396,24.5321666666667
+79,397,32.2791666666667
+79,398,20.3411666666667
+79,399,28.0246666666667
+79,400,26.9028333333333
+79,401,23.749
+79,402,26.9875
+79,403,26.289
+79,404,25.0825
+79,405,29.3581666666667
+79,406,28.9771666666667
+79,407,25.4
+79,408,18.3091666666667
+79,409,30.4588333333333
+79,410,31.0091666666667
+79,411,23.0716666666667
+79,412,22.987
+79,413,28.3633333333333
+79,414,25.7386666666667
+79,415,29.6968333333333
+79,416,28.702
+79,417,29.972
+79,418,22.3731666666667
+79,419,27.6013333333333
+79,420,28.3633333333333
+79,421,21.2936666666667
+79,422,25.5905
+79,423,26.8816666666667
+79,424,29.8873333333333
+79,425,23.2198333333333
+79,426,19.6003333333333
+79,427,28.1516666666667
+79,428,29.0195
+79,429,27.6225
+79,430,26.3948333333333
+79,431,24.8708333333333
+79,432,26.9875
+79,433,25.5905
+79,434,21.971
+79,435,25.2306666666667
+79,436,23.9395
+79,437,28.2786666666667
+79,438,27.6648333333333
+79,439,30.607
+79,440,31.6865
+79,441,29.591
+79,442,23.0505
+79,443,26.162
+79,444,28.6808333333333
+79,445,29.845
+79,446,27.94
+79,447,27.8341666666667
+79,448,23.7701666666667
+79,449,30.988
+79,450,27.7918333333333
+79,451,26.162
+79,452,28.8501666666667
+79,453,30.226
+79,454,25.654
+79,455,29.9085
+79,456,22.7753333333333
+79,457,29.4005
+79,458,32.4273333333333
+79,459,28.9136666666667
+79,460,32.8718333333333
+79,461,25.8656666666667
+79,462,24.511
+79,463,21.7381666666667
+79,464,24.8073333333333
+79,465,26.67
+79,466,23.2621666666667
+79,467,25.5693333333333
+79,468,28.1093333333333
+79,469,25.908
+79,470,23.7066666666667
+79,471,30.1625
+79,472,24.5745
+79,473,27.7283333333333
+79,474,30.1201666666667
+79,475,27.0298333333333
+79,476,29.5063333333333
+79,477,37.211
+79,478,32.9353333333333
+79,479,26.2043333333333
+79,480,29.2311666666667
+79,481,26.3101666666667
+79,482,24.9766666666667
+79,483,31.1573333333333
+79,484,34.2688333333333
+79,485,26.416
+79,486,22.6483333333333
+79,487,38.0153333333333
+79,488,25.3153333333333
+79,489,33.274
+79,490,23.9606666666667
+79,491,22.6271666666667
+79,492,23.0716666666667
+79,493,24.9766666666667
+79,494,26.8181666666667
+79,495,27.0933333333333
+79,496,33.528
+79,497,21.5265
+79,498,27.9823333333333
+79,499,32.9565
+79,500,25.9503333333333
+79,501,27.4108333333333
+79,502,26.7758333333333
+79,503,27.9611666666667
+79,504,24.13
+79,505,33.5703333333333
+79,506,25.5905
+79,507,25.6963333333333
+79,508,31.0938333333333
+79,509,28.1305
+79,510,30.48
+79,511,29.972
+79,512,32.0675
+79,513,28.1728333333333
+79,514,33.3798333333333
+79,515,28.829
+79,516,34.4805
+79,517,29.6756666666667
+79,518,30.5223333333333
+79,519,24.3416666666667
+79,520,28.7866666666667
+79,521,26.5641666666667
+79,522,28.2151666666667
+79,523,27.9611666666667
+79,524,24.6168333333333
+79,525,26.3525
+79,526,28.0035
+79,527,26.5006666666667
+79,528,27.7283333333333
+79,529,29.5486666666667
+79,530,28.194
+79,531,29.972
+79,532,30.4376666666667
+79,533,32.2156666666667
+79,534,30.6916666666667
+79,535,26.7758333333333
+79,536,25.1671666666667
+79,537,26.3313333333333
+79,538,25.9291666666667
+79,539,30.9033333333333
+79,540,29.1888333333333
+79,541,28.0458333333333
+79,542,23.2198333333333
+79,543,26.416
+79,544,35.1155
+79,545,22.5213333333333
+79,546,27.6648333333333
+79,547,20.2353333333333
+79,548,31.7288333333333
+79,549,28.067
+79,550,27.0933333333333
+79,551,32.0251666666667
+79,552,27.051
+79,553,26.8816666666667
+79,554,29.7391666666667
+79,555,26.0561666666667
+79,556,29.3581666666667
+79,557,31.0726666666667
+79,558,26.2678333333333
+79,559,23.0928333333333
+79,560,29.972
+79,561,34.0571666666667
+79,562,29.4216666666667
+79,563,31.6653333333333
+79,564,30.7763333333333
+79,565,25.8445
+79,566,26.8816666666667
+79,567,29.0618333333333
+79,568,26.8605
+79,569,26.5853333333333
+79,570,33.02
+79,571,25.4846666666667
+79,572,26.2255
+79,573,31.3901666666667
+79,574,23.7701666666667
+79,575,28.8501666666667
+79,576,27.5378333333333
+79,577,30.8186666666667
+79,578,27.8765
+79,579,27.4955
+79,580,27.7918333333333
+79,581,28.7443333333333
+79,582,29.0195
+79,583,29.6333333333333
+79,584,27.9188333333333
+79,585,32.5331666666667
+79,586,26.7123333333333
+79,587,33.3163333333333
+79,588,29.464
+79,589,27.8765
+79,590,19.3463333333333
+79,591,23.0928333333333
+79,592,21.3571666666667
+79,593,25.7386666666667
+79,594,36.1315
+79,595,29.4216666666667
+79,596,27.3685
+79,597,36.7241666666667
+79,598,22.1403333333333
+79,599,28.9983333333333
+79,600,37.2745
+79,601,24.1088333333333
+79,602,28.9771666666667
+79,603,30.5858333333333
+79,604,25.273
+79,605,23.6643333333333
+79,606,26.9663333333333
+79,607,26.2678333333333
+79,608,23.7913333333333
+79,609,29.9085
+79,610,23.9395
+79,611,27.3685
+79,612,22.5001666666667
+79,613,25.6328333333333
+79,614,36.6818333333333
+79,615,32.0675
+79,616,28.1305
+79,617,32.9988333333333
+79,618,28.7866666666667
+79,619,26.7335
+79,620,18.5208333333333
+79,621,29.1676666666667
+79,622,32.2156666666667
+79,623,27.0298333333333
+79,624,36.2796666666667
+79,625,29.9931666666667
+79,626,28.1728333333333
+79,627,28.2363333333333
+79,628,22.3096666666667
+79,629,26.3101666666667
+79,630,29.5275
+79,631,22.5636666666667
+79,632,24.638
+79,633,23.6008333333333
+79,634,27.178
+79,635,27.9188333333333
+79,636,27.4743333333333
+79,637,30.861
+79,638,32.4485
+79,639,34.8403333333333
+79,640,21.8651666666667
+79,641,27.813
+79,642,31.1361666666667
+79,643,22.9658333333333
+79,644,26.0138333333333
+79,645,26.8393333333333
+79,646,25.1036666666667
+79,647,28.8501666666667
+79,648,24.9978333333333
+79,649,24.1935
+79,650,32.4061666666667
+79,651,25.527
+79,652,30.1836666666667
+79,653,28.194
+79,654,26.6488333333333
+79,655,27.3473333333333
+79,656,26.416
+79,657,29.2523333333333
+79,658,25.3788333333333
+79,659,25.1883333333333
+79,660,30.5646666666667
+79,661,28.9771666666667
+79,662,26.9028333333333
+79,663,30.2048333333333
+79,664,19.2616666666667
+79,665,21.2513333333333
+79,666,24.511
+79,667,30.607
+79,668,31.2843333333333
+79,669,29.5275
+79,670,29.7391666666667
+79,671,26.543
+79,672,26.7758333333333
+79,673,31.3055
+79,674,27.2626666666667
+79,675,27.5801666666667
+79,676,25.6116666666667
+79,677,28.6173333333333
+79,678,28.7866666666667
+79,679,31.496
+79,680,20.8703333333333
+79,681,21.336
+79,682,23.1775
+79,683,30.1625
+79,684,30.9456666666667
+79,685,32.766
+79,686,28.1305
+79,687,32.0463333333333
+79,688,23.6008333333333
+79,689,27.5378333333333
+79,690,26.416
+79,691,27.0721666666667
+79,692,29.4428333333333
+79,693,30.1413333333333
+79,694,26.2678333333333
+79,695,27.3685
+79,696,24.4686666666667
+79,697,30.0566666666667
+79,698,30.6493333333333
+79,699,24.1723333333333
+79,700,24.7226666666667
+79,701,30.9668333333333
+79,702,28.829
+79,703,30.353
+79,704,26.7335
+79,705,29.845
+79,706,33.4221666666667
+79,707,27.2626666666667
+79,708,28.1516666666667
+79,709,28.5326666666667
+79,710,26.543
+79,711,30.5435
+79,712,25.8233333333333
+79,713,23.0928333333333
+79,714,28.1093333333333
+79,715,27.7495
+79,716,24.5533333333333
+79,717,32.131
+79,718,26.0773333333333
+79,719,28.067
+79,720,24.3628333333333
+79,721,28.5326666666667
+79,722,31.3901666666667
+79,723,27.9611666666667
+79,724,29.6333333333333
+79,725,24.5321666666667
+79,726,21.5053333333333
+79,727,24.1935
+79,728,30.8186666666667
+79,729,33.147
+79,730,35.2001666666667
+79,731,38.6291666666667
+79,732,29.083
+79,733,29.5063333333333
+79,734,30.3106666666667
+79,735,30.2471666666667
+79,736,32.258
+79,737,27.2415
+79,738,24.9343333333333
+79,739,29.7391666666667
+79,740,26.7546666666667
+79,741,28.9771666666667
+79,742,30.5646666666667
+79,743,25.2518333333333
+79,744,28.321
+79,745,28.0458333333333
+79,746,26.5853333333333
+79,747,21.7593333333333
+79,748,20.5105
+79,749,29.3793333333333
+79,750,23.5796666666667
+79,751,30.353
+79,752,26.5006666666667
+79,753,29.3581666666667
+79,754,29.5486666666667
+79,755,25.1671666666667
+79,756,25.6751666666667
+79,757,27.686
+79,758,25.1036666666667
+79,759,30.0566666666667
+79,760,33.1681666666667
+79,761,24.13
+79,762,22.9235
+79,763,28.6808333333333
+79,764,19.177
+79,765,27.0086666666667
+79,766,27.6013333333333
+79,767,23.9818333333333
+79,768,31.0726666666667
+79,769,33.8455
+79,770,25.8445
+79,771,31.3901666666667
+79,772,28.5115
+79,773,30.2895
+79,774,26.6911666666667
+79,775,32.4273333333333
+79,776,28.829
+79,777,26.0773333333333
+79,778,30.5011666666667
+79,779,30.9245
+79,780,26.8393333333333
+79,781,20.1295
+79,782,33.4856666666667
+79,783,22.5001666666667
+79,784,29.8238333333333
+79,785,30.353
+79,786,27.0933333333333
+79,787,24.0453333333333
+79,788,30.4376666666667
+79,789,25.3153333333333
+79,790,31.6441666666667
+79,791,29.8661666666667
+79,792,23.3045
+79,793,31.1996666666667
+79,794,26.924
+79,795,28.0458333333333
+79,796,28.0246666666667
+79,797,27.4108333333333
+79,798,24.4263333333333
+79,799,25.6751666666667
+79,800,28.7866666666667
+79,801,25.654
+79,802,32.1733333333333
+79,803,27.1568333333333
+79,804,26.3948333333333
+79,805,30.3318333333333
+79,806,30.099
+79,807,30.5646666666667
+79,808,23.0081666666667
+79,809,32.0886666666667
+79,810,30.5011666666667
+79,811,28.4056666666667
+79,812,33.6973333333333
+79,813,22.987
+79,814,24.9131666666667
+79,815,31.3266666666667
+79,816,27.1991666666667
+79,817,24.9766666666667
+79,818,21.3995
+79,819,30.8821666666667
+79,820,25.8233333333333
+79,821,25.781
+79,822,25.5905
+79,823,26.7758333333333
+79,824,28.2151666666667
+79,825,25.7598333333333
+79,826,30.6493333333333
+79,827,26.162
+79,828,29.8026666666667
+79,829,30.3741666666667
+79,830,31.1361666666667
+79,831,22.6695
+79,832,31.0091666666667
+79,833,23.3891666666667
+79,834,29.8026666666667
+79,835,29.464
+79,836,24.765
+79,837,26.8181666666667
+79,838,21.9498333333333
+79,839,26.4371666666667
+79,840,24.13
+79,841,27.305
+79,842,29.5698333333333
+79,843,28.2998333333333
+79,844,36.4913333333333
+79,845,35.2636666666667
+79,846,28.9136666666667
+79,847,30.2895
+79,848,24.7226666666667
+79,849,24.3416666666667
+79,850,33.1681666666667
+79,851,21.971
+79,852,23.0716666666667
+79,853,25.1036666666667
+79,854,29.1465
+79,855,28.5115
+79,856,21.2513333333333
+79,857,27.8553333333333
+79,858,30.2471666666667
+79,859,28.448
+79,860,24.8285
+79,861,27.3896666666667
+79,862,29.6121666666667
+79,863,27.4955
+79,864,24.4051666666667
+79,865,29.1676666666667
+79,866,28.4691666666667
+79,867,22.5213333333333
+79,868,22.1403333333333
+79,869,27.1568333333333
+79,870,25.6116666666667
+79,871,25.8868333333333
+79,872,24.4263333333333
+79,873,29.9931666666667
+79,874,27.3685
+79,875,27.6013333333333
+79,876,32.9776666666667
+79,877,29.1253333333333
+79,878,30.3318333333333
+79,879,20.2141666666667
+79,880,29.5698333333333
+79,881,29.0195
+79,882,27.0933333333333
+79,883,29.5063333333333
+79,884,31.877
+79,885,22.352
+79,886,26.797
+79,887,27.9823333333333
+79,888,27.3473333333333
+79,889,30.1625
+79,890,28.067
+79,891,29.1888333333333
+79,892,23.749
+79,893,27.3896666666667
+79,894,32.639
+79,895,31.8346666666667
+79,896,34.0571666666667
+79,897,23.1563333333333
+79,898,23.6643333333333
+79,899,34.3323333333333
+79,900,26.7758333333333
+79,901,30.5223333333333
+79,902,33.782
+79,903,27.1568333333333
+79,904,27.3685
+79,905,27.7283333333333
+79,906,32.131
+79,907,25.8233333333333
+79,908,29.8026666666667
+79,909,29.2523333333333
+79,910,34.671
+79,911,32.7025
+79,912,22.5636666666667
+79,913,22.8176666666667
+79,914,27.4955
+79,915,30.1201666666667
+79,916,29.718
+79,917,34.5651666666667
+79,918,32.4696666666667
+79,919,18.3091666666667
+79,920,22.7541666666667
+79,921,29.0618333333333
+79,922,27.2626666666667
+79,923,28.448
+79,924,24.384
+79,925,23.4103333333333
+79,926,24.6803333333333
+79,927,27.7918333333333
+79,928,30.2683333333333
+79,929,26.6911666666667
+79,930,24.7015
+79,931,31.9828333333333
+79,932,22.7541666666667
+79,933,23.0505
+79,934,26.5006666666667
+79,935,22.8811666666667
+79,936,35.4541666666667
+79,937,30.0355
+79,938,28.9983333333333
+79,939,26.2043333333333
+79,940,23.7701666666667
+79,941,25.1883333333333
+79,942,26.9028333333333
+79,943,25.9926666666667
+79,944,23.495
+79,945,23.114
+79,946,31.115
+79,947,24.2993333333333
+79,948,26.5006666666667
+79,949,27.6013333333333
+79,950,24.765
+79,951,28.4056666666667
+79,952,32.0886666666667
+79,953,28.5115
+79,954,27.5801666666667
+79,955,33.6126666666667
+79,956,31.7288333333333
+79,957,19.8543333333333
+79,958,28.067
+79,959,31.0515
+79,960,24.638
+79,961,26.3948333333333
+79,962,21.5265
+79,963,29.4005
+79,964,28.4903333333333
+79,965,26.1408333333333
+79,966,28.9771666666667
+79,967,36.0045
+79,968,32.2368333333333
+79,969,32.766
+79,970,30.3741666666667
+79,971,24.892
+79,972,27.0298333333333
+79,973,25.4423333333333
+79,974,24.4686666666667
+79,975,27.8765
+79,976,26.2466666666667
+79,977,27.9611666666667
+79,978,25.6963333333333
+79,979,18.3938333333333
+79,980,24.0453333333333
+79,981,26.162
+79,982,31.5383333333333
+79,983,23.5585
+79,984,27.2626666666667
+79,985,30.9033333333333
+79,986,28.3845
+79,987,31.3901666666667
+79,988,24.2993333333333
+79,989,34.4381666666667
+79,990,32.7448333333333
+79,991,24.8708333333333
+79,992,22.6483333333333
+79,993,24.7015
+79,994,25.3788333333333
+79,995,30.0566666666667
+79,996,30.3741666666667
+79,997,21.3995
+79,998,34.6921666666667
+79,999,26.7546666666667
+79,1000,26.7546666666667
+80,1,24.0453333333333
+80,2,29.3793333333333
+80,3,35.2636666666667
+80,4,27.4531666666667
+80,5,26.7546666666667
+80,6,29.2735
+80,7,30.2048333333333
+80,8,25.4635
+80,9,26.3313333333333
+80,10,33.6973333333333
+80,11,28.2151666666667
+80,12,30.607
+80,13,32.0675
+80,14,26.7335
+80,15,31.6653333333333
+80,16,30.9456666666667
+80,17,32.7871666666667
+80,18,26.1196666666667
+80,19,33.3375
+80,20,19.8755
+80,21,34.0783333333333
+80,22,27.9611666666667
+80,23,31.623
+80,24,27.5801666666667
+80,25,32.8295
+80,26,31.369
+80,27,30.9245
+80,28,28.0246666666667
+80,29,25.9291666666667
+80,30,29.1676666666667
+80,31,32.5755
+80,32,33.1046666666667
+80,33,26.3948333333333
+80,34,29.8238333333333
+80,35,31.4536666666667
+80,36,29.1465
+80,37,34.3111666666667
+80,38,26.67
+80,39,25.9503333333333
+80,40,26.1196666666667
+80,41,29.2523333333333
+80,42,26.7123333333333
+80,43,30.2471666666667
+80,44,30.4376666666667
+80,45,25.8233333333333
+80,46,29.4428333333333
+80,47,31.4748333333333
+80,48,24.2781666666667
+80,49,25.0613333333333
+80,50,29.0406666666667
+80,51,27.7918333333333
+80,52,29.1676666666667
+80,53,29.6333333333333
+80,54,28.7655
+80,55,32.9988333333333
+80,56,23.1775
+80,57,28.2363333333333
+80,58,28.0881666666667
+80,59,26.4371666666667
+80,60,25.4423333333333
+80,61,27.813
+80,62,29.9085
+80,63,31.8981666666667
+80,64,27.5801666666667
+80,65,34.417
+80,66,27.6436666666667
+80,67,25.781
+80,68,27.7283333333333
+80,69,28.6173333333333
+80,70,28.8925
+80,71,33.4433333333333
+80,72,23.0081666666667
+80,73,29.464
+80,74,25.654
+80,75,29.8238333333333
+80,76,32.7025
+80,77,32.131
+80,78,28.194
+80,79,25.6751666666667
+80,80,28.5326666666667
+80,81,36.3643333333333
+80,82,27.1356666666667
+80,83,29.5698333333333
+80,84,34.8191666666667
+80,85,33.655
+80,86,29.5063333333333
+80,87,27.8553333333333
+80,88,32.9353333333333
+80,89,31.3055
+80,90,30.5435
+80,91,24.2993333333333
+80,92,30.607
+80,93,32.5331666666667
+80,94,31.1573333333333
+80,95,24.8708333333333
+80,96,25.5058333333333
+80,97,31.9193333333333
+80,98,31.4748333333333
+80,99,34.417
+80,100,29.7815
+80,101,32.3003333333333
+80,102,30.2895
+80,103,30.7763333333333
+80,104,26.1831666666667
+80,105,30.734
+80,106,24.4898333333333
+80,107,30.4588333333333
+80,108,29.591
+80,109,29.2946666666667
+80,110,33.5491666666667
+80,111,23.9818333333333
+80,112,26.543
+80,113,31.9193333333333
+80,114,19.8543333333333
+80,115,27.6436666666667
+80,116,37.8671666666667
+80,117,26.8605
+80,118,27.9823333333333
+80,119,24.892
+80,120,24.8285
+80,121,23.7278333333333
+80,122,28.7866666666667
+80,123,39.2853333333333
+80,124,34.1841666666667
+80,125,25.9503333333333
+80,126,26.5006666666667
+80,127,29.9931666666667
+80,128,24.3205
+80,129,28.4056666666667
+80,130,30.0566666666667
+80,131,28.5326666666667
+80,132,29.718
+80,133,31.1361666666667
+80,134,38.481
+80,135,37.2533333333333
+80,136,31.877
+80,137,27.0086666666667
+80,138,27.3261666666667
+80,139,33.6126666666667
+80,140,24.6591666666667
+80,141,30.3318333333333
+80,142,27.6013333333333
+80,143,31.115
+80,144,26.6911666666667
+80,145,32.0251666666667
+80,146,28.702
+80,147,30.734
+80,148,27.4108333333333
+80,149,33.6126666666667
+80,150,29.8238333333333
+80,151,31.9616666666667
+80,152,29.8873333333333
+80,153,26.0773333333333
+80,154,35.4541666666667
+80,155,25.6751666666667
+80,156,27.9611666666667
+80,157,26.3101666666667
+80,158,27.1145
+80,159,27.5378333333333
+80,160,28.575
+80,161,25.654
+80,162,31.3478333333333
+80,163,32.4908333333333
+80,164,24.9555
+80,165,29.9085
+80,166,29.1888333333333
+80,167,27.051
+80,168,32.0251666666667
+80,169,27.7918333333333
+80,170,28.4903333333333
+80,171,23.241
+80,172,28.9136666666667
+80,173,28.5538333333333
+80,174,29.4216666666667
+80,175,27.8553333333333
+80,176,31.9616666666667
+80,177,33.6126666666667
+80,178,32.2156666666667
+80,179,25.908
+80,180,25.0613333333333
+80,181,29.6333333333333
+80,182,27.3896666666667
+80,183,27.4955
+80,184,36.0256666666667
+80,185,23.6855
+80,186,31.4536666666667
+80,187,31.3266666666667
+80,188,23.368
+80,189,28.3845
+80,190,16.0231666666667
+80,191,26.797
+80,192,25.7175
+80,193,35.052
+80,194,33.8878333333333
+80,195,34.7133333333333
+80,196,23.6431666666667
+80,197,34.4593333333333
+80,198,33.5703333333333
+80,199,26.3736666666667
+80,200,22.7118333333333
+80,201,26.8393333333333
+80,202,28.956
+80,203,24.6591666666667
+80,204,28.9348333333333
+80,205,29.1676666666667
+80,206,32.0886666666667
+80,207,27.1145
+80,208,32.5966666666667
+80,209,27.3473333333333
+80,210,24.5533333333333
+80,211,27.7071666666667
+80,212,28.4056666666667
+80,213,31.3901666666667
+80,214,30.861
+80,215,23.749
+80,216,31.5806666666667
+80,217,29.4428333333333
+80,218,25.4635
+80,219,35.6658333333333
+80,220,33.4856666666667
+80,221,33.6126666666667
+80,222,30.9245
+80,223,32.9776666666667
+80,224,29.3158333333333
+80,225,25.1036666666667
+80,226,24.9555
+80,227,26.3948333333333
+80,228,27.94
+80,229,32.5331666666667
+80,230,31.1573333333333
+80,231,27.1568333333333
+80,232,31.7288333333333
+80,233,27.2415
+80,234,34.544
+80,235,28.9348333333333
+80,236,25.1248333333333
+80,237,25.6116666666667
+80,238,30.0355
+80,239,27.686
+80,240,34.2476666666667
+80,241,31.1361666666667
+80,242,28.1516666666667
+80,243,27.8976666666667
+80,244,31.3055
+80,245,32.5755
+80,246,26.9875
+80,247,29.1888333333333
+80,248,23.2833333333333
+80,249,28.2786666666667
+80,250,23.368
+80,251,29.2735
+80,252,32.3426666666667
+80,253,26.4795
+80,254,29.4851666666667
+80,255,31.3266666666667
+80,256,29.4428333333333
+80,257,33.1046666666667
+80,258,27.0721666666667
+80,259,31.0726666666667
+80,260,32.8083333333333
+80,261,35.8351666666667
+80,262,32.9141666666667
+80,263,28.8078333333333
+80,264,32.1945
+80,265,30.9245
+80,266,30.4376666666667
+80,267,25.4635
+80,268,27.4108333333333
+80,269,28.1516666666667
+80,270,29.7603333333333
+80,271,29.6545
+80,272,29.7815
+80,273,22.0345
+80,274,35.2001666666667
+80,275,31.8981666666667
+80,276,35.1578333333333
+80,277,25.8021666666667
+80,278,29.0406666666667
+80,279,27.0933333333333
+80,280,30.099
+80,281,27.2203333333333
+80,282,38.6291666666667
+80,283,31.1996666666667
+80,284,30.7975
+80,285,30.988
+80,286,28.575
+80,287,27.0298333333333
+80,288,25.0825
+80,289,28.0035
+80,290,32.639
+80,291,31.3901666666667
+80,292,22.7965
+80,293,26.2255
+80,294,27.2415
+80,295,30.48
+80,296,34.9673333333333
+80,297,28.956
+80,298,32.3003333333333
+80,299,33.147
+80,300,28.3421666666667
+80,301,28.2151666666667
+80,302,30.6493333333333
+80,303,30.6493333333333
+80,304,31.0515
+80,305,25.5058333333333
+80,306,29.9508333333333
+80,307,29.4216666666667
+80,308,31.3266666666667
+80,309,31.9828333333333
+80,310,26.543
+80,311,37.1051666666667
+80,312,24.6803333333333
+80,313,26.3736666666667
+80,314,24.003
+80,315,25.4423333333333
+80,316,26.3101666666667
+80,317,28.321
+80,318,31.496
+80,319,25.1248333333333
+80,320,28.5961666666667
+80,321,29.6756666666667
+80,322,29.9296666666667
+80,323,29.7815
+80,324,29.9296666666667
+80,325,26.1408333333333
+80,326,27.1568333333333
+80,327,27.7071666666667
+80,328,30.1201666666667
+80,329,26.5218333333333
+80,330,25.9291666666667
+80,331,34.7133333333333
+80,332,25.3153333333333
+80,333,29.0406666666667
+80,334,38.9043333333333
+80,335,27.3473333333333
+80,336,27.9188333333333
+80,337,33.1893333333333
+80,338,27.3896666666667
+80,339,26.7123333333333
+80,340,32.3426666666667
+80,341,31.0726666666667
+80,342,30.9668333333333
+80,343,30.2048333333333
+80,344,32.8295
+80,345,32.5966666666667
+80,346,37.465
+80,347,35.5176666666667
+80,348,34.1418333333333
+80,349,32.8083333333333
+80,350,26.1831666666667
+80,351,21.1878333333333
+80,352,33.0411666666667
+80,353,30.5858333333333
+80,354,25.8656666666667
+80,355,36.2796666666667
+80,356,28.9983333333333
+80,357,31.4536666666667
+80,358,35.4753333333333
+80,359,22.6271666666667
+80,360,24.8073333333333
+80,361,30.1413333333333
+80,362,26.0985
+80,363,28.4056666666667
+80,364,24.765
+80,365,25.8656666666667
+80,366,28.8078333333333
+80,367,31.8558333333333
+80,368,31.369
+80,369,30.0143333333333
+80,370,29.7391666666667
+80,371,31.8981666666667
+80,372,25.0613333333333
+80,373,31.6018333333333
+80,374,30.48
+80,375,31.4748333333333
+80,376,24.7861666666667
+80,377,26.9663333333333
+80,378,29.464
+80,379,35.2848333333333
+80,380,32.258
+80,381,30.1836666666667
+80,382,30.861
+80,383,29.4428333333333
+80,384,29.5063333333333
+80,385,28.2363333333333
+80,386,29.7391666666667
+80,387,32.4061666666667
+80,388,30.2895
+80,389,33.1258333333333
+80,390,35.0731666666667
+80,391,29.1041666666667
+80,392,32.1521666666667
+80,393,26.3313333333333
+80,394,36.9781666666667
+80,395,21.0185
+80,396,28.5115
+80,397,32.4061666666667
+80,398,32.258
+80,399,31.5171666666667
+80,400,28.7655
+80,401,25.4635
+80,402,26.5641666666667
+80,403,33.1893333333333
+80,404,31.115
+80,405,35.433
+80,406,25.1036666666667
+80,407,31.8981666666667
+80,408,35.433
+80,409,21.3783333333333
+80,410,31.6018333333333
+80,411,24.3628333333333
+80,412,26.9451666666667
+80,413,26.9663333333333
+80,414,29.1041666666667
+80,415,33.7396666666667
+80,416,26.1196666666667
+80,417,24.7226666666667
+80,418,28.0458333333333
+80,419,29.2523333333333
+80,420,22.479
+80,421,28.8713333333333
+80,422,36.0468333333333
+80,423,26.4795
+80,424,25.1883333333333
+80,425,30.6705
+80,426,31.75
+80,427,28.829
+80,428,28.0246666666667
+80,429,24.4263333333333
+80,430,28.8713333333333
+80,431,34.0995
+80,432,32.8083333333333
+80,433,25.4
+80,434,25.2095
+80,435,29.1676666666667
+80,436,31.9405
+80,437,30.5435
+80,438,31.496
+80,439,26.4371666666667
+80,440,31.3055
+80,441,31.1996666666667
+80,442,33.909
+80,443,31.8558333333333
+80,444,33.909
+80,445,24.384
+80,446,30.9456666666667
+80,447,28.0458333333333
+80,448,32.0675
+80,449,30.5011666666667
+80,450,27.559
+80,451,33.6338333333333
+80,452,32.893
+80,453,27.2626666666667
+80,454,31.1996666666667
+80,455,31.2843333333333
+80,456,30.4165
+80,457,40.9363333333333
+80,458,34.8191666666667
+80,459,19.0288333333333
+80,460,27.3896666666667
+80,461,28.8925
+80,462,27.7495
+80,463,25.4211666666667
+80,464,27.3473333333333
+80,465,23.4315
+80,466,22.5425
+80,467,30.0778333333333
+80,468,30.734
+80,469,22.2673333333333
+80,470,29.6968333333333
+80,471,29.6545
+80,472,27.9823333333333
+80,473,28.2998333333333
+80,474,29.1041666666667
+80,475,32.004
+80,476,22.8388333333333
+80,477,25.1883333333333
+80,478,26.9028333333333
+80,479,32.639
+80,480,21.2513333333333
+80,481,28.3421666666667
+80,482,33.3586666666667
+80,483,27.9188333333333
+80,484,29.1888333333333
+80,485,29.1041666666667
+80,486,35.6658333333333
+80,487,24.3628333333333
+80,488,26.5006666666667
+80,489,28.321
+80,490,31.496
+80,491,29.7815
+80,492,33.909
+80,493,26.2043333333333
+80,494,28.5115
+80,495,30.3741666666667
+80,496,34.798
+80,497,28.5326666666667
+80,498,34.2265
+80,499,32.893
+80,500,30.48
+80,501,27.2415
+80,502,20.0236666666667
+80,503,34.6498333333333
+80,504,30.861
+80,505,31.2631666666667
+80,506,24.4263333333333
+80,507,24.4263333333333
+80,508,25.7598333333333
+80,509,27.94
+80,510,30.8186666666667
+80,511,27.3685
+80,512,31.75
+80,513,20.701
+80,514,28.6385
+80,515,26.5218333333333
+80,516,31.1573333333333
+80,517,28.2151666666667
+80,518,26.797
+80,519,25.273
+80,520,36.9358333333333
+80,521,34.9673333333333
+80,522,31.4748333333333
+80,523,35.9833333333333
+80,524,27.2838333333333
+80,525,29.2946666666667
+80,526,28.2363333333333
+80,527,29.1041666666667
+80,528,25.654
+80,529,31.5171666666667
+80,530,30.48
+80,531,29.1041666666667
+80,532,28.3845
+80,533,31.3055
+80,534,27.6225
+80,535,30.0778333333333
+80,536,36.8723333333333
+80,537,25.5905
+80,538,23.368
+80,539,32.131
+80,540,31.0091666666667
+80,541,26.0985
+80,542,35.9621666666667
+80,543,36.5548333333333
+80,544,32.4061666666667
+80,545,25.2306666666667
+80,546,31.0091666666667
+80,547,26.0561666666667
+80,548,31.2208333333333
+80,549,19.3675
+80,550,24.5533333333333
+80,551,27.3896666666667
+80,552,26.035
+80,553,29.4851666666667
+80,554,29.4428333333333
+80,555,26.2255
+80,556,27.7071666666667
+80,557,30.4588333333333
+80,558,26.2466666666667
+80,559,25.2095
+80,560,27.6225
+80,561,27.5166666666667
+80,562,30.2683333333333
+80,563,30.5223333333333
+80,564,31.369
+80,565,23.3468333333333
+80,566,24.4051666666667
+80,567,25.273
+80,568,31.7076666666667
+80,569,26.8393333333333
+80,570,32.5543333333333
+80,571,38.1211666666667
+80,572,34.7556666666667
+80,573,34.5016666666667
+80,574,33.3375
+80,575,23.876
+80,576,34.8403333333333
+80,577,27.0298333333333
+80,578,29.9508333333333
+80,579,28.5326666666667
+80,580,28.067
+80,581,36.7241666666667
+80,582,32.766
+80,583,32.7025
+80,584,37.4015
+80,585,31.8135
+80,586,27.8765
+80,587,26.6065
+80,588,31.2843333333333
+80,589,32.4061666666667
+80,590,31.0515
+80,591,23.1986666666667
+80,592,29.464
+80,593,26.2043333333333
+80,594,29.6545
+80,595,26.416
+80,596,28.9136666666667
+80,597,21.5688333333333
+80,598,31.6865
+80,599,27.1568333333333
+80,600,28.9983333333333
+80,601,24.2146666666667
+80,602,29.9931666666667
+80,603,33.147
+80,604,30.3953333333333
+80,605,27.5166666666667
+80,606,33.1258333333333
+80,607,26.67
+80,608,27.94
+80,609,36.2796666666667
+80,610,25.1248333333333
+80,611,24.4686666666667
+80,612,29.0406666666667
+80,613,31.4113333333333
+80,614,30.607
+80,615,36.2161666666667
+80,616,24.4051666666667
+80,617,30.1413333333333
+80,618,26.0138333333333
+80,619,34.3958333333333
+80,620,27.0086666666667
+80,621,24.3205
+80,622,32.1521666666667
+80,623,30.2895
+80,624,31.3478333333333
+80,625,28.4691666666667
+80,626,29.4851666666667
+80,627,29.1676666666667
+80,628,25.8656666666667
+80,629,33.3798333333333
+80,630,28.2363333333333
+80,631,27.7071666666667
+80,632,38.5021666666667
+80,633,29.1676666666667
+80,634,32.9353333333333
+80,635,22.6483333333333
+80,636,31.8558333333333
+80,637,34.3535
+80,638,31.623
+80,639,26.2466666666667
+80,640,28.7866666666667
+80,641,30.2048333333333
+80,642,25.527
+80,643,30.3741666666667
+80,644,29.21
+80,645,29.9931666666667
+80,646,36.1526666666667
+80,647,28.4691666666667
+80,648,30.1201666666667
+80,649,27.0933333333333
+80,650,22.9446666666667
+80,651,26.6065
+80,652,24.7226666666667
+80,653,31.1361666666667
+80,654,33.9936666666667
+80,655,26.2678333333333
+80,656,32.3638333333333
+80,657,26.2678333333333
+80,658,30.8186666666667
+80,659,35.4965
+80,660,26.0773333333333
+80,661,24.4686666666667
+80,662,34.3111666666667
+80,663,25.7386666666667
+80,664,27.0721666666667
+80,665,25.8656666666667
+80,666,30.226
+80,667,29.8238333333333
+80,668,27.9823333333333
+80,669,28.2151666666667
+80,670,30.5223333333333
+80,671,27.686
+80,672,37.2745
+80,673,28.1728333333333
+80,674,27.6013333333333
+80,675,27.3685
+80,676,31.4536666666667
+80,677,27.1145
+80,678,22.7118333333333
+80,679,32.639
+80,680,28.1728333333333
+80,681,29.1041666666667
+80,682,24.9978333333333
+80,683,26.9663333333333
+80,684,28.3421666666667
+80,685,28.8078333333333
+80,686,24.2358333333333
+80,687,34.4593333333333
+80,688,30.5858333333333
+80,689,28.8925
+80,690,32.1098333333333
+80,691,31.115
+80,692,29.337
+80,693,27.4743333333333
+80,694,26.8181666666667
+80,695,27.178
+80,696,29.1465
+80,697,26.797
+80,698,32.0675
+80,699,26.797
+80,700,21.5053333333333
+80,701,24.9555
+80,702,26.924
+80,703,24.4898333333333
+80,704,30.6493333333333
+80,705,28.4903333333333
+80,706,29.5275
+80,707,34.7133333333333
+80,708,29.3158333333333
+80,709,38.1423333333333
+80,710,28.5961666666667
+80,711,30.5435
+80,712,33.8878333333333
+80,713,27.178
+80,714,23.9183333333333
+80,715,27.2415
+80,716,30.9668333333333
+80,717,28.8713333333333
+80,718,28.1516666666667
+80,719,26.2255
+80,720,26.5853333333333
+80,721,22.6271666666667
+80,722,26.6065
+80,723,29.5486666666667
+80,724,30.2471666666667
+80,725,25.1248333333333
+80,726,35.7081666666667
+80,727,35.2001666666667
+80,728,21.3995
+80,729,35.179
+80,730,29.337
+80,731,24.0665
+80,732,34.8403333333333
+80,733,33.7396666666667
+80,734,34.4593333333333
+80,735,30.48
+80,736,26.4795
+80,737,19.8755
+80,738,31.7288333333333
+80,739,21.3571666666667
+80,740,31.0515
+80,741,33.909
+80,742,31.7923333333333
+80,743,25.4635
+80,744,30.3106666666667
+80,745,31.0515
+80,746,26.1831666666667
+80,747,30.6281666666667
+80,748,28.3633333333333
+80,749,22.0768333333333
+80,750,25.3576666666667
+80,751,33.909
+80,752,28.7655
+80,753,25.6963333333333
+80,754,23.8548333333333
+80,755,28.9983333333333
+80,756,27.0721666666667
+80,757,29.6121666666667
+80,758,24.6591666666667
+80,759,25.1248333333333
+80,760,24.5533333333333
+80,761,30.3318333333333
+80,762,27.6013333333333
+80,763,31.8135
+80,764,33.2951666666667
+80,765,31.4113333333333
+80,766,28.0035
+80,767,36.4913333333333
+80,768,27.8976666666667
+80,769,31.1785
+80,770,27.1568333333333
+80,771,30.226
+80,772,28.1093333333333
+80,773,23.495
+80,774,36.322
+80,775,24.7861666666667
+80,776,27.686
+80,777,28.1305
+80,778,31.5806666666667
+80,779,26.543
+80,780,34.3535
+80,781,38.989
+80,782,30.0566666666667
+80,783,30.1201666666667
+80,784,30.226
+80,785,27.1145
+80,786,27.2415
+80,787,26.3948333333333
+80,788,25.4423333333333
+80,789,32.5755
+80,790,33.3586666666667
+80,791,32.385
+80,792,27.0298333333333
+80,793,34.9885
+80,794,27.3685
+80,795,30.6705
+80,796,26.797
+80,797,30.607
+80,798,29.2523333333333
+80,799,29.0618333333333
+80,800,28.6385
+80,801,24.3416666666667
+80,802,28.2786666666667
+80,803,27.813
+80,804,31.8558333333333
+80,805,31.7076666666667
+80,806,40.0685
+80,807,30.4165
+80,808,33.782
+80,809,26.1408333333333
+80,810,29.6968333333333
+80,811,28.3421666666667
+80,812,30.7975
+80,813,33.909
+80,814,35.5388333333333
+80,815,29.4216666666667
+80,816,22.1826666666667
+80,817,25.9291666666667
+80,818,27.1568333333333
+80,819,24.9978333333333
+80,820,32.0886666666667
+80,821,36.5971666666667
+80,822,33.6973333333333
+80,823,23.9606666666667
+80,824,29.6545
+80,825,28.1093333333333
+80,826,22.9023333333333
+80,827,30.9668333333333
+80,828,28.5538333333333
+80,829,29.7603333333333
+80,830,23.6855
+80,831,28.4268333333333
+80,832,27.8765
+80,833,29.972
+80,834,34.544
+80,835,30.2048333333333
+80,836,28.5538333333333
+80,837,28.9136666666667
+80,838,28.5538333333333
+80,839,30.607
+80,840,22.4155
+80,841,30.9668333333333
+80,842,36.9358333333333
+80,843,30.099
+80,844,31.0303333333333
+80,845,27.2626666666667
+80,846,33.9301666666667
+80,847,33.401
+80,848,26.0773333333333
+80,849,26.4583333333333
+80,850,26.67
+80,851,28.4903333333333
+80,852,28.067
+80,853,31.4536666666667
+80,854,27.0298333333333
+80,855,37.6131666666667
+80,856,22.479
+80,857,32.9353333333333
+80,858,28.0881666666667
+80,859,26.9028333333333
+80,860,28.5326666666667
+80,861,29.6545
+80,862,37.6131666666667
+80,863,27.3896666666667
+80,864,33.2951666666667
+80,865,30.3106666666667
+80,866,22.2461666666667
+80,867,30.2048333333333
+80,868,31.9193333333333
+80,869,32.8718333333333
+80,870,33.0835
+80,871,33.1681666666667
+80,872,26.4583333333333
+80,873,28.3845
+80,874,29.4005
+80,875,26.0985
+80,876,30.3106666666667
+80,877,27.7283333333333
+80,878,26.5006666666667
+80,879,25.1248333333333
+80,880,31.2208333333333
+80,881,27.3473333333333
+80,882,36.9358333333333
+80,883,25.5905
+80,884,28.4691666666667
+80,885,35.0943333333333
+80,886,25.7175
+80,887,32.6601666666667
+80,888,31.9405
+80,889,26.8816666666667
+80,890,29.5063333333333
+80,891,23.4738333333333
+80,892,32.0251666666667
+80,893,33.782
+80,894,28.5538333333333
+80,895,34.5651666666667
+80,896,31.5806666666667
+80,897,24.4475
+80,898,29.9085
+80,899,29.3581666666667
+80,900,31.9405
+80,901,32.8295
+80,902,26.1831666666667
+80,903,27.1568333333333
+80,904,25.8445
+80,905,28.7443333333333
+80,906,26.1408333333333
+80,907,31.7288333333333
+80,908,28.1728333333333
+80,909,30.9456666666667
+80,910,25.8656666666667
+80,911,23.3891666666667
+80,912,32.766
+80,913,28.956
+80,914,31.1996666666667
+80,915,32.258
+80,916,27.2838333333333
+80,917,34.2265
+80,918,27.2203333333333
+80,919,28.6385
+80,920,33.9725
+80,921,22.0345
+80,922,28.067
+80,923,34.2688333333333
+80,924,35.5176666666667
+80,925,30.7763333333333
+80,926,31.7923333333333
+80,927,30.8821666666667
+80,928,30.5223333333333
+80,929,27.0086666666667
+80,930,28.067
+80,931,26.035
+80,932,27.1991666666667
+80,933,28.829
+80,934,27.6225
+80,935,30.48
+80,936,29.6121666666667
+80,937,30.226
+80,938,33.6126666666667
+80,939,29.5698333333333
+80,940,25.3153333333333
+80,941,23.7701666666667
+80,942,24.7015
+80,943,35.2001666666667
+80,944,24.7438333333333
+80,945,28.321
+80,946,31.242
+80,947,26.7758333333333
+80,948,32.131
+80,949,22.8811666666667
+80,950,28.5326666666667
+80,951,22.3731666666667
+80,952,27.051
+80,953,33.655
+80,954,30.6493333333333
+80,955,33.4221666666667
+80,956,25.6328333333333
+80,957,23.9395
+80,958,29.2946666666667
+80,959,36.3855
+80,960,30.3318333333333
+80,961,26.2043333333333
+80,962,26.9028333333333
+80,963,28.1305
+80,964,34.9673333333333
+80,965,23.9395
+80,966,32.6813333333333
+80,967,28.8078333333333
+80,968,25.4846666666667
+80,969,30.1625
+80,970,25.1883333333333
+80,971,26.0773333333333
+80,972,30.3741666666667
+80,973,32.9141666666667
+80,974,29.2735
+80,975,35.8351666666667
+80,976,30.0143333333333
+80,977,24.5533333333333
+80,978,32.0463333333333
+80,979,20.2565
+80,980,29.3793333333333
+80,981,31.0726666666667
+80,982,30.607
+80,983,33.2951666666667
+80,984,29.2523333333333
+80,985,32.7025
+80,986,29.083
+80,987,30.734
+80,988,28.702
+80,989,24.7226666666667
+80,990,24.4898333333333
+80,991,32.639
+80,992,33.8243333333333
+80,993,31.4536666666667
+80,994,30.607
+80,995,33.1893333333333
+80,996,28.3845
+80,997,30.7975
+80,998,25.9926666666667
+80,999,24.13
+80,1000,25.908
+81,1,26.5557
+81,2,22.5255666666667
+81,3,23.7320666666667
+81,4,33.2824666666667
+81,5,25.3873
+81,6,29.337
+81,7,28.0246666666667
+81,8,22.8261333333333
+81,9,25.7513666666667
+81,10,30.4630666666667
+81,11,21.2132333333333
+81,12,25.0063
+81,13,32.8718333333333
+81,14,34.3238666666667
+81,15,37.8290666666667
+81,16,31.8812333333333
+81,17,28.9814
+81,18,28.8332333333333
+81,19,26.1196666666667
+81,20,28.5961666666667
+81,21,31.7373
+81,22,28.2151666666667
+81,23,38.6122333333333
+81,24,35.7166333333333
+81,25,29.9931666666667
+81,26,32.3045666666667
+81,27,25.2349
+81,28,27.3727333333333
+81,29,30.8906333333333
+81,30,28.2194
+81,31,31.1658
+81,32,26.3398
+81,33,23.8167333333333
+81,34,26.9663333333333
+81,35,32.2241333333333
+81,36,31.4452
+81,37,27.3304
+81,38,28.4353
+81,39,29.3581666666667
+81,40,28.6004
+81,41,37.5073333333333
+81,42,31.5849
+81,43,23.9437333333333
+81,44,36.6183333333333
+81,45,38.0365
+81,46,23.5839
+81,47,30.1582666666667
+81,48,27.7918333333333
+81,49,24.3628333333333
+81,50,29.4682333333333
+81,51,29.2523333333333
+81,52,27.8003
+81,53,29.8280666666667
+81,54,34.8064666666667
+81,55,26.3525
+81,56,30.8229
+81,57,27.5166666666667
+81,58,26.4668
+81,59,31.8643
+81,60,35.4965
+81,61,32.258
+81,62,24.3670666666667
+81,63,32.7109666666667
+81,64,25.5016
+81,65,21.0269666666667
+81,66,30.2133
+81,67,30.9033333333333
+81,68,29.2311666666667
+81,69,34.2011
+81,70,31.1658
+81,71,23.0124
+81,72,27.8976666666667
+81,73,27.5420666666667
+81,74,27.5844
+81,75,32.4061666666667
+81,76,20.9338333333333
+81,77,28.0035
+81,78,32.0251666666667
+81,79,25.6963333333333
+81,80,32.9057
+81,81,25.654
+81,82,28.1770666666667
+81,83,20.5359
+81,84,26.0773333333333
+81,85,25.8656666666667
+81,86,22.5933
+81,87,28.9221333333333
+81,88,29.1676666666667
+81,89,31.9828333333333
+81,90,27.7622
+81,91,26.8605
+81,92,36.8765666666667
+81,93,21.6916
+81,94,23.2029
+81,95,30.2133
+81,96,32.1183
+81,97,31.4113333333333
+81,98,29.0745333333333
+81,99,28.4691666666667
+81,100,33.1300666666667
+81,101,31.2716333333333
+81,102,23.6093
+81,103,25.9715
+81,104,25.3619
+81,105,20.4724
+81,106,32.5162333333333
+81,107,29.6164
+81,108,24.1342333333333
+81,109,29.3666333333333
+81,110,26.2466666666667
+81,111,24.9555
+81,112,33.1512333333333
+81,113,24.6168333333333
+81,114,25.8064
+81,115,40.3648333333333
+81,116,31.496
+81,117,32.9184
+81,118,27.9273
+81,119,24.9428
+81,120,27.9611666666667
+81,121,33.1681666666667
+81,122,29.6629666666667
+81,123,28.321
+81,124,37.3422333333333
+81,125,25.4846666666667
+81,126,27.3304
+81,127,23.5204
+81,128,30.5646666666667
+81,129,26.4668
+81,130,24.2146666666667
+81,131,29.3624
+81,132,27.7452666666667
+81,133,30.7551666666667
+81,134,35.7759
+81,135,34.417
+81,136,25.9715
+81,137,28.3675666666667
+81,138,31.2716333333333
+81,139,24.6845666666667
+81,140,35.433
+81,141,28.6427333333333
+81,142,30.5477333333333
+81,143,23.9691333333333
+81,144,30.5943
+81,145,29.0025666666667
+81,146,29.3158333333333
+81,147,37.2575666666667
+81,148,24.1977333333333
+81,149,26.9621
+81,150,32.3045666666667
+81,151,34.8699666666667
+81,152,25.0274666666667
+81,153,23.0759
+81,154,31.4367333333333
+81,155,22.479
+81,156,22.5933
+81,157,29.3624
+81,158,25.6794
+81,159,27.6944666666667
+81,160,28.1178
+81,161,28.2024666666667
+81,162,27.4150666666667
+81,163,32.1056
+81,164,22.9700666666667
+81,165,37.5158
+81,166,25.8064
+81,167,23.6685666666667
+81,168,28.5538333333333
+81,169,26.3609666666667
+81,170,30.1201666666667
+81,171,31.1869666666667
+81,172,30.5054
+81,173,37.3634
+81,174,29.5740666666667
+81,175,30.734
+81,176,26.9070666666667
+81,177,26.7335
+81,178,22.9319666666667
+81,179,25.0401666666667
+81,180,28.0712333333333
+81,181,30.9583666666667
+81,182,21.1370333333333
+81,183,28.3845
+81,184,23.1775
+81,185,33.3248
+81,186,30.2090666666667
+81,187,28.7909
+81,188,31.6865
+81,189,31.6907333333333
+81,190,39.8483666666667
+81,191,36.3431666666667
+81,192,38.6757333333333
+81,193,29.2777333333333
+81,194,26.8012333333333
+81,195,31.3266666666667
+81,196,24.8539
+81,197,35.5219
+81,198,30.3106666666667
+81,199,27.3134666666667
+81,200,28.5411333333333
+81,201,25.5397
+81,202,34.9504
+81,203,28.2236333333333
+81,204,32.2029666666667
+81,205,23.7278333333333
+81,206,30.1032333333333
+81,207,31.9489666666667
+81,208,29.1719
+81,209,32.6474666666667
+81,210,27.9823333333333
+81,211,24.0326333333333
+81,212,28.1813
+81,213,25.3238
+81,214,31.623
+81,215,28.0881666666667
+81,216,22.9235
+81,217,38.0661333333333
+81,218,26.5684
+81,219,33.0623333333333
+81,220,21.8863333333333
+81,221,23.6897333333333
+81,222,31.5425666666667
+81,223,30.2344666666667
+81,224,28.1559
+81,225,30.5308
+81,226,30.1244
+81,227,32.1140666666667
+81,228,21.1243333333333
+81,229,28.1516666666667
+81,230,27.6479
+81,231,29.3793333333333
+81,232,34.3154
+81,233,31.1869666666667
+81,234,27.6648333333333
+81,235,24.5194666666667
+81,236,24.892
+81,237,24.3924666666667
+81,238,28.9263666666667
+81,239,29.6841333333333
+81,240,23.9437333333333
+81,241,30.0439666666667
+81,242,34.4212333333333
+81,243,32.4315666666667
+81,244,34.8445666666667
+81,245,30.7170666666667
+81,246,32.9395666666667
+81,247,29.0025666666667
+81,248,32.2156666666667
+81,249,26.416
+81,250,31.3055
+81,251,20.7518
+81,252,30.2895
+81,253,26.8689666666667
+81,254,30.9245
+81,255,26.6911666666667
+81,256,30.7255333333333
+81,257,27.1610666666667
+81,258,34.6286666666667
+81,259,35.9664
+81,260,25.9376333333333
+81,261,20.7899
+81,262,23.749
+81,263,29.0406666666667
+81,264,29.3835666666667
+81,265,25.9164666666667
+81,266,29.8026666666667
+81,267,28.3633333333333
+81,268,23.4526666666667
+81,269,25.3195666666667
+81,270,29.7264666666667
+81,271,22.3308333333333
+81,272,34.2138
+81,273,32.8210333333333
+81,274,28.2405666666667
+81,275,20.4385333333333
+81,276,23.7871
+81,277,31.1404
+81,278,32.7321333333333
+81,279,35.3102333333333
+81,280,34.2053333333333
+81,281,27.1991666666667
+81,282,30.2725666666667
+81,283,38.2524
+81,284,27.8807333333333
+81,285,31.7330666666667
+81,286,29.3920333333333
+81,287,29.7010666666667
+81,288,32.4696666666667
+81,289,28.5792333333333
+81,290,26.6488333333333
+81,291,27.2245666666667
+81,292,29.1761333333333
+81,293,32.8168
+81,294,28.3294666666667
+81,295,26.9324666666667
+81,296,24.3628333333333
+81,297,26.5853333333333
+81,298,25.1036666666667
+81,299,24.13
+81,300,33.1343
+81,301,25.1671666666667
+81,302,23.5373333333333
+81,303,35.0181333333333
+81,304,31.7119
+81,305,33.8074
+81,306,29.1507333333333
+81,307,29.718
+81,308,30.0143333333333
+81,309,26.6319
+81,310,29.3793333333333
+81,311,27.3685
+81,312,24.4686666666667
+81,313,32.385
+81,314,27.4150666666667
+81,315,26.0561666666667
+81,316,34.163
+81,317,32.5331666666667
+81,318,35.5854
+81,319,30.734
+81,320,27.7537333333333
+81,321,23.4357333333333
+81,322,28.956
+81,323,36.5590666666667
+81,324,40.5553333333333
+81,325,24.1765666666667
+81,326,32.6220666666667
+81,327,28.6469666666667
+81,328,25.5354666666667
+81,329,31.3859333333333
+81,330,26.1196666666667
+81,331,20.9423
+81,332,25.0444
+81,333,31.3563
+81,334,26.3779
+81,335,32.8718333333333
+81,336,36.7072333333333
+81,337,34.3111666666667
+81,338,29.5825333333333
+81,339,28.0289
+81,340,29.7603333333333
+81,341,25.2772333333333
+81,342,24.257
+81,343,29.1338
+81,344,30.0651333333333
+81,345,26.5049
+81,346,30.6832
+81,347,31.5595
+81,348,29.083
+81,349,34.0614
+81,350,27.9188333333333
+81,351,32.0971333333333
+81,352,28.956
+81,353,29.0618333333333
+81,354,27.8214666666667
+81,355,21.844
+81,356,27.9654
+81,357,28.7951333333333
+81,358,31.5806666666667
+81,359,28.8078333333333
+81,360,26.1450666666667
+81,361,33.8582
+81,362,23.9903
+81,363,24.5533333333333
+81,364,23.0335666666667
+81,365,27.8807333333333
+81,366,32.9184
+81,367,29.4428333333333
+81,368,28.2998333333333
+81,369,26.2128
+81,370,29.5571333333333
+81,371,30.734
+81,372,31.5383333333333
+81,373,32.0463333333333
+81,374,21.2936666666667
+81,375,31.1869666666667
+81,376,26.67
+81,377,31.8854666666667
+81,378,29.5063333333333
+81,379,24.4559666666667
+81,380,27.3473333333333
+81,381,33.5491666666667
+81,382,31.6060666666667
+81,383,32.0717333333333
+81,384,27.8341666666667
+81,385,29.8661666666667
+81,386,24.1342333333333
+81,387,35.3483333333333
+81,388,27.7368
+81,389,34.2942333333333
+81,390,35.4033666666667
+81,391,28.3887333333333
+81,392,28.1770666666667
+81,393,28.1347333333333
+81,394,28.6385
+81,395,32.9438
+81,396,26.5218333333333
+81,397,29.4851666666667
+81,398,36.4320666666667
+81,399,26.6319
+81,400,23.5204
+81,401,22.2080666666667
+81,402,33.1512333333333
+81,403,31.9913
+81,404,26.6107333333333
+81,405,32.8972333333333
+81,406,32.8718333333333
+81,407,28.7316333333333
+81,408,26.5006666666667
+81,409,29.6037
+81,410,24.6422333333333
+81,411,22.4197333333333
+81,412,24.5787333333333
+81,413,38.354
+81,414,21.0439
+81,415,26.162
+81,416,29.3624
+81,417,28.3252333333333
+81,418,29.7815
+81,419,26.7335
+81,420,39.4589
+81,421,26.7843
+81,422,36.4532333333333
+81,423,30.48
+81,424,31.7161333333333
+81,425,35.1409
+81,426,24.2866333333333
+81,427,27.1145
+81,428,27.2203333333333
+81,429,32.4569666666667
+81,430,32.6898
+81,431,30.5731333333333
+81,432,21.8313
+81,433,30.2895
+81,434,30.2175333333333
+81,435,26.0434666666667
+81,436,21.1666666666667
+81,437,33.4899
+81,438,28.5961666666667
+81,439,36.0891666666667
+81,440,28.067
+81,441,28.5961666666667
+81,442,33.3713666666667
+81,443,26.5641666666667
+81,444,31.1996666666667
+81,445,30.1921333333333
+81,446,23.8336666666667
+81,447,30.353
+81,448,27.8384
+81,449,37.8333
+81,450,35.179
+81,451,28.9814
+81,452,25.3830666666667
+81,453,37.3634
+81,454,29.6206333333333
+81,455,29.6333333333333
+81,456,34.4678
+81,457,22.3604666666667
+81,458,28.4945666666667
+81,459,26.5938
+81,460,33.1512333333333
+81,461,27.4108333333333
+81,462,26.8054666666667
+81,463,26.7800666666667
+81,464,25.8021666666667
+81,465,28.7697333333333
+81,466,22.2504
+81,467,39.5012333333333
+81,468,30.5096333333333
+81,469,25.0274666666667
+81,470,24.5533333333333
+81,471,30.6916666666667
+81,472,27.3939
+81,473,24.6168333333333
+81,474,32.7914
+81,475,25.9545666666667
+81,476,23.0081666666667
+81,477,29.5063333333333
+81,478,28.4099
+81,479,26.9917333333333
+81,480,29.4978666666667
+81,481,29.21
+81,482,28.3252333333333
+81,483,29.8915666666667
+81,484,26.1112
+81,485,30.5054
+81,486,31.7076666666667
+81,487,28.0289
+81,488,30.0693666666667
+81,489,30.0609
+81,490,31.5298666666667
+81,491,29.1041666666667
+81,492,29.7434
+81,493,27.1187333333333
+81,494,33.4983666666667
+81,495,23.495
+81,496,26.1281333333333
+81,497,25.6709333333333
+81,498,28.2151666666667
+81,499,37.3676333333333
+81,500,34.2730666666667
+81,501,35.9706333333333
+81,502,28.194
+81,503,33.6804
+81,504,24.8200333333333
+81,505,24.8962333333333
+81,506,28.321
+81,507,30.8483
+81,508,29.5783
+81,509,24.9428
+81,510,26.0392333333333
+81,511,36.3685666666667
+81,512,34.2095666666667
+81,513,24.3670666666667
+81,514,34.8064666666667
+81,515,29.4343666666667
+81,516,31.369
+81,517,32.1648666666667
+81,518,28.1770666666667
+81,519,29.4428333333333
+81,520,26.4456333333333
+81,521,26.3948333333333
+81,522,30.5646666666667
+81,523,27.4574
+81,524,27.3896666666667
+81,525,25.9503333333333
+81,526,27.6352
+81,527,29.6756666666667
+81,528,29.4978666666667
+81,529,33.147
+81,530,27.7283333333333
+81,531,27.0298333333333
+81,532,27.6309666666667
+81,533,29.845
+81,534,25.8233333333333
+81,535,27.3727333333333
+81,536,28.2659666666667
+81,537,26.6065
+81,538,21.1285666666667
+81,539,25.9926666666667
+81,540,27.1356666666667
+81,541,30.8229
+81,542,33.2401333333333
+81,543,31.0345666666667
+81,544,24.3755333333333
+81,545,27.4785666666667
+81,546,25.3534333333333
+81,547,34.2942333333333
+81,548,28.3887333333333
+81,549,20.5359
+81,550,26.9875
+81,551,28.2532666666667
+81,552,22.2504
+81,553,34.1884
+81,554,32.5162333333333
+81,555,32.3638333333333
+81,556,32.0886666666667
+81,557,30.1413333333333
+81,558,27.6267333333333
+81,559,33.1893333333333
+81,560,26.6742333333333
+81,561,31.5383333333333
+81,562,30.48
+81,563,27.5420666666667
+81,564,34.6752333333333
+81,565,29.7645666666667
+81,566,29.5571333333333
+81,567,30.3360666666667
+81,568,32.2834
+81,569,30.861
+81,570,23.7955666666667
+81,571,32.6009
+81,572,29.6587333333333
+81,573,22.2885
+81,574,31.1615666666667
+81,575,25.8233333333333
+81,576,33.2062666666667
+81,577,28.4691666666667
+81,578,23.9818333333333
+81,579,21.3148333333333
+81,580,21.6577333333333
+81,581,24.2189
+81,582,32.2156666666667
+81,583,27.5209
+81,584,25.4846666666667
+81,585,31.6653333333333
+81,586,38.4640666666667
+81,587,31.8685333333333
+81,588,30.7763333333333
+81,589,25.8318
+81,590,31.2716333333333
+81,591,34.1206666666667
+81,592,33.7100333333333
+81,593,35.0393
+81,594,27.2626666666667
+81,595,25.8064
+81,596,29.6418
+81,597,28.6893
+81,598,26.7250333333333
+81,599,25.9926666666667
+81,600,32.5755
+81,601,30.1413333333333
+81,602,33.5788
+81,603,24.4051666666667
+81,604,28.3929666666667
+81,605,27.6267333333333
+81,606,36.6606666666667
+81,607,32.8083333333333
+81,608,26.6911666666667
+81,609,30.6832
+81,610,33.0242333333333
+81,611,28.829
+81,612,23.9606666666667
+81,613,29.0957
+81,614,21.1243333333333
+81,615,32.512
+81,616,32.4908333333333
+81,617,32.5331666666667
+81,618,31.6865
+81,619,30.353
+81,620,28.6215666666667
+81,621,26.797
+81,622,27.8595666666667
+81,623,26.5472333333333
+81,624,28.0331333333333
+81,625,28.8501666666667
+81,626,31.0811333333333
+81,627,26.7546666666667
+81,628,26.6065
+81,629,28.3675666666667
+81,630,30.5265666666667
+81,631,24.0961333333333
+81,632,29.6799
+81,633,27.9273
+81,634,29.4047333333333
+81,635,23.4696
+81,636,20.7052333333333
+81,637,31.3393666666667
+81,638,24.4475
+81,639,23.7955666666667
+81,640,28.0035
+81,641,36.0722333333333
+81,642,29.9296666666667
+81,643,29.7010666666667
+81,644,31.7754
+81,645,35.941
+81,646,26.4287
+81,647,30.6747333333333
+81,648,29.2396333333333
+81,649,33.6761666666667
+81,650,24.3035666666667
+81,651,26.3186333333333
+81,652,25.6878666666667
+81,653,30.353
+81,654,24.7438333333333
+81,655,22.8811666666667
+81,656,36.8554
+81,657,26.0477
+81,658,24.9809
+81,659,30.2556333333333
+81,660,27.4108333333333
+81,661,33.3332666666667
+81,662,23.4103333333333
+81,663,30.1286333333333
+81,664,20.8703333333333
+81,665,33.1766333333333
+81,666,30.4419
+81,667,24.5956666666667
+81,668,32.4273333333333
+81,669,22.733
+81,670,24.1554
+81,671,27.5632333333333
+81,672,27.4616333333333
+81,673,32.4485
+81,674,31.1065333333333
+81,675,28.9602333333333
+81,676,22.479
+81,677,32.2495333333333
+81,678,32.6220666666667
+81,679,29.5740666666667
+81,680,26.3144
+81,681,24.4051666666667
+81,682,28.5326666666667
+81,683,28.4310666666667
+81,684,23.3256666666667
+81,685,26.162
+81,686,31.8812333333333
+81,687,31.3266666666667
+81,688,34.0783333333333
+81,689,29.1295666666667
+81,690,23.1055333333333
+81,691,27.0721666666667
+81,692,34.6286666666667
+81,693,34.4212333333333
+81,694,27.9992666666667
+81,695,23.3256666666667
+81,696,25.4084666666667
+81,697,31.0853666666667
+81,698,27.0552333333333
+81,699,31.9786
+81,700,29.4470666666667
+81,701,37.9349
+81,702,30.8186666666667
+81,703,27.7198666666667
+81,704,28.3845
+81,705,29.7434
+81,706,38.8408333333333
+81,707,27.0721666666667
+81,708,24.384
+81,709,30.4376666666667
+81,710,28.6893
+81,711,26.5726333333333
+81,712,30.9541333333333
+81,713,26.5726333333333
+81,714,31.2843333333333
+81,715,33.528
+81,716,30.9118
+81,717,29.6799
+81,718,26.5684
+81,719,23.5839
+81,720,32.5162333333333
+81,721,31.1192333333333
+81,722,32.6855666666667
+81,723,30.226
+81,724,23.1351666666667
+81,725,31.8600666666667
+81,726,25.7429
+81,727,31.3563
+81,728,20.955
+81,729,34.798
+81,730,27.6648333333333
+81,731,28.3929666666667
+81,732,31.9235666666667
+81,733,23.2875666666667
+81,734,38.2735666666667
+81,735,28.6850666666667
+81,736,26.7462
+81,737,26.6911666666667
+81,738,28.1347333333333
+81,739,28.7485666666667
+81,740,28.1559
+81,741,31.5087
+81,742,25.3026333333333
+81,743,27.1272
+81,744,30.6112333333333
+81,745,27.0171333333333
+81,746,35.5261333333333
+81,747,28.448
+81,748,33.7015666666667
+81,749,32.6644
+81,750,21.6746666666667
+81,751,28.4268333333333
+81,752,28.6893
+81,753,26.0392333333333
+81,754,24.8327333333333
+81,755,31.2039
+81,756,31.4409666666667
+81,757,25.3365
+81,758,28.1601333333333
+81,759,31.5087
+81,760,27.2796
+81,761,30.5689
+81,762,25.6963333333333
+81,763,28.956
+81,764,23.9649
+81,765,26.1450666666667
+81,766,30.6154666666667
+81,767,25.9503333333333
+81,768,28.6258
+81,769,31.4155666666667
+81,770,26.2085666666667
+81,771,28.9009666666667
+81,772,35.2467333333333
+81,773,27.3896666666667
+81,774,27.2499666666667
+81,775,25.8868333333333
+81,776,26.0731
+81,777,36.6606666666667
+81,778,36.2796666666667
+81,779,19.8162333333333
+81,780,29.9762333333333
+81,781,31.2885666666667
+81,782,28.7866666666667
+81,783,33.5661
+81,784,29.4047333333333
+81,785,27.4574
+81,786,29.9381333333333
+81,787,24.3205
+81,788,24.0961333333333
+81,789,29.5148
+81,790,29.1507333333333
+81,791,28.4056666666667
+81,792,31.5679666666667
+81,793,32.639
+81,794,33.02
+81,795,28.0924
+81,796,35.5684666666667
+81,797,20.7052333333333
+81,798,29.8619333333333
+81,799,27.9103666666667
+81,800,27.559
+81,801,31.7330666666667
+81,802,31.3944
+81,803,28.9983333333333
+81,804,30.8821666666667
+81,805,32.0463333333333
+81,806,25.8699
+81,807,34.4466333333333
+81,808,27.9484666666667
+81,809,38.3963333333333
+81,810,33.0454
+81,811,29.8915666666667
+81,812,29.2946666666667
+81,813,24.9555
+81,814,32.6263
+81,815,22.2334666666667
+81,816,26.67
+81,817,20.9169
+81,818,29.7264666666667
+81,819,27.1356666666667
+81,820,28.6258
+81,821,25.9715
+81,822,24.0453333333333
+81,823,34.6286666666667
+81,824,36.9612333333333
+81,825,28.5834666666667
+81,826,31.4833
+81,827,23.6431666666667
+81,828,33.0411666666667
+81,829,24.6168333333333
+81,830,24.7861666666667
+81,831,24.5533333333333
+81,832,23.4145666666667
+81,833,27.6987
+81,834,23.6093
+81,835,28.321
+81,836,25.7640666666667
+81,837,27.8765
+81,838,26.8393333333333
+81,839,36.4701666666667
+81,840,30.1244
+81,841,27.4404666666667
+81,842,31.2504666666667
+81,843,24.4729
+81,844,40.4960666666667
+81,845,23.9437333333333
+81,846,29.4682333333333
+81,847,28.4903333333333
+81,848,23.6770333333333
+81,849,27.7833666666667
+81,850,24.0707333333333
+81,851,33.274
+81,852,25.3068666666667
+81,853,25.4042333333333
+81,854,40.0769666666667
+81,855,24.3205
+81,856,28.1220333333333
+81,857,25.3830666666667
+81,858,34.9504
+81,859,37.2575666666667
+81,860,34.9461666666667
+81,861,34.7175666666667
+81,862,27.4447
+81,863,30.5265666666667
+81,864,25.9757333333333
+81,865,28.6004
+81,866,24.5448666666667
+81,867,30.0185666666667
+81,868,28.7485666666667
+81,869,26.0561666666667
+81,870,27.8849666666667
+81,871,31.0176333333333
+81,872,32.7956333333333
+81,873,30.6747333333333
+81,874,35.0731666666667
+81,875,27.0594666666667
+81,876,22.4832333333333
+81,877,32.9692
+81,878,29.7899666666667
+81,879,25.7217333333333
+81,880,36.8977333333333
+81,881,32.5162333333333
+81,882,39.751
+81,883,22.352
+81,884,31.4325
+81,885,29.2946666666667
+81,886,27.3727333333333
+81,887,23.6431666666667
+81,888,32.1945
+81,889,20.6417333333333
+81,890,31.3309
+81,891,27.1356666666667
+81,892,29.8873333333333
+81,893,31.0938333333333
+81,894,32.3426666666667
+81,895,21.6323333333333
+81,896,25.9291666666667
+81,897,28.8755666666667
+81,898,28.7655
+81,899,32.639
+81,900,28.8417
+81,901,29.0660666666667
+81,902,24.0072333333333
+81,903,33.9132333333333
+81,904,34.3365666666667
+81,905,26.4625666666667
+81,906,28.4861
+81,907,25.1036666666667
+81,908,30.1413333333333
+81,909,29.7603333333333
+81,910,32.1987333333333
+81,911,23.7574666666667
+81,912,29.2311666666667
+81,913,33.6973333333333
+81,914,29.8280666666667
+81,915,30.7678666666667
+81,916,25.8741333333333
+81,917,32.385
+81,918,28.3506333333333
+81,919,28.1135666666667
+81,920,33.2359
+81,921,33.0454
+81,922,29.1041666666667
+81,923,26.0815666666667
+81,924,27.7071666666667
+81,925,29.3666333333333
+81,926,31.7076666666667
+81,927,29.6545
+81,928,30.3741666666667
+81,929,32.6898
+81,930,30.1413333333333
+81,931,26.2974666666667
+81,932,30.5900666666667
+81,933,29.9339
+81,934,25.1968
+81,935,30.3826333333333
+81,936,37.0035666666667
+81,937,22.733
+81,938,24.3078
+81,939,26.8816666666667
+81,940,25.5566333333333
+81,941,28.9856333333333
+81,942,22.4409
+81,943,28.6596666666667
+81,944,27.1145
+81,945,35.2044
+81,946,37.6809
+81,947,26.5768666666667
+81,948,27.8553333333333
+81,949,27.3685
+81,950,34.6413666666667
+81,951,26.8605
+81,952,30.2514
+81,953,30.3445333333333
+81,954,23.8167333333333
+81,955,27.8384
+81,956,29.9212
+81,957,35.7378
+81,958,29.2608
+81,959,25.146
+81,960,27.8384
+81,961,22.6187
+81,962,24.7988666666667
+81,963,25.5143
+81,964,36.3939666666667
+81,965,26.1281333333333
+81,966,26.9113
+81,967,24.2993333333333
+81,968,25.2518333333333
+81,969,23.5204
+81,970,26.0858
+81,971,28.5623
+81,972,29.337
+81,973,26.5218333333333
+81,974,27.7325666666667
+81,975,27.9823333333333
+81,976,30.8864
+81,977,32.2834
+81,978,31.1827333333333
+81,979,23.6050666666667
+81,980,38.862
+81,981,23.2071333333333
+81,982,30.1836666666667
+81,983,34.925
+81,984,30.5138666666667
+81,985,26.6149666666667
+81,986,35.2552
+81,987,28.7062333333333
+81,988,28.3718
+81,989,25.9926666666667
+81,990,26.7758333333333
+81,991,35.9664
+81,992,26.3948333333333
+81,993,25.6751666666667
+81,994,34.3408
+81,995,34.5905666666667
+81,996,29.3666333333333
+81,997,31.4663666666667
+81,998,34.4805
+81,999,28.5115
+81,1000,33.8666666666667
+82,1,33.1258333333333
+82,2,33.3798333333333
+82,3,30.5223333333333
+82,4,28.5961666666667
+82,5,28.702
+82,6,26.0985
+82,7,29.5275
+82,8,18.2245
+82,9,26.9663333333333
+82,10,27.3473333333333
+82,11,32.1098333333333
+82,12,19.8966666666667
+82,13,25.6328333333333
+82,14,29.6545
+82,15,27.3473333333333
+82,16,26.3948333333333
+82,17,26.416
+82,18,29.1888333333333
+82,19,26.2043333333333
+82,20,20.4893333333333
+82,21,29.1253333333333
+82,22,25.7175
+82,23,22.3096666666667
+82,24,30.734
+82,25,25.1248333333333
+82,26,24.3416666666667
+82,27,28.5961666666667
+82,28,25.8656666666667
+82,29,22.098
+82,30,22.9446666666667
+82,31,31.8135
+82,32,26.67
+82,33,37.5708333333333
+82,34,26.0773333333333
+82,35,29.4851666666667
+82,36,24.1511666666667
+82,37,28.1516666666667
+82,38,24.9343333333333
+82,39,27.813
+82,40,24.9343333333333
+82,41,25.908
+82,42,30.6493333333333
+82,43,33.1258333333333
+82,44,33.3586666666667
+82,45,20.1506666666667
+82,46,38.1846666666667
+82,47,28.194
+82,48,30.0778333333333
+82,49,28.7231666666667
+82,50,33.8031666666667
+82,51,23.9183333333333
+82,52,32.639
+82,53,32.0675
+82,54,25.1671666666667
+82,55,34.2688333333333
+82,56,22.1826666666667
+82,57,26.8181666666667
+82,58,25.5058333333333
+82,59,28.1093333333333
+82,60,30.734
+82,61,23.6643333333333
+82,62,20.2353333333333
+82,63,26.4795
+82,64,25.3788333333333
+82,65,26.0138333333333
+82,66,31.5806666666667
+82,67,23.5161666666667
+82,68,17.6318333333333
+82,69,25.4423333333333
+82,70,30.1625
+82,71,37.9518333333333
+82,72,25.9291666666667
+82,73,25.8445
+82,74,17.3566666666667
+82,75,28.2575
+82,76,27.7283333333333
+82,77,26.5641666666667
+82,78,21.7593333333333
+82,79,29.591
+82,80,24.6591666666667
+82,81,26.67
+82,82,27.6648333333333
+82,83,22.225
+82,84,24.2358333333333
+82,85,24.2146666666667
+82,86,30.226
+82,87,24.8285
+82,88,27.2626666666667
+82,89,24.5745
+82,90,26.5853333333333
+82,91,30.0566666666667
+82,92,28.3845
+82,93,26.289
+82,94,20.7433333333333
+82,95,29.6121666666667
+82,96,26.5218333333333
+82,97,27.0086666666667
+82,98,31.0726666666667
+82,99,27.3261666666667
+82,100,32.1521666666667
+82,101,25.8656666666667
+82,102,22.7753333333333
+82,103,30.1201666666667
+82,104,27.3896666666667
+82,105,26.6488333333333
+82,106,32.512
+82,107,32.2791666666667
+82,108,31.9616666666667
+82,109,25.8656666666667
+82,110,16.1078333333333
+82,111,26.6276666666667
+82,112,20.3623333333333
+82,113,26.0985
+82,114,29.8026666666667
+82,115,22.225
+82,116,23.1563333333333
+82,117,22.225
+82,118,32.2156666666667
+82,119,20.2776666666667
+82,120,27.686
+82,121,30.2471666666667
+82,122,25.8656666666667
+82,123,26.5218333333333
+82,124,26.035
+82,125,27.1568333333333
+82,126,22.3308333333333
+82,127,33.7608333333333
+82,128,31.0938333333333
+82,129,23.114
+82,130,23.1986666666667
+82,131,25.2306666666667
+82,132,31.9828333333333
+82,133,28.194
+82,134,19.5368333333333
+82,135,29.0618333333333
+82,136,33.2105
+82,137,32.639
+82,138,27.8976666666667
+82,139,25.0825
+82,140,30.3318333333333
+82,141,25.1883333333333
+82,142,23.6643333333333
+82,143,27.0721666666667
+82,144,25.2941666666667
+82,145,22.6271666666667
+82,146,25.3788333333333
+82,147,27.0298333333333
+82,148,26.9028333333333
+82,149,27.6013333333333
+82,150,26.5641666666667
+82,151,31.3478333333333
+82,152,30.861
+82,153,25.7386666666667
+82,154,32.1945
+82,155,24.7861666666667
+82,156,28.2786666666667
+82,157,22.0768333333333
+82,158,30.3106666666667
+82,159,32.0886666666667
+82,160,27.9611666666667
+82,161,28.3633333333333
+82,162,31.0938333333333
+82,163,26.4795
+82,164,17.018
+82,165,30.2471666666667
+82,166,23.0293333333333
+82,167,23.1775
+82,168,27.8765
+82,169,24.638
+82,170,28.8501666666667
+82,171,28.5538333333333
+82,172,22.9446666666667
+82,173,29.1888333333333
+82,174,17.1026666666667
+82,175,24.9343333333333
+82,176,32.3003333333333
+82,177,20.7433333333333
+82,178,21.844
+82,179,30.1413333333333
+82,180,26.8393333333333
+82,181,28.448
+82,182,22.2461666666667
+82,183,23.3256666666667
+82,184,26.7758333333333
+82,185,27.0933333333333
+82,186,23.3256666666667
+82,187,28.0246666666667
+82,188,23.2198333333333
+82,189,23.9395
+82,190,26.162
+82,191,18.8383333333333
+82,192,33.1046666666667
+82,193,26.1831666666667
+82,194,25.2095
+82,195,31.5806666666667
+82,196,24.765
+82,197,27.7918333333333
+82,198,26.5641666666667
+82,199,23.8548333333333
+82,200,27.0298333333333
+82,201,23.7278333333333
+82,202,27.0721666666667
+82,203,25.1883333333333
+82,204,21.1455
+82,205,30.226
+82,206,25.3365
+82,207,33.9301666666667
+82,208,20.7856666666667
+82,209,31.242
+82,210,31.5595
+82,211,28.2998333333333
+82,212,26.6276666666667
+82,213,29.1888333333333
+82,214,27.9188333333333
+82,215,31.3266666666667
+82,216,29.3158333333333
+82,217,24.2993333333333
+82,218,24.5745
+82,219,32.2791666666667
+82,220,19.8966666666667
+82,221,23.5585
+82,222,20.447
+82,223,36.8723333333333
+82,224,21.971
+82,225,29.1465
+82,226,16.637
+82,227,29.5486666666667
+82,228,28.3633333333333
+82,229,23.1986666666667
+82,230,21.5476666666667
+82,231,30.4588333333333
+82,232,29.6968333333333
+82,233,24.3205
+82,234,35.052
+82,235,21.7805
+82,236,23.9183333333333
+82,237,34.417
+82,238,30.9456666666667
+82,239,23.5161666666667
+82,240,32.2791666666667
+82,241,32.766
+82,242,27.8765
+82,243,25.908
+82,244,30.6281666666667
+82,245,31.115
+82,246,24.003
+82,247,26.162
+82,248,22.1403333333333
+82,249,30.9668333333333
+82,250,27.4955
+82,251,22.8388333333333
+82,252,24.1723333333333
+82,253,22.9658333333333
+82,254,26.0561666666667
+82,255,28.194
+82,256,20.8491666666667
+82,257,21.8228333333333
+82,258,22.2038333333333
+82,259,26.8816666666667
+82,260,29.3581666666667
+82,261,29.9296666666667
+82,262,27.0721666666667
+82,263,31.6018333333333
+82,264,29.2523333333333
+82,265,23.9818333333333
+82,266,28.2151666666667
+82,267,22.8388333333333
+82,268,23.9606666666667
+82,269,24.3628333333333
+82,270,20.9973333333333
+82,271,26.3313333333333
+82,272,26.3313333333333
+82,273,26.0985
+82,274,24.0665
+82,275,19.6215
+82,276,20.4258333333333
+82,277,20.2353333333333
+82,278,27.6436666666667
+82,279,25.4635
+82,280,21.844
+82,281,30.6916666666667
+82,282,26.2678333333333
+82,283,25.7175
+82,284,31.2843333333333
+82,285,31.877
+82,286,25.9503333333333
+82,287,27.3896666666667
+82,288,20.9761666666667
+82,289,28.8078333333333
+82,290,26.5218333333333
+82,291,30.7975
+82,292,27.6648333333333
+82,293,19.3251666666667
+82,294,24.257
+82,295,23.1351666666667
+82,296,27.4531666666667
+82,297,25.8021666666667
+82,298,26.5641666666667
+82,299,32.3003333333333
+82,300,32.1098333333333
+82,301,25.6328333333333
+82,302,28.2363333333333
+82,303,24.13
+82,304,25.5481666666667
+82,305,27.0086666666667
+82,306,30.4588333333333
+82,307,19.1981666666667
+82,308,30.0778333333333
+82,309,33.02
+82,310,25.1248333333333
+82,311,30.5646666666667
+82,312,26.67
+82,313,28.3845
+82,314,29.6968333333333
+82,315,23.0293333333333
+82,316,27.6648333333333
+82,317,25.8233333333333
+82,318,26.2255
+82,319,32.8506666666667
+82,320,26.7546666666667
+82,321,26.1831666666667
+82,322,21.1031666666667
+82,323,22.9023333333333
+82,324,30.4165
+82,325,31.496
+82,326,32.2156666666667
+82,327,25.527
+82,328,22.1403333333333
+82,329,29.0618333333333
+82,330,22.6483333333333
+82,331,24.765
+82,332,24.3416666666667
+82,333,23.8971666666667
+82,334,33.6973333333333
+82,335,25.9926666666667
+82,336,20.9973333333333
+82,337,27.9611666666667
+82,338,18.7325
+82,339,24.4263333333333
+82,340,22.5636666666667
+82,341,19.0711666666667
+82,342,25.0613333333333
+82,343,23.2833333333333
+82,344,31.4536666666667
+82,345,28.448
+82,346,26.6488333333333
+82,347,32.0251666666667
+82,348,23.622
+82,349,26.9028333333333
+82,350,25.9503333333333
+82,351,25.3153333333333
+82,352,24.8285
+82,353,19.177
+82,354,25.8233333333333
+82,355,35.7293333333333
+82,356,31.0303333333333
+82,357,25.1248333333333
+82,358,25.5905
+82,359,26.543
+82,360,21.2513333333333
+82,361,24.1088333333333
+82,362,30.0778333333333
+82,363,24.8496666666667
+82,364,25.4
+82,365,32.8718333333333
+82,366,28.0458333333333
+82,367,22.2673333333333
+82,368,28.3845
+82,369,35.306
+82,370,29.3581666666667
+82,371,28.4268333333333
+82,372,22.225
+82,373,24.5956666666667
+82,374,20.32
+82,375,24.3205
+82,376,29.2523333333333
+82,377,26.543
+82,378,36.576
+82,379,33.147
+82,380,22.7118333333333
+82,381,24.9343333333333
+82,382,30.9245
+82,383,23.0081666666667
+82,384,29.1888333333333
+82,385,32.893
+82,386,22.8388333333333
+82,387,33.9301666666667
+82,388,32.3215
+82,389,21.59
+82,390,29.6756666666667
+82,391,25.2518333333333
+82,392,22.733
+82,393,26.9875
+82,394,31.9616666666667
+82,395,29.9296666666667
+82,396,23.6431666666667
+82,397,35.7505
+82,398,29.6756666666667
+82,399,24.1935
+82,400,26.2255
+82,401,31.0303333333333
+82,402,25.1671666666667
+82,403,20.4046666666667
+82,404,32.9776666666667
+82,405,22.7118333333333
+82,406,25.273
+82,407,21.9075
+82,408,27.5166666666667
+82,409,27.2203333333333
+82,410,30.3953333333333
+82,411,28.7655
+82,412,22.0556666666667
+82,413,21.6111666666667
+82,414,26.67
+82,415,27.432
+82,416,25.3576666666667
+82,417,29.2311666666667
+82,418,27.4955
+82,419,28.829
+82,420,33.6761666666667
+82,421,26.8181666666667
+82,422,27.3685
+82,423,22.5636666666667
+82,424,28.575
+82,425,32.5331666666667
+82,426,26.416
+82,427,25.8445
+82,428,25.3576666666667
+82,429,35.2636666666667
+82,430,25.6328333333333
+82,431,23.7913333333333
+82,432,32.6813333333333
+82,433,24.8073333333333
+82,434,27.2838333333333
+82,435,25.8656666666667
+82,436,31.0938333333333
+82,437,27.3685
+82,438,31.0091666666667
+82,439,28.8501666666667
+82,440,31.8135
+82,441,21.4206666666667
+82,442,23.5373333333333
+82,443,22.9235
+82,444,28.6173333333333
+82,445,25.4211666666667
+82,446,29.0406666666667
+82,447,27.5378333333333
+82,448,23.1351666666667
+82,449,28.2998333333333
+82,450,25.8868333333333
+82,451,21.971
+82,452,25.5481666666667
+82,453,30.226
+82,454,27.432
+82,455,34.5651666666667
+82,456,26.924
+82,457,33.6973333333333
+82,458,25.6116666666667
+82,459,26.1196666666667
+82,460,24.1935
+82,461,26.416
+82,462,29.9296666666667
+82,463,27.051
+82,464,22.0768333333333
+82,465,23.2198333333333
+82,466,24.2781666666667
+82,467,28.194
+82,468,25.654
+82,469,20.4893333333333
+82,470,34.1206666666667
+82,471,21.4206666666667
+82,472,32.131
+82,473,37.1263333333333
+82,474,24.6803333333333
+82,475,24.6591666666667
+82,476,29.3581666666667
+82,477,25.5905
+82,478,22.6695
+82,479,28.067
+82,480,26.1196666666667
+82,481,23.2621666666667
+82,482,25.2306666666667
+82,483,25.0613333333333
+82,484,23.9606666666667
+82,485,23.2621666666667
+82,486,21.717
+82,487,23.0505
+82,488,24.5956666666667
+82,489,21.3783333333333
+82,490,23.9183333333333
+82,491,33.401
+82,492,22.6906666666667
+82,493,22.9023333333333
+82,494,24.1935
+82,495,26.6911666666667
+82,496,25.9926666666667
+82,497,22.6483333333333
+82,498,29.1465
+82,499,21.8228333333333
+82,500,29.8873333333333
+82,501,27.8553333333333
+82,502,24.13
+82,503,30.5858333333333
+82,504,27.1145
+82,505,26.9875
+82,506,24.0876666666667
+82,507,25.908
+82,508,23.9818333333333
+82,509,26.9451666666667
+82,510,23.2833333333333
+82,511,28.9983333333333
+82,512,24.9131666666667
+82,513,23.2198333333333
+82,514,32.3215
+82,515,27.6225
+82,516,28.6385
+82,517,26.1408333333333
+82,518,26.9663333333333
+82,519,26.7546666666667
+82,520,33.9725
+82,521,26.5853333333333
+82,522,23.749
+82,523,19.7485
+82,524,21.9075
+82,525,26.0561666666667
+82,526,30.6493333333333
+82,527,29.0618333333333
+82,528,31.9616666666667
+82,529,30.9668333333333
+82,530,32.1521666666667
+82,531,30.607
+82,532,31.877
+82,533,24.4686666666667
+82,534,21.1243333333333
+82,535,21.0608333333333
+82,536,24.0665
+82,537,25.273
+82,538,29.9508333333333
+82,539,28.7866666666667
+82,540,28.2151666666667
+82,541,33.3375
+82,542,20.7221666666667
+82,543,28.6808333333333
+82,544,21.9075
+82,545,23.4315
+82,546,33.274
+82,547,28.5115
+82,548,31.0303333333333
+82,549,22.4578333333333
+82,550,27.7071666666667
+82,551,32.2368333333333
+82,552,19.8331666666667
+82,553,22.3731666666667
+82,554,26.7546666666667
+82,555,31.4536666666667
+82,556,30.48
+82,557,21.844
+82,558,31.2208333333333
+82,559,27.4531666666667
+82,560,23.4315
+82,561,20.1506666666667
+82,562,22.6695
+82,563,28.067
+82,564,38.227
+82,565,26.1831666666667
+82,566,27.8976666666667
+82,567,30.2048333333333
+82,568,21.8651666666667
+82,569,25.4846666666667
+82,570,23.3256666666667
+82,571,21.4418333333333
+82,572,24.5956666666667
+82,573,23.241
+82,574,27.0086666666667
+82,575,22.3096666666667
+82,576,28.5115
+82,577,28.194
+82,578,25.0825
+82,579,27.4743333333333
+82,580,25.2518333333333
+82,581,25.146
+82,582,29.6121666666667
+82,583,28.6385
+82,584,28.702
+82,585,27.0721666666667
+82,586,22.6483333333333
+82,587,21.3148333333333
+82,588,21.3148333333333
+82,589,28.0458333333333
+82,590,25.019
+82,591,22.733
+82,592,23.4315
+82,593,24.2146666666667
+82,594,27.7071666666667
+82,595,25.8868333333333
+82,596,26.6911666666667
+82,597,21.1031666666667
+82,598,24.9766666666667
+82,599,26.4371666666667
+82,600,30.0143333333333
+82,601,29.0618333333333
+82,602,26.0138333333333
+82,603,21.8651666666667
+82,604,23.0505
+82,605,31.0938333333333
+82,606,25.1671666666667
+82,607,27.432
+82,608,27.2415
+82,609,26.5218333333333
+82,610,26.0138333333333
+82,611,24.4475
+82,612,27.1991666666667
+82,613,22.7541666666667
+82,614,24.1723333333333
+82,615,24.9343333333333
+82,616,28.4056666666667
+82,617,29.4005
+82,618,26.6276666666667
+82,619,29.7603333333333
+82,620,22.098
+82,621,29.7815
+82,622,24.1935
+82,623,30.0143333333333
+82,624,26.6065
+82,625,27.305
+82,626,29.464
+82,627,30.6281666666667
+82,628,25.0401666666667
+82,629,26.0138333333333
+82,630,30.3953333333333
+82,631,26.8605
+82,632,29.6333333333333
+82,633,28.575
+82,634,24.8708333333333
+82,635,24.1935
+82,636,24.4051666666667
+82,637,25.3365
+82,638,21.8228333333333
+82,639,27.1568333333333
+82,640,23.622
+82,641,34.9673333333333
+82,642,30.3953333333333
+82,643,28.6173333333333
+82,644,28.6385
+82,645,22.7541666666667
+82,646,28.7655
+82,647,31.1361666666667
+82,648,27.7495
+82,649,20.5105
+82,650,35.687
+82,651,29.6756666666667
+82,652,20.1295
+82,653,24.5533333333333
+82,654,23.6431666666667
+82,655,29.6333333333333
+82,656,28.2786666666667
+82,657,27.6648333333333
+82,658,25.2306666666667
+82,659,31.2631666666667
+82,660,28.575
+82,661,20.4681666666667
+82,662,24.9978333333333
+82,663,26.6488333333333
+82,664,20.9973333333333
+82,665,26.7758333333333
+82,666,22.6271666666667
+82,667,21.5053333333333
+82,668,24.1935
+82,669,29.1888333333333
+82,670,31.242
+82,671,28.2363333333333
+82,672,23.6643333333333
+82,673,26.6911666666667
+82,674,27.8553333333333
+82,675,26.2255
+82,676,24.0665
+82,677,21.1031666666667
+82,678,27.5166666666667
+82,679,34.9885
+82,680,25.908
+82,681,34.6286666666667
+82,682,28.5961666666667
+82,683,29.6121666666667
+82,684,23.8336666666667
+82,685,22.5848333333333
+82,686,26.1408333333333
+82,687,31.1785
+82,688,27.6013333333333
+82,689,31.496
+82,690,24.1723333333333
+82,691,26.7335
+82,692,32.766
+82,693,27.94
+82,694,28.1728333333333
+82,695,20.7856666666667
+82,696,20.955
+82,697,28.448
+82,698,27.8976666666667
+82,699,27.051
+82,700,26.9451666666667
+82,701,28.7655
+82,702,27.8341666666667
+82,703,27.4743333333333
+82,704,28.7231666666667
+82,705,23.8548333333333
+82,706,16.637
+82,707,34.3111666666667
+82,708,24.4898333333333
+82,709,30.8186666666667
+82,710,29.6333333333333
+82,711,24.4475
+82,712,30.1413333333333
+82,713,29.21
+82,714,23.622
+82,715,31.75
+82,716,26.7123333333333
+82,717,27.1568333333333
+82,718,20.0448333333333
+82,719,23.9818333333333
+82,720,36.195
+82,721,32.9353333333333
+82,722,24.6591666666667
+82,723,23.7066666666667
+82,724,23.0081666666667
+82,725,30.2048333333333
+82,726,23.4103333333333
+82,727,26.9663333333333
+82,728,28.2363333333333
+82,729,25.8445
+82,730,29.6545
+82,731,28.6808333333333
+82,732,34.8615
+82,733,23.5373333333333
+82,734,26.2678333333333
+82,735,28.575
+82,736,30.988
+82,737,28.321
+82,738,35.2848333333333
+82,739,22.606
+82,740,25.3153333333333
+82,741,29.5486666666667
+82,742,27.5166666666667
+82,743,31.6018333333333
+82,744,31.5383333333333
+82,745,31.1996666666667
+82,746,28.2786666666667
+82,747,36.7665
+82,748,28.575
+82,749,27.3473333333333
+82,750,16.3406666666667
+82,751,31.4325
+82,752,27.5801666666667
+82,753,27.5378333333333
+82,754,25.4423333333333
+82,755,22.7541666666667
+82,756,33.02
+82,757,26.5218333333333
+82,758,26.2466666666667
+82,759,33.6761666666667
+82,760,27.8765
+82,761,29.6121666666667
+82,762,30.226
+82,763,31.7711666666667
+82,764,26.1196666666667
+82,765,30.9033333333333
+82,766,30.1413333333333
+82,767,27.813
+82,768,24.3628333333333
+82,769,23.0716666666667
+82,770,24.13
+82,771,32.639
+82,772,32.1521666666667
+82,773,22.6695
+82,774,29.8873333333333
+82,775,31.1996666666667
+82,776,23.749
+82,777,23.6643333333333
+82,778,22.7118333333333
+82,779,26.8181666666667
+82,780,35.1155
+82,781,25.7175
+82,782,24.1088333333333
+82,783,33.9513333333333
+82,784,18.6055
+82,785,28.6385
+82,786,29.3158333333333
+82,787,26.2678333333333
+82,788,30.0778333333333
+82,789,29.3793333333333
+82,790,24.7861666666667
+82,791,30.0778333333333
+82,792,33.528
+82,793,35.8986666666667
+82,794,25.273
+82,795,30.8398333333333
+82,796,28.4268333333333
+82,797,30.48
+82,798,27.6013333333333
+82,799,27.6648333333333
+82,800,24.8073333333333
+82,801,30.48
+82,802,29.2946666666667
+82,803,27.6013333333333
+82,804,25.7598333333333
+82,805,24.6803333333333
+82,806,28.2786666666667
+82,807,26.0561666666667
+82,808,32.258
+82,809,29.5698333333333
+82,810,24.2993333333333
+82,811,26.5853333333333
+82,812,25.8656666666667
+82,813,33.0411666666667
+82,814,21.2936666666667
+82,815,29.0406666666667
+82,816,26.9663333333333
+82,817,23.8125
+82,818,25.4211666666667
+82,819,22.5848333333333
+82,820,30.2048333333333
+82,821,28.5961666666667
+82,822,23.7278333333333
+82,823,25.4423333333333
+82,824,22.9658333333333
+82,825,20.9126666666667
+82,826,29.7391666666667
+82,827,21.4206666666667
+82,828,23.7701666666667
+82,829,25.1671666666667
+82,830,27.559
+82,831,29.9508333333333
+82,832,36.8511666666667
+82,833,26.035
+82,834,32.0251666666667
+82,835,24.4263333333333
+82,836,29.5698333333333
+82,837,29.7603333333333
+82,838,30.0355
+82,839,32.0675
+82,840,22.6483333333333
+82,841,20.8915
+82,842,22.0345
+82,843,19.7485
+82,844,32.8718333333333
+82,845,32.4273333333333
+82,846,31.3055
+82,847,31.5383333333333
+82,848,29.7815
+82,849,31.6865
+82,850,22.0133333333333
+82,851,21.7381666666667
+82,852,26.5218333333333
+82,853,29.591
+82,854,23.9183333333333
+82,855,29.8238333333333
+82,856,29.5275
+82,857,23.114
+82,858,23.6855
+82,859,26.6488333333333
+82,860,25.3365
+82,861,28.8078333333333
+82,862,27.6225
+82,863,22.2038333333333
+82,864,27.0721666666667
+82,865,31.0515
+82,866,24.5745
+82,867,31.0726666666667
+82,868,30.3318333333333
+82,869,16.8063333333333
+82,870,26.0773333333333
+82,871,25.5905
+82,872,23.6855
+82,873,29.4005
+82,874,29.8661666666667
+82,875,32.5331666666667
+82,876,26.2043333333333
+82,877,30.6281666666667
+82,878,25.908
+82,879,27.8976666666667
+82,880,21.1243333333333
+82,881,30.6281666666667
+82,882,27.686
+82,883,25.781
+82,884,24.892
+82,885,25.8021666666667
+82,886,32.512
+82,887,31.2208333333333
+82,888,29.6121666666667
+82,889,27.305
+82,890,33.1681666666667
+82,891,24.6803333333333
+82,892,33.9301666666667
+82,893,28.2786666666667
+82,894,30.3953333333333
+82,895,21.209
+82,896,25.527
+82,897,31.6865
+82,898,21.6323333333333
+82,899,25.8021666666667
+82,900,30.4588333333333
+82,901,29.0195
+82,902,27.2838333333333
+82,903,31.0726666666667
+82,904,25.4846666666667
+82,905,32.893
+82,906,32.9988333333333
+82,907,21.8228333333333
+82,908,24.5533333333333
+82,909,30.9033333333333
+82,910,26.2043333333333
+82,911,32.6601666666667
+82,912,30.7128333333333
+82,913,22.8388333333333
+82,914,21.8016666666667
+82,915,23.7066666666667
+82,916,35.6446666666667
+82,917,21.5476666666667
+82,918,23.7701666666667
+82,919,22.5213333333333
+82,920,30.48
+82,921,28.9771666666667
+82,922,29.8026666666667
+82,923,22.733
+82,924,25.8445
+82,925,25.9291666666667
+82,926,25.7598333333333
+82,927,22.606
+82,928,28.9771666666667
+82,929,22.9446666666667
+82,930,25.3153333333333
+82,931,29.1888333333333
+82,932,28.8078333333333
+82,933,27.6013333333333
+82,934,30.4376666666667
+82,935,26.2678333333333
+82,936,20.7221666666667
+82,937,28.5115
+82,938,21.1878333333333
+82,939,22.3731666666667
+82,940,27.0721666666667
+82,941,21.0608333333333
+82,942,24.003
+82,943,37.6131666666667
+82,944,27.3473333333333
+82,945,29.4216666666667
+82,946,34.798
+82,947,28.8925
+82,948,24.7226666666667
+82,949,33.9936666666667
+82,950,29.3158333333333
+82,951,25.0825
+82,952,29.0195
+82,953,21.3783333333333
+82,954,20.8915
+82,955,28.7443333333333
+82,956,24.4051666666667
+82,957,30.6281666666667
+82,958,29.2311666666667
+82,959,22.6695
+82,960,27.5166666666667
+82,961,25.7598333333333
+82,962,31.7923333333333
+82,963,27.1991666666667
+82,964,31.6018333333333
+82,965,22.479
+82,966,33.655
+82,967,27.9188333333333
+82,968,24.638
+82,969,19.7696666666667
+82,970,27.7283333333333
+82,971,29.083
+82,972,32.8506666666667
+82,973,25.654
+82,974,27.0086666666667
+82,975,27.1145
+82,976,32.5966666666667
+82,977,35.3906666666667
+82,978,24.9555
+82,979,31.2208333333333
+82,980,28.8501666666667
+82,981,31.1573333333333
+82,982,25.6963333333333
+82,983,26.5218333333333
+82,984,27.3896666666667
+82,985,30.988
+82,986,25.8868333333333
+82,987,30.7975
+82,988,25.1036666666667
+82,989,26.5218333333333
+82,990,30.0778333333333
+82,991,22.9446666666667
+82,992,29.7815
+82,993,33.401
+82,994,23.9606666666667
+82,995,30.3106666666667
+82,996,27.7495
+82,997,30.5011666666667
+82,998,23.622
+82,999,24.0453333333333
+82,1000,27.8765
+83,1,15.7099
+83,2,15.5194
+83,3,15.2357666666667
+83,4,15.8707666666667
+83,5,21.1031666666667
+83,6,18.4700333333333
+83,7,17.8138666666667
+83,8,15.5109333333333
+83,9,20.1041
+83,10,17.5598666666667
+83,11,19.5072
+83,12,17.2677666666667
+83,13,15.1976666666667
+83,14,15.2273
+83,15,18.1102
+83,16,16.1417
+83,17,15.8707666666667
+83,18,17.1111333333333
+83,19,16.3576
+83,20,20.7772
+83,21,18.0890333333333
+83,22,17.6022
+83,23,13.7075333333333
+83,24,17.8308
+83,25,19.8755
+83,26,14.2832666666667
+83,27,15.6845
+83,28,20.6205666666667
+83,29,13.2164666666667
+83,30,15.2103666666667
+83,31,16.1417
+83,32,15.8877
+83,33,13.0386666666667
+83,34,16.9926
+83,35,18.4404
+83,36,17.78
+83,37,19.1092666666667
+83,38,17.0561
+83,39,13.8980333333333
+83,40,16.4211
+83,41,14.0250333333333
+83,42,12.9667
+83,43,19.3548
+83,44,17.8604333333333
+83,45,21.1836
+83,46,16.8867666666667
+83,47,17.7757666666667
+83,48,17.7461333333333
+83,49,17.3312666666667
+83,50,17.0391666666667
+83,51,16.4803666666667
+83,52,17.4328666666667
+83,53,12.8608666666667
+83,54,18.9992
+83,55,18.2075666666667
+83,56,18.2372
+83,57,16.9460333333333
+83,58,19.5537666666667
+83,59,14.3848666666667
+83,60,16.6073666666667
+83,61,15.7226
+83,62,16.7301333333333
+83,63,17.3355
+83,64,14.4272
+83,65,15.6802666666667
+83,66,15.4601333333333
+83,67,15.3585333333333
+83,68,17.4582666666667
+83,69,14.4272
+83,70,18.161
+83,71,17.6826333333333
+83,72,18.0636333333333
+83,73,15.6379333333333
+83,74,17.1407666666667
+83,75,15.0029333333333
+83,76,14.0631333333333
+83,77,17.9281666666667
+83,78,18.1821666666667
+83,79,13.5297333333333
+83,80,19.0838666666667
+83,81,18.5123666666667
+83,82,16.3406666666667
+83,83,15.5236333333333
+83,84,18.3896
+83,85,18.4404
+83,86,14.1308666666667
+83,87,16.5227
+83,88,21.4587666666667
+83,89,16.4380333333333
+83,90,14.6642666666667
+83,91,13.4196666666667
+83,92,19.3802
+83,93,17.1619333333333
+83,94,13.9996333333333
+83,95,15.3797
+83,96,16.3322
+83,97,16.9079333333333
+83,98,16.6285333333333
+83,99,14.9775333333333
+83,100,15.7268333333333
+83,101,14.4907
+83,102,16.4846
+83,103,15.9808333333333
+83,104,17.7884666666667
+83,105,19.9474666666667
+83,106,15.4474333333333
+83,107,17.3905333333333
+83,108,16.2729333333333
+83,109,14.8547666666667
+83,110,17.1788666666667
+83,111,18.8552666666667
+83,112,17.1111333333333
+83,113,15.1045333333333
+83,114,18.8341
+83,115,13.6567333333333
+83,116,17.4074666666667
+83,117,17.0730333333333
+83,118,18.0255333333333
+83,119,14.5499666666667
+83,120,16.1628666666667
+83,121,14.1732
+83,122,15.2103666666667
+83,123,21.2217
+83,124,14.9775333333333
+83,125,18.2795333333333
+83,126,14.8547666666667
+83,127,19.4691
+83,128,13.2376333333333
+83,129,19.8035333333333
+83,130,18.7409666666667
+83,131,17.7588333333333
+83,132,18.8510333333333
+83,133,16.1247666666667
+83,134,17.3905333333333
+83,135,17.8646666666667
+83,136,16.0612666666667
+83,137,13.5424333333333
+83,138,17.7546
+83,139,14.9987
+83,140,14.3002
+83,141,17.7546
+83,142,13.7371666666667
+83,143,18.7028666666667
+83,144,18.6393666666667
+83,145,18.1567666666667
+83,146,16.3787666666667
+83,147,14.2197666666667
+83,148,14.5965333333333
+83,149,12.7973666666667
+83,150,16.5862
+83,151,17.2677666666667
+83,152,17.6149
+83,153,13.5763
+83,154,15.7437666666667
+83,155,14.0843
+83,156,17.1534666666667
+83,157,15.875
+83,158,16.0316333333333
+83,159,13.843
+83,160,17.272
+83,161,15.7945666666667
+83,162,18.7071
+83,163,14.4653
+83,164,16.5015333333333
+83,165,15.9215666666667
+83,166,18.8552666666667
+83,167,14.8759333333333
+83,168,16.8063333333333
+83,169,17.8435
+83,170,15.0537333333333
+83,171,15.7861
+83,172,14.3721666666667
+83,173,17.6276
+83,174,20.8915
+83,175,15.6929666666667
+83,176,13.9022666666667
+83,177,16.8359666666667
+83,178,16.3957
+83,179,15.1849666666667
+83,180,14.3002
+83,181,15.4559
+83,182,16.7343666666667
+83,183,14.6304
+83,184,13.9488333333333
+83,185,16.2009666666667
+83,186,19.5241333333333
+83,187,15.7437666666667
+83,188,20.1676
+83,189,18.5589333333333
+83,190,16.5650333333333
+83,191,18.0213
+83,192,15.1553333333333
+83,193,19.2870666666667
+83,194,16.8952333333333
+83,195,17.1746333333333
+83,196,17.4582666666667
+83,197,17.3101
+83,198,14.3679333333333
+83,199,18.7028666666667
+83,200,15.4643666666667
+83,201,16.6285333333333
+83,202,16.2983333333333
+83,203,16.0570333333333
+83,204,15.0876
+83,205,20.3327
+83,206,13.9022666666667
+83,207,19.3632666666667
+83,208,20.6544333333333
+83,209,13.0386666666667
+83,210,21.1836
+83,211,17.7165
+83,212,16.8232666666667
+83,213,17.7334333333333
+83,214,17.2847
+83,215,18.5547
+83,216,15.3754666666667
+83,217,16.6327666666667
+83,218,15.9046333333333
+83,219,22.1149333333333
+83,220,14.1732
+83,221,15.6125333333333
+83,222,15.8242
+83,223,19.0796333333333
+83,224,17.2677666666667
+83,225,16.8698333333333
+83,226,16.0782
+83,227,14.7870333333333
+83,228,18.3218666666667
+83,229,19.4902666666667
+83,230,14.7997333333333
+83,231,18.4615666666667
+83,232,16.5565666666667
+83,233,19.0034333333333
+83,234,17.7715333333333
+83,235,15.3797
+83,236,16.8402
+83,237,17.0857333333333
+83,238,18.3472666666667
+83,239,15.7607
+83,240,15.5998333333333
+83,241,17.6572333333333
+83,242,20.7094666666667
+83,243,16.1205333333333
+83,244,14.8505333333333
+83,245,18.6182
+83,246,18.5504666666667
+83,247,17.2804666666667
+83,248,17.0137666666667
+83,249,20.5951666666667
+83,250,16.0570333333333
+83,251,18.1440666666667
+83,252,16.383
+83,253,15.5109333333333
+83,254,16.8994666666667
+83,255,14.9817666666667
+83,256,14.5796
+83,257,19.8924333333333
+83,258,15.4347333333333
+83,259,21.8524666666667
+83,260,18.6817
+83,261,15.7353
+83,262,12.8566333333333
+83,263,16.7089666666667
+83,264,21.209
+83,265,14.4483666666667
+83,266,16.9502666666667
+83,267,19.4691
+83,268,13.8091333333333
+83,269,17.1619333333333
+83,270,18.4361666666667
+83,271,14.7870333333333
+83,272,19.4521666666667
+83,273,14.9436666666667
+83,274,20.8110666666667
+83,275,18.0467
+83,276,18.4742666666667
+83,277,15.5998333333333
+83,278,14.5415
+83,279,16.129
+83,280,17.4455666666667
+83,281,19.0796333333333
+83,282,19.5537666666667
+83,283,16.7936333333333
+83,284,17.5175333333333
+83,285,13.1656666666667
+83,286,16.4211
+83,287,13.7710333333333
+83,288,16.8444333333333
+83,289,18.1821666666667
+83,290,17.2804666666667
+83,291,20.6375
+83,292,17.0053
+83,293,16.5692666666667
+83,294,18.9187666666667
+83,295,16.0147
+83,296,16.51
+83,297,17.5006
+83,298,15.7607
+83,299,19.8458666666667
+83,300,16.4380333333333
+83,301,16.6497
+83,302,17.5556333333333
+83,303,15.8326666666667
+83,304,16.4549666666667
+83,305,16.7174333333333
+83,306,17.3524333333333
+83,307,17.3312666666667
+83,308,13.5339666666667
+83,309,18.4531
+83,310,14.5499666666667
+83,311,16.3533666666667
+83,312,23.2579333333333
+83,313,16.8529
+83,314,18.8933666666667
+83,315,20.2988333333333
+83,316,16.1501666666667
+83,317,20.3581
+83,318,18.3091666666667
+83,319,18.4277
+83,320,15.494
+83,321,17.4117
+83,322,17.3058666666667
+83,323,18.7917666666667
+83,324,16.1840333333333
+83,325,18.0297666666667
+83,326,16.0147
+83,327,16.9502666666667
+83,328,16.8783
+83,329,19.9982666666667
+83,330,16.2941
+83,331,13.6059333333333
+83,332,16.4592
+83,333,16.1586333333333
+83,334,15.9681333333333
+83,335,17.5895
+83,336,17.5387
+83,337,19.0415333333333
+83,338,16.0951333333333
+83,339,14.3594666666667
+83,340,18.7240333333333
+83,341,16.8825333333333
+83,342,17.1026666666667
+83,343,15.1426333333333
+83,344,19.2151
+83,345,20.0406
+83,346,22.0048666666667
+83,347,19.3886666666667
+83,348,16.5354
+83,349,16.9672
+83,350,19.1431333333333
+83,351,15.5575
+83,352,16.8190333333333
+83,353,17.4413333333333
+83,354,16.7767
+83,355,16.0401
+83,356,15.494
+83,357,16.6835666666667
+83,358,15.5278666666667
+83,359,15.6633333333333
+83,360,15.6548666666667
+83,361,17.5852666666667
+83,362,15.9808333333333
+83,363,18.5970333333333
+83,364,20.6967666666667
+83,365,18.4488666666667
+83,366,14.9987
+83,367,17.7207333333333
+83,368,14.3086666666667
+83,369,20.0448333333333
+83,370,20.1803
+83,371,18.0975
+83,372,17.4582666666667
+83,373,17.0264666666667
+83,374,18.1906333333333
+83,375,15.2484666666667
+83,376,15.4474333333333
+83,377,20.4681666666667
+83,378,16.4888333333333
+83,379,17.5217666666667
+83,380,19.0881
+83,381,14.8547666666667
+83,382,14.6261666666667
+83,383,14.5161
+83,384,17.1577
+83,385,18.1398333333333
+83,386,14.9563666666667
+83,387,16.8402
+83,388,15.0833666666667
+83,389,17.6953333333333
+83,390,16.5481
+83,391,16.0231666666667
+83,392,13.5593666666667
+83,393,16.383
+83,394,16.891
+83,395,17.8943
+83,396,16.9037
+83,397,17.4582666666667
+83,398,20.7941333333333
+83,399,16.4338
+83,400,15.9808333333333
+83,401,17.9874333333333
+83,402,14.2113
+83,403,19.1304333333333
+83,404,16.1798
+83,405,16.2729333333333
+83,406,18.0467
+83,407,16.6835666666667
+83,408,17.0815
+83,409,15.8877
+83,410,17.8308
+83,411,14.8759333333333
+83,412,15.5363333333333
+83,413,15.1257
+83,414,13.8303
+83,415,19.5368333333333
+83,416,14.6177
+83,417,18.8806666666667
+83,418,13.9403666666667
+83,419,16.8486666666667
+83,420,18.7240333333333
+83,421,15.1214666666667
+83,422,21.7762666666667
+83,423,17.8900666666667
+83,424,17.1831
+83,425,16.0189333333333
+83,426,14.4272
+83,427,16.3110333333333
+83,428,17.3736
+83,429,16.7386
+83,430,14.1605
+83,431,13.6906
+83,432,17.3482
+83,433,16.6920333333333
+83,434,16.7936333333333
+83,435,12.9455333333333
+83,436,15.2781
+83,437,17.2931666666667
+83,438,14.4060333333333
+83,439,15.7014333333333
+83,440,15.7395333333333
+83,441,13.9403666666667
+83,442,17.3736
+83,443,16.8952333333333
+83,444,17.4371
+83,445,16.0316333333333
+83,446,13.1572
+83,447,18.7748333333333
+83,448,15.3754666666667
+83,449,15.8919333333333
+83,450,16.9968333333333
+83,451,17.8562
+83,452,18.7071
+83,453,17.2677666666667
+83,454,13.8514666666667
+83,455,17.7292
+83,456,18.6393666666667
+83,457,16.2263666666667
+83,458,17.6106666666667
+83,459,17.9832
+83,460,16.9375666666667
+83,461,18.6139666666667
+83,462,17.1365333333333
+83,463,16.1544
+83,464,16.3660666666667
+83,465,17.8435
+83,466,13.7541
+83,467,17.7715333333333
+83,468,19.7654333333333
+83,469,16.9883666666667
+83,470,18.0636333333333
+83,471,17.3905333333333
+83,472,19.1516
+83,473,15.0368
+83,474,16.3533666666667
+83,475,16.6751
+83,476,18.4912
+83,477,17.7969333333333
+83,478,15.6294666666667
+83,479,21.8609333333333
+83,480,18.4319333333333
+83,481,13.5339666666667
+83,482,15.5109333333333
+83,483,14.6431
+83,484,16.9375666666667
+83,485,15.3162
+83,486,15.5913666666667
+83,487,14.4060333333333
+83,488,15.24
+83,489,18.7240333333333
+83,490,16.7682333333333
+83,491,17.6487666666667
+83,492,16.4338
+83,493,15.1257
+83,494,15.4432
+83,495,16.0824333333333
+83,496,15.4897666666667
+83,497,15.0071666666667
+83,498,15.9342666666667
+83,499,17.1788666666667
+83,500,14.4737666666667
+83,501,15.748
+83,502,16.0443333333333
+83,503,17.2889333333333
+83,504,16.2898666666667
+83,505,20.828
+83,506,19.2574333333333
+83,507,14.0292666666667
+83,508,17.2042666666667
+83,509,15.8284333333333
+83,510,18.0213
+83,511,16.5904333333333
+83,512,15.3035
+83,513,14.4356666666667
+83,514,19.5537666666667
+83,515,14.0673666666667
+83,516,16.764
+83,517,14.4991666666667
+83,518,17.1323
+83,519,17.7969333333333
+83,520,15.7861
+83,521,16.4168666666667
+83,522,14.7574
+83,523,20.5232
+83,524,16.7978666666667
+83,525,16.4126333333333
+83,526,18.6012666666667
+83,527,16.5692666666667
+83,528,15.6802666666667
+83,529,19.3759666666667
+83,530,17.5344666666667
+83,531,15.3373666666667
+83,532,15.0410333333333
+83,533,17.6191333333333
+83,534,18.0424666666667
+83,535,17.6106666666667
+83,536,16.6708666666667
+83,537,15.3331333333333
+83,538,17.2000333333333
+83,539,18.0255333333333
+83,540,17.399
+83,541,16.0231666666667
+83,542,15.2696333333333
+83,543,20.7602666666667
+83,544,17.399
+83,545,16.6708666666667
+83,546,14.6812
+83,547,14.0885333333333
+83,548,16.8952333333333
+83,549,17.272
+83,550,15.8496
+83,551,17.4201666666667
+83,552,16.0570333333333
+83,553,15.1384
+83,554,17.8181
+83,555,15.3839333333333
+83,556,17.0815
+83,557,17.8308
+83,558,17.9747333333333
+83,559,16.9079333333333
+83,560,17.1111333333333
+83,561,18.5504666666667
+83,562,17.2550666666667
+83,563,18.0678666666667
+83,564,15.2146
+83,565,16.6073666666667
+83,566,17.7969333333333
+83,567,13.7117666666667
+83,568,17.4794333333333
+83,569,16.2771666666667
+83,570,16.5269333333333
+83,571,18.8891333333333
+83,572,19.3336333333333
+83,573,15.9131
+83,574,17.1238333333333
+83,575,16.2433
+83,576,14.9648333333333
+83,577,17.0772666666667
+83,578,15.0368
+83,579,16.6878
+83,580,15.7353
+83,581,19.2108666666667
+83,582,16.2898666666667
+83,583,16.2983333333333
+83,584,17.9832
+83,585,16.9418
+83,586,14.4441333333333
+83,587,15.2950333333333
+83,588,16.7597666666667
+83,589,13.6609666666667
+83,590,15.8665333333333
+83,591,18.6266666666667
+83,592,16.5184666666667
+83,593,17.399
+83,594,14.2578666666667
+83,595,14.8082
+83,596,16.9121666666667
+83,597,16.6793333333333
+83,598,20.8026
+83,599,16.2475333333333
+83,600,15.4855333333333
+83,601,15.0071666666667
+83,602,14.9013333333333
+83,603,13.6652
+83,604,14.9987
+83,605,14.3848666666667
+83,606,15.6337
+83,607,18.4742666666667
+83,608,16.7513
+83,609,16.3999333333333
+83,610,17.0942
+83,611,17.7673
+83,612,15.3373666666667
+83,613,13.6694333333333
+83,614,14.4272
+83,615,17.2423666666667
+83,616,14.8801666666667
+83,617,15.8877
+83,618,17.8223333333333
+83,619,16.2475333333333
+83,620,14.6558
+83,621,18.0255333333333
+83,622,16.5904333333333
+83,623,15.1849666666667
+83,624,17.5048333333333
+83,625,17.1407666666667
+83,626,14.7531666666667
+83,627,15.1511
+83,628,17.0137666666667
+83,629,14.1562666666667
+83,630,19.3844333333333
+83,631,14.4187333333333
+83,632,17.0603333333333
+83,633,15.8538333333333
+83,634,15.9088666666667
+83,635,13.0259666666667
+83,636,13.5001
+83,637,16.7809333333333
+83,638,13.9403666666667
+83,639,17.8562
+83,640,19.5791666666667
+83,641,18.4658
+83,642,17.2593
+83,643,15.7226
+83,644,17.5768
+83,645,17.2847
+83,646,17.2423666666667
+83,647,17.3270333333333
+83,648,22.2969666666667
+83,649,19.3294
+83,650,18.1102
+83,651,14.9436666666667
+83,652,16.5692666666667
+83,653,18.7367333333333
+83,654,17.4836666666667
+83,655,15.6548666666667
+83,656,21.7593333333333
+83,657,16.3279666666667
+83,658,20.4808666666667
+83,659,17.9281666666667
+83,660,17.3905333333333
+83,661,13.7541
+83,662,19.0288333333333
+83,663,14.5203333333333
+83,664,16.8148
+83,665,15.4305
+83,666,22.3223666666667
+83,667,15.5067
+83,668,14.4610666666667
+83,669,18.0805666666667
+83,670,19.7654333333333
+83,671,13.8599333333333
+83,672,17.8985333333333
+83,673,14.5034
+83,674,12.8354666666667
+83,675,17.0942
+83,676,16.0401
+83,677,15.6337
+83,678,20.1887666666667
+83,679,18.1567666666667
+83,680,18.7325
+83,681,13.1953
+83,682,14.4441333333333
+83,683,16.2052
+83,684,16.6751
+83,685,13.1783666666667
+83,686,16.4041666666667
+83,687,15.1892
+83,688,20.7137
+83,689,17.5133
+83,690,17.5979666666667
+83,691,17.8350333333333
+83,692,15.367
+83,693,15.3966333333333
+83,694,16.2729333333333
+83,695,15.6591
+83,696,16.5904333333333
+83,697,15.2273
+83,698,14.3340666666667
+83,699,13.5001
+83,700,15.9554333333333
+83,701,16.7386
+83,702,16.3533666666667
+83,703,17.1619333333333
+83,704,19.1304333333333
+83,705,19.1304333333333
+83,706,13.7244666666667
+83,707,15.0368
+83,708,13.3942666666667
+83,709,14.4399
+83,710,15.5744333333333
+83,711,16.9545
+83,712,19.0203666666667
+83,713,19.1304333333333
+83,714,16.5989
+83,715,19.8289333333333
+83,716,13.5763
+83,717,15.0283333333333
+83,718,14.2748
+83,719,14.0462
+83,720,15.5659666666667
+83,721,17.653
+83,722,18.9314666666667
+83,723,16.0782
+83,724,18.542
+83,725,14.8886333333333
+83,726,15.2103666666667
+83,727,17.9578
+83,728,15.8665333333333
+83,729,18.6224333333333
+83,730,13.4154333333333
+83,731,17.2635333333333
+83,732,15.6929666666667
+83,733,15.5194
+83,734,15.8877
+83,735,18.3261
+83,736,14.1689666666667
+83,737,18.2795333333333
+83,738,17.4074666666667
+83,739,19.8712666666667
+83,740,16.8021
+83,741,15.0579666666667
+83,742,15.2188333333333
+83,743,17.1196
+83,744,18.6182
+83,745,16.0782
+83,746,15.0833666666667
+83,747,18.1186666666667
+83,748,18.2795333333333
+83,749,16.3660666666667
+83,750,17.4328666666667
+83,751,16.0951333333333
+83,752,15.7226
+83,753,15.7353
+83,754,17.3016333333333
+83,755,21.1963
+83,756,14.8632333333333
+83,757,17.5429333333333
+83,758,19.5918666666667
+83,759,18.6224333333333
+83,760,15.9427333333333
+83,761,19.4225333333333
+83,762,16.5057666666667
+83,763,12.8143
+83,764,15.2908
+83,765,17.7927
+83,766,14.0462
+83,767,16.0993666666667
+83,768,14.9902333333333
+83,769,15.1045333333333
+83,770,15.3458333333333
+83,771,14.8971
+83,772,15.9300333333333
+83,773,15.6040666666667
+83,774,17.5937333333333
+83,775,16.4211
+83,776,17.6826333333333
+83,777,17.4117
+83,778,17.3058666666667
+83,779,13.2249333333333
+83,780,17.4709666666667
+83,781,17.1619333333333
+83,782,19.0584666666667
+83,783,15.2781
+83,784,18.8933666666667
+83,785,16.7343666666667
+83,786,15.9342666666667
+83,787,16.9164
+83,788,15.5998333333333
+83,789,14.0504333333333
+83,790,18.8129333333333
+83,791,18.5377666666667
+83,792,17.3228
+83,793,18.5039
+83,794,15.7607
+83,795,17.5175333333333
+83,796,19.8924333333333
+83,797,18.9611
+83,798,13.3307666666667
+83,799,17.8816
+83,800,18.4531
+83,801,18.5335333333333
+83,802,12.9116666666667
+83,803,15.5151666666667
+83,804,18.1356
+83,805,17.7503666666667
+83,806,15.8199666666667
+83,807,16.8063333333333
+83,808,16.0782
+83,809,17.2593
+83,810,16.0570333333333
+83,811,16.9672
+83,812,22.479
+83,813,17.0942
+83,814,18.1525333333333
+83,815,17.9578
+83,816,17.1619333333333
+83,817,20.9931
+83,818,21.6323333333333
+83,819,13.6863666666667
+83,820,19.5918666666667
+83,821,15.7395333333333
+83,822,19.3590333333333
+83,823,17.4117
+83,824,14.7447
+83,825,16.1840333333333
+83,826,18.1694666666667
+83,827,19.0034333333333
+83,828,16.8698333333333
+83,829,17.5048333333333
+83,830,16.5438666666667
+83,831,19.3421
+83,832,19.3421
+83,833,17.3439666666667
+83,834,13.4239
+83,835,16.2179
+83,836,15.8242
+83,837,15.2103666666667
+83,838,19.4056
+83,839,16.7682333333333
+83,840,17.0476333333333
+83,841,15.4305
+83,842,18.0721
+83,843,20.32
+83,844,15.3119666666667
+83,845,16.2475333333333
+83,846,15.7988
+83,847,15.6802666666667
+83,848,18.1313666666667
+83,849,16.1078333333333
+83,850,15.0410333333333
+83,851,19.8882
+83,852,15.1087666666667
+83,853,16.8190333333333
+83,854,17.0645666666667
+83,855,13.8853333333333
+83,856,14.4441333333333
+83,857,17.7334333333333
+83,858,15.2950333333333
+83,859,16.7132
+83,860,13.9615333333333
+83,861,18.7155666666667
+83,862,14.4991666666667
+83,863,18.0297666666667
+83,864,16.2687
+83,865,16.7597666666667
+83,866,16.7809333333333
+83,867,18.1271333333333
+83,868,16.6539333333333
+83,869,15.0664333333333
+83,870,14.5542
+83,871,16.4380333333333
+83,872,15.621
+83,873,14.7108333333333
+83,874,16.0993666666667
+83,875,19.4437
+83,876,17.7588333333333
+83,877,15.2315333333333
+83,878,15.2527
+83,879,20.1676
+83,880,13.9022666666667
+83,881,14.9521333333333
+83,882,16.2898666666667
+83,883,18.2245
+83,884,16.5269333333333
+83,885,20.1252666666667
+83,886,14.859
+83,887,17.8350333333333
+83,888,19.3082333333333
+83,889,18.8383333333333
+83,890,21.7974333333333
+83,891,19.1854666666667
+83,892,17.2593
+83,893,14.2578666666667
+83,894,13.3519333333333
+83,895,18.4912
+83,896,14.4526
+83,897,15.4643666666667
+83,898,16.3787666666667
+83,899,16.7174333333333
+83,900,16.7343666666667
+83,901,18.8722
+83,902,15.7395333333333
+83,903,19.3802
+83,904,18.1991
+83,905,15.8030333333333
+83,906,16.2941
+83,907,19.8543333333333
+83,908,19.4056
+83,909,17.9493333333333
+83,910,19.7654333333333
+83,911,15.9850666666667
+83,912,20.3919666666667
+83,913,16.6412333333333
+83,914,13.1445
+83,915,14.8632333333333
+83,916,18.7325
+83,917,16.9714333333333
+83,918,13.8091333333333
+83,919,14.4145
+83,920,16.2306
+83,921,16.1078333333333
+83,922,14.9775333333333
+83,923,13.9530666666667
+83,924,16.1628666666667
+83,925,15.4008666666667
+83,926,19.1008
+83,927,11.8025333333333
+83,928,15.8284333333333
+83,929,16.5904333333333
+83,930,18.0297666666667
+83,931,16.5438666666667
+83,932,14.7701
+83,933,16.5565666666667
+83,934,17.2296666666667
+83,935,13.1953
+83,936,18.8298666666667
+83,937,18.6139666666667
+83,938,15.8030333333333
+83,939,14.8928666666667
+83,940,15.875
+83,941,18.9272333333333
+83,942,18.9441666666667
+83,943,16.3322
+83,944,15.6591
+83,945,16.5565666666667
+83,946,17.7249666666667
+83,947,15.4770666666667
+83,948,17.5302333333333
+83,949,16.7978666666667
+83,950,16.9248666666667
+83,951,15.8284333333333
+83,952,12.6153333333333
+83,953,16.0824333333333
+83,954,20.5867
+83,955,12.8905
+83,956,17.4159333333333
+83,957,14.0081
+83,958,17.8011666666667
+83,959,19.3082333333333
+83,960,13.1487333333333
+83,961,16.9629666666667
+83,962,14.1943666666667
+83,963,17.6699333333333
+83,964,17.1788666666667
+83,965,16.8867666666667
+83,966,14.5796
+83,967,16.8571333333333
+83,968,16.7089666666667
+83,969,14.5753666666667
+83,970,18.6817
+83,971,15.3966333333333
+83,972,14.3594666666667
+83,973,17.2931666666667
+83,974,15.2611666666667
+83,975,13.9615333333333
+83,976,18.8933666666667
+83,977,13.8726333333333
+83,978,12.4544666666667
+83,979,13.8049
+83,980,15.2823333333333
+83,981,15.8919333333333
+83,982,17.5302333333333
+83,983,16.9672
+83,984,15.4643666666667
+83,985,18.3642
+83,986,14.1139333333333
+83,987,16.2898666666667
+83,988,15.8496
+83,989,14.7277666666667
+83,990,16.5015333333333
+83,991,16.7343666666667
+83,992,16.6878
+83,993,14.6177
+83,994,18.0551666666667
+83,995,16.5481
+83,996,20.1379666666667
+83,997,15.4432
+83,998,17.7334333333333
+83,999,16.4592
+83,1000,12.8397
+84,1,27.8553333333333
+84,2,25.4423333333333
+84,3,29.8873333333333
+84,4,24.2146666666667
+84,5,27.7706666666667
+84,6,27.3473333333333
+84,7,27.0933333333333
+84,8,26.6276666666667
+84,9,30.48
+84,10,23.7066666666667
+84,11,31.1573333333333
+84,12,25.8656666666667
+84,13,20.7433333333333
+84,14,28.5326666666667
+84,15,22.8176666666667
+84,16,18.5843333333333
+84,17,26.035
+84,18,20.1506666666667
+84,19,24.4263333333333
+84,20,26.289
+84,21,25.4423333333333
+84,22,25.2306666666667
+84,23,24.0876666666667
+84,24,22.1403333333333
+84,25,27.051
+84,26,23.1563333333333
+84,27,24.638
+84,28,28.9983333333333
+84,29,24.6803333333333
+84,30,23.622
+84,31,32.131
+84,32,25.3576666666667
+84,33,21.082
+84,34,25.2306666666667
+84,35,32.3003333333333
+84,36,23.114
+84,37,22.86
+84,38,26.3736666666667
+84,39,25.3576666666667
+84,40,19.7696666666667
+84,41,22.2673333333333
+84,42,19.6003333333333
+84,43,28.575
+84,44,26.2466666666667
+84,45,22.9023333333333
+84,46,21.6323333333333
+84,47,28.2786666666667
+84,48,27.7706666666667
+84,49,28.321
+84,50,27.432
+84,51,19.9813333333333
+84,52,16.6793333333333
+84,53,24.638
+84,54,24.638
+84,55,22.6906666666667
+84,56,21.844
+84,57,22.6483333333333
+84,58,19.431
+84,59,22.8176666666667
+84,60,26.0773333333333
+84,61,29.1253333333333
+84,62,25.527
+84,63,25.4
+84,64,22.098
+84,65,24.765
+84,66,27.6436666666667
+84,67,22.606
+84,68,22.4366666666667
+84,69,31.5383333333333
+84,70,26.3736666666667
+84,71,30.226
+84,72,27.94
+84,73,26.5006666666667
+84,74,17.907
+84,75,23.495
+84,76,29.3793333333333
+84,77,28.8713333333333
+84,78,28.9983333333333
+84,79,24.6803333333333
+84,80,26.543
+84,81,24.3416666666667
+84,82,21.4206666666667
+84,83,29.1676666666667
+84,84,31.7076666666667
+84,85,20.6163333333333
+84,86,28.4903333333333
+84,87,30.1413333333333
+84,88,31.5383333333333
+84,89,24.4263333333333
+84,90,27.3896666666667
+84,91,25.0613333333333
+84,92,19.8966666666667
+84,93,24.1723333333333
+84,94,25.3153333333333
+84,95,24.765
+84,96,23.8336666666667
+84,97,23.0716666666667
+84,98,22.2673333333333
+84,99,19.177
+84,100,24.8496666666667
+84,101,29.5063333333333
+84,102,24.2993333333333
+84,103,26.797
+84,104,22.225
+84,105,23.9183333333333
+84,106,29.337
+84,107,29.337
+84,108,25.8656666666667
+84,109,26.8816666666667
+84,110,26.797
+84,111,16.9333333333333
+84,112,29.972
+84,113,16.764
+84,114,24.003
+84,115,25.146
+84,116,25.146
+84,117,20.7856666666667
+84,118,28.956
+84,119,28.1093333333333
+84,120,21.5053333333333
+84,121,25.1036666666667
+84,122,24.2146666666667
+84,123,23.7066666666667
+84,124,19.8966666666667
+84,125,20.2776666666667
+84,126,23.0716666666667
+84,127,28.2786666666667
+84,128,27.0933333333333
+84,129,19.2193333333333
+84,130,24.6803333333333
+84,131,23.1986666666667
+84,132,17.4836666666667
+84,133,28.1093333333333
+84,134,21.9286666666667
+84,135,24.2146666666667
+84,136,20.447
+84,137,22.6906666666667
+84,138,26.67
+84,139,20.447
+84,140,26.0773333333333
+84,141,25.0613333333333
+84,142,27.3896666666667
+84,143,23.1986666666667
+84,144,29.4216666666667
+84,145,20.1506666666667
+84,146,19.812
+84,147,24.2146666666667
+84,148,22.9023333333333
+84,149,29.083
+84,150,28.1516666666667
+84,151,22.4366666666667
+84,152,22.6483333333333
+84,153,22.3096666666667
+84,154,25.8233333333333
+84,155,24.3416666666667
+84,156,21.7593333333333
+84,157,19.7696666666667
+84,158,23.7066666666667
+84,159,27.686
+84,160,22.606
+84,161,21.5053333333333
+84,162,23.241
+84,163,28.448
+84,164,26.6276666666667
+84,165,21.336
+84,166,19.7696666666667
+84,167,24.2993333333333
+84,168,22.6906666666667
+84,169,19.2193333333333
+84,170,27.4743333333333
+84,171,20.2353333333333
+84,172,25.6963333333333
+84,173,34.29
+84,174,30.6493333333333
+84,175,21.8016666666667
+84,176,20.955
+84,177,30.4376666666667
+84,178,28.702
+84,179,20.193
+84,180,20.9973333333333
+84,181,22.8176666666667
+84,182,22.7753333333333
+84,183,24.511
+84,184,24.892
+84,185,22.4366666666667
+84,186,28.5326666666667
+84,187,34.544
+84,188,26.4583333333333
+84,189,26.7123333333333
+84,190,22.6483333333333
+84,191,27.9823333333333
+84,192,26.6276666666667
+84,193,25.654
+84,194,23.495
+84,195,26.416
+84,196,20.1083333333333
+84,197,28.194
+84,198,26.6276666666667
+84,199,25.9503333333333
+84,200,25.273
+84,201,25.0613333333333
+84,202,22.6906666666667
+84,203,21.0396666666667
+84,204,20.828
+84,205,28.0246666666667
+84,206,21.971
+84,207,29.5486666666667
+84,208,23.4103333333333
+84,209,20.9973333333333
+84,210,29.083
+84,211,25.019
+84,212,25.3153333333333
+84,213,21.463
+84,214,20.701
+84,215,24.638
+84,216,22.733
+84,217,26.3313333333333
+84,218,27.1356666666667
+84,219,19.558
+84,220,19.9813333333333
+84,221,30.1836666666667
+84,222,25.3576666666667
+84,223,23.4526666666667
+84,224,21.717
+84,225,24.892
+84,226,22.5636666666667
+84,227,26.67
+84,228,23.241
+84,229,26.2466666666667
+84,230,21.5476666666667
+84,231,29.8026666666667
+84,232,24.8496666666667
+84,233,23.8336666666667
+84,234,21.8863333333333
+84,235,20.701
+84,236,24.13
+84,237,30.226
+84,238,21.8016666666667
+84,239,23.749
+84,240,24.8496666666667
+84,241,25.654
+84,242,23.4103333333333
+84,243,23.5373333333333
+84,244,16.4253333333333
+84,245,20.6163333333333
+84,246,21.7593333333333
+84,247,23.241
+84,248,23.9606666666667
+84,249,26.8816666666667
+84,250,26.8816666666667
+84,251,28.4903333333333
+84,252,25.4
+84,253,26.0773333333333
+84,254,24.5956666666667
+84,255,31.1573333333333
+84,256,23.622
+84,257,23.368
+84,258,20.066
+84,259,28.7443333333333
+84,260,30.0143333333333
+84,261,18.9653333333333
+84,262,22.987
+84,263,22.225
+84,264,31.0726666666667
+84,265,23.368
+84,266,23.495
+84,267,27.8976666666667
+84,268,32.5543333333333
+84,269,21.2936666666667
+84,270,26.1196666666667
+84,271,20.447
+84,272,25.4
+84,273,24.5533333333333
+84,274,32.512
+84,275,20.193
+84,276,28.7866666666667
+84,277,28.702
+84,278,22.8176666666667
+84,279,20.9126666666667
+84,280,17.3143333333333
+84,281,28.067
+84,282,30.8186666666667
+84,283,25.781
+84,284,28.575
+84,285,24.4686666666667
+84,286,28.7866666666667
+84,287,25.146
+84,288,24.4686666666667
+84,289,27.7283333333333
+84,290,21.336
+84,291,22.0133333333333
+84,292,23.5796666666667
+84,293,20.9126666666667
+84,294,26.3313333333333
+84,295,26.2043333333333
+84,296,25.527
+84,297,24.5956666666667
+84,298,25.5693333333333
+84,299,27.4743333333333
+84,300,27.4743333333333
+84,301,21.209
+84,302,24.9766666666667
+84,303,22.7753333333333
+84,304,26.035
+84,305,24.511
+84,306,30.607
+84,307,21.844
+84,308,24.2993333333333
+84,309,21.1243333333333
+84,310,27.0086666666667
+84,311,20.1506666666667
+84,312,21.5476666666667
+84,313,26.67
+84,314,23.5373333333333
+84,315,30.0143333333333
+84,316,29.2523333333333
+84,317,24.2146666666667
+84,318,24.0453333333333
+84,319,25.9503333333333
+84,320,25.0613333333333
+84,321,30.9033333333333
+84,322,27.432
+84,323,27.9823333333333
+84,324,23.114
+84,325,22.733
+84,326,25.7386666666667
+84,327,24.7226666666667
+84,328,26.4583333333333
+84,329,29.1253333333333
+84,330,22.6906666666667
+84,331,30.8186666666667
+84,332,26.289
+84,333,22.86
+84,334,26.3313333333333
+84,335,24.7226666666667
+84,336,26.7546666666667
+84,337,26.7123333333333
+84,338,23.749
+84,339,30.226
+84,340,26.2043333333333
+84,341,24.4263333333333
+84,342,19.7273333333333
+84,343,22.6483333333333
+84,344,27.1356666666667
+84,345,21.844
+84,346,23.368
+84,347,23.6643333333333
+84,348,19.431
+84,349,22.987
+84,350,29.8026666666667
+84,351,21.3783333333333
+84,352,20.066
+84,353,24.765
+84,354,25.4846666666667
+84,355,21.844
+84,356,26.0773333333333
+84,357,25.781
+84,358,20.7856666666667
+84,359,32.4696666666667
+84,360,22.3096666666667
+84,361,27.559
+84,362,30.2683333333333
+84,363,22.352
+84,364,21.6746666666667
+84,365,24.9766666666667
+84,366,26.4583333333333
+84,367,18.2456666666667
+84,368,26.543
+84,369,29.718
+84,370,19.685
+84,371,31.877
+84,372,24.9343333333333
+84,373,28.9136666666667
+84,374,28.956
+84,375,22.3943333333333
+84,376,18.0763333333333
+84,377,25.6116666666667
+84,378,27.305
+84,379,22.6483333333333
+84,380,26.8393333333333
+84,381,24.9343333333333
+84,382,26.3313333333333
+84,383,27.051
+84,384,21.5053333333333
+84,385,23.3256666666667
+84,386,23.7913333333333
+84,387,24.892
+84,388,26.797
+84,389,25.1036666666667
+84,390,25.3576666666667
+84,391,25.4423333333333
+84,392,22.479
+84,393,25.781
+84,394,30.099
+84,395,25.3576666666667
+84,396,23.4103333333333
+84,397,28.9136666666667
+84,398,30.0566666666667
+84,399,30.6493333333333
+84,400,30.607
+84,401,23.622
+84,402,28.8713333333333
+84,403,25.273
+84,404,26.4583333333333
+84,405,28.575
+84,406,27.305
+84,407,25.7386666666667
+84,408,28.4903333333333
+84,409,22.6483333333333
+84,410,21.8016666666667
+84,411,18.5843333333333
+84,412,27.0086666666667
+84,413,21.844
+84,414,22.225
+84,415,33.02
+84,416,19.3463333333333
+84,417,22.5213333333333
+84,418,24.257
+84,419,19.6426666666667
+84,420,25.146
+84,421,25.4423333333333
+84,422,27.2626666666667
+84,423,30.5646666666667
+84,424,22.3943333333333
+84,425,23.9606666666667
+84,426,26.797
+84,427,29.972
+84,428,21.4206666666667
+84,429,24.6803333333333
+84,430,23.0293333333333
+84,431,21.082
+84,432,22.733
+84,433,24.6803333333333
+84,434,25.3153333333333
+84,435,25.273
+84,436,25.3153333333333
+84,437,18.161
+84,438,30.3953333333333
+84,439,23.8336666666667
+84,440,23.7913333333333
+84,441,24.2146666666667
+84,442,23.241
+84,443,24.5956666666667
+84,444,23.9606666666667
+84,445,27.2626666666667
+84,446,26.0773333333333
+84,447,20.9973333333333
+84,448,23.241
+84,449,21.0396666666667
+84,450,29.718
+84,451,26.035
+84,452,25.1036666666667
+84,453,19.304
+84,454,21.463
+84,455,22.098
+84,456,23.9183333333333
+84,457,21.6746666666667
+84,458,29.1253333333333
+84,459,21.5476666666667
+84,460,20.701
+84,461,27.7706666666667
+84,462,21.2936666666667
+84,463,25.9926666666667
+84,464,26.3736666666667
+84,465,24.4686666666667
+84,466,26.3736666666667
+84,467,19.9813333333333
+84,468,27.559
+84,469,27.94
+84,470,20.1506666666667
+84,471,23.1986666666667
+84,472,24.3416666666667
+84,473,23.5796666666667
+84,474,26.67
+84,475,22.9023333333333
+84,476,21.844
+84,477,24.2146666666667
+84,478,25.6116666666667
+84,479,28.0246666666667
+84,480,25.019
+84,481,26.289
+84,482,28.3633333333333
+84,483,30.353
+84,484,21.971
+84,485,20.574
+84,486,21.9286666666667
+84,487,27.432
+84,488,24.257
+84,489,19.7696666666667
+84,490,25.4
+84,491,20.6586666666667
+84,492,27.178
+84,493,25.5693333333333
+84,494,24.5956666666667
+84,495,23.368
+84,496,25.3576666666667
+84,497,23.749
+84,498,26.8393333333333
+84,499,22.987
+84,500,27.3896666666667
+84,501,27.8976666666667
+84,502,30.3106666666667
+84,503,32.4696666666667
+84,504,27.0086666666667
+84,505,18.4996666666667
+84,506,24.5956666666667
+84,507,24.13
+84,508,25.9926666666667
+84,509,25.3153333333333
+84,510,23.495
+84,511,28.7866666666667
+84,512,23.8336666666667
+84,513,28.321
+84,514,26.3313333333333
+84,515,27.7706666666667
+84,516,23.3256666666667
+84,517,26.3313333333333
+84,518,25.5693333333333
+84,519,26.67
+84,520,23.6643333333333
+84,521,21.8863333333333
+84,522,22.5636666666667
+84,523,29.972
+84,524,25.019
+84,525,21.4206666666667
+84,526,21.844
+84,527,31.75
+84,528,31.75
+84,529,22.9023333333333
+84,530,22.352
+84,531,19.812
+84,532,32.004
+84,533,21.5476666666667
+84,534,30.48
+84,535,33.9936666666667
+84,536,23.8336666666667
+84,537,21.2936666666667
+84,538,25.8233333333333
+84,539,25.4846666666667
+84,540,28.956
+84,541,25.0613333333333
+84,542,18.0763333333333
+84,543,29.972
+84,544,22.2673333333333
+84,545,20.4046666666667
+84,546,21.971
+84,547,22.0133333333333
+84,548,23.5373333333333
+84,549,25.6116666666667
+84,550,24.9766666666667
+84,551,28.956
+84,552,22.2673333333333
+84,553,26.543
+84,554,24.3416666666667
+84,555,27.178
+84,556,25.908
+84,557,23.495
+84,558,20.828
+84,559,25.019
+84,560,24.5533333333333
+84,561,24.257
+84,562,27.7283333333333
+84,563,26.7546666666667
+84,564,23.114
+84,565,30.861
+84,566,27.2203333333333
+84,567,29.2946666666667
+84,568,24.13
+84,569,24.257
+84,570,25.1036666666667
+84,571,25.4
+84,572,30.1836666666667
+84,573,23.8336666666667
+84,574,19.3886666666667
+84,575,22.6483333333333
+84,576,26.9663333333333
+84,577,26.543
+84,578,22.8176666666667
+84,579,21.9286666666667
+84,580,22.352
+84,581,23.1986666666667
+84,582,26.4583333333333
+84,583,24.892
+84,584,20.3623333333333
+84,585,27.4743333333333
+84,586,31.1996666666667
+84,587,27.2626666666667
+84,588,21.2936666666667
+84,589,23.5796666666667
+84,590,24.1723333333333
+84,591,20.701
+84,592,18.7113333333333
+84,593,21.717
+84,594,21.59
+84,595,27.7706666666667
+84,596,18.7113333333333
+84,597,29.0406666666667
+84,598,29.8026666666667
+84,599,27.3473333333333
+84,600,21.2936666666667
+84,601,21.1243333333333
+84,602,21.59
+84,603,25.0613333333333
+84,604,29.9296666666667
+84,605,25.273
+84,606,31.7923333333333
+84,607,33.909
+84,608,26.543
+84,609,24.511
+84,610,24.4263333333333
+84,611,28.194
+84,612,24.6803333333333
+84,613,25.019
+84,614,27.2626666666667
+84,615,27.4743333333333
+84,616,24.638
+84,617,19.2193333333333
+84,618,25.908
+84,619,24.5956666666667
+84,620,25.527
+84,621,19.812
+84,622,25.146
+84,623,24.6803333333333
+84,624,26.1196666666667
+84,625,23.0293333333333
+84,626,26.289
+84,627,30.9033333333333
+84,628,28.7443333333333
+84,629,29.0406666666667
+84,630,28.5326666666667
+84,631,23.7066666666667
+84,632,21.1666666666667
+84,633,23.114
+84,634,23.5796666666667
+84,635,29.972
+84,636,30.48
+84,637,24.384
+84,638,26.797
+84,639,24.1723333333333
+84,640,25.146
+84,641,21.717
+84,642,35.814
+84,643,21.8016666666667
+84,644,19.685
+84,645,25.4846666666667
+84,646,30.48
+84,647,23.9183333333333
+84,648,25.3576666666667
+84,649,25.273
+84,650,27.4743333333333
+84,651,25.146
+84,652,24.003
+84,653,24.4263333333333
+84,654,23.114
+84,655,21.7593333333333
+84,656,27.9823333333333
+84,657,24.4686666666667
+84,658,27.0933333333333
+84,659,23.1563333333333
+84,660,18.415
+84,661,26.543
+84,662,24.2146666666667
+84,663,27.432
+84,664,26.5006666666667
+84,665,26.035
+84,666,26.416
+84,667,14.605
+84,668,23.0293333333333
+84,669,22.2673333333333
+84,670,25.654
+84,671,25.4423333333333
+84,672,28.829
+84,673,22.1403333333333
+84,674,21.8863333333333
+84,675,23.4526666666667
+84,676,24.384
+84,677,23.114
+84,678,18.5843333333333
+84,679,20.701
+84,680,28.8713333333333
+84,681,19.6426666666667
+84,682,22.8176666666667
+84,683,27.432
+84,684,29.2523333333333
+84,685,28.1093333333333
+84,686,19.7273333333333
+84,687,18.034
+84,688,23.7913333333333
+84,689,21.2936666666667
+84,690,25.3153333333333
+84,691,22.6906666666667
+84,692,26.5853333333333
+84,693,26.7123333333333
+84,694,21.5476666666667
+84,695,27.305
+84,696,23.0716666666667
+84,697,27.2203333333333
+84,698,25.146
+84,699,32.2156666666667
+84,700,26.3313333333333
+84,701,25.7386666666667
+84,702,21.209
+84,703,28.2363333333333
+84,704,25.8233333333333
+84,705,23.7913333333333
+84,706,24.4686666666667
+84,707,22.86
+84,708,23.9606666666667
+84,709,24.5533333333333
+84,710,24.4686666666667
+84,711,22.86
+84,712,24.9343333333333
+84,713,23.749
+84,714,32.004
+84,715,21.8016666666667
+84,716,29.1676666666667
+84,717,21.8016666666667
+84,718,24.003
+84,719,20.6163333333333
+84,720,28.194
+84,721,25.9503333333333
+84,722,22.479
+84,723,32.5543333333333
+84,724,25.0613333333333
+84,725,19.3463333333333
+84,726,19.8966666666667
+84,727,25.908
+84,728,23.368
+84,729,25.2306666666667
+84,730,23.5373333333333
+84,731,20.32
+84,732,23.0716666666667
+84,733,22.9446666666667
+84,734,26.162
+84,735,24.384
+84,736,29.5063333333333
+84,737,28.6596666666667
+84,738,24.13
+84,739,23.0716666666667
+84,740,22.606
+84,741,23.8336666666667
+84,742,20.6163333333333
+84,743,30.5646666666667
+84,744,27.305
+84,745,22.0556666666667
+84,746,22.8176666666667
+84,747,22.3096666666667
+84,748,16.9333333333333
+84,749,27.178
+84,750,25.146
+84,751,23.9183333333333
+84,752,27.432
+84,753,28.1516666666667
+84,754,21.5053333333333
+84,755,28.9983333333333
+84,756,30.099
+84,757,24.5956666666667
+84,758,27.686
+84,759,28.3633333333333
+84,760,24.0876666666667
+84,761,32.385
+84,762,19.2616666666667
+84,763,24.6803333333333
+84,764,23.9183333333333
+84,765,28.4056666666667
+84,766,18.7113333333333
+84,767,20.2776666666667
+84,768,29.21
+84,769,22.8176666666667
+84,770,24.4263333333333
+84,771,27.813
+84,772,33.6126666666667
+84,773,26.924
+84,774,27.686
+84,775,29.845
+84,776,23.5373333333333
+84,777,28.7866666666667
+84,778,24.5956666666667
+84,779,23.622
+84,780,28.7443333333333
+84,781,27.0086666666667
+84,782,23.5796666666667
+84,783,24.5533333333333
+84,784,25.8656666666667
+84,785,21.9286666666667
+84,786,26.0773333333333
+84,787,26.0773333333333
+84,788,25.908
+84,789,23.5796666666667
+84,790,22.4366666666667
+84,791,28.448
+84,792,20.701
+84,793,26.3313333333333
+84,794,26.0773333333333
+84,795,27.3473333333333
+84,796,23.4526666666667
+84,797,19.558
+84,798,20.2776666666667
+84,799,25.908
+84,800,28.4056666666667
+84,801,26.7123333333333
+84,802,23.495
+84,803,23.8336666666667
+84,804,25.6963333333333
+84,805,22.2673333333333
+84,806,25.2306666666667
+84,807,20.6586666666667
+84,808,27.2626666666667
+84,809,25.6116666666667
+84,810,25.146
+84,811,25.527
+84,812,24.5533333333333
+84,813,27.432
+84,814,20.9126666666667
+84,815,27.6436666666667
+84,816,24.3416666666667
+84,817,29.1253333333333
+84,818,25.527
+84,819,23.2833333333333
+84,820,23.622
+84,821,26.6276666666667
+84,822,25.8656666666667
+84,823,22.733
+84,824,22.3096666666667
+84,825,27.559
+84,826,21.4206666666667
+84,827,20.701
+84,828,26.6276666666667
+84,829,25.9926666666667
+84,830,20.9126666666667
+84,831,22.1826666666667
+84,832,27.559
+84,833,27.2203333333333
+84,834,19.2616666666667
+84,835,24.257
+84,836,21.717
+84,837,17.1873333333333
+84,838,24.5956666666667
+84,839,22.1403333333333
+84,840,25.2306666666667
+84,841,22.1403333333333
+84,842,27.0933333333333
+84,843,23.368
+84,844,30.3106666666667
+84,845,25.4
+84,846,20.8703333333333
+84,847,23.2833333333333
+84,848,29.6333333333333
+84,849,25.781
+84,850,24.384
+84,851,23.876
+84,852,15.2823333333333
+84,853,19.9813333333333
+84,854,25.4423333333333
+84,855,32.639
+84,856,23.4526666666667
+84,857,30.988
+84,858,24.9766666666667
+84,859,26.2466666666667
+84,860,27.7706666666667
+84,861,27.0086666666667
+84,862,29.1253333333333
+84,863,24.4686666666667
+84,864,20.5316666666667
+84,865,22.6906666666667
+84,866,29.591
+84,867,27.0086666666667
+84,868,25.1036666666667
+84,869,21.59
+84,870,26.7546666666667
+84,871,24.892
+84,872,29.5063333333333
+84,873,23.749
+84,874,26.4583333333333
+84,875,23.5796666666667
+84,876,29.3793333333333
+84,877,21.9286666666667
+84,878,25.6116666666667
+84,879,29.0406666666667
+84,880,24.892
+84,881,31.3266666666667
+84,882,24.0453333333333
+84,883,24.003
+84,884,23.8336666666667
+84,885,22.6483333333333
+84,886,18.2456666666667
+84,887,27.0086666666667
+84,888,30.607
+84,889,29.7603333333333
+84,890,26.924
+84,891,21.336
+84,892,26.5006666666667
+84,893,25.4
+84,894,26.416
+84,895,23.368
+84,896,28.5326666666667
+84,897,27.813
+84,898,27.3473333333333
+84,899,24.7226666666667
+84,900,30.607
+84,901,29.5063333333333
+84,902,23.622
+84,903,27.3473333333333
+84,904,27.1356666666667
+84,905,22.6906666666667
+84,906,21.971
+84,907,30.3953333333333
+84,908,23.1563333333333
+84,909,30.4376666666667
+84,910,23.6643333333333
+84,911,29.464
+84,912,26.1196666666667
+84,913,30.9033333333333
+84,914,26.162
+84,915,23.749
+84,916,24.2993333333333
+84,917,23.0293333333333
+84,918,24.8073333333333
+84,919,25.654
+84,920,20.7433333333333
+84,921,31.7923333333333
+84,922,18.6266666666667
+84,923,28.7866666666667
+84,924,22.9023333333333
+84,925,21.5476666666667
+84,926,23.495
+84,927,20.7856666666667
+84,928,30.6493333333333
+84,929,24.8496666666667
+84,930,25.4423333333333
+84,931,22.733
+84,932,26.035
+84,933,30.1836666666667
+84,934,28.4903333333333
+84,935,24.13
+84,936,21.463
+84,937,26.3736666666667
+84,938,29.1676666666667
+84,939,24.257
+84,940,24.7226666666667
+84,941,29.1253333333333
+84,942,24.892
+84,943,26.035
+84,944,27.0933333333333
+84,945,28.2363333333333
+84,946,25.0613333333333
+84,947,24.0453333333333
+84,948,25.7386666666667
+84,949,18.542
+84,950,27.3473333333333
+84,951,20.9126666666667
+84,952,25.1883333333333
+84,953,26.797
+84,954,19.6003333333333
+84,955,24.4686666666667
+84,956,22.4366666666667
+84,957,26.924
+84,958,23.368
+84,959,23.2833333333333
+84,960,29.464
+84,961,22.2673333333333
+84,962,30.607
+84,963,20.447
+84,964,28.2363333333333
+84,965,28.9136666666667
+84,966,25.6963333333333
+84,967,22.987
+84,968,18.1186666666667
+84,969,26.543
+84,970,22.606
+84,971,24.257
+84,972,17.8646666666667
+84,973,19.05
+84,974,25.273
+84,975,25.4846666666667
+84,976,26.3313333333333
+84,977,25.0613333333333
+84,978,28.7866666666667
+84,979,30.353
+84,980,28.7443333333333
+84,981,31.242
+84,982,23.2833333333333
+84,983,20.3623333333333
+84,984,21.5053333333333
+84,985,25.3576666666667
+84,986,27.178
+84,987,25.0613333333333
+84,988,22.987
+84,989,23.1986666666667
+84,990,24.4686666666667
+84,991,19.1346666666667
+84,992,28.067
+84,993,30.9033333333333
+84,994,27.1356666666667
+84,995,21.0396666666667
+84,996,27.686
+84,997,24.0453333333333
+84,998,20.701
+84,999,23.2833333333333
+84,1000,20.0236666666667
+85,1,39.5816666666667
+85,2,25.2518333333333
+85,3,25.8656666666667
+85,4,25.1036666666667
+85,5,25.3153333333333
+85,6,33.6761666666667
+85,7,36.195
+85,8,29.1253333333333
+85,9,22.3096666666667
+85,10,32.0675
+85,11,28.3421666666667
+85,12,30.607
+85,13,24.4263333333333
+85,14,22.8811666666667
+85,15,28.1728333333333
+85,16,27.1568333333333
+85,17,34.036
+85,18,25.9291666666667
+85,19,30.0143333333333
+85,20,33.401
+85,21,28.7231666666667
+85,22,24.0665
+85,23,31.7288333333333
+85,24,38.227
+85,25,31.496
+85,26,22.0345
+85,27,27.2203333333333
+85,28,32.6813333333333
+85,29,24.2993333333333
+85,30,23.7278333333333
+85,31,32.0886666666667
+85,32,32.6178333333333
+85,33,24.511
+85,34,28.5326666666667
+85,35,32.1945
+85,36,35.4753333333333
+85,37,36.2373333333333
+85,38,30.988
+85,39,31.8558333333333
+85,40,28.2363333333333
+85,41,30.6281666666667
+85,42,34.3958333333333
+85,43,27.8553333333333
+85,44,21.0396666666667
+85,45,34.7133333333333
+85,46,23.9606666666667
+85,47,30.4165
+85,48,32.3003333333333
+85,49,27.1568333333333
+85,50,32.1733333333333
+85,51,37.7401666666667
+85,52,33.909
+85,53,34.5651666666667
+85,54,27.8765
+85,55,38.6291666666667
+85,56,30.3953333333333
+85,57,23.1563333333333
+85,58,26.4583333333333
+85,59,21.8863333333333
+85,60,29.8026666666667
+85,61,31.75
+85,62,41.6983333333333
+85,63,35.9198333333333
+85,64,31.4325
+85,65,23.8336666666667
+85,66,24.4051666666667
+85,67,28.3633333333333
+85,68,21.7593333333333
+85,69,23.622
+85,70,29.9931666666667
+85,71,38.2693333333333
+85,72,29.9085
+85,73,29.8238333333333
+85,74,25.9715
+85,75,29.337
+85,76,26.9875
+85,77,34.036
+85,78,28.3845
+85,79,34.036
+85,80,30.48
+85,81,21.8016666666667
+85,82,28.9136666666667
+85,83,30.7975
+85,84,28.7866666666667
+85,85,46.863
+85,86,32.0886666666667
+85,87,30.5646666666667
+85,88,39.0948333333333
+85,89,30.1413333333333
+85,90,28.4691666666667
+85,91,23.368
+85,92,28.702
+85,93,30.5435
+85,94,36.8935
+85,95,40.3225
+85,96,25.8445
+85,97,27.0721666666667
+85,98,29.5698333333333
+85,99,27.6225
+85,100,29.4005
+85,101,35.56
+85,102,24.5745
+85,103,29.6333333333333
+85,104,33.8243333333333
+85,105,33.3163333333333
+85,106,28.6173333333333
+85,107,39.9415
+85,108,19.2193333333333
+85,109,34.9885
+85,110,33.6761666666667
+85,111,24.1088333333333
+85,112,31.8346666666667
+85,113,30.6916666666667
+85,114,27.2203333333333
+85,115,33.1046666666667
+85,116,30.9033333333333
+85,117,38.6291666666667
+85,118,35.3695
+85,119,29.6333333333333
+85,120,29.21
+85,121,27.7706666666667
+85,122,32.385
+85,123,32.004
+85,124,30.3318333333333
+85,125,27.6436666666667
+85,126,33.0835
+85,127,30.8398333333333
+85,128,28.2151666666667
+85,129,32.2156666666667
+85,130,35.5811666666667
+85,131,34.1418333333333
+85,132,32.7871666666667
+85,133,23.7066666666667
+85,134,33.1258333333333
+85,135,35.5176666666667
+85,136,24.5745
+85,137,28.1305
+85,138,28.6808333333333
+85,139,29.1253333333333
+85,140,25.4635
+85,141,30.9456666666667
+85,142,36.0045
+85,143,26.2466666666667
+85,144,42.164
+85,145,37.0416666666667
+85,146,32.7236666666667
+85,147,26.5006666666667
+85,148,38.8196666666667
+85,149,25.3365
+85,150,32.131
+85,151,32.3426666666667
+85,152,35.306
+85,153,36.4701666666667
+85,154,34.163
+85,155,17.9916666666667
+85,156,40.3648333333333
+85,157,42.6508333333333
+85,158,38.2905
+85,159,29.1888333333333
+85,160,29.464
+85,161,35.3483333333333
+85,162,34.6498333333333
+85,163,26.6065
+85,164,29.7391666666667
+85,165,24.3205
+85,166,27.3685
+85,167,36.8935
+85,168,27.1145
+85,169,32.7236666666667
+85,170,33.4221666666667
+85,171,28.4268333333333
+85,172,32.639
+85,173,22.8388333333333
+85,174,29.1676666666667
+85,175,34.798
+85,176,33.3586666666667
+85,177,20.9126666666667
+85,178,26.162
+85,179,25.4211666666667
+85,180,32.9141666666667
+85,181,33.5068333333333
+85,182,34.5228333333333
+85,183,25.4211666666667
+85,184,33.6761666666667
+85,185,30.0143333333333
+85,186,27.5166666666667
+85,187,34.1418333333333
+85,188,30.9033333333333
+85,189,31.3266666666667
+85,190,29.2946666666667
+85,191,25.3153333333333
+85,192,23.114
+85,193,32.5966666666667
+85,194,35.179
+85,195,33.2951666666667
+85,196,23.6008333333333
+85,197,25.2095
+85,198,28.702
+85,199,23.6643333333333
+85,200,29.845
+85,201,29.9508333333333
+85,202,21.6958333333333
+85,203,25.5905
+85,204,29.6333333333333
+85,205,18.161
+85,206,37.9095
+85,207,22.2673333333333
+85,208,26.3101666666667
+85,209,26.5218333333333
+85,210,25.3576666666667
+85,211,32.8295
+85,212,29.6756666666667
+85,213,25.4211666666667
+85,214,23.6643333333333
+85,215,37.1263333333333
+85,216,35.2636666666667
+85,217,24.003
+85,218,23.368
+85,219,22.0556666666667
+85,220,23.2621666666667
+85,221,28.4056666666667
+85,222,23.9606666666667
+85,223,31.242
+85,224,28.3845
+85,225,30.2471666666667
+85,226,27.305
+85,227,33.5068333333333
+85,228,30.861
+85,229,31.4325
+85,230,23.5585
+85,231,34.036
+85,232,29.972
+85,233,31.496
+85,234,28.1305
+85,235,30.353
+85,236,25.0613333333333
+85,237,34.4381666666667
+85,238,27.1145
+85,239,31.9828333333333
+85,240,29.1465
+85,241,30.2471666666667
+85,242,37.465
+85,243,30.5223333333333
+85,244,34.3746666666667
+85,245,27.9823333333333
+85,246,29.7815
+85,247,36.7241666666667
+85,248,27.3896666666667
+85,249,28.0881666666667
+85,250,28.5115
+85,251,25.1248333333333
+85,252,27.305
+85,253,24.4898333333333
+85,254,33.9301666666667
+85,255,31.6441666666667
+85,256,23.622
+85,257,32.3003333333333
+85,258,36.2585
+85,259,33.1681666666667
+85,260,26.3101666666667
+85,261,39.8568333333333
+85,262,30.9033333333333
+85,263,28.6596666666667
+85,264,20.4046666666667
+85,265,30.0355
+85,266,35.1155
+85,267,30.099
+85,268,30.1413333333333
+85,269,32.0251666666667
+85,270,22.8176666666667
+85,271,30.2683333333333
+85,272,34.036
+85,273,41.783
+85,274,35.8775
+85,275,26.797
+85,276,23.5796666666667
+85,277,28.6596666666667
+85,278,32.6601666666667
+85,279,37.5285
+85,280,32.5966666666667
+85,281,32.4696666666667
+85,282,28.4056666666667
+85,283,21.8016666666667
+85,284,30.5223333333333
+85,285,34.4593333333333
+85,286,32.9353333333333
+85,287,36.0468333333333
+85,288,30.3741666666667
+85,289,35.9621666666667
+85,290,36.4278333333333
+85,291,29.2735
+85,292,32.9565
+85,293,31.8981666666667
+85,294,28.1516666666667
+85,295,40.005
+85,296,28.7231666666667
+85,297,32.5543333333333
+85,298,33.5703333333333
+85,299,32.5543333333333
+85,300,29.1888333333333
+85,301,24.8073333333333
+85,302,30.6916666666667
+85,303,32.258
+85,304,22.1191666666667
+85,305,30.9033333333333
+85,306,26.6488333333333
+85,307,31.4113333333333
+85,308,23.2833333333333
+85,309,37.3591666666667
+85,310,33.9513333333333
+85,311,34.9038333333333
+85,312,34.9673333333333
+85,313,25.3576666666667
+85,314,25.8233333333333
+85,315,35.0943333333333
+85,316,30.5858333333333
+85,317,30.3953333333333
+85,318,21.59
+85,319,30.0566666666667
+85,320,31.877
+85,321,31.5383333333333
+85,322,24.765
+85,323,22.3096666666667
+85,324,29.9085
+85,325,32.5966666666667
+85,326,30.5223333333333
+85,327,33.5068333333333
+85,328,27.6648333333333
+85,329,31.8346666666667
+85,330,29.21
+85,331,25.273
+85,332,31.0091666666667
+85,333,31.8558333333333
+85,334,32.7236666666667
+85,335,27.8765
+85,336,27.5166666666667
+85,337,23.3891666666667
+85,338,35.4753333333333
+85,339,31.8135
+85,340,26.0985
+85,341,30.5223333333333
+85,342,30.2048333333333
+85,343,25.6751666666667
+85,344,25.7598333333333
+85,345,27.178
+85,346,28.7866666666667
+85,347,30.353
+85,348,24.1511666666667
+85,349,23.495
+85,350,31.369
+85,351,32.9565
+85,352,28.2786666666667
+85,353,21.59
+85,354,34.2476666666667
+85,355,26.9663333333333
+85,356,28.829
+85,357,29.1465
+85,358,29.6121666666667
+85,359,32.3003333333333
+85,360,29.5275
+85,361,26.3736666666667
+85,362,28.2786666666667
+85,363,28.4056666666667
+85,364,36.0468333333333
+85,365,27.6013333333333
+85,366,29.3158333333333
+85,367,27.6013333333333
+85,368,27.813
+85,369,30.5011666666667
+85,370,26.035
+85,371,32.9988333333333
+85,372,26.5006666666667
+85,373,31.7711666666667
+85,374,35.3271666666667
+85,375,26.7758333333333
+85,376,29.4851666666667
+85,377,23.8125
+85,378,29.4428333333333
+85,379,41.4866666666667
+85,380,31.3478333333333
+85,381,26.8816666666667
+85,382,31.6441666666667
+85,383,29.464
+85,384,35.1578333333333
+85,385,31.75
+85,386,31.8135
+85,387,30.9033333333333
+85,388,33.0411666666667
+85,389,31.2208333333333
+85,390,34.4593333333333
+85,391,30.099
+85,392,27.8553333333333
+85,393,28.5961666666667
+85,394,35.306
+85,395,30.7975
+85,396,34.6498333333333
+85,397,30.5646666666667
+85,398,30.9668333333333
+85,399,30.4165
+85,400,34.798
+85,401,25.3365
+85,402,28.702
+85,403,28.0035
+85,404,27.6436666666667
+85,405,32.004
+85,406,25.8233333333333
+85,407,22.6906666666667
+85,408,31.9405
+85,409,28.194
+85,410,25.4
+85,411,28.194
+85,412,30.3318333333333
+85,413,31.1785
+85,414,35.8351666666667
+85,415,26.3313333333333
+85,416,19.4733333333333
+85,417,25.781
+85,418,35.306
+85,419,32.0463333333333
+85,420,29.3158333333333
+85,421,26.0773333333333
+85,422,23.9395
+85,423,35.4965
+85,424,30.988
+85,425,42.164
+85,426,29.6756666666667
+85,427,28.8501666666667
+85,428,29.1041666666667
+85,429,34.163
+85,430,33.4221666666667
+85,431,31.8135
+85,432,38.8196666666667
+85,433,27.6648333333333
+85,434,32.131
+85,435,38.1
+85,436,25.908
+85,437,29.7391666666667
+85,438,26.162
+85,439,25.9926666666667
+85,440,24.7015
+85,441,27.5801666666667
+85,442,39.116
+85,443,28.4691666666667
+85,444,26.924
+85,445,34.0571666666667
+85,446,33.4433333333333
+85,447,40.0685
+85,448,25.7175
+85,449,25.4635
+85,450,27.9823333333333
+85,451,27.0086666666667
+85,452,26.8605
+85,453,36.8723333333333
+85,454,32.5543333333333
+85,455,24.2993333333333
+85,456,31.0726666666667
+85,457,26.3736666666667
+85,458,35.179
+85,459,36.195
+85,460,26.7123333333333
+85,461,30.1836666666667
+85,462,25.6963333333333
+85,463,35.3483333333333
+85,464,25.4846666666667
+85,465,30.6916666666667
+85,466,28.7231666666667
+85,467,20.193
+85,468,35.179
+85,469,42.8201666666667
+85,470,33.147
+85,471,31.6441666666667
+85,472,35.687
+85,473,27.686
+85,474,28.6596666666667
+85,475,24.1723333333333
+85,476,35.052
+85,477,29.1041666666667
+85,478,34.2265
+85,479,24.003
+85,480,30.0778333333333
+85,481,32.4908333333333
+85,482,32.0675
+85,483,20.8703333333333
+85,484,25.0401666666667
+85,485,30.5223333333333
+85,486,30.353
+85,487,31.2843333333333
+85,488,24.5533333333333
+85,489,32.0251666666667
+85,490,23.0716666666667
+85,491,25.9291666666667
+85,492,24.2781666666667
+85,493,33.9513333333333
+85,494,29.7603333333333
+85,495,34.0783333333333
+85,496,26.797
+85,497,23.6431666666667
+85,498,26.67
+85,499,21.5265
+85,500,22.479
+85,501,22.4155
+85,502,33.782
+85,503,31.1361666666667
+85,504,29.8661666666667
+85,505,34.0995
+85,506,28.9136666666667
+85,507,22.3943333333333
+85,508,30.5858333333333
+85,509,22.2461666666667
+85,510,33.909
+85,511,30.6705
+85,512,23.0716666666667
+85,513,32.3638333333333
+85,514,35.6658333333333
+85,515,27.2838333333333
+85,516,27.559
+85,517,33.6126666666667
+85,518,22.86
+85,519,33.274
+85,520,23.495
+85,521,32.8718333333333
+85,522,34.3746666666667
+85,523,28.2151666666667
+85,524,24.765
+85,525,26.9663333333333
+85,526,23.1351666666667
+85,527,27.4743333333333
+85,528,26.9663333333333
+85,529,29.9508333333333
+85,530,28.702
+85,531,34.7345
+85,532,34.8615
+85,533,32.8506666666667
+85,534,32.8506666666667
+85,535,23.7913333333333
+85,536,30.353
+85,537,29.7391666666667
+85,538,26.416
+85,539,31.0303333333333
+85,540,30.734
+85,541,34.0783333333333
+85,542,24.511
+85,543,21.8651666666667
+85,544,36.3008333333333
+85,545,36.9993333333333
+85,546,32.0251666666667
+85,547,27.7495
+85,548,26.0138333333333
+85,549,30.0778333333333
+85,550,32.4273333333333
+85,551,31.1996666666667
+85,552,20.32
+85,553,27.6013333333333
+85,554,27.686
+85,555,35.2636666666667
+85,556,28.4903333333333
+85,557,34.4593333333333
+85,558,23.0928333333333
+85,559,23.7913333333333
+85,560,35.4965
+85,561,35.1366666666667
+85,562,30.6493333333333
+85,563,24.511
+85,564,26.3313333333333
+85,565,30.5011666666667
+85,566,24.4475
+85,567,22.4366666666667
+85,568,21.0396666666667
+85,569,28.829
+85,570,36.4066666666667
+85,571,23.6855
+85,572,29.4216666666667
+85,573,21.4206666666667
+85,574,25.1036666666667
+85,575,24.4898333333333
+85,576,31.1573333333333
+85,577,30.861
+85,578,24.9766666666667
+85,579,24.3628333333333
+85,580,34.3746666666667
+85,581,29.083
+85,582,29.0406666666667
+85,583,36.3643333333333
+85,584,23.4315
+85,585,32.3003333333333
+85,586,34.1841666666667
+85,587,24.0876666666667
+85,588,24.6168333333333
+85,589,26.2255
+85,590,27.4108333333333
+85,591,26.7546666666667
+85,592,33.0835
+85,593,27.305
+85,594,29.2523333333333
+85,595,27.7071666666667
+85,596,34.544
+85,597,26.67
+85,598,28.0035
+85,599,28.7231666666667
+85,600,34.9885
+85,601,33.0835
+85,602,26.4795
+85,603,23.9606666666667
+85,604,32.5966666666667
+85,605,36.8723333333333
+85,606,25.0401666666667
+85,607,30.7763333333333
+85,608,33.3586666666667
+85,609,26.5641666666667
+85,610,30.099
+85,611,38.354
+85,612,28.5961666666667
+85,613,29.21
+85,614,27.305
+85,615,29.4005
+85,616,18.6266666666667
+85,617,30.0143333333333
+85,618,16.6793333333333
+85,619,36.6395
+85,620,29.337
+85,621,23.7066666666667
+85,622,28.8078333333333
+85,623,35.687
+85,624,29.6756666666667
+85,625,31.1996666666667
+85,626,29.7391666666667
+85,627,34.7345
+85,628,35.2425
+85,629,30.9245
+85,630,34.8191666666667
+85,631,20.2988333333333
+85,632,29.0195
+85,633,31.5383333333333
+85,634,34.3535
+85,635,27.3473333333333
+85,636,27.9823333333333
+85,637,30.2895
+85,638,25.9715
+85,639,31.4113333333333
+85,640,33.4856666666667
+85,641,28.702
+85,642,33.6338333333333
+85,643,27.0298333333333
+85,644,21.4206666666667
+85,645,21.1031666666667
+85,646,25.6116666666667
+85,647,38.1211666666667
+85,648,26.3948333333333
+85,649,25.5481666666667
+85,650,30.1413333333333
+85,651,25.4423333333333
+85,652,30.0566666666667
+85,653,35.7081666666667
+85,654,32.1945
+85,655,26.8816666666667
+85,656,25.8656666666667
+85,657,26.3948333333333
+85,658,37.9518333333333
+85,659,28.067
+85,660,33.4221666666667
+85,661,31.8558333333333
+85,662,31.115
+85,663,29.1676666666667
+85,664,30.099
+85,665,32.7871666666667
+85,666,31.242
+85,667,26.4583333333333
+85,668,27.7918333333333
+85,669,28.0035
+85,670,17.0603333333333
+85,671,27.7283333333333
+85,672,29.5698333333333
+85,673,25.8233333333333
+85,674,27.3896666666667
+85,675,22.0345
+85,676,27.4108333333333
+85,677,42.8201666666667
+85,678,34.2688333333333
+85,679,22.479
+85,680,26.6911666666667
+85,681,29.845
+85,682,29.7391666666667
+85,683,26.0561666666667
+85,684,30.7128333333333
+85,685,22.4578333333333
+85,686,28.8078333333333
+85,687,34.0571666666667
+85,688,28.4056666666667
+85,689,28.9983333333333
+85,690,26.2043333333333
+85,691,30.8821666666667
+85,692,35.8563333333333
+85,693,29.9296666666667
+85,694,26.4371666666667
+85,695,31.3266666666667
+85,696,30.8398333333333
+85,697,37.9518333333333
+85,698,26.7546666666667
+85,699,31.7076666666667
+85,700,34.4593333333333
+85,701,27.5801666666667
+85,702,41.021
+85,703,39.1795
+85,704,31.0515
+85,705,31.115
+85,706,32.3638333333333
+85,707,28.2998333333333
+85,708,27.3473333333333
+85,709,32.8506666666667
+85,710,29.5275
+85,711,30.4376666666667
+85,712,26.6276666666667
+85,713,26.7335
+85,714,28.4903333333333
+85,715,30.3953333333333
+85,716,29.4216666666667
+85,717,31.8981666666667
+85,718,31.0938333333333
+85,719,34.6286666666667
+85,720,28.2998333333333
+85,721,29.4428333333333
+85,722,36.9993333333333
+85,723,24.8496666666667
+85,724,35.3271666666667
+85,725,30.6705
+85,726,29.7391666666667
+85,727,27.0933333333333
+85,728,33.6126666666667
+85,729,28.1305
+85,730,23.7701666666667
+85,731,28.194
+85,732,28.7866666666667
+85,733,26.7758333333333
+85,734,28.7443333333333
+85,735,30.2471666666667
+85,736,32.1521666666667
+85,737,43.0318333333333
+85,738,25.0613333333333
+85,739,36.6183333333333
+85,740,36.449
+85,741,28.321
+85,742,27.1356666666667
+85,743,24.2146666666667
+85,744,26.0561666666667
+85,745,33.6338333333333
+85,746,30.3741666666667
+85,747,34.1418333333333
+85,748,33.6338333333333
+85,749,21.5053333333333
+85,750,45.4448333333333
+85,751,35.3695
+85,752,40.6188333333333
+85,753,33.3375
+85,754,27.2838333333333
+85,755,33.9936666666667
+85,756,28.4903333333333
+85,757,30.6705
+85,758,21.6323333333333
+85,759,30.0143333333333
+85,760,19.2193333333333
+85,761,31.4325
+85,762,30.607
+85,763,35.7928333333333
+85,764,24.511
+85,765,24.4263333333333
+85,766,22.987
+85,767,39.5816666666667
+85,768,29.337
+85,769,29.3793333333333
+85,770,28.0246666666667
+85,771,27.7283333333333
+85,772,25.8445
+85,773,32.4696666666667
+85,774,27.1145
+85,775,30.988
+85,776,23.368
+85,777,21.3995
+85,778,26.7546666666667
+85,779,36.1103333333333
+85,780,24.8708333333333
+85,781,34.0571666666667
+85,782,32.7025
+85,783,32.4485
+85,784,28.0246666666667
+85,785,31.0938333333333
+85,786,24.5956666666667
+85,787,30.7128333333333
+85,788,37.1051666666667
+85,789,25.4
+85,790,30.0778333333333
+85,791,32.4908333333333
+85,792,29.0406666666667
+85,793,28.2575
+85,794,37.8036666666667
+85,795,30.0778333333333
+85,796,37.7401666666667
+85,797,32.1098333333333
+85,798,36.2373333333333
+85,799,27.559
+85,800,27.0298333333333
+85,801,27.1991666666667
+85,802,24.765
+85,803,25.9926666666667
+85,804,30.1836666666667
+85,805,30.6705
+85,806,34.5228333333333
+85,807,27.3473333333333
+85,808,32.766
+85,809,21.6746666666667
+85,810,28.1728333333333
+85,811,29.1676666666667
+85,812,30.3741666666667
+85,813,34.6498333333333
+85,814,28.7231666666667
+85,815,25.5905
+85,816,34.0148333333333
+85,817,27.9823333333333
+85,818,22.0768333333333
+85,819,35.2001666666667
+85,820,26.7123333333333
+85,821,31.6441666666667
+85,822,28.4268333333333
+85,823,22.9446666666667
+85,824,37.3591666666667
+85,825,23.5373333333333
+85,826,28.6173333333333
+85,827,27.2626666666667
+85,828,28.9136666666667
+85,829,27.6436666666667
+85,830,33.7396666666667
+85,831,31.877
+85,832,30.734
+85,833,27.4955
+85,834,32.7236666666667
+85,835,35.4753333333333
+85,836,28.702
+85,837,40.386
+85,838,26.1831666666667
+85,839,38.3328333333333
+85,840,28.1728333333333
+85,841,34.5228333333333
+85,842,27.0721666666667
+85,843,24.9766666666667
+85,844,27.7071666666667
+85,845,28.2786666666667
+85,846,30.734
+85,847,30.7128333333333
+85,848,26.416
+85,849,24.9766666666667
+85,850,33.274
+85,851,28.6173333333333
+85,852,26.4795
+85,853,30.1413333333333
+85,854,25.7386666666667
+85,855,25.4846666666667
+85,856,31.1785
+85,857,28.1093333333333
+85,858,30.5646666666667
+85,859,29.5063333333333
+85,860,28.6808333333333
+85,861,24.7015
+85,862,26.7335
+85,863,24.0876666666667
+85,864,32.4273333333333
+85,865,29.0195
+85,866,27.4108333333333
+85,867,29.4005
+85,868,33.274
+85,869,33.0623333333333
+85,870,26.2466666666667
+85,871,28.3845
+85,872,24.892
+85,873,24.7226666666667
+85,874,27.813
+85,875,34.3111666666667
+85,876,30.5858333333333
+85,877,28.0458333333333
+85,878,26.5853333333333
+85,879,28.575
+85,880,35.3271666666667
+85,881,29.3158333333333
+85,882,26.9451666666667
+85,883,30.2895
+85,884,24.6803333333333
+85,885,33.6126666666667
+85,886,36.9993333333333
+85,887,26.6911666666667
+85,888,31.8981666666667
+85,889,29.845
+85,890,28.4903333333333
+85,891,31.0515
+85,892,30.9456666666667
+85,893,28.5538333333333
+85,894,18.9441666666667
+85,895,24.003
+85,896,28.3845
+85,897,27.8976666666667
+85,898,34.4805
+85,899,32.0886666666667
+85,900,29.9296666666667
+85,901,33.2316666666667
+85,902,21.3995
+85,903,24.4686666666667
+85,904,27.1145
+85,905,30.6916666666667
+85,906,23.8548333333333
+85,907,32.8083333333333
+85,908,28.6173333333333
+85,909,31.7288333333333
+85,910,30.6281666666667
+85,911,29.4005
+85,912,28.6596666666667
+85,913,21.463
+85,914,32.4273333333333
+85,915,26.2678333333333
+85,916,26.797
+85,917,29.8238333333333
+85,918,35.941
+85,919,30.7763333333333
+85,920,26.9663333333333
+85,921,26.6276666666667
+85,922,29.2523333333333
+85,923,22.1191666666667
+85,924,22.352
+85,925,30.1625
+85,926,28.321
+85,927,37.338
+85,928,29.7391666666667
+85,929,28.194
+85,930,32.258
+85,931,25.9291666666667
+85,932,37.2956666666667
+85,933,28.6173333333333
+85,934,27.3685
+85,935,31.369
+85,936,35.0308333333333
+85,937,25.1248333333333
+85,938,28.6596666666667
+85,939,27.9823333333333
+85,940,31.7711666666667
+85,941,30.0143333333333
+85,942,26.289
+85,943,33.4856666666667
+85,944,31.115
+85,945,30.734
+85,946,25.3153333333333
+85,947,21.2936666666667
+85,948,22.987
+85,949,38.2905
+85,950,22.7541666666667
+85,951,30.3106666666667
+85,952,23.8336666666667
+85,953,33.9513333333333
+85,954,26.9663333333333
+85,955,27.3896666666667
+85,956,26.67
+85,957,20.0236666666667
+85,958,31.5171666666667
+85,959,33.4856666666667
+85,960,29.2946666666667
+85,961,26.289
+85,962,22.606
+85,963,25.9503333333333
+85,964,33.5703333333333
+85,965,31.5595
+85,966,28.1516666666667
+85,967,31.8981666666667
+85,968,25.3788333333333
+85,969,24.0241666666667
+85,970,36.703
+85,971,26.8393333333333
+85,972,27.0086666666667
+85,973,29.0406666666667
+85,974,35.3271666666667
+85,975,33.655
+85,976,25.8656666666667
+85,977,31.4113333333333
+85,978,19.0711666666667
+85,979,29.1676666666667
+85,980,21.0396666666667
+85,981,22.6271666666667
+85,982,22.6695
+85,983,35.2213333333333
+85,984,27.432
+85,985,29.7815
+85,986,27.1356666666667
+85,987,25.3153333333333
+85,988,30.0778333333333
+85,989,37.084
+85,990,30.48
+85,991,33.4433333333333
+85,992,30.6493333333333
+85,993,34.6075
+85,994,21.717
+85,995,29.1888333333333
+85,996,26.6065
+85,997,23.5796666666667
+85,998,26.6488333333333
+85,999,33.0835
+85,1000,29.5275
+86,1,25.273
+86,2,24.9555
+86,3,26.9875
+86,4,27.8976666666667
+86,5,24.4686666666667
+86,6,23.7278333333333
+86,7,30.48
+86,8,22.5425
+86,9,33.4645
+86,10,26.6488333333333
+86,11,24.638
+86,12,27.9823333333333
+86,13,26.0138333333333
+86,14,26.3101666666667
+86,15,27.2838333333333
+86,16,30.5646666666667
+86,17,26.3736666666667
+86,18,31.6865
+86,19,27.7283333333333
+86,20,27.051
+86,21,26.9875
+86,22,27.94
+86,23,25.2306666666667
+86,24,20.447
+86,25,29.1888333333333
+86,26,32.9776666666667
+86,27,22.9658333333333
+86,28,31.7288333333333
+86,29,30.9668333333333
+86,30,33.8878333333333
+86,31,23.8548333333333
+86,32,25.8233333333333
+86,33,22.7753333333333
+86,34,26.8816666666667
+86,35,24.1088333333333
+86,36,31.242
+86,37,23.4315
+86,38,21.9921666666667
+86,39,26.8605
+86,40,31.5383333333333
+86,41,28.829
+86,42,29.083
+86,43,30.0355
+86,44,26.7546666666667
+86,45,29.5698333333333
+86,46,26.7123333333333
+86,47,29.7603333333333
+86,48,23.114
+86,49,25.5905
+86,50,24.5321666666667
+86,51,27.5801666666667
+86,52,30.3106666666667
+86,53,28.9136666666667
+86,54,19.939
+86,55,25.9715
+86,56,24.3628333333333
+86,57,27.686
+86,58,26.5853333333333
+86,59,28.2575
+86,60,22.3308333333333
+86,61,24.1511666666667
+86,62,26.9663333333333
+86,63,35.56
+86,64,29.845
+86,65,23.3045
+86,66,27.686
+86,67,26.5006666666667
+86,68,23.5796666666667
+86,69,28.829
+86,70,30.8398333333333
+86,71,20.4046666666667
+86,72,28.1305
+86,73,24.2358333333333
+86,74,24.0453333333333
+86,75,20.5528333333333
+86,76,29.9508333333333
+86,77,30.4376666666667
+86,78,29.9508333333333
+86,79,24.2993333333333
+86,80,26.4795
+86,81,29.6545
+86,82,25.7175
+86,83,23.2833333333333
+86,84,26.7335
+86,85,25.6328333333333
+86,86,27.3896666666667
+86,87,26.416
+86,88,37.2321666666667
+86,89,23.495
+86,90,25.4846666666667
+86,91,23.3045
+86,92,27.4531666666667
+86,93,23.8125
+86,94,25.7175
+86,95,31.5171666666667
+86,96,21.4206666666667
+86,97,26.8605
+86,98,27.7495
+86,99,28.6596666666667
+86,100,33.5915
+86,101,25.9503333333333
+86,102,27.5378333333333
+86,103,23.1563333333333
+86,104,23.9395
+86,105,31.6865
+86,106,28.2786666666667
+86,107,23.4103333333333
+86,108,23.495
+86,109,23.9395
+86,110,28.0881666666667
+86,111,25.4
+86,112,26.3736666666667
+86,113,24.1511666666667
+86,114,27.178
+86,115,25.2095
+86,116,25.1883333333333
+86,117,23.3891666666667
+86,118,25.4423333333333
+86,119,23.5585
+86,120,24.8073333333333
+86,121,24.6591666666667
+86,122,31.6865
+86,123,24.2781666666667
+86,124,25.5058333333333
+86,125,29.8238333333333
+86,126,29.1253333333333
+86,127,28.6808333333333
+86,128,28.5326666666667
+86,129,18.923
+86,130,26.7758333333333
+86,131,35.8351666666667
+86,132,31.4325
+86,133,20.2565
+86,134,27.2415
+86,135,24.7861666666667
+86,136,30.607
+86,137,26.6488333333333
+86,138,31.0091666666667
+86,139,25.2941666666667
+86,140,23.3468333333333
+86,141,29.0618333333333
+86,142,23.4738333333333
+86,143,27.9611666666667
+86,144,32.1521666666667
+86,145,24.6591666666667
+86,146,24.9978333333333
+86,147,23.9818333333333
+86,148,31.623
+86,149,32.5331666666667
+86,150,24.5533333333333
+86,151,24.5745
+86,152,19.7061666666667
+86,153,33.7396666666667
+86,154,27.9611666666667
+86,155,25.8021666666667
+86,156,22.6271666666667
+86,157,26.924
+86,158,22.5213333333333
+86,159,28.956
+86,160,24.1088333333333
+86,161,19.5368333333333
+86,162,19.7061666666667
+86,163,32.5331666666667
+86,164,23.876
+86,165,22.6695
+86,166,33.3798333333333
+86,167,27.7071666666667
+86,168,21.0608333333333
+86,169,28.6596666666667
+86,170,29.0618333333333
+86,171,28.2363333333333
+86,172,27.4108333333333
+86,173,24.9343333333333
+86,174,26.289
+86,175,27.0721666666667
+86,176,23.6643333333333
+86,177,20.8915
+86,178,26.1196666666667
+86,179,19.8966666666667
+86,180,25.5693333333333
+86,181,24.1935
+86,182,24.7015
+86,183,21.6958333333333
+86,184,24.2993333333333
+86,185,28.8925
+86,186,30.5858333333333
+86,187,38.9466666666667
+86,188,24.4263333333333
+86,189,23.876
+86,190,26.1196666666667
+86,191,23.0505
+86,192,30.1836666666667
+86,193,30.3741666666667
+86,194,23.5373333333333
+86,195,24.4475
+86,196,24.6591666666667
+86,197,32.8083333333333
+86,198,23.9395
+86,199,23.2198333333333
+86,200,32.4061666666667
+86,201,32.7236666666667
+86,202,24.9131666666667
+86,203,25.9291666666667
+86,204,25.273
+86,205,24.9555
+86,206,28.9348333333333
+86,207,27.7918333333333
+86,208,25.0401666666667
+86,209,29.9085
+86,210,26.9663333333333
+86,211,31.3055
+86,212,34.544
+86,213,26.8181666666667
+86,214,28.6596666666667
+86,215,26.3101666666667
+86,216,23.3256666666667
+86,217,24.8496666666667
+86,218,29.2311666666667
+86,219,26.6276666666667
+86,220,20.066
+86,221,22.479
+86,222,20.4893333333333
+86,223,24.8496666666667
+86,224,31.0303333333333
+86,225,27.6225
+86,226,34.3323333333333
+86,227,28.702
+86,228,27.178
+86,229,31.242
+86,230,21.2725
+86,231,20.5316666666667
+86,232,27.178
+86,233,24.4898333333333
+86,234,34.6498333333333
+86,235,32.131
+86,236,29.5486666666667
+86,237,25.4846666666667
+86,238,21.971
+86,239,26.67
+86,240,25.5693333333333
+86,241,21.5265
+86,242,25.5693333333333
+86,243,29.5486666666667
+86,244,24.7015
+86,245,26.2678333333333
+86,246,27.051
+86,247,25.7175
+86,248,23.6008333333333
+86,249,24.2358333333333
+86,250,26.0985
+86,251,29.3158333333333
+86,252,29.8238333333333
+86,253,25.4423333333333
+86,254,24.2358333333333
+86,255,27.1356666666667
+86,256,24.4051666666667
+86,257,28.5115
+86,258,26.3525
+86,259,25.654
+86,260,23.3468333333333
+86,261,27.6648333333333
+86,262,25.6116666666667
+86,263,28.2575
+86,264,25.527
+86,265,27.2626666666667
+86,266,23.6855
+86,267,23.749
+86,268,31.2631666666667
+86,269,26.8181666666667
+86,270,29.9931666666667
+86,271,25.1883333333333
+86,272,22.606
+86,273,27.7283333333333
+86,274,24.8496666666667
+86,275,30.9245
+86,276,29.591
+86,277,18.9653333333333
+86,278,17.4413333333333
+86,279,24.1511666666667
+86,280,24.4898333333333
+86,281,26.2043333333333
+86,282,20.0236666666667
+86,283,30.353
+86,284,21.0396666666667
+86,285,25.908
+86,286,23.2621666666667
+86,287,35.814
+86,288,23.8336666666667
+86,289,29.6968333333333
+86,290,25.9291666666667
+86,291,23.495
+86,292,25.8021666666667
+86,293,24.8708333333333
+86,294,24.6168333333333
+86,295,27.9611666666667
+86,296,29.3158333333333
+86,297,22.8388333333333
+86,298,27.8553333333333
+86,299,30.734
+86,300,29.9085
+86,301,25.7598333333333
+86,302,26.035
+86,303,27.051
+86,304,23.5796666666667
+86,305,27.4955
+86,306,25.9715
+86,307,22.2885
+86,308,24.4686666666667
+86,309,21.6746666666667
+86,310,20.5528333333333
+86,311,30.7551666666667
+86,312,24.3628333333333
+86,313,21.7593333333333
+86,314,21.6746666666667
+86,315,22.5425
+86,316,30.4165
+86,317,29.1041666666667
+86,318,23.6008333333333
+86,319,23.8336666666667
+86,320,28.8925
+86,321,17.78
+86,322,23.7278333333333
+86,323,25.1883333333333
+86,324,25.1671666666667
+86,325,29.6121666666667
+86,326,32.0886666666667
+86,327,25.6116666666667
+86,328,28.321
+86,329,20.2988333333333
+86,330,29.1041666666667
+86,331,27.0721666666667
+86,332,27.1145
+86,333,25.5693333333333
+86,334,23.495
+86,335,29.6756666666667
+86,336,21.0396666666667
+86,337,23.6855
+86,338,22.5636666666667
+86,339,30.353
+86,340,25.2306666666667
+86,341,27.1356666666667
+86,342,30.6493333333333
+86,343,28.5326666666667
+86,344,24.0665
+86,345,22.7118333333333
+86,346,23.2833333333333
+86,347,26.9451666666667
+86,348,30.1413333333333
+86,349,25.5905
+86,350,27.5801666666667
+86,351,26.3948333333333
+86,352,22.8388333333333
+86,353,21.1243333333333
+86,354,29.2523333333333
+86,355,27.8976666666667
+86,356,30.607
+86,357,28.6596666666667
+86,358,25.2518333333333
+86,359,24.384
+86,360,27.559
+86,361,30.0143333333333
+86,362,22.9658333333333
+86,363,27.0298333333333
+86,364,25.7598333333333
+86,365,32.385
+86,366,21.2936666666667
+86,367,30.7551666666667
+86,368,26.7546666666667
+86,369,24.003
+86,370,21.2301666666667
+86,371,25.8021666666667
+86,372,25.146
+86,373,30.3106666666667
+86,374,27.0721666666667
+86,375,25.0613333333333
+86,376,25.9715
+86,377,26.797
+86,378,29.1888333333333
+86,379,24.2358333333333
+86,380,25.781
+86,381,22.7541666666667
+86,382,30.8821666666667
+86,383,24.9555
+86,384,31.7076666666667
+86,385,25.8021666666667
+86,386,27.6225
+86,387,27.4531666666667
+86,388,30.8398333333333
+86,389,26.3948333333333
+86,390,29.4428333333333
+86,391,23.9395
+86,392,23.9395
+86,393,25.8656666666667
+86,394,23.0716666666667
+86,395,31.0303333333333
+86,396,31.3901666666667
+86,397,28.3633333333333
+86,398,27.5166666666667
+86,399,25.4635
+86,400,21.7593333333333
+86,401,23.2833333333333
+86,402,29.1465
+86,403,24.4051666666667
+86,404,22.8388333333333
+86,405,22.4155
+86,406,25.1883333333333
+86,407,26.4795
+86,408,33.2316666666667
+86,409,24.4898333333333
+86,410,27.6225
+86,411,26.8605
+86,412,31.0726666666667
+86,413,31.75
+86,414,29.0618333333333
+86,415,23.7066666666667
+86,416,24.4898333333333
+86,417,28.6596666666667
+86,418,24.765
+86,419,26.3101666666667
+86,420,24.2146666666667
+86,421,26.0561666666667
+86,422,20.5316666666667
+86,423,29.2311666666667
+86,424,22.3096666666667
+86,425,22.86
+86,426,28.5326666666667
+86,427,29.5275
+86,428,18.161
+86,429,24.6591666666667
+86,430,26.2678333333333
+86,431,30.9245
+86,432,29.1465
+86,433,19.4945
+86,434,25.781
+86,435,31.5171666666667
+86,436,29.1465
+86,437,25.019
+86,438,30.9668333333333
+86,439,21.336
+86,440,29.972
+86,441,30.099
+86,442,29.9508333333333
+86,443,31.3266666666667
+86,444,23.8971666666667
+86,445,29.337
+86,446,27.5378333333333
+86,447,30.2048333333333
+86,448,21.3995
+86,449,24.511
+86,450,25.2306666666667
+86,451,27.6225
+86,452,27.0721666666667
+86,453,27.8341666666667
+86,454,22.4155
+86,455,25.0401666666667
+86,456,26.2255
+86,457,25.273
+86,458,29.0195
+86,459,24.9766666666667
+86,460,27.432
+86,461,24.765
+86,462,24.5745
+86,463,28.575
+86,464,25.3153333333333
+86,465,26.9451666666667
+86,466,25.5905
+86,467,23.4103333333333
+86,468,30.9245
+86,469,18.7748333333333
+86,470,28.9983333333333
+86,471,22.479
+86,472,26.9875
+86,473,33.4856666666667
+86,474,24.384
+86,475,28.0035
+86,476,30.6493333333333
+86,477,26.6488333333333
+86,478,25.0401666666667
+86,479,29.4216666666667
+86,480,24.6591666666667
+86,481,24.3205
+86,482,23.6008333333333
+86,483,31.0938333333333
+86,484,19.8755
+86,485,23.6431666666667
+86,486,22.3731666666667
+86,487,28.5961666666667
+86,488,21.844
+86,489,21.8016666666667
+86,490,26.7123333333333
+86,491,21.2936666666667
+86,492,23.749
+86,493,23.7701666666667
+86,494,31.7076666666667
+86,495,19.5791666666667
+86,496,25.3365
+86,497,21.6535
+86,498,27.3685
+86,499,20.4893333333333
+86,500,23.0505
+86,501,26.3101666666667
+86,502,25.654
+86,503,21.9921666666667
+86,504,24.511
+86,505,23.8548333333333
+86,506,31.3901666666667
+86,507,26.3525
+86,508,23.5796666666667
+86,509,24.8708333333333
+86,510,27.94
+86,511,29.0195
+86,512,19.2616666666667
+86,513,32.4908333333333
+86,514,25.6328333333333
+86,515,28.702
+86,516,23.8548333333333
+86,517,24.2146666666667
+86,518,22.1403333333333
+86,519,24.13
+86,520,26.035
+86,521,30.7128333333333
+86,522,30.353
+86,523,33.0623333333333
+86,524,21.59
+86,525,28.194
+86,526,32.8083333333333
+86,527,27.7071666666667
+86,528,24.0453333333333
+86,529,23.2198333333333
+86,530,24.13
+86,531,26.4795
+86,532,25.3576666666667
+86,533,21.1031666666667
+86,534,25.9926666666667
+86,535,30.5646666666667
+86,536,25.4423333333333
+86,537,21.5053333333333
+86,538,24.4263333333333
+86,539,26.9451666666667
+86,540,25.0613333333333
+86,541,27.0933333333333
+86,542,26.5218333333333
+86,543,28.5115
+86,544,27.3896666666667
+86,545,18.923
+86,546,22.2461666666667
+86,547,26.5853333333333
+86,548,32.6178333333333
+86,549,27.2626666666667
+86,550,24.9343333333333
+86,551,27.7495
+86,552,21.3571666666667
+86,553,22.6695
+86,554,20.7433333333333
+86,555,27.4531666666667
+86,556,17.907
+86,557,30.4588333333333
+86,558,24.13
+86,559,30.4376666666667
+86,560,28.1305
+86,561,24.8073333333333
+86,562,28.7443333333333
+86,563,20.5316666666667
+86,564,25.6116666666667
+86,565,31.6441666666667
+86,566,23.4738333333333
+86,567,30.8821666666667
+86,568,26.2466666666667
+86,569,27.0298333333333
+86,570,33.2316666666667
+86,571,24.511
+86,572,27.1991666666667
+86,573,23.368
+86,574,34.3958333333333
+86,575,24.6591666666667
+86,576,25.3365
+86,577,27.1356666666667
+86,578,32.0251666666667
+86,579,25.273
+86,580,24.3628333333333
+86,581,26.9663333333333
+86,582,28.6808333333333
+86,583,24.4686666666667
+86,584,21.9075
+86,585,22.352
+86,586,22.733
+86,587,25.908
+86,588,28.7655
+86,589,24.7438333333333
+86,590,22.5213333333333
+86,591,21.8228333333333
+86,592,27.813
+86,593,30.8398333333333
+86,594,28.5961666666667
+86,595,26.3101666666667
+86,596,26.3101666666667
+86,597,29.5063333333333
+86,598,27.6648333333333
+86,599,25.2518333333333
+86,600,32.9776666666667
+86,601,25.4423333333333
+86,602,26.1408333333333
+86,603,25.6963333333333
+86,604,26.5006666666667
+86,605,27.3896666666667
+86,606,28.321
+86,607,27.6648333333333
+86,608,26.2255
+86,609,29.7815
+86,610,22.8388333333333
+86,611,21.59
+86,612,19.7061666666667
+86,613,25.5905
+86,614,25.019
+86,615,22.225
+86,616,24.2358333333333
+86,617,24.2358333333333
+86,618,26.7758333333333
+86,619,24.2993333333333
+86,620,30.7551666666667
+86,621,26.4583333333333
+86,622,27.432
+86,623,26.3313333333333
+86,624,22.733
+86,625,25.2095
+86,626,28.6385
+86,627,28.8078333333333
+86,628,27.8976666666667
+86,629,31.1996666666667
+86,630,22.1615
+86,631,26.9028333333333
+86,632,19.6003333333333
+86,633,22.5636666666667
+86,634,25.5693333333333
+86,635,26.8393333333333
+86,636,27.1568333333333
+86,637,31.2843333333333
+86,638,32.6178333333333
+86,639,26.3313333333333
+86,640,26.67
+86,641,24.6168333333333
+86,642,27.6225
+86,643,24.0241666666667
+86,644,22.606
+86,645,24.9978333333333
+86,646,26.7335
+86,647,26.3525
+86,648,29.0406666666667
+86,649,26.797
+86,650,23.0081666666667
+86,651,26.7546666666667
+86,652,27.686
+86,653,26.5853333333333
+86,654,36.703
+86,655,29.4851666666667
+86,656,25.8868333333333
+86,657,25.6963333333333
+86,658,24.3205
+86,659,24.3628333333333
+86,660,20.9126666666667
+86,661,28.2998333333333
+86,662,26.8393333333333
+86,663,31.3478333333333
+86,664,25.7598333333333
+86,665,19.939
+86,666,25.4423333333333
+86,667,26.1408333333333
+86,668,21.5265
+86,669,25.9715
+86,670,29.7603333333333
+86,671,31.5806666666667
+86,672,25.7386666666667
+86,673,29.1465
+86,674,24.5745
+86,675,29.9931666666667
+86,676,27.1991666666667
+86,677,29.845
+86,678,20.7221666666667
+86,679,23.9606666666667
+86,680,26.7123333333333
+86,681,29.9296666666667
+86,682,27.3896666666667
+86,683,25.9503333333333
+86,684,34.1418333333333
+86,685,32.9776666666667
+86,686,29.8873333333333
+86,687,22.0768333333333
+86,688,24.9766666666667
+86,689,27.6225
+86,690,27.6225
+86,691,21.59
+86,692,32.0886666666667
+86,693,35.5811666666667
+86,694,25.019
+86,695,27.7071666666667
+86,696,31.4748333333333
+86,697,25.5905
+86,698,28.6808333333333
+86,699,25.3576666666667
+86,700,28.0881666666667
+86,701,20.9338333333333
+86,702,21.8228333333333
+86,703,26.9028333333333
+86,704,27.432
+86,705,25.4
+86,706,23.1986666666667
+86,707,27.2838333333333
+86,708,33.5491666666667
+86,709,23.2833333333333
+86,710,32.0675
+86,711,25.8233333333333
+86,712,27.5166666666667
+86,713,29.4216666666667
+86,714,27.9823333333333
+86,715,34.544
+86,716,26.7758333333333
+86,717,23.3045
+86,718,27.9823333333333
+86,719,19.7273333333333
+86,720,25.5693333333333
+86,721,24.9343333333333
+86,722,25.908
+86,723,27.2626666666667
+86,724,34.1841666666667
+86,725,21.971
+86,726,23.7066666666667
+86,727,21.3995
+86,728,30.607
+86,729,24.5956666666667
+86,730,26.1831666666667
+86,731,28.1305
+86,732,22.4366666666667
+86,733,28.6808333333333
+86,734,33.1046666666667
+86,735,23.7066666666667
+86,736,25.1671666666667
+86,737,22.9658333333333
+86,738,25.1671666666667
+86,739,24.4263333333333
+86,740,23.6008333333333
+86,741,22.225
+86,742,28.956
+86,743,24.257
+86,744,25.1883333333333
+86,745,25.4635
+86,746,26.4583333333333
+86,747,26.797
+86,748,26.9875
+86,749,24.3628333333333
+86,750,32.0886666666667
+86,751,21.0185
+86,752,24.7226666666667
+86,753,22.1826666666667
+86,754,25.2941666666667
+86,755,25.4
+86,756,26.289
+86,757,27.9188333333333
+86,758,19.1135
+86,759,21.4841666666667
+86,760,28.6385
+86,761,24.5956666666667
+86,762,22.1826666666667
+86,763,20.7221666666667
+86,764,23.495
+86,765,24.3205
+86,766,22.4155
+86,767,22.8176666666667
+86,768,22.606
+86,769,24.7861666666667
+86,770,25.6328333333333
+86,771,23.622
+86,772,26.7546666666667
+86,773,30.2471666666667
+86,774,23.8971666666667
+86,775,23.8971666666667
+86,776,24.765
+86,777,27.051
+86,778,24.9131666666667
+86,779,20.5951666666667
+86,780,31.75
+86,781,27.6648333333333
+86,782,26.3736666666667
+86,783,28.1516666666667
+86,784,21.8228333333333
+86,785,23.4315
+86,786,27.1356666666667
+86,787,26.3736666666667
+86,788,32.131
+86,789,23.1775
+86,790,29.3581666666667
+86,791,23.2833333333333
+86,792,35.1366666666667
+86,793,28.3633333333333
+86,794,22.2038333333333
+86,795,35.7505
+86,796,27.7283333333333
+86,797,24.4475
+86,798,26.2466666666667
+86,799,27.2415
+86,800,18.796
+86,801,31.5595
+86,802,27.8553333333333
+86,803,23.7913333333333
+86,804,23.8548333333333
+86,805,31.1361666666667
+86,806,23.241
+86,807,25.3153333333333
+86,808,30.1201666666667
+86,809,25.5905
+86,810,26.5006666666667
+86,811,24.9131666666667
+86,812,17.6741666666667
+86,813,29.972
+86,814,28.2363333333333
+86,815,20.701
+86,816,22.7965
+86,817,25.3576666666667
+86,818,28.702
+86,819,18.9018333333333
+86,820,27.3473333333333
+86,821,24.4898333333333
+86,822,27.2203333333333
+86,823,29.1676666666667
+86,824,26.6276666666667
+86,825,25.2306666666667
+86,826,28.0881666666667
+86,827,26.0985
+86,828,26.3313333333333
+86,829,22.8388333333333
+86,830,23.876
+86,831,30.4588333333333
+86,832,29.083
+86,833,27.7283333333333
+86,834,29.083
+86,835,19.812
+86,836,25.1248333333333
+86,837,17.6953333333333
+86,838,29.5275
+86,839,24.9978333333333
+86,840,27.4108333333333
+86,841,29.7391666666667
+86,842,24.7226666666667
+86,843,28.829
+86,844,32.1945
+86,845,19.7485
+86,846,30.3741666666667
+86,847,25.6328333333333
+86,848,30.3953333333333
+86,849,32.512
+86,850,29.7391666666667
+86,851,27.686
+86,852,29.4216666666667
+86,853,27.3473333333333
+86,854,22.3096666666667
+86,855,20.5528333333333
+86,856,23.0928333333333
+86,857,27.6648333333333
+86,858,25.1883333333333
+86,859,31.0938333333333
+86,860,25.4635
+86,861,29.1676666666667
+86,862,29.5063333333333
+86,863,27.686
+86,864,31.1785
+86,865,35.2636666666667
+86,866,28.0035
+86,867,22.9023333333333
+86,868,26.2466666666667
+86,869,28.1516666666667
+86,870,22.1615
+86,871,23.5161666666667
+86,872,23.749
+86,873,28.7866666666667
+86,874,24.4475
+86,875,19.6215
+86,876,33.4433333333333
+86,877,28.7655
+86,878,25.2306666666667
+86,879,26.9451666666667
+86,880,28.0246666666667
+86,881,27.6225
+86,882,30.3953333333333
+86,883,26.6488333333333
+86,884,22.5213333333333
+86,885,24.5533333333333
+86,886,25.1671666666667
+86,887,23.6431666666667
+86,888,26.6065
+86,889,32.0675
+86,890,23.4526666666667
+86,891,31.5806666666667
+86,892,23.8125
+86,893,29.4851666666667
+86,894,21.5688333333333
+86,895,27.4743333333333
+86,896,26.5853333333333
+86,897,28.1516666666667
+86,898,24.9978333333333
+86,899,19.4521666666667
+86,900,27.7495
+86,901,22.0556666666667
+86,902,23.2621666666667
+86,903,21.6111666666667
+86,904,30.2048333333333
+86,905,25.019
+86,906,35.7081666666667
+86,907,22.1826666666667
+86,908,24.4686666666667
+86,909,32.893
+86,910,26.0773333333333
+86,911,29.083
+86,912,29.464
+86,913,27.686
+86,914,22.6695
+86,915,27.3473333333333
+86,916,30.5435
+86,917,31.8346666666667
+86,918,30.226
+86,919,21.8651666666667
+86,920,25.6751666666667
+86,921,26.7335
+86,922,22.606
+86,923,23.876
+86,924,24.511
+86,925,26.0561666666667
+86,926,28.8078333333333
+86,927,25.4423333333333
+86,928,25.2306666666667
+86,929,20.447
+86,930,20.7645
+86,931,23.876
+86,932,21.3783333333333
+86,933,27.1145
+86,934,28.3421666666667
+86,935,25.654
+86,936,28.7866666666667
+86,937,33.1046666666667
+86,938,25.781
+86,939,23.9606666666667
+86,940,24.1088333333333
+86,941,23.0505
+86,942,24.5533333333333
+86,943,21.3571666666667
+86,944,26.6911666666667
+86,945,27.8765
+86,946,26.5218333333333
+86,947,23.2198333333333
+86,948,27.3473333333333
+86,949,26.4583333333333
+86,950,26.7335
+86,951,24.765
+86,952,31.0303333333333
+86,953,31.2631666666667
+86,954,27.6648333333333
+86,955,29.4851666666667
+86,956,31.6653333333333
+86,957,31.8981666666667
+86,958,26.289
+86,959,25.9715
+86,960,27.4531666666667
+86,961,27.2203333333333
+86,962,26.1408333333333
+86,963,24.511
+86,964,24.384
+86,965,21.4418333333333
+86,966,30.6705
+86,967,27.6225
+86,968,25.4635
+86,969,32.4485
+86,970,29.6545
+86,971,31.2208333333333
+86,972,22.6271666666667
+86,973,26.9663333333333
+86,974,27.686
+86,975,25.1248333333333
+86,976,28.067
+86,977,29.6756666666667
+86,978,29.4005
+86,979,27.6648333333333
+86,980,26.5218333333333
+86,981,27.1356666666667
+86,982,23.8548333333333
+86,983,20.8491666666667
+86,984,29.2311666666667
+86,985,23.2621666666667
+86,986,18.5208333333333
+86,987,23.3256666666667
+86,988,29.8026666666667
+86,989,23.9183333333333
+86,990,27.6225
+86,991,24.9978333333333
+86,992,20.5528333333333
+86,993,26.5218333333333
+86,994,34.8191666666667
+86,995,18.7113333333333
+86,996,28.3633333333333
+86,997,22.2673333333333
+86,998,22.9235
+86,999,22.6271666666667
+86,1000,30.5011666666667
+87,1,31.5806666666667
+87,2,31.0938333333333
+87,3,31.877
+87,4,35.1578333333333
+87,5,25.0401666666667
+87,6,31.9828333333333
+87,7,24.3205
+87,8,25.8233333333333
+87,9,25.6116666666667
+87,10,28.9136666666667
+87,11,35.941
+87,12,24.9978333333333
+87,13,31.2631666666667
+87,14,33.2951666666667
+87,15,20.4893333333333
+87,16,28.9348333333333
+87,17,28.575
+87,18,30.0566666666667
+87,19,20.2353333333333
+87,20,27.3685
+87,21,28.2151666666667
+87,22,28.5538333333333
+87,23,21.7805
+87,24,25.8868333333333
+87,25,21.1455
+87,26,18.034
+87,27,22.4366666666667
+87,28,34.163
+87,29,20.0236666666667
+87,30,27.2838333333333
+87,31,28.8078333333333
+87,32,27.559
+87,33,31.1361666666667
+87,34,26.924
+87,35,25.5481666666667
+87,36,22.5213333333333
+87,37,27.0298333333333
+87,38,22.9446666666667
+87,39,25.3788333333333
+87,40,24.8285
+87,41,27.7071666666667
+87,42,21.5053333333333
+87,43,29.2523333333333
+87,44,22.098
+87,45,25.0401666666667
+87,46,24.384
+87,47,29.718
+87,48,24.2358333333333
+87,49,24.5533333333333
+87,50,25.4635
+87,51,26.6276666666667
+87,52,18.2033333333333
+87,53,29.845
+87,54,23.0293333333333
+87,55,32.7236666666667
+87,56,23.9183333333333
+87,57,29.464
+87,58,29.591
+87,59,32.1945
+87,60,27.8341666666667
+87,61,36.1315
+87,62,25.3576666666667
+87,63,21.3783333333333
+87,64,23.9606666666667
+87,65,23.7066666666667
+87,66,26.7758333333333
+87,67,24.1935
+87,68,32.9141666666667
+87,69,28.7231666666667
+87,70,26.543
+87,71,21.7593333333333
+87,72,28.2575
+87,73,29.8873333333333
+87,74,27.9188333333333
+87,75,21.844
+87,76,23.3045
+87,77,21.8228333333333
+87,78,31.7076666666667
+87,79,26.0138333333333
+87,80,21.7805
+87,81,19.939
+87,82,25.5905
+87,83,19.8331666666667
+87,84,23.2198333333333
+87,85,37.1686666666667
+87,86,24.8073333333333
+87,87,26.67
+87,88,30.4588333333333
+87,89,28.321
+87,90,24.9555
+87,91,20.955
+87,92,27.5166666666667
+87,93,24.1088333333333
+87,94,23.9183333333333
+87,95,22.4155
+87,96,21.2725
+87,97,28.1516666666667
+87,98,27.6648333333333
+87,99,29.5275
+87,100,24.3416666666667
+87,101,28.1305
+87,102,33.3798333333333
+87,103,26.8816666666667
+87,104,30.6916666666667
+87,105,19.6638333333333
+87,106,28.0458333333333
+87,107,28.3633333333333
+87,108,26.2466666666667
+87,109,22.7753333333333
+87,110,24.5745
+87,111,25.8656666666667
+87,112,23.8548333333333
+87,113,34.8403333333333
+87,114,24.384
+87,115,20.955
+87,116,22.7541666666667
+87,117,22.5001666666667
+87,118,22.7118333333333
+87,119,26.035
+87,120,26.3101666666667
+87,121,31.5383333333333
+87,122,32.6178333333333
+87,123,25.781
+87,124,26.67
+87,125,22.0133333333333
+87,126,31.4748333333333
+87,127,26.3948333333333
+87,128,18.4361666666667
+87,129,21.0396666666667
+87,130,21.7805
+87,131,27.432
+87,132,31.4325
+87,133,29.0618333333333
+87,134,19.9813333333333
+87,135,25.2306666666667
+87,136,30.3741666666667
+87,137,22.7541666666667
+87,138,26.4371666666667
+87,139,26.5006666666667
+87,140,18.5631666666667
+87,141,17.5048333333333
+87,142,20.2141666666667
+87,143,24.13
+87,144,27.8553333333333
+87,145,24.257
+87,146,26.543
+87,147,30.4165
+87,148,32.8083333333333
+87,149,28.6385
+87,150,24.4686666666667
+87,151,27.4955
+87,152,28.1093333333333
+87,153,22.5213333333333
+87,154,30.1836666666667
+87,155,23.9183333333333
+87,156,26.7546666666667
+87,157,27.0086666666667
+87,158,26.2255
+87,159,28.2151666666667
+87,160,26.6911666666667
+87,161,24.5956666666667
+87,162,19.9601666666667
+87,163,23.6855
+87,164,25.0613333333333
+87,165,28.2363333333333
+87,166,21.3148333333333
+87,167,31.8346666666667
+87,168,27.4955
+87,169,25.9503333333333
+87,170,28.6808333333333
+87,171,24.8285
+87,172,30.0355
+87,173,29.8026666666667
+87,174,28.4903333333333
+87,175,25.6963333333333
+87,176,28.2998333333333
+87,177,26.3736666666667
+87,178,26.7546666666667
+87,179,25.3576666666667
+87,180,26.797
+87,181,23.6643333333333
+87,182,22.5001666666667
+87,183,25.2095
+87,184,27.0721666666667
+87,185,28.3421666666667
+87,186,21.082
+87,187,22.5425
+87,188,26.4795
+87,189,29.083
+87,190,20.9973333333333
+87,191,19.2828333333333
+87,192,21.336
+87,193,22.2038333333333
+87,194,28.2786666666667
+87,195,29.7815
+87,196,27.0933333333333
+87,197,21.9921666666667
+87,198,23.7066666666667
+87,199,29.1041666666667
+87,200,29.9085
+87,201,24.2146666666667
+87,202,28.7443333333333
+87,203,30.988
+87,204,19.5368333333333
+87,205,26.924
+87,206,25.781
+87,207,27.7071666666667
+87,208,26.162
+87,209,16.7216666666667
+87,210,25.0401666666667
+87,211,24.1935
+87,212,24.9978333333333
+87,213,26.8393333333333
+87,214,29.21
+87,215,23.241
+87,216,27.7495
+87,217,18.0975
+87,218,24.1935
+87,219,26.543
+87,220,21.3995
+87,221,27.0298333333333
+87,222,22.3096666666667
+87,223,29.7603333333333
+87,224,21.2936666666667
+87,225,25.9291666666667
+87,226,23.6643333333333
+87,227,30.3953333333333
+87,228,28.6385
+87,229,23.368
+87,230,26.7546666666667
+87,231,26.8181666666667
+87,232,26.7758333333333
+87,233,25.8233333333333
+87,234,27.0721666666667
+87,235,26.1831666666667
+87,236,23.876
+87,237,27.6436666666667
+87,238,29.6968333333333
+87,239,18.6478333333333
+87,240,26.6065
+87,241,25.5905
+87,242,31.1361666666667
+87,243,23.1351666666667
+87,244,29.2523333333333
+87,245,28.6596666666667
+87,246,22.8811666666667
+87,247,30.0355
+87,248,18.2245
+87,249,26.924
+87,250,29.1676666666667
+87,251,32.1733333333333
+87,252,40.3648333333333
+87,253,27.7071666666667
+87,254,25.0825
+87,255,31.5171666666667
+87,256,22.606
+87,257,27.432
+87,258,29.8661666666667
+87,259,19.9178333333333
+87,260,25.908
+87,261,25.8233333333333
+87,262,28.956
+87,263,21.9286666666667
+87,264,27.1356666666667
+87,265,22.9446666666667
+87,266,31.8981666666667
+87,267,22.225
+87,268,28.3421666666667
+87,269,28.321
+87,270,22.8176666666667
+87,271,28.321
+87,272,23.0293333333333
+87,273,23.9818333333333
+87,274,32.4061666666667
+87,275,26.0773333333333
+87,276,25.5058333333333
+87,277,20.2776666666667
+87,278,34.9038333333333
+87,279,37.1475
+87,280,29.845
+87,281,23.9183333333333
+87,282,19.4521666666667
+87,283,24.0665
+87,284,25.5058333333333
+87,285,21.5053333333333
+87,286,24.7438333333333
+87,287,23.4315
+87,288,30.1413333333333
+87,289,34.3535
+87,290,23.3256666666667
+87,291,31.0726666666667
+87,292,25.2306666666667
+87,293,20.1718333333333
+87,294,22.2673333333333
+87,295,15.4305
+87,296,25.4423333333333
+87,297,38.7561666666667
+87,298,25.8656666666667
+87,299,29.1888333333333
+87,300,20.0025
+87,301,22.6483333333333
+87,302,24.0665
+87,303,22.8388333333333
+87,304,31.3266666666667
+87,305,22.2673333333333
+87,306,24.765
+87,307,29.6121666666667
+87,308,20.7645
+87,309,21.7805
+87,310,30.1413333333333
+87,311,23.7278333333333
+87,312,27.3896666666667
+87,313,26.543
+87,314,21.2513333333333
+87,315,24.6803333333333
+87,316,22.3308333333333
+87,317,21.9921666666667
+87,318,27.0933333333333
+87,319,28.0881666666667
+87,320,25.908
+87,321,27.1568333333333
+87,322,30.4588333333333
+87,323,26.9663333333333
+87,324,21.9286666666667
+87,325,19.8543333333333
+87,326,25.8233333333333
+87,327,28.6173333333333
+87,328,24.892
+87,329,27.559
+87,330,23.7701666666667
+87,331,24.003
+87,332,23.4103333333333
+87,333,25.5481666666667
+87,334,21.717
+87,335,27.6013333333333
+87,336,24.8496666666667
+87,337,28.8713333333333
+87,338,27.559
+87,339,24.8073333333333
+87,340,28.3845
+87,341,24.1723333333333
+87,342,33.3586666666667
+87,343,29.9296666666667
+87,344,24.1723333333333
+87,345,21.9498333333333
+87,346,26.0985
+87,347,23.0716666666667
+87,348,34.6286666666667
+87,349,25.1248333333333
+87,350,24.2146666666667
+87,351,24.9766666666667
+87,352,27.6225
+87,353,30.4165
+87,354,22.352
+87,355,20.4258333333333
+87,356,28.8713333333333
+87,357,24.6591666666667
+87,358,31.5806666666667
+87,359,28.321
+87,360,22.0133333333333
+87,361,24.892
+87,362,20.955
+87,363,30.2683333333333
+87,364,29.9085
+87,365,28.1093333333333
+87,366,27.94
+87,367,19.7908333333333
+87,368,25.8233333333333
+87,369,20.8068333333333
+87,370,27.9823333333333
+87,371,22.7118333333333
+87,372,22.9235
+87,373,20.5105
+87,374,20.7856666666667
+87,375,24.6803333333333
+87,376,23.7913333333333
+87,377,22.7541666666667
+87,378,28.0246666666667
+87,379,25.8656666666667
+87,380,19.7485
+87,381,25.3576666666667
+87,382,30.2471666666667
+87,383,24.9131666666667
+87,384,21.2513333333333
+87,385,26.8181666666667
+87,386,28.0035
+87,387,33.0623333333333
+87,388,31.0515
+87,389,25.2518333333333
+87,390,30.0566666666667
+87,391,24.3416666666667
+87,392,29.2946666666667
+87,393,19.7908333333333
+87,394,20.7856666666667
+87,395,20.9338333333333
+87,396,26.9028333333333
+87,397,27.813
+87,398,28.9136666666667
+87,399,26.3313333333333
+87,400,29.337
+87,401,36.5971666666667
+87,402,23.4738333333333
+87,403,31.0515
+87,404,28.956
+87,405,26.5641666666667
+87,406,18.4785
+87,407,30.5858333333333
+87,408,25.2095
+87,409,27.4955
+87,410,22.5848333333333
+87,411,25.273
+87,412,22.8388333333333
+87,413,33.1046666666667
+87,414,29.21
+87,415,23.241
+87,416,28.7655
+87,417,22.5848333333333
+87,418,23.4103333333333
+87,419,31.4113333333333
+87,420,23.8125
+87,421,27.2415
+87,422,30.2895
+87,423,29.4428333333333
+87,424,23.2198333333333
+87,425,29.1888333333333
+87,426,22.225
+87,427,20.3623333333333
+87,428,33.3586666666667
+87,429,23.0928333333333
+87,430,27.4531666666667
+87,431,22.3308333333333
+87,432,16.1925
+87,433,29.4216666666667
+87,434,27.6225
+87,435,22.0768333333333
+87,436,31.623
+87,437,31.2631666666667
+87,438,28.4056666666667
+87,439,17.5048333333333
+87,440,24.0453333333333
+87,441,23.7066666666667
+87,442,21.4418333333333
+87,443,27.94
+87,444,27.8553333333333
+87,445,22.479
+87,446,25.146
+87,447,24.8285
+87,448,29.8026666666667
+87,449,21.9498333333333
+87,450,22.225
+87,451,24.2358333333333
+87,452,26.4371666666667
+87,453,27.2203333333333
+87,454,16.8698333333333
+87,455,27.2838333333333
+87,456,29.6333333333333
+87,457,12.8058333333333
+87,458,26.543
+87,459,19.9178333333333
+87,460,34.2265
+87,461,16.1078333333333
+87,462,24.5533333333333
+87,463,21.0608333333333
+87,464,26.7758333333333
+87,465,23.9818333333333
+87,466,27.0086666666667
+87,467,24.7438333333333
+87,468,27.5801666666667
+87,469,31.2843333333333
+87,470,34.5228333333333
+87,471,32.7448333333333
+87,472,30.8398333333333
+87,473,27.9823333333333
+87,474,26.1831666666667
+87,475,25.273
+87,476,22.6483333333333
+87,477,32.004
+87,478,21.6323333333333
+87,479,17.9916666666667
+87,480,25.5481666666667
+87,481,27.4108333333333
+87,482,25.0825
+87,483,28.956
+87,484,25.4846666666667
+87,485,34.3323333333333
+87,486,27.2626666666667
+87,487,23.3891666666667
+87,488,19.1558333333333
+87,489,23.4315
+87,490,22.7118333333333
+87,491,29.6121666666667
+87,492,27.7071666666667
+87,493,30.2895
+87,494,28.5115
+87,495,22.6906666666667
+87,496,31.5806666666667
+87,497,25.8656666666667
+87,498,25.4635
+87,499,20.7645
+87,500,29.7815
+87,501,31.6865
+87,502,29.8238333333333
+87,503,23.2833333333333
+87,504,26.3525
+87,505,27.8976666666667
+87,506,24.4898333333333
+87,507,16.1501666666667
+87,508,32.1733333333333
+87,509,27.3473333333333
+87,510,20.2776666666667
+87,511,31.4748333333333
+87,512,25.2941666666667
+87,513,29.845
+87,514,23.2833333333333
+87,515,27.6013333333333
+87,516,26.035
+87,517,24.8073333333333
+87,518,25.4423333333333
+87,519,22.4578333333333
+87,520,32.0675
+87,521,26.6276666666667
+87,522,28.9771666666667
+87,523,29.8238333333333
+87,524,24.13
+87,525,28.0246666666667
+87,526,18.4573333333333
+87,527,23.495
+87,528,31.9828333333333
+87,529,25.1036666666667
+87,530,25.1036666666667
+87,531,26.289
+87,532,20.4258333333333
+87,533,24.9131666666667
+87,534,14.0546666666667
+87,535,18.8595
+87,536,40.0896666666667
+87,537,33.8666666666667
+87,538,28.2575
+87,539,20.4046666666667
+87,540,28.1093333333333
+87,541,26.3736666666667
+87,542,24.9555
+87,543,23.9818333333333
+87,544,23.876
+87,545,20.3411666666667
+87,546,30.48
+87,547,26.2043333333333
+87,548,32.7236666666667
+87,549,32.4273333333333
+87,550,23.7066666666667
+87,551,31.5171666666667
+87,552,27.432
+87,553,18.7113333333333
+87,554,33.7396666666667
+87,555,29.4216666666667
+87,556,21.2301666666667
+87,557,22.4155
+87,558,27.5378333333333
+87,559,24.8073333333333
+87,560,33.5915
+87,561,25.527
+87,562,27.813
+87,563,25.3365
+87,564,18.0551666666667
+87,565,22.225
+87,566,32.9776666666667
+87,567,26.5006666666667
+87,568,23.4738333333333
+87,569,27.0086666666667
+87,570,20.7221666666667
+87,571,25.146
+87,572,30.1201666666667
+87,573,27.3896666666667
+87,574,31.1785
+87,575,19.9813333333333
+87,576,28.0881666666667
+87,577,22.4366666666667
+87,578,33.3586666666667
+87,579,20.9338333333333
+87,580,30.4376666666667
+87,581,24.892
+87,582,23.6008333333333
+87,583,20.6586666666667
+87,584,26.6276666666667
+87,585,25.019
+87,586,28.6173333333333
+87,587,22.9235
+87,588,23.368
+87,589,29.591
+87,590,28.2998333333333
+87,591,21.9498333333333
+87,592,20.8491666666667
+87,593,17.8858333333333
+87,594,24.638
+87,595,25.1883333333333
+87,596,26.3101666666667
+87,597,18.3515
+87,598,28.9136666666667
+87,599,25.0825
+87,600,20.32
+87,601,26.3101666666667
+87,602,32.2791666666667
+87,603,26.5853333333333
+87,604,27.0933333333333
+87,605,27.0086666666667
+87,606,26.6488333333333
+87,607,29.0195
+87,608,37.1898333333333
+87,609,19.3251666666667
+87,610,23.622
+87,611,28.321
+87,612,25.1671666666667
+87,613,31.0726666666667
+87,614,29.3581666666667
+87,615,16.7428333333333
+87,616,34.2476666666667
+87,617,25.7598333333333
+87,618,22.9658333333333
+87,619,30.3106666666667
+87,620,22.9446666666667
+87,621,26.4371666666667
+87,622,31.9405
+87,623,29.9085
+87,624,32.9565
+87,625,23.9606666666667
+87,626,23.0293333333333
+87,627,30.861
+87,628,23.9606666666667
+87,629,20.7856666666667
+87,630,21.463
+87,631,20.5316666666667
+87,632,24.257
+87,633,28.4691666666667
+87,634,26.9451666666667
+87,635,25.0613333333333
+87,636,33.6761666666667
+87,637,32.6813333333333
+87,638,25.2095
+87,639,25.146
+87,640,30.6705
+87,641,26.7758333333333
+87,642,31.1361666666667
+87,643,25.3788333333333
+87,644,26.3948333333333
+87,645,27.7918333333333
+87,646,24.2781666666667
+87,647,26.3736666666667
+87,648,28.5538333333333
+87,649,29.9085
+87,650,26.8181666666667
+87,651,18.6266666666667
+87,652,17.7165
+87,653,21.4206666666667
+87,654,26.2678333333333
+87,655,29.5486666666667
+87,656,25.6116666666667
+87,657,22.2673333333333
+87,658,26.7335
+87,659,22.7965
+87,660,35.941
+87,661,25.8021666666667
+87,662,28.1516666666667
+87,663,25.1248333333333
+87,664,21.6111666666667
+87,665,26.4583333333333
+87,666,30.3318333333333
+87,667,24.9978333333333
+87,668,30.5435
+87,669,25.8445
+87,670,23.2198333333333
+87,671,26.3948333333333
+87,672,27.3896666666667
+87,673,30.1836666666667
+87,674,21.2301666666667
+87,675,23.241
+87,676,21.8863333333333
+87,677,27.6225
+87,678,24.765
+87,679,24.257
+87,680,23.241
+87,681,28.7655
+87,682,25.6116666666667
+87,683,27.5801666666667
+87,684,20.5316666666667
+87,685,27.7495
+87,686,32.3426666666667
+87,687,26.797
+87,688,22.9235
+87,689,27.813
+87,690,21.8016666666667
+87,691,26.2678333333333
+87,692,26.924
+87,693,28.4056666666667
+87,694,24.892
+87,695,26.5853333333333
+87,696,25.8656666666667
+87,697,17.6318333333333
+87,698,17.6953333333333
+87,699,25.527
+87,700,28.5538333333333
+87,701,22.3096666666667
+87,702,23.495
+87,703,28.2151666666667
+87,704,26.8393333333333
+87,705,23.7066666666667
+87,706,24.2358333333333
+87,707,20.1295
+87,708,31.9828333333333
+87,709,35.3695
+87,710,19.9178333333333
+87,711,27.6436666666667
+87,712,27.686
+87,713,28.3633333333333
+87,714,26.7123333333333
+87,715,25.6751666666667
+87,716,20.1295
+87,717,22.606
+87,718,22.5636666666667
+87,719,32.5543333333333
+87,720,26.8393333333333
+87,721,27.8765
+87,722,32.385
+87,723,29.9508333333333
+87,724,18.6055
+87,725,26.8393333333333
+87,726,19.3675
+87,727,25.1248333333333
+87,728,20.2141666666667
+87,729,31.4748333333333
+87,730,24.8708333333333
+87,731,23.3891666666667
+87,732,25.7386666666667
+87,733,32.5331666666667
+87,734,32.7025
+87,735,24.638
+87,736,28.4691666666667
+87,737,23.622
+87,738,18.4785
+87,739,18.6901666666667
+87,740,22.7965
+87,741,23.8336666666667
+87,742,24.0241666666667
+87,743,25.2095
+87,744,27.8341666666667
+87,745,20.1718333333333
+87,746,21.1666666666667
+87,747,27.1991666666667
+87,748,27.7283333333333
+87,749,23.9606666666667
+87,750,27.4955
+87,751,26.7758333333333
+87,752,24.1935
+87,753,25.781
+87,754,34.8403333333333
+87,755,23.1775
+87,756,16.637
+87,757,22.2885
+87,758,24.3205
+87,759,23.0716666666667
+87,760,23.495
+87,761,17.4836666666667
+87,762,26.7335
+87,763,31.2843333333333
+87,764,20.1295
+87,765,20.1718333333333
+87,766,21.7593333333333
+87,767,25.7598333333333
+87,768,34.163
+87,769,24.9978333333333
+87,770,25.7598333333333
+87,771,28.2998333333333
+87,772,29.6121666666667
+87,773,25.4423333333333
+87,774,19.685
+87,775,17.907
+87,776,29.1253333333333
+87,777,29.6756666666667
+87,778,21.463
+87,779,27.7283333333333
+87,780,24.003
+87,781,23.2621666666667
+87,782,24.1088333333333
+87,783,33.6338333333333
+87,784,25.5905
+87,785,20.193
+87,786,21.1878333333333
+87,787,20.955
+87,788,30.353
+87,789,26.0561666666667
+87,790,25.2518333333333
+87,791,25.0825
+87,792,15.0283333333333
+87,793,27.0933333333333
+87,794,30.861
+87,795,30.861
+87,796,26.0773333333333
+87,797,26.2043333333333
+87,798,28.9136666666667
+87,799,27.305
+87,800,25.8233333333333
+87,801,21.3571666666667
+87,802,28.0035
+87,803,29.9508333333333
+87,804,15.494
+87,805,30.5011666666667
+87,806,25.7175
+87,807,26.4795
+87,808,27.3685
+87,809,30.7763333333333
+87,810,28.9771666666667
+87,811,32.258
+87,812,31.2843333333333
+87,813,26.5853333333333
+87,814,19.812
+87,815,23.6855
+87,816,32.7236666666667
+87,817,19.7485
+87,818,28.4056666666667
+87,819,24.0241666666667
+87,820,26.3948333333333
+87,821,28.9771666666667
+87,822,25.6116666666667
+87,823,37.2533333333333
+87,824,27.305
+87,825,31.496
+87,826,26.5853333333333
+87,827,28.956
+87,828,29.3793333333333
+87,829,25.8656666666667
+87,830,24.4475
+87,831,20.828
+87,832,20.5105
+87,833,30.1413333333333
+87,834,22.7965
+87,835,32.9141666666667
+87,836,20.574
+87,837,26.0138333333333
+87,838,22.3096666666667
+87,839,24.4898333333333
+87,840,28.9136666666667
+87,841,29.1041666666667
+87,842,25.8656666666667
+87,843,24.3205
+87,844,24.257
+87,845,34.671
+87,846,25.2095
+87,847,19.939
+87,848,20.4893333333333
+87,849,27.1145
+87,850,27.8976666666667
+87,851,25.4
+87,852,21.844
+87,853,25.273
+87,854,29.0195
+87,855,25.9291666666667
+87,856,30.7975
+87,857,28.5326666666667
+87,858,29.0618333333333
+87,859,24.7226666666667
+87,860,16.891
+87,861,26.3736666666667
+87,862,32.4485
+87,863,26.543
+87,864,28.4691666666667
+87,865,28.4268333333333
+87,866,24.2146666666667
+87,867,37.846
+87,868,29.3793333333333
+87,869,25.2306666666667
+87,870,26.9028333333333
+87,871,26.6065
+87,872,24.7226666666667
+87,873,28.8925
+87,874,25.7386666666667
+87,875,19.3251666666667
+87,876,31.9405
+87,877,19.4098333333333
+87,878,28.702
+87,879,26.2255
+87,880,24.384
+87,881,29.4216666666667
+87,882,28.9136666666667
+87,883,30.9456666666667
+87,884,22.9658333333333
+87,885,27.0298333333333
+87,886,23.9395
+87,887,18.923
+87,888,24.8708333333333
+87,889,27.6225
+87,890,27.4955
+87,891,21.0608333333333
+87,892,34.8615
+87,893,26.3525
+87,894,17.2508333333333
+87,895,30.9668333333333
+87,896,22.1826666666667
+87,897,25.5058333333333
+87,898,31.1996666666667
+87,899,28.321
+87,900,26.3101666666667
+87,901,25.8656666666667
+87,902,28.4691666666667
+87,903,26.543
+87,904,29.1676666666667
+87,905,24.4263333333333
+87,906,22.4366666666667
+87,907,17.2296666666667
+87,908,31.9193333333333
+87,909,21.9921666666667
+87,910,28.4268333333333
+87,911,29.7603333333333
+87,912,16.383
+87,913,23.495
+87,914,22.5848333333333
+87,915,31.115
+87,916,21.9075
+87,917,28.0035
+87,918,28.0246666666667
+87,919,32.8295
+87,920,30.9456666666667
+87,921,28.8925
+87,922,27.1145
+87,923,24.892
+87,924,24.257
+87,925,21.4418333333333
+87,926,24.5321666666667
+87,927,19.7908333333333
+87,928,32.8083333333333
+87,929,24.4263333333333
+87,930,23.9183333333333
+87,931,34.3958333333333
+87,932,25.7386666666667
+87,933,22.9446666666667
+87,934,20.7645
+87,935,22.8811666666667
+87,936,20.9338333333333
+87,937,21.971
+87,938,24.3416666666667
+87,939,25.2306666666667
+87,940,30.0143333333333
+87,941,23.5373333333333
+87,942,24.0665
+87,943,24.7015
+87,944,24.9343333333333
+87,945,25.1883333333333
+87,946,21.4206666666667
+87,947,31.3055
+87,948,25.8445
+87,949,31.2843333333333
+87,950,22.5848333333333
+87,951,14.1393333333333
+87,952,31.1785
+87,953,21.4418333333333
+87,954,32.893
+87,955,22.7965
+87,956,25.9291666666667
+87,957,27.1568333333333
+87,958,31.0091666666667
+87,959,31.1785
+87,960,25.7386666666667
+87,961,30.3318333333333
+87,962,27.2203333333333
+87,963,23.2621666666667
+87,964,27.1356666666667
+87,965,23.368
+87,966,26.797
+87,967,21.1031666666667
+87,968,26.2043333333333
+87,969,21.6323333333333
+87,970,30.4165
+87,971,25.1036666666667
+87,972,28.3845
+87,973,22.86
+87,974,18.6901666666667
+87,975,27.1356666666667
+87,976,24.0665
+87,977,28.4691666666667
+87,978,25.5905
+87,979,25.8868333333333
+87,980,29.464
+87,981,22.0133333333333
+87,982,23.495
+87,983,29.0406666666667
+87,984,22.8176666666667
+87,985,30.8398333333333
+87,986,29.2311666666667
+87,987,31.8558333333333
+87,988,20.9126666666667
+87,989,28.0246666666667
+87,990,25.7598333333333
+87,991,36.3855
+87,992,23.3891666666667
+87,993,26.0773333333333
+87,994,19.9601666666667
+87,995,24.9555
+87,996,26.3101666666667
+87,997,26.8605
+87,998,22.9446666666667
+87,999,25.3576666666667
+87,1000,29.6333333333333
+88,1,24.9343333333333
+88,2,27.3473333333333
+88,3,20.447
+88,4,31.1573333333333
+88,5,28.956
+88,6,24.1723333333333
+88,7,22.6483333333333
+88,8,24.8496666666667
+88,9,26.924
+88,10,35.052
+88,11,27.559
+88,12,30.6916666666667
+88,13,30.861
+88,14,36.8723333333333
+88,15,35.2213333333333
+88,16,32.0886666666667
+88,17,24.8073333333333
+88,18,26.289
+88,19,27.305
+88,20,32.4696666666667
+88,21,28.4056666666667
+88,22,27.0933333333333
+88,23,35.5176666666667
+88,24,26.035
+88,25,33.8243333333333
+88,26,30.988
+88,27,25.3576666666667
+88,28,26.4583333333333
+88,29,32.6813333333333
+88,30,30.7763333333333
+88,31,31.5383333333333
+88,32,24.13
+88,33,32.766
+88,34,30.8186666666667
+88,35,28.1516666666667
+88,36,25.1036666666667
+88,37,28.321
+88,38,28.829
+88,39,24.3416666666667
+88,40,28.575
+88,41,35.2636666666667
+88,42,30.099
+88,43,28.0246666666667
+88,44,33.3163333333333
+88,45,32.8506666666667
+88,46,25.4846666666667
+88,47,32.6813333333333
+88,48,31.7076666666667
+88,49,28.321
+88,50,27.178
+88,51,31.9616666666667
+88,52,28.5326666666667
+88,53,27.2626666666667
+88,54,32.4696666666667
+88,55,26.6276666666667
+88,56,25.9503333333333
+88,57,31.7076666666667
+88,58,28.956
+88,59,34.3323333333333
+88,60,26.3313333333333
+88,61,26.416
+88,62,22.2673333333333
+88,63,28.6173333333333
+88,64,30.5223333333333
+88,65,31.2843333333333
+88,66,28.956
+88,67,25.3153333333333
+88,68,29.21
+88,69,25.9503333333333
+88,70,31.3266666666667
+88,71,31.3266666666667
+88,72,30.988
+88,73,34.3746666666667
+88,74,29.4216666666667
+88,75,26.797
+88,76,27.813
+88,77,22.098
+88,78,29.1676666666667
+88,79,21.717
+88,80,23.4103333333333
+88,81,37.973
+88,82,24.3416666666667
+88,83,28.6596666666667
+88,84,32.0886666666667
+88,85,28.575
+88,86,32.385
+88,87,27.3473333333333
+88,88,28.194
+88,89,26.6276666666667
+88,90,27.3896666666667
+88,91,27.178
+88,92,32.4696666666667
+88,93,30.5646666666667
+88,94,28.067
+88,95,27.178
+88,96,27.7283333333333
+88,97,30.9456666666667
+88,98,36.83
+88,99,30.0566666666667
+88,100,26.035
+88,101,29.6756666666667
+88,102,29.21
+88,103,31.5383333333333
+88,104,29.21
+88,105,31.0726666666667
+88,106,34.163
+88,107,22.3943333333333
+88,108,25.8233333333333
+88,109,30.0143333333333
+88,110,27.6013333333333
+88,111,25.9503333333333
+88,112,23.0293333333333
+88,113,26.9663333333333
+88,114,37.2533333333333
+88,115,25.273
+88,116,30.3106666666667
+88,117,38.3963333333333
+88,118,35.052
+88,119,29.5486666666667
+88,120,28.575
+88,121,30.861
+88,122,31.7923333333333
+88,123,25.1883333333333
+88,124,25.3153333333333
+88,125,31.5383333333333
+88,126,23.749
+88,127,26.924
+88,128,30.5646666666667
+88,129,27.1356666666667
+88,130,26.289
+88,131,29.6333333333333
+88,132,29.1676666666667
+88,133,30.7763333333333
+88,134,25.654
+88,135,25.1883333333333
+88,136,23.0716666666667
+88,137,30.6493333333333
+88,138,26.7546666666667
+88,139,27.813
+88,140,27.7706666666667
+88,141,31.1996666666667
+88,142,33.02
+88,143,24.1723333333333
+88,144,30.988
+88,145,27.94
+88,146,24.003
+88,147,24.1723333333333
+88,148,30.3953333333333
+88,149,23.5796666666667
+88,150,29.4216666666667
+88,151,26.8816666666667
+88,152,30.8186666666667
+88,153,30.607
+88,154,25.146
+88,155,32.5966666666667
+88,156,33.6126666666667
+88,157,23.3256666666667
+88,158,26.289
+88,159,27.9823333333333
+88,160,26.797
+88,161,32.8506666666667
+88,162,25.5693333333333
+88,163,29.845
+88,164,30.226
+88,165,30.607
+88,166,25.8233333333333
+88,167,26.7546666666667
+88,168,24.003
+88,169,31.0303333333333
+88,170,32.131
+88,171,25.146
+88,172,24.5956666666667
+88,173,28.448
+88,174,36.5336666666667
+88,175,31.7076666666667
+88,176,35.8986666666667
+88,177,32.385
+88,178,27.7283333333333
+88,179,31.5383333333333
+88,180,27.9823333333333
+88,181,27.5166666666667
+88,182,28.1093333333333
+88,183,28.956
+88,184,28.829
+88,185,23.4103333333333
+88,186,35.3906666666667
+88,187,36.8723333333333
+88,188,24.6803333333333
+88,189,29.6333333333333
+88,190,30.099
+88,191,24.3416666666667
+88,192,32.0463333333333
+88,193,24.257
+88,194,25.273
+88,195,38.0576666666667
+88,196,31.7076666666667
+88,197,37.4226666666667
+88,198,28.3633333333333
+88,199,37.338
+88,200,25.4
+88,201,30.9456666666667
+88,202,25.6963333333333
+88,203,21.6746666666667
+88,204,33.655
+88,205,28.6596666666667
+88,206,28.7443333333333
+88,207,28.7866666666667
+88,208,27.3896666666667
+88,209,26.2043333333333
+88,210,25.9503333333333
+88,211,26.3736666666667
+88,212,23.6643333333333
+88,213,24.638
+88,214,25.781
+88,215,30.0143333333333
+88,216,32.3426666666667
+88,217,27.5166666666667
+88,218,31.623
+88,219,32.7236666666667
+88,220,30.5223333333333
+88,221,22.86
+88,222,22.9023333333333
+88,223,34.8826666666667
+88,224,24.4686666666667
+88,225,27.5166666666667
+88,226,24.384
+88,227,28.6173333333333
+88,228,24.9766666666667
+88,229,25.908
+88,230,26.289
+88,231,25.019
+88,232,30.0143333333333
+88,233,22.1403333333333
+88,234,25.9503333333333
+88,235,26.3736666666667
+88,236,28.9136666666667
+88,237,29.3793333333333
+88,238,26.4583333333333
+88,239,34.417
+88,240,25.019
+88,241,31.115
+88,242,24.5956666666667
+88,243,33.655
+88,244,25.3576666666667
+88,245,28.7866666666667
+88,246,29.3793333333333
+88,247,32.5966666666667
+88,248,31.1996666666667
+88,249,22.9023333333333
+88,250,28.7866666666667
+88,251,30.353
+88,252,24.13
+88,253,29.3793333333333
+88,254,25.527
+88,255,32.8083333333333
+88,256,32.258
+88,257,30.734
+88,258,25.273
+88,259,24.4263333333333
+88,260,31.2843333333333
+88,261,21.844
+88,262,22.5213333333333
+88,263,25.9503333333333
+88,264,26.8393333333333
+88,265,27.7283333333333
+88,266,32.5966666666667
+88,267,25.9503333333333
+88,268,25.4
+88,269,24.5533333333333
+88,270,24.0876666666667
+88,271,30.1413333333333
+88,272,28.1093333333333
+88,273,31.7923333333333
+88,274,26.162
+88,275,33.1893333333333
+88,276,23.876
+88,277,26.797
+88,278,32.893
+88,279,34.163
+88,280,38.1
+88,281,28.2786666666667
+88,282,26.2466666666667
+88,283,36.957
+88,284,32.893
+88,285,28.9983333333333
+88,286,30.9033333333333
+88,287,23.8336666666667
+88,288,31.496
+88,289,30.1836666666667
+88,290,30.226
+88,291,32.639
+88,292,33.9936666666667
+88,293,30.9456666666667
+88,294,31.75
+88,295,26.5853333333333
+88,296,20.9126666666667
+88,297,31.75
+88,298,26.1196666666667
+88,299,30.5223333333333
+88,300,27.8976666666667
+88,301,26.4583333333333
+88,302,26.2043333333333
+88,303,32.512
+88,304,30.0566666666667
+88,305,24.2146666666667
+88,306,28.575
+88,307,30.988
+88,308,33.2316666666667
+88,309,21.59
+88,310,31.9616666666667
+88,311,32.2156666666667
+88,312,30.6493333333333
+88,313,30.6493333333333
+88,314,32.7236666666667
+88,315,29.972
+88,316,21.8863333333333
+88,317,27.8553333333333
+88,318,26.416
+88,319,29.4216666666667
+88,320,35.56
+88,321,32.766
+88,322,22.3096666666667
+88,323,26.924
+88,324,26.2043333333333
+88,325,29.21
+88,326,22.7753333333333
+88,327,35.941
+88,328,33.1893333333333
+88,329,27.432
+88,330,25.6963333333333
+88,331,34.2053333333333
+88,332,21.7593333333333
+88,333,27.1356666666667
+88,334,26.4583333333333
+88,335,27.2203333333333
+88,336,28.448
+88,337,31.9193333333333
+88,338,29.21
+88,339,29.591
+88,340,30.6916666666667
+88,341,31.1996666666667
+88,342,24.5533333333333
+88,343,29.1253333333333
+88,344,27.9823333333333
+88,345,32.639
+88,346,28.575
+88,347,33.02
+88,348,26.7123333333333
+88,349,27.813
+88,350,37.7613333333333
+88,351,24.4686666666667
+88,352,23.114
+88,353,28.956
+88,354,26.289
+88,355,32.8083333333333
+88,356,33.274
+88,357,31.115
+88,358,31.496
+88,359,31.7076666666667
+88,360,28.6596666666667
+88,361,31.6653333333333
+88,362,32.3003333333333
+88,363,28.448
+88,364,30.099
+88,365,30.1413333333333
+88,366,33.528
+88,367,31.496
+88,368,30.3953333333333
+88,369,27.7283333333333
+88,370,28.8713333333333
+88,371,24.5956666666667
+88,372,30.1413333333333
+88,373,27.813
+88,374,33.7396666666667
+88,375,28.8713333333333
+88,376,27.0086666666667
+88,377,25.1036666666667
+88,378,29.1676666666667
+88,379,25.6963333333333
+88,380,20.1506666666667
+88,381,29.0406666666667
+88,382,35.9833333333333
+88,383,23.4103333333333
+88,384,30.1413333333333
+88,385,30.0566666666667
+88,386,34.2476666666667
+88,387,34.036
+88,388,29.6333333333333
+88,389,25.1036666666667
+88,390,27.178
+88,391,34.5863333333333
+88,392,28.194
+88,393,30.9456666666667
+88,394,37.0416666666667
+88,395,31.242
+88,396,22.1403333333333
+88,397,28.7866666666667
+88,398,27.8976666666667
+88,399,24.6803333333333
+88,400,23.6643333333333
+88,401,25.654
+88,402,26.2466666666667
+88,403,20.9973333333333
+88,404,32.0463333333333
+88,405,24.9343333333333
+88,406,30.9033333333333
+88,407,31.0303333333333
+88,408,27.5166666666667
+88,409,26.7546666666667
+88,410,31.8346666666667
+88,411,27.94
+88,412,22.6483333333333
+88,413,33.274
+88,414,28.6173333333333
+88,415,27.0086666666667
+88,416,30.988
+88,417,30.861
+88,418,28.3633333333333
+88,419,39.116
+88,420,28.702
+88,421,31.7923333333333
+88,422,28.0246666666667
+88,423,29.1253333333333
+88,424,29.5063333333333
+88,425,31.5806666666667
+88,426,27.686
+88,427,31.5383333333333
+88,428,32.258
+88,429,37.8036666666667
+88,430,30.2683333333333
+88,431,29.9296666666667
+88,432,27.305
+88,433,32.0886666666667
+88,434,25.146
+88,435,33.1893333333333
+88,436,24.8073333333333
+88,437,22.6483333333333
+88,438,25.8233333333333
+88,439,22.6483333333333
+88,440,25.2306666666667
+88,441,27.3473333333333
+88,442,29.718
+88,443,26.3313333333333
+88,444,27.305
+88,445,31.3266666666667
+88,446,27.94
+88,447,31.2843333333333
+88,448,28.321
+88,449,23.6643333333333
+88,450,29.718
+88,451,27.813
+88,452,23.0716666666667
+88,453,32.4273333333333
+88,454,20.1506666666667
+88,455,21.463
+88,456,32.131
+88,457,29.337
+88,458,26.162
+88,459,24.9343333333333
+88,460,30.3953333333333
+88,461,30.226
+88,462,17.907
+88,463,31.4113333333333
+88,464,27.1356666666667
+88,465,28.2786666666667
+88,466,28.9136666666667
+88,467,27.432
+88,468,28.1093333333333
+88,469,28.448
+88,470,27.178
+88,471,27.0933333333333
+88,472,26.3736666666667
+88,473,26.3736666666667
+88,474,27.305
+88,475,29.8026666666667
+88,476,27.686
+88,477,27.6013333333333
+88,478,22.9446666666667
+88,479,30.0143333333333
+88,480,30.988
+88,481,24.5956666666667
+88,482,26.1196666666667
+88,483,24.7226666666667
+88,484,36.1103333333333
+88,485,26.0773333333333
+88,486,32.258
+88,487,30.0566666666667
+88,488,26.416
+88,489,20.2776666666667
+88,490,31.3266666666667
+88,491,25.5693333333333
+88,492,23.1986666666667
+88,493,29.6756666666667
+88,494,33.655
+88,495,32.5966666666667
+88,496,30.8186666666667
+88,497,26.162
+88,498,27.94
+88,499,29.0406666666667
+88,500,38.0576666666667
+88,501,25.4
+88,502,24.9766666666667
+88,503,26.5006666666667
+88,504,27.178
+88,505,27.94
+88,506,25.4846666666667
+88,507,36.4066666666667
+88,508,27.2203333333333
+88,509,26.5006666666667
+88,510,27.8976666666667
+88,511,26.035
+88,512,24.384
+88,513,29.845
+88,514,28.321
+88,515,24.2993333333333
+88,516,27.178
+88,517,32.9776666666667
+88,518,31.7076666666667
+88,519,27.2203333333333
+88,520,33.4856666666667
+88,521,30.5646666666667
+88,522,29.591
+88,523,28.6596666666667
+88,524,22.9023333333333
+88,525,29.1676666666667
+88,526,23.241
+88,527,23.876
+88,528,28.575
+88,529,30.353
+88,530,30.988
+88,531,37.338
+88,532,31.5383333333333
+88,533,29.083
+88,534,29.8026666666667
+88,535,25.9926666666667
+88,536,34.925
+88,537,26.8816666666667
+88,538,26.8816666666667
+88,539,19.9813333333333
+88,540,31.2843333333333
+88,541,32.2156666666667
+88,542,31.623
+88,543,22.3943333333333
+88,544,28.956
+88,545,22.86
+88,546,23.495
+88,547,27.559
+88,548,31.4536666666667
+88,549,26.2466666666667
+88,550,32.4273333333333
+88,551,32.004
+88,552,29.845
+88,553,25.6116666666667
+88,554,28.829
+88,555,28.1093333333333
+88,556,24.8496666666667
+88,557,23.7913333333333
+88,558,23.114
+88,559,26.5006666666667
+88,560,25.273
+88,561,29.845
+88,562,28.1093333333333
+88,563,33.0623333333333
+88,564,36.1103333333333
+88,565,25.6116666666667
+88,566,31.9616666666667
+88,567,26.5853333333333
+88,568,27.94
+88,569,24.13
+88,570,34.7556666666667
+88,571,25.019
+88,572,32.7236666666667
+88,573,27.9823333333333
+88,574,22.9446666666667
+88,575,31.6653333333333
+88,576,27.5166666666667
+88,577,25.8656666666667
+88,578,31.369
+88,579,27.94
+88,580,30.6493333333333
+88,581,29.2523333333333
+88,582,27.178
+88,583,29.1676666666667
+88,584,28.448
+88,585,25.9503333333333
+88,586,37.5073333333333
+88,587,33.8243333333333
+88,588,31.242
+88,589,24.384
+88,590,25.654
+88,591,34.7133333333333
+88,592,30.988
+88,593,33.0623333333333
+88,594,26.2466666666667
+88,595,30.9456666666667
+88,596,30.9033333333333
+88,597,29.6333333333333
+88,598,24.13
+88,599,27.1356666666667
+88,600,31.4113333333333
+88,601,26.035
+88,602,24.8496666666667
+88,603,33.1046666666667
+88,604,29.8873333333333
+88,605,27.4743333333333
+88,606,35.306
+88,607,28.194
+88,608,27.1356666666667
+88,609,31.5806666666667
+88,610,30.2683333333333
+88,611,26.162
+88,612,24.5533333333333
+88,613,31.496
+88,614,31.1996666666667
+88,615,29.5486666666667
+88,616,21.082
+88,617,26.3313333333333
+88,618,22.86
+88,619,27.3896666666667
+88,620,33.4856666666667
+88,621,26.543
+88,622,25.5693333333333
+88,623,27.178
+88,624,36.7453333333333
+88,625,21.59
+88,626,26.67
+88,627,26.6276666666667
+88,628,27.051
+88,629,30.4376666666667
+88,630,31.5806666666667
+88,631,30.3106666666667
+88,632,31.9616666666667
+88,633,28.6596666666667
+88,634,29.5486666666667
+88,635,33.8666666666667
+88,636,24.9766666666667
+88,637,27.94
+88,638,26.9663333333333
+88,639,24.511
+88,640,34.1206666666667
+88,641,30.1413333333333
+88,642,35.6023333333333
+88,643,27.7283333333333
+88,644,21.209
+88,645,25.4
+88,646,28.829
+88,647,29.9296666666667
+88,648,30.48
+88,649,30.607
+88,650,26.9663333333333
+88,651,30.9033333333333
+88,652,28.5326666666667
+88,653,25.1036666666667
+88,654,29.845
+88,655,28.2363333333333
+88,656,30.988
+88,657,38.735
+88,658,37.5496666666667
+88,659,28.321
+88,660,28.0246666666667
+88,661,21.082
+88,662,30.988
+88,663,31.5383333333333
+88,664,25.8233333333333
+88,665,30.353
+88,666,31.5806666666667
+88,667,24.511
+88,668,22.9023333333333
+88,669,31.5383333333333
+88,670,26.8816666666667
+88,671,28.702
+88,672,29.5486666666667
+88,673,32.893
+88,674,34.4593333333333
+88,675,23.7066666666667
+88,676,26.3313333333333
+88,677,29.083
+88,678,30.6493333333333
+88,679,22.5636666666667
+88,680,23.3256666666667
+88,681,28.3633333333333
+88,682,34.925
+88,683,30.5646666666667
+88,684,28.1093333333333
+88,685,24.3416666666667
+88,686,30.5646666666667
+88,687,25.8656666666667
+88,688,25.019
+88,689,28.702
+88,690,31.7076666666667
+88,691,37.8036666666667
+88,692,27.0933333333333
+88,693,38.1423333333333
+88,694,24.9766666666667
+88,695,25.146
+88,696,36.195
+88,697,31.1996666666667
+88,698,23.622
+88,699,28.321
+88,700,24.4686666666667
+88,701,28.575
+88,702,33.782
+88,703,21.9286666666667
+88,704,25.8233333333333
+88,705,26.3313333333333
+88,706,33.9513333333333
+88,707,24.5956666666667
+88,708,30.8186666666667
+88,709,33.9513333333333
+88,710,21.6746666666667
+88,711,31.242
+88,712,27.0086666666667
+88,713,30.353
+88,714,28.1516666666667
+88,715,33.8243333333333
+88,716,23.241
+88,717,29.6756666666667
+88,718,28.702
+88,719,23.4103333333333
+88,720,27.8976666666667
+88,721,34.2476666666667
+88,722,33.401
+88,723,25.2306666666667
+88,724,31.1996666666667
+88,725,24.765
+88,726,29.6333333333333
+88,727,30.353
+88,728,24.638
+88,729,26.5006666666667
+88,730,29.591
+88,731,30.353
+88,732,30.3953333333333
+88,733,27.686
+88,734,23.0716666666667
+88,735,33.0623333333333
+88,736,30.1836666666667
+88,737,29.3793333333333
+88,738,27.559
+88,739,26.2043333333333
+88,740,33.3586666666667
+88,741,29.8026666666667
+88,742,26.1196666666667
+88,743,31.1996666666667
+88,744,24.892
+88,745,26.2466666666667
+88,746,25.9926666666667
+88,747,33.5703333333333
+88,748,27.94
+88,749,25.6963333333333
+88,750,26.7123333333333
+88,751,31.6653333333333
+88,752,17.2296666666667
+88,753,37.4226666666667
+88,754,28.1516666666667
+88,755,22.1403333333333
+88,756,29.8873333333333
+88,757,25.9503333333333
+88,758,29.1676666666667
+88,759,31.9193333333333
+88,760,24.5956666666667
+88,761,28.2363333333333
+88,762,40.3013333333333
+88,763,33.9513333333333
+88,764,26.2466666666667
+88,765,25.4846666666667
+88,766,29.8026666666667
+88,767,31.7076666666667
+88,768,31.242
+88,769,32.512
+88,770,24.765
+88,771,27.6436666666667
+88,772,21.082
+88,773,29.7603333333333
+88,774,32.5966666666667
+88,775,27.432
+88,776,30.6916666666667
+88,777,31.6653333333333
+88,778,21.9286666666667
+88,779,26.797
+88,780,29.591
+88,781,25.908
+88,782,31.496
+88,783,30.099
+88,784,29.6756666666667
+88,785,29.845
+88,786,24.257
+88,787,19.304
+88,788,28.1093333333333
+88,789,24.6803333333333
+88,790,35.6023333333333
+88,791,24.5956666666667
+88,792,28.6173333333333
+88,793,31.75
+88,794,29.5063333333333
+88,795,31.8346666666667
+88,796,29.3793333333333
+88,797,34.417
+88,798,26.924
+88,799,27.432
+88,800,25.527
+88,801,32.131
+88,802,21.9286666666667
+88,803,33.7396666666667
+88,804,24.892
+88,805,34.6286666666667
+88,806,30.9033333333333
+88,807,24.7226666666667
+88,808,21.2936666666667
+88,809,31.4113333333333
+88,810,26.5853333333333
+88,811,30.1836666666667
+88,812,31.115
+88,813,27.305
+88,814,38.9043333333333
+88,815,24.638
+88,816,26.3736666666667
+88,817,25.908
+88,818,30.3106666666667
+88,819,31.369
+88,820,28.9136666666667
+88,821,31.4536666666667
+88,822,27.8553333333333
+88,823,32.9353333333333
+88,824,28.448
+88,825,33.4433333333333
+88,826,27.5166666666667
+88,827,34.5016666666667
+88,828,23.9606666666667
+88,829,25.9926666666667
+88,830,28.575
+88,831,30.4376666666667
+88,832,28.448
+88,833,32.258
+88,834,28.702
+88,835,31.0303333333333
+88,836,26.924
+88,837,19.304
+88,838,29.5063333333333
+88,839,30.1836666666667
+88,840,29.337
+88,841,32.639
+88,842,24.6803333333333
+88,843,27.94
+88,844,29.8873333333333
+88,845,22.352
+88,846,29.1253333333333
+88,847,24.9343333333333
+88,848,26.3313333333333
+88,849,27.686
+88,850,27.0933333333333
+88,851,28.1516666666667
+88,852,31.7923333333333
+88,853,31.496
+88,854,31.369
+88,855,30.4376666666667
+88,856,25.2306666666667
+88,857,24.257
+88,858,21.8016666666667
+88,859,32.639
+88,860,23.495
+88,861,27.178
+88,862,25.9926666666667
+88,863,26.7123333333333
+88,864,25.273
+88,865,29.1676666666667
+88,866,34.2476666666667
+88,867,25.4423333333333
+88,868,29.21
+88,869,31.8346666666667
+88,870,25.1036666666667
+88,871,34.163
+88,872,20.1083333333333
+88,873,27.0086666666667
+88,874,30.1836666666667
+88,875,29.5486666666667
+88,876,28.067
+88,877,24.765
+88,878,22.733
+88,879,31.369
+88,880,24.8073333333333
+88,881,32.7236666666667
+88,882,32.2156666666667
+88,883,28.5326666666667
+88,884,28.575
+88,885,31.9616666666667
+88,886,35.8986666666667
+88,887,26.9663333333333
+88,888,28.067
+88,889,32.893
+88,890,33.655
+88,891,24.1723333333333
+88,892,21.717
+88,893,22.733
+88,894,33.0623333333333
+88,895,32.0463333333333
+88,896,33.5703333333333
+88,897,39.3276666666667
+88,898,30.607
+88,899,26.289
+88,900,34.4593333333333
+88,901,32.3003333333333
+88,902,25.8233333333333
+88,903,29.2946666666667
+88,904,25.8233333333333
+88,905,21.082
+88,906,27.813
+88,907,24.5956666666667
+88,908,32.9353333333333
+88,909,31.2843333333333
+88,910,28.4903333333333
+88,911,26.289
+88,912,31.1996666666667
+88,913,24.8073333333333
+88,914,32.258
+88,915,27.2626666666667
+88,916,28.1093333333333
+88,917,29.8873333333333
+88,918,30.988
+88,919,37.7613333333333
+88,920,31.7923333333333
+88,921,31.496
+88,922,20.6163333333333
+88,923,27.5166666666667
+88,924,29.6756666666667
+88,925,33.5703333333333
+88,926,27.305
+88,927,33.3163333333333
+88,928,32.5543333333333
+88,929,25.273
+88,930,25.273
+88,931,28.1516666666667
+88,932,27.6436666666667
+88,933,25.5693333333333
+88,934,32.004
+88,935,27.6013333333333
+88,936,22.987
+88,937,24.257
+88,938,25.146
+88,939,30.988
+88,940,30.1836666666667
+88,941,31.5383333333333
+88,942,28.956
+88,943,30.9456666666667
+88,944,38.1423333333333
+88,945,28.321
+88,946,30.6916666666667
+88,947,27.0933333333333
+88,948,25.9503333333333
+88,949,36.6183333333333
+88,950,31.7076666666667
+88,951,24.257
+88,952,29.337
+88,953,30.2683333333333
+88,954,25.4846666666667
+88,955,34.5016666666667
+88,956,25.6116666666667
+88,957,34.3323333333333
+88,958,27.813
+88,959,25.6116666666667
+88,960,28.956
+88,961,20.1083333333333
+88,962,33.6126666666667
+88,963,28.5326666666667
+88,964,30.7763333333333
+88,965,28.194
+88,966,26.797
+88,967,28.2363333333333
+88,968,28.6596666666667
+88,969,30.988
+88,970,28.4056666666667
+88,971,26.2043333333333
+88,972,37.4226666666667
+88,973,32.893
+88,974,29.8873333333333
+88,975,20.9973333333333
+88,976,26.67
+88,977,25.4423333333333
+88,978,27.1356666666667
+88,979,30.1836666666667
+88,980,34.7556666666667
+88,981,25.8233333333333
+88,982,36.2796666666667
+88,983,35.1366666666667
+88,984,23.622
+88,985,30.861
+88,986,29.1253333333333
+88,987,27.4743333333333
+88,988,30.0143333333333
+88,989,36.6606666666667
+88,990,26.2043333333333
+88,991,26.162
+88,992,32.5543333333333
+88,993,26.7546666666667
+88,994,23.5796666666667
+88,995,34.544
+88,996,31.369
+88,997,31.242
+88,998,29.1253333333333
+88,999,30.5646666666667
+88,1000,30.3106666666667
+89,1,20.9973333333333
+89,2,28.194
+89,3,23.9818333333333
+89,4,31.6653333333333
+89,5,22.5213333333333
+89,6,22.733
+89,7,28.2151666666667
+89,8,29.4428333333333
+89,9,23.0716666666667
+89,10,26.924
+89,11,26.7758333333333
+89,12,18.7748333333333
+89,13,18.6266666666667
+89,14,20.2353333333333
+89,15,27.432
+89,16,22.0345
+89,17,25.1036666666667
+89,18,25.4423333333333
+89,19,26.67
+89,20,25.4
+89,21,25.1883333333333
+89,22,30.2895
+89,23,25.7175
+89,24,22.7118333333333
+89,25,28.6596666666667
+89,26,23.749
+89,27,21.8228333333333
+89,28,23.1563333333333
+89,29,23.3256666666667
+89,30,25.0401666666667
+89,31,21.1878333333333
+89,32,27.6648333333333
+89,33,23.0505
+89,34,27.0933333333333
+89,35,22.2038333333333
+89,36,21.6323333333333
+89,37,22.9023333333333
+89,38,22.5848333333333
+89,39,24.6168333333333
+89,40,24.2146666666667
+89,41,22.1403333333333
+89,42,29.337
+89,43,25.0401666666667
+89,44,25.8021666666667
+89,45,20.447
+89,46,25.0825
+89,47,18.288
+89,48,24.4475
+89,49,23.7278333333333
+89,50,28.2575
+89,51,22.7965
+89,52,25.1883333333333
+89,53,20.7221666666667
+89,54,29.8873333333333
+89,55,24.6803333333333
+89,56,23.1986666666667
+89,57,26.6488333333333
+89,58,25.1036666666667
+89,59,21.7805
+89,60,27.0721666666667
+89,61,24.5745
+89,62,21.9921666666667
+89,63,19.1981666666667
+89,64,23.4103333333333
+89,65,20.6798333333333
+89,66,22.1403333333333
+89,67,22.0768333333333
+89,68,27.2415
+89,69,21.2725
+89,70,25.0825
+89,71,25.9503333333333
+89,72,27.4531666666667
+89,73,21.7381666666667
+89,74,27.4108333333333
+89,75,26.3101666666667
+89,76,20.193
+89,77,24.9131666666667
+89,78,20.2353333333333
+89,79,23.368
+89,80,20.8703333333333
+89,81,23.9818333333333
+89,82,23.0081666666667
+89,83,27.432
+89,84,25.3576666666667
+89,85,23.3891666666667
+89,86,23.3891666666667
+89,87,26.035
+89,88,28.067
+89,89,20.6163333333333
+89,90,26.8393333333333
+89,91,29.3158333333333
+89,92,25.8656666666667
+89,93,20.8703333333333
+89,94,26.8605
+89,95,23.9818333333333
+89,96,29.5275
+89,97,23.2198333333333
+89,98,26.4583333333333
+89,99,19.3886666666667
+89,100,20.3411666666667
+89,101,23.3256666666667
+89,102,26.4795
+89,103,21.2301666666667
+89,104,24.6591666666667
+89,105,27.5378333333333
+89,106,26.1831666666667
+89,107,22.3308333333333
+89,108,22.6483333333333
+89,109,22.6271666666667
+89,110,26.7546666666667
+89,111,24.9555
+89,112,24.4051666666667
+89,113,20.6163333333333
+89,114,24.6168333333333
+89,115,28.3421666666667
+89,116,18.4361666666667
+89,117,24.0876666666667
+89,118,23.9183333333333
+89,119,24.5533333333333
+89,120,21.1031666666667
+89,121,24.9131666666667
+89,122,27.5801666666667
+89,123,26.797
+89,124,24.5745
+89,125,26.289
+89,126,26.2043333333333
+89,127,22.5425
+89,128,25.1883333333333
+89,129,23.6643333333333
+89,130,21.9498333333333
+89,131,25.527
+89,132,25.2095
+89,133,19.4733333333333
+89,134,31.9828333333333
+89,135,26.7123333333333
+89,136,28.448
+89,137,21.209
+89,138,25.3153333333333
+89,139,23.2833333333333
+89,140,25.654
+89,141,23.7913333333333
+89,142,27.7495
+89,143,20.1295
+89,144,26.2466666666667
+89,145,21.0396666666667
+89,146,23.6855
+89,147,26.1408333333333
+89,148,26.67
+89,149,25.8021666666667
+89,150,23.5585
+89,151,22.352
+89,152,26.5006666666667
+89,153,28.575
+89,154,23.6431666666667
+89,155,23.495
+89,156,28.5538333333333
+89,157,18.9018333333333
+89,158,25.273
+89,159,17.7165
+89,160,28.7655
+89,161,27.4531666666667
+89,162,33.1046666666667
+89,163,23.3045
+89,164,19.1346666666667
+89,165,20.6375
+89,166,25.654
+89,167,23.1351666666667
+89,168,25.781
+89,169,26.7546666666667
+89,170,24.5956666666667
+89,171,26.7335
+89,172,22.225
+89,173,26.035
+89,174,25.0613333333333
+89,175,26.3736666666667
+89,176,21.717
+89,177,23.7278333333333
+89,178,24.3205
+89,179,22.2885
+89,180,30.353
+89,181,23.749
+89,182,23.876
+89,183,19.7908333333333
+89,184,20.2776666666667
+89,185,23.8548333333333
+89,186,29.6121666666667
+89,187,22.9446666666667
+89,188,24.1511666666667
+89,189,26.6911666666667
+89,190,30.0143333333333
+89,191,27.7706666666667
+89,192,23.0081666666667
+89,193,24.4475
+89,194,23.5373333333333
+89,195,24.511
+89,196,19.7485
+89,197,25.0825
+89,198,21.5265
+89,199,17.907
+89,200,26.8605
+89,201,26.9875
+89,202,22.3943333333333
+89,203,23.622
+89,204,24.5321666666667
+89,205,27.4108333333333
+89,206,28.2575
+89,207,19.1981666666667
+89,208,24.0241666666667
+89,209,23.2198333333333
+89,210,27.0298333333333
+89,211,25.527
+89,212,25.8868333333333
+89,213,22.8388333333333
+89,214,21.1878333333333
+89,215,25.019
+89,216,23.7066666666667
+89,217,26.7758333333333
+89,218,26.416
+89,219,22.4155
+89,220,21.8651666666667
+89,221,27.6013333333333
+89,222,23.3256666666667
+89,223,28.8925
+89,224,21.6746666666667
+89,225,23.2621666666667
+89,226,27.5378333333333
+89,227,20.7645
+89,228,27.4955
+89,229,30.5646666666667
+89,230,25.3153333333333
+89,231,21.59
+89,232,24.5321666666667
+89,233,25.527
+89,234,29.5275
+89,235,24.4898333333333
+89,236,17.145
+89,237,23.3256666666667
+89,238,29.2735
+89,239,25.8445
+89,240,21.6323333333333
+89,241,21.209
+89,242,23.6855
+89,243,25.9291666666667
+89,244,22.7753333333333
+89,245,20.8915
+89,246,24.0876666666667
+89,247,24.2146666666667
+89,248,23.2198333333333
+89,249,27.432
+89,250,24.384
+89,251,25.2941666666667
+89,252,25.5481666666667
+89,253,22.5001666666667
+89,254,24.1935
+89,255,26.1196666666667
+89,256,25.1671666666667
+89,257,28.4056666666667
+89,258,24.257
+89,259,24.8496666666667
+89,260,18.8383333333333
+89,261,21.6746666666667
+89,262,25.908
+89,263,21.3571666666667
+89,264,25.273
+89,265,20.5951666666667
+89,266,32.0251666666667
+89,267,22.352
+89,268,25.8021666666667
+89,269,21.1243333333333
+89,270,25.5693333333333
+89,271,25.8445
+89,272,23.5161666666667
+89,273,25.8021666666667
+89,274,26.2466666666667
+89,275,25.0613333333333
+89,276,21.3995
+89,277,21.9286666666667
+89,278,19.2405
+89,279,21.5053333333333
+89,280,30.099
+89,281,19.6215
+89,282,25.8233333333333
+89,283,26.289
+89,284,20.6798333333333
+89,285,23.0081666666667
+89,286,24.2781666666667
+89,287,25.1883333333333
+89,288,26.9028333333333
+89,289,27.8765
+89,290,19.1558333333333
+89,291,20.8703333333333
+89,292,29.3793333333333
+89,293,25.4211666666667
+89,294,24.8708333333333
+89,295,17.78
+89,296,23.1986666666667
+89,297,24.8708333333333
+89,298,23.114
+89,299,24.7226666666667
+89,300,26.0773333333333
+89,301,24.511
+89,302,20.3623333333333
+89,303,21.9075
+89,304,16.4253333333333
+89,305,20.7856666666667
+89,306,21.717
+89,307,27.6013333333333
+89,308,26.416
+89,309,25.9926666666667
+89,310,24.3416666666667
+89,311,24.6803333333333
+89,312,26.289
+89,313,25.8021666666667
+89,314,26.9451666666667
+89,315,20.6798333333333
+89,316,25.5693333333333
+89,317,20.1718333333333
+89,318,26.0561666666667
+89,319,22.3096666666667
+89,320,26.1196666666667
+89,321,27.1991666666667
+89,322,20.6163333333333
+89,323,26.162
+89,324,26.0773333333333
+89,325,32.766
+89,326,25.8656666666667
+89,327,23.8971666666667
+89,328,27.4108333333333
+89,329,27.6225
+89,330,27.8976666666667
+89,331,27.2838333333333
+89,332,30.353
+89,333,23.6643333333333
+89,334,24.0876666666667
+89,335,24.7015
+89,336,21.7381666666667
+89,337,21.8651666666667
+89,338,25.9715
+89,339,23.7701666666667
+89,340,27.94
+89,341,25.1883333333333
+89,342,20.5528333333333
+89,343,22.4366666666667
+89,344,21.9075
+89,345,25.2306666666667
+89,346,26.0985
+89,347,21.463
+89,348,25.4211666666667
+89,349,22.5001666666667
+89,350,23.749
+89,351,24.3416666666667
+89,352,21.3571666666667
+89,353,22.606
+89,354,28.3845
+89,355,28.9771666666667
+89,356,18.1821666666667
+89,357,24.3416666666667
+89,358,22.6271666666667
+89,359,27.305
+89,360,22.6906666666667
+89,361,22.3943333333333
+89,362,17.145
+89,363,24.2358333333333
+89,364,21.6746666666667
+89,365,24.9555
+89,366,29.6756666666667
+89,367,20.955
+89,368,23.7278333333333
+89,369,21.209
+89,370,28.829
+89,371,24.6591666666667
+89,372,28.7866666666667
+89,373,26.0561666666667
+89,374,22.7541666666667
+89,375,25.4635
+89,376,27.2203333333333
+89,377,27.6648333333333
+89,378,24.13
+89,379,21.7381666666667
+89,380,29.8026666666667
+89,381,23.3468333333333
+89,382,23.6855
+89,383,26.289
+89,384,26.67
+89,385,21.0185
+89,386,26.0985
+89,387,25.6751666666667
+89,388,21.8016666666667
+89,389,23.0293333333333
+89,390,23.8548333333333
+89,391,24.6591666666667
+89,392,21.336
+89,393,21.2301666666667
+89,394,24.8708333333333
+89,395,22.9446666666667
+89,396,28.2151666666667
+89,397,26.5218333333333
+89,398,23.6855
+89,399,19.685
+89,400,23.4103333333333
+89,401,24.5745
+89,402,20.447
+89,403,27.7706666666667
+89,404,30.3953333333333
+89,405,25.2941666666667
+89,406,27.3685
+89,407,20.6798333333333
+89,408,20.2353333333333
+89,409,20.6163333333333
+89,410,20.3623333333333
+89,411,25.6963333333333
+89,412,20.2988333333333
+89,413,22.1191666666667
+89,414,24.0665
+89,415,28.194
+89,416,24.4051666666667
+89,417,29.0195
+89,418,22.5001666666667
+89,419,21.0608333333333
+89,420,25.908
+89,421,23.5161666666667
+89,422,21.8016666666667
+89,423,28.1728333333333
+89,424,30.48
+89,425,17.8223333333333
+89,426,28.7443333333333
+89,427,25.4846666666667
+89,428,26.162
+89,429,22.1615
+89,430,23.876
+89,431,25.2518333333333
+89,432,27.1991666666667
+89,433,24.257
+89,434,28.829
+89,435,28.8078333333333
+89,436,18.161
+89,437,18.796
+89,438,19.2193333333333
+89,439,25.9715
+89,440,21.8651666666667
+89,441,28.7231666666667
+89,442,24.6168333333333
+89,443,27.3685
+89,444,24.765
+89,445,23.9818333333333
+89,446,20.828
+89,447,23.7913333333333
+89,448,28.829
+89,449,28.9348333333333
+89,450,25.9291666666667
+89,451,27.6436666666667
+89,452,22.3943333333333
+89,453,24.8708333333333
+89,454,26.035
+89,455,25.6751666666667
+89,456,25.654
+89,457,30.226
+89,458,23.7913333333333
+89,459,27.0298333333333
+89,460,26.1196666666667
+89,461,20.9761666666667
+89,462,22.098
+89,463,24.4263333333333
+89,464,25.1883333333333
+89,465,25.019
+89,466,28.5538333333333
+89,467,25.9291666666667
+89,468,22.9446666666667
+89,469,22.2673333333333
+89,470,27.6436666666667
+89,471,24.5321666666667
+89,472,26.3313333333333
+89,473,26.8816666666667
+89,474,27.5166666666667
+89,475,23.8125
+89,476,22.7753333333333
+89,477,29.4851666666667
+89,478,22.8388333333333
+89,479,26.924
+89,480,25.9291666666667
+89,481,18.6478333333333
+89,482,27.6648333333333
+89,483,27.432
+89,484,22.352
+89,485,24.2993333333333
+89,486,23.0293333333333
+89,487,25.1248333333333
+89,488,21.5476666666667
+89,489,20.9973333333333
+89,490,22.479
+89,491,24.1935
+89,492,24.9131666666667
+89,493,27.2203333333333
+89,494,26.0773333333333
+89,495,30.1836666666667
+89,496,22.9023333333333
+89,497,26.9875
+89,498,30.8398333333333
+89,499,24.9978333333333
+89,500,25.4423333333333
+89,501,28.5326666666667
+89,502,22.3731666666667
+89,503,23.8125
+89,504,22.479
+89,505,23.0928333333333
+89,506,20.5528333333333
+89,507,25.2095
+89,508,26.9451666666667
+89,509,27.1568333333333
+89,510,23.1351666666667
+89,511,24.6803333333333
+89,512,26.9663333333333
+89,513,22.5213333333333
+89,514,21.4206666666667
+89,515,26.4583333333333
+89,516,24.4263333333333
+89,517,16.4676666666667
+89,518,26.9875
+89,519,28.3421666666667
+89,520,27.5801666666667
+89,521,23.5585
+89,522,25.4846666666667
+89,523,23.4103333333333
+89,524,26.8816666666667
+89,525,21.971
+89,526,25.0613333333333
+89,527,23.9818333333333
+89,528,24.765
+89,529,18.923
+89,530,25.5905
+89,531,26.7758333333333
+89,532,20.7221666666667
+89,533,22.6906666666667
+89,534,21.4841666666667
+89,535,23.6431666666667
+89,536,23.6855
+89,537,23.5796666666667
+89,538,27.1991666666667
+89,539,27.5801666666667
+89,540,21.3571666666667
+89,541,27.1568333333333
+89,542,25.4211666666667
+89,543,27.6436666666667
+89,544,28.9771666666667
+89,545,28.6385
+89,546,25.3576666666667
+89,547,30.1413333333333
+89,548,27.3685
+89,549,23.876
+89,550,26.162
+89,551,20.8915
+89,552,28.2363333333333
+89,553,24.7861666666667
+89,554,24.8073333333333
+89,555,21.7593333333333
+89,556,26.3313333333333
+89,557,25.5058333333333
+89,558,28.3845
+89,559,24.5956666666667
+89,560,27.0298333333333
+89,561,20.0448333333333
+89,562,25.0825
+89,563,28.194
+89,564,24.1511666666667
+89,565,25.3788333333333
+89,566,28.321
+89,567,17.4836666666667
+89,568,23.2621666666667
+89,569,23.5585
+89,570,24.2146666666667
+89,571,18.1398333333333
+89,572,21.9921666666667
+89,573,21.4206666666667
+89,574,28.2151666666667
+89,575,23.5161666666667
+89,576,25.8233333333333
+89,577,24.4898333333333
+89,578,19.8966666666667
+89,579,24.3416666666667
+89,580,29.1253333333333
+89,581,29.3793333333333
+89,582,19.939
+89,583,24.6803333333333
+89,584,16.0655
+89,585,24.7226666666667
+89,586,26.0561666666667
+89,587,22.7753333333333
+89,588,28.1305
+89,589,18.8806666666667
+89,590,21.3995
+89,591,26.4371666666667
+89,592,23.9818333333333
+89,593,25.4211666666667
+89,594,24.1511666666667
+89,595,22.2885
+89,596,24.384
+89,597,24.2993333333333
+89,598,26.2255
+89,599,21.971
+89,600,22.352
+89,601,26.5641666666667
+89,602,25.3365
+89,603,27.2838333333333
+89,604,31.5383333333333
+89,605,20.5316666666667
+89,606,21.4418333333333
+89,607,23.8548333333333
+89,608,24.7438333333333
+89,609,25.6116666666667
+89,610,22.6483333333333
+89,611,21.8228333333333
+89,612,23.1986666666667
+89,613,23.4103333333333
+89,614,21.4206666666667
+89,615,22.1403333333333
+89,616,24.003
+89,617,26.7758333333333
+89,618,28.6596666666667
+89,619,21.7805
+89,620,20.32
+89,621,24.3628333333333
+89,622,23.4526666666667
+89,623,25.1036666666667
+89,624,26.9663333333333
+89,625,24.5956666666667
+89,626,19.8331666666667
+89,627,26.9875
+89,628,24.3205
+89,629,24.1935
+89,630,25.4
+89,631,20.6163333333333
+89,632,21.209
+89,633,23.6008333333333
+89,634,21.844
+89,635,24.5533333333333
+89,636,20.574
+89,637,22.098
+89,638,23.7066666666667
+89,639,26.1831666666667
+89,640,21.8016666666667
+89,641,28.0881666666667
+89,642,20.066
+89,643,21.4206666666667
+89,644,24.0665
+89,645,23.6008333333333
+89,646,27.3896666666667
+89,647,22.9235
+89,648,25.5905
+89,649,29.083
+89,650,25.3365
+89,651,26.0985
+89,652,22.4578333333333
+89,653,32.3426666666667
+89,654,27.9611666666667
+89,655,23.9818333333333
+89,656,27.0721666666667
+89,657,22.86
+89,658,24.5745
+89,659,24.6803333333333
+89,660,22.2673333333333
+89,661,20.8491666666667
+89,662,25.8445
+89,663,26.6488333333333
+89,664,21.717
+89,665,28.1093333333333
+89,666,17.3566666666667
+89,667,26.8816666666667
+89,668,15.7903333333333
+89,669,21.463
+89,670,25.9926666666667
+89,671,24.6803333333333
+89,672,24.765
+89,673,18.0763333333333
+89,674,23.0081666666667
+89,675,27.9611666666667
+89,676,19.7061666666667
+89,677,24.2146666666667
+89,678,28.0881666666667
+89,679,25.5481666666667
+89,680,25.7386666666667
+89,681,29.8661666666667
+89,682,21.6323333333333
+89,683,25.3153333333333
+89,684,25.1883333333333
+89,685,26.6276666666667
+89,686,17.0815
+89,687,27.8765
+89,688,19.7485
+89,689,27.0086666666667
+89,690,22.7118333333333
+89,691,22.4155
+89,692,23.1351666666667
+89,693,26.6276666666667
+89,694,24.4898333333333
+89,695,24.0665
+89,696,21.2725
+89,697,30.2683333333333
+89,698,24.5745
+89,699,25.8233333333333
+89,700,26.6911666666667
+89,701,22.9446666666667
+89,702,21.8863333333333
+89,703,26.289
+89,704,22.3308333333333
+89,705,19.3886666666667
+89,706,21.1666666666667
+89,707,24.4898333333333
+89,708,20.0448333333333
+89,709,23.0716666666667
+89,710,21.59
+89,711,21.4418333333333
+89,712,20.4681666666667
+89,713,24.3628333333333
+89,714,24.3628333333333
+89,715,26.8605
+89,716,25.0401666666667
+89,717,20.1718333333333
+89,718,26.6065
+89,719,21.6958333333333
+89,720,23.8125
+89,721,24.7861666666667
+89,722,25.1036666666667
+89,723,25.0825
+89,724,23.876
+89,725,26.4795
+89,726,28.194
+89,727,24.8708333333333
+89,728,22.352
+89,729,26.2678333333333
+89,730,23.6643333333333
+89,731,21.5265
+89,732,24.5321666666667
+89,733,25.4423333333333
+89,734,23.2621666666667
+89,735,23.4103333333333
+89,736,21.6958333333333
+89,737,28.5538333333333
+89,738,24.7226666666667
+89,739,25.5058333333333
+89,740,22.3943333333333
+89,741,24.765
+89,742,21.971
+89,743,25.8656666666667
+89,744,23.4315
+89,745,26.1196666666667
+89,746,22.2038333333333
+89,747,26.5853333333333
+89,748,22.1826666666667
+89,749,24.9131666666667
+89,750,23.622
+89,751,23.4315
+89,752,24.5956666666667
+89,753,26.5641666666667
+89,754,27.178
+89,755,26.289
+89,756,26.7758333333333
+89,757,20.8915
+89,758,21.082
+89,759,28.4903333333333
+89,760,23.1775
+89,761,26.5006666666667
+89,762,22.1403333333333
+89,763,24.9555
+89,764,24.003
+89,765,23.6643333333333
+89,766,20.32
+89,767,21.8651666666667
+89,768,23.3891666666667
+89,769,26.0561666666667
+89,770,25.4
+89,771,22.6483333333333
+89,772,24.511
+89,773,27.7283333333333
+89,774,28.1728333333333
+89,775,24.0876666666667
+89,776,29.2311666666667
+89,777,26.5853333333333
+89,778,22.7753333333333
+89,779,28.5961666666667
+89,780,24.8708333333333
+89,781,29.5275
+89,782,26.0773333333333
+89,783,25.6116666666667
+89,784,19.685
+89,785,23.3468333333333
+89,786,19.8755
+89,787,25.3788333333333
+89,788,30.099
+89,789,24.2146666666667
+89,790,26.7546666666667
+89,791,27.94
+89,792,21.6111666666667
+89,793,25.527
+89,794,30.7763333333333
+89,795,20.1718333333333
+89,796,22.2673333333333
+89,797,20.6375
+89,798,21.3783333333333
+89,799,24.3628333333333
+89,800,25.0401666666667
+89,801,27.813
+89,802,25.908
+89,803,23.0505
+89,804,22.86
+89,805,24.4475
+89,806,26.6488333333333
+89,807,26.9663333333333
+89,808,20.0871666666667
+89,809,20.6375
+89,810,25.2941666666667
+89,811,22.7753333333333
+89,812,26.0773333333333
+89,813,24.2146666666667
+89,814,24.2993333333333
+89,815,25.8445
+89,816,26.6276666666667
+89,817,20.8915
+89,818,25.0613333333333
+89,819,19.2405
+89,820,23.4526666666667
+89,821,31.3266666666667
+89,822,23.0928333333333
+89,823,23.3045
+89,824,32.004
+89,825,24.4051666666667
+89,826,29.1253333333333
+89,827,29.0618333333333
+89,828,29.1676666666667
+89,829,30.9456666666667
+89,830,22.479
+89,831,22.7118333333333
+89,832,22.4578333333333
+89,833,20.1718333333333
+89,834,27.6225
+89,835,20.0236666666667
+89,836,24.7015
+89,837,22.479
+89,838,23.8336666666667
+89,839,21.1878333333333
+89,840,21.3148333333333
+89,841,26.162
+89,842,27.0933333333333
+89,843,28.5538333333333
+89,844,21.336
+89,845,18.3515
+89,846,25.8233333333333
+89,847,24.7438333333333
+89,848,26.8605
+89,849,28.2575
+89,850,24.6591666666667
+89,851,26.5218333333333
+89,852,25.019
+89,853,21.5476666666667
+89,854,25.9291666666667
+89,855,23.6643333333333
+89,856,24.7438333333333
+89,857,26.5853333333333
+89,858,23.5585
+89,859,24.1723333333333
+89,860,23.114
+89,861,21.6535
+89,862,23.4315
+89,863,27.1145
+89,864,25.8233333333333
+89,865,24.0241666666667
+89,866,21.4841666666667
+89,867,24.5321666666667
+89,868,20.2565
+89,869,28.3845
+89,870,25.781
+89,871,23.749
+89,872,27.4743333333333
+89,873,21.6746666666667
+89,874,24.3628333333333
+89,875,24.003
+89,876,25.7175
+89,877,25.9291666666667
+89,878,20.955
+89,879,20.7856666666667
+89,880,24.0876666666667
+89,881,23.2833333333333
+89,882,25.8868333333333
+89,883,24.6591666666667
+89,884,24.4051666666667
+89,885,20.4258333333333
+89,886,27.1568333333333
+89,887,24.511
+89,888,24.9343333333333
+89,889,23.4103333333333
+89,890,20.955
+89,891,19.304
+89,892,23.368
+89,893,27.178
+89,894,18.3303333333333
+89,895,26.9875
+89,896,23.7913333333333
+89,897,29.5275
+89,898,26.2466666666667
+89,899,26.0561666666667
+89,900,27.5166666666667
+89,901,18.9865
+89,902,25.527
+89,903,21.2725
+89,904,24.2993333333333
+89,905,24.4898333333333
+89,906,24.9131666666667
+89,907,21.3571666666667
+89,908,21.6111666666667
+89,909,26.3525
+89,910,27.051
+89,911,24.5745
+89,912,28.4056666666667
+89,913,26.1831666666667
+89,914,21.7593333333333
+89,915,20.4258333333333
+89,916,25.2095
+89,917,25.3365
+89,918,23.6431666666667
+89,919,19.6215
+89,920,23.241
+89,921,22.2461666666667
+89,922,23.2833333333333
+89,923,21.2301666666667
+89,924,22.1403333333333
+89,925,26.2466666666667
+89,926,25.273
+89,927,22.4578333333333
+89,928,24.765
+89,929,23.5373333333333
+89,930,28.3845
+89,931,24.0876666666667
+89,932,21.4418333333333
+89,933,26.9451666666667
+89,934,23.368
+89,935,25.8445
+89,936,28.7655
+89,937,27.3896666666667
+89,938,26.0773333333333
+89,939,22.987
+89,940,23.9606666666667
+89,941,25.4211666666667
+89,942,22.5001666666667
+89,943,22.5213333333333
+89,944,22.3943333333333
+89,945,26.3948333333333
+89,946,21.4841666666667
+89,947,23.7701666666667
+89,948,24.384
+89,949,25.7598333333333
+89,950,28.956
+89,951,25.9503333333333
+89,952,23.7066666666667
+89,953,28.2151666666667
+89,954,25.1036666666667
+89,955,24.5533333333333
+89,956,20.9761666666667
+89,957,23.2198333333333
+89,958,21.5053333333333
+89,959,26.7758333333333
+89,960,24.0876666666667
+89,961,22.6483333333333
+89,962,24.8285
+89,963,24.4898333333333
+89,964,25.6116666666667
+89,965,22.4366666666667
+89,966,24.1511666666667
+89,967,28.2786666666667
+89,968,30.9245
+89,969,26.162
+89,970,19.6638333333333
+89,971,22.733
+89,972,30.4588333333333
+89,973,27.2203333333333
+89,974,22.7541666666667
+89,975,24.0665
+89,976,23.1986666666667
+89,977,27.8765
+89,978,25.781
+89,979,32.9141666666667
+89,980,26.5006666666667
+89,981,23.622
+89,982,24.765
+89,983,21.463
+89,984,20.0025
+89,985,28.4268333333333
+89,986,24.003
+89,987,23.8336666666667
+89,988,23.2198333333333
+89,989,24.2358333333333
+89,990,23.0505
+89,991,25.8021666666667
+89,992,26.4371666666667
+89,993,24.511
+89,994,25.6751666666667
+89,995,25.654
+89,996,29.1676666666667
+89,997,20.9126666666667
+89,998,28.1093333333333
+89,999,25.0401666666667
+89,1000,25.8656666666667
+90,1,23.5373333333333
+90,2,18.796
+90,3,20.7856666666667
+90,4,20.9973333333333
+90,5,25.527
+90,6,21.1666666666667
+90,7,25.1883333333333
+90,8,28.5538333333333
+90,9,21.7593333333333
+90,10,26.035
+90,11,21.4206666666667
+90,12,22.8176666666667
+90,13,23.9818333333333
+90,14,26.3313333333333
+90,15,22.5213333333333
+90,16,30.861
+90,17,28.8713333333333
+90,18,22.5848333333333
+90,19,26.2043333333333
+90,20,24.7226666666667
+90,21,20.1083333333333
+90,22,21.8016666666667
+90,23,24.1088333333333
+90,24,20.4681666666667
+90,25,19.685
+90,26,21.844
+90,27,24.9555
+90,28,22.7753333333333
+90,29,28.3845
+90,30,32.766
+90,31,24.7861666666667
+90,32,23.4526666666667
+90,33,25.4846666666667
+90,34,18.9653333333333
+90,35,22.6271666666667
+90,36,24.003
+90,37,24.257
+90,38,22.6906666666667
+90,39,20.1718333333333
+90,40,21.5053333333333
+90,41,17.6106666666667
+90,42,20.7433333333333
+90,43,23.0293333333333
+90,44,23.7701666666667
+90,45,19.685
+90,46,23.1775
+90,47,23.8336666666667
+90,48,19.05
+90,49,19.7273333333333
+90,50,28.1516666666667
+90,51,25.4846666666667
+90,52,18.2033333333333
+90,53,26.67
+90,54,21.209
+90,55,17.9916666666667
+90,56,18.0975
+90,57,13.5466666666667
+90,58,25.2518333333333
+90,59,18.8806666666667
+90,60,23.0716666666667
+90,61,22.0556666666667
+90,62,26.2466666666667
+90,63,24.003
+90,64,21.6746666666667
+90,65,24.7015
+90,66,22.6695
+90,67,23.2833333333333
+90,68,17.5471666666667
+90,69,21.7805
+90,70,23.7701666666667
+90,71,23.9818333333333
+90,72,21.1243333333333
+90,73,23.7278333333333
+90,74,23.114
+90,75,22.0768333333333
+90,76,23.6855
+90,77,29.3793333333333
+90,78,25.8233333333333
+90,79,22.3943333333333
+90,80,21.4841666666667
+90,81,20.0448333333333
+90,82,25.5693333333333
+90,83,22.4155
+90,84,25.3365
+90,85,26.1408333333333
+90,86,18.0551666666667
+90,87,17.6106666666667
+90,88,20.2353333333333
+90,89,26.7123333333333
+90,90,22.987
+90,91,19.0288333333333
+90,92,19.4733333333333
+90,93,21.0608333333333
+90,94,14.5838333333333
+90,95,24.7015
+90,96,21.6323333333333
+90,97,19.4733333333333
+90,98,20.2141666666667
+90,99,24.6168333333333
+90,100,27.305
+90,101,22.987
+90,102,20.066
+90,103,28.1516666666667
+90,104,24.3205
+90,105,27.0933333333333
+90,106,24.384
+90,107,24.5533333333333
+90,108,24.5321666666667
+90,109,22.4155
+90,110,21.844
+90,111,23.4103333333333
+90,112,21.1666666666667
+90,113,27.3685
+90,114,23.749
+90,115,20.5528333333333
+90,116,23.622
+90,117,24.384
+90,118,22.9235
+90,119,19.7485
+90,120,19.1135
+90,121,21.3571666666667
+90,122,25.4635
+90,123,24.4263333333333
+90,124,26.1196666666667
+90,125,21.6323333333333
+90,126,25.9503333333333
+90,127,24.638
+90,128,19.812
+90,129,27.2626666666667
+90,130,22.733
+90,131,21.6958333333333
+90,132,23.8336666666667
+90,133,20.0025
+90,134,21.1243333333333
+90,135,25.9926666666667
+90,136,20.2988333333333
+90,137,24.6591666666667
+90,138,22.733
+90,139,22.0768333333333
+90,140,23.0505
+90,141,19.1558333333333
+90,142,20.4046666666667
+90,143,22.6271666666667
+90,144,18.415
+90,145,23.9183333333333
+90,146,24.9131666666667
+90,147,20.8915
+90,148,22.098
+90,149,26.0773333333333
+90,150,20.5105
+90,151,19.8543333333333
+90,152,23.876
+90,153,21.4841666666667
+90,154,22.2038333333333
+90,155,27.4108333333333
+90,156,23.4315
+90,157,20.2353333333333
+90,158,24.0453333333333
+90,159,22.5213333333333
+90,160,21.8863333333333
+90,161,17.4413333333333
+90,162,19.3463333333333
+90,163,24.8073333333333
+90,164,20.4681666666667
+90,165,28.2575
+90,166,24.5956666666667
+90,167,22.2673333333333
+90,168,32.639
+90,169,21.5476666666667
+90,170,20.3623333333333
+90,171,22.0133333333333
+90,172,21.9498333333333
+90,173,20.6375
+90,174,24.9343333333333
+90,175,21.3571666666667
+90,176,21.59
+90,177,16.7216666666667
+90,178,22.5213333333333
+90,179,20.2353333333333
+90,180,23.495
+90,181,16.6793333333333
+90,182,28.0246666666667
+90,183,17.9493333333333
+90,184,25.019
+90,185,22.6906666666667
+90,186,21.4206666666667
+90,187,23.622
+90,188,21.844
+90,189,28.1305
+90,190,27.3896666666667
+90,191,20.2988333333333
+90,192,23.9606666666667
+90,193,23.2621666666667
+90,194,28.7866666666667
+90,195,22.5213333333333
+90,196,16.5735
+90,197,25.6963333333333
+90,198,22.733
+90,199,22.4578333333333
+90,200,23.3468333333333
+90,201,22.9446666666667
+90,202,22.098
+90,203,21.8863333333333
+90,204,25.7175
+90,205,31.2843333333333
+90,206,16.9756666666667
+90,207,21.0185
+90,208,18.5843333333333
+90,209,23.241
+90,210,23.6008333333333
+90,211,31.7076666666667
+90,212,26.3525
+90,213,21.0608333333333
+90,214,22.606
+90,215,26.5006666666667
+90,216,23.6431666666667
+90,217,19.9813333333333
+90,218,22.225
+90,219,18.1821666666667
+90,220,28.5115
+90,221,27.9188333333333
+90,222,19.7485
+90,223,20.4681666666667
+90,224,27.8976666666667
+90,225,25.7175
+90,226,24.7226666666667
+90,227,20.3411666666667
+90,228,20.9338333333333
+90,229,23.114
+90,230,22.9235
+90,231,19.7273333333333
+90,232,26.5006666666667
+90,233,23.0505
+90,234,18.034
+90,235,24.257
+90,236,27.5378333333333
+90,237,26.8181666666667
+90,238,25.8233333333333
+90,239,23.4738333333333
+90,240,26.0773333333333
+90,241,29.7391666666667
+90,242,21.3995
+90,243,23.9606666666667
+90,244,25.7386666666667
+90,245,23.8971666666667
+90,246,24.0453333333333
+90,247,21.463
+90,248,19.939
+90,249,23.241
+90,250,23.7066666666667
+90,251,24.765
+90,252,22.3731666666667
+90,253,18.1398333333333
+90,254,16.7851666666667
+90,255,19.4733333333333
+90,256,25.7598333333333
+90,257,26.9028333333333
+90,258,28.8925
+90,259,25.3576666666667
+90,260,25.6963333333333
+90,261,23.7066666666667
+90,262,18.1821666666667
+90,263,29.3581666666667
+90,264,24.003
+90,265,24.2146666666667
+90,266,25.2941666666667
+90,267,22.225
+90,268,26.7758333333333
+90,269,19.5791666666667
+90,270,17.8646666666667
+90,271,23.4738333333333
+90,272,22.8176666666667
+90,273,23.114
+90,274,26.5006666666667
+90,275,24.7015
+90,276,21.3148333333333
+90,277,22.8388333333333
+90,278,19.4521666666667
+90,279,21.717
+90,280,26.6488333333333
+90,281,22.86
+90,282,20.7433333333333
+90,283,24.638
+90,284,23.6008333333333
+90,285,25.6116666666667
+90,286,21.5476666666667
+90,287,23.5585
+90,288,21.5688333333333
+90,289,22.352
+90,290,20.193
+90,291,23.3045
+90,292,23.7913333333333
+90,293,20.2988333333333
+90,294,22.1403333333333
+90,295,21.8016666666667
+90,296,22.0133333333333
+90,297,24.4263333333333
+90,298,26.3948333333333
+90,299,26.3525
+90,300,19.8755
+90,301,24.511
+90,302,21.0185
+90,303,22.8388333333333
+90,304,21.844
+90,305,24.0665
+90,306,20.2141666666667
+90,307,20.7856666666667
+90,308,18.1398333333333
+90,309,21.8228333333333
+90,310,26.8393333333333
+90,311,26.8393333333333
+90,312,25.3365
+90,313,26.8816666666667
+90,314,19.939
+90,315,17.5683333333333
+90,316,22.5001666666667
+90,317,25.019
+90,318,19.3886666666667
+90,319,23.8125
+90,320,25.8445
+90,321,21.8016666666667
+90,322,25.0825
+90,323,28.448
+90,324,23.0716666666667
+90,325,20.193
+90,326,25.0401666666667
+90,327,22.0768333333333
+90,328,23.495
+90,329,28.3845
+90,330,19.304
+90,331,23.495
+90,332,20.7856666666667
+90,333,22.479
+90,334,25.9926666666667
+90,335,22.3731666666667
+90,336,26.5218333333333
+90,337,25.5693333333333
+90,338,22.6483333333333
+90,339,25.4846666666667
+90,340,20.8491666666667
+90,341,21.1243333333333
+90,342,24.3416666666667
+90,343,26.4583333333333
+90,344,21.6746666666667
+90,345,26.1196666666667
+90,346,22.6695
+90,347,24.384
+90,348,22.733
+90,349,23.5373333333333
+90,350,29.3158333333333
+90,351,20.1506666666667
+90,352,17.8646666666667
+90,353,21.8651666666667
+90,354,24.13
+90,355,25.5693333333333
+90,356,20.2565
+90,357,25.6963333333333
+90,358,23.0293333333333
+90,359,23.0928333333333
+90,360,29.9085
+90,361,23.8971666666667
+90,362,30.0143333333333
+90,363,22.7965
+90,364,23.4315
+90,365,24.0241666666667
+90,366,18.923
+90,367,22.606
+90,368,20.8915
+90,369,25.0825
+90,370,24.3205
+90,371,18.2456666666667
+90,372,26.6488333333333
+90,373,20.828
+90,374,23.114
+90,375,23.6855
+90,376,28.1516666666667
+90,377,25.2306666666667
+90,378,23.241
+90,379,24.892
+90,380,25.1883333333333
+90,381,24.3205
+90,382,18.3091666666667
+90,383,20.6798333333333
+90,384,25.1883333333333
+90,385,17.7588333333333
+90,386,25.2306666666667
+90,387,20.0236666666667
+90,388,17.0391666666667
+90,389,21.971
+90,390,23.114
+90,391,26.67
+90,392,20.5105
+90,393,20.4258333333333
+90,394,19.1981666666667
+90,395,25.8021666666667
+90,396,23.8548333333333
+90,397,19.431
+90,398,21.1243333333333
+90,399,23.1986666666667
+90,400,27.0933333333333
+90,401,20.7433333333333
+90,402,21.6323333333333
+90,403,25.9926666666667
+90,404,26.924
+90,405,23.3468333333333
+90,406,24.4686666666667
+90,407,20.4046666666667
+90,408,19.4733333333333
+90,409,25.0825
+90,410,25.3788333333333
+90,411,23.3256666666667
+90,412,24.5956666666667
+90,413,22.1615
+90,414,17.2508333333333
+90,415,23.0081666666667
+90,416,20.0871666666667
+90,417,27.305
+90,418,26.6276666666667
+90,419,20.7221666666667
+90,420,25.6116666666667
+90,421,21.1878333333333
+90,422,22.0768333333333
+90,423,23.3468333333333
+90,424,27.1356666666667
+90,425,21.3995
+90,426,17.9493333333333
+90,427,26.543
+90,428,30.0566666666667
+90,429,21.6535
+90,430,20.9338333333333
+90,431,24.8073333333333
+90,432,26.289
+90,433,25.6116666666667
+90,434,22.9446666666667
+90,435,25.654
+90,436,19.2193333333333
+90,437,22.352
+90,438,19.5791666666667
+90,439,20.3411666666667
+90,440,23.4315
+90,441,20.5951666666667
+90,442,24.0241666666667
+90,443,17.272
+90,444,23.4738333333333
+90,445,22.6906666666667
+90,446,17.6953333333333
+90,447,22.6483333333333
+90,448,24.4051666666667
+90,449,21.2513333333333
+90,450,22.5425
+90,451,21.717
+90,452,23.1351666666667
+90,453,21.1243333333333
+90,454,29.4428333333333
+90,455,22.1403333333333
+90,456,23.114
+90,457,23.5373333333333
+90,458,26.6065
+90,459,25.2941666666667
+90,460,24.0453333333333
+90,461,24.384
+90,462,27.1568333333333
+90,463,19.6638333333333
+90,464,18.9865
+90,465,20.701
+90,466,20.7856666666667
+90,467,24.7015
+90,468,23.5585
+90,469,23.4526666666667
+90,470,21.336
+90,471,24.257
+90,472,24.4263333333333
+90,473,25.0825
+90,474,26.5218333333333
+90,475,19.8543333333333
+90,476,24.638
+90,477,24.4475
+90,478,20.4893333333333
+90,479,17.8646666666667
+90,480,17.1873333333333
+90,481,23.622
+90,482,21.8863333333333
+90,483,21.9286666666667
+90,484,22.6906666666667
+90,485,24.2781666666667
+90,486,22.1615
+90,487,25.9503333333333
+90,488,26.035
+90,489,24.7861666666667
+90,490,24.7226666666667
+90,491,20.066
+90,492,21.1031666666667
+90,493,18.3726666666667
+90,494,20.1083333333333
+90,495,20.4893333333333
+90,496,22.1826666666667
+90,497,24.4263333333333
+90,498,20.828
+90,499,27.4531666666667
+90,500,20.0025
+90,501,18.7113333333333
+90,502,28.575
+90,503,27.5801666666667
+90,504,21.4206666666667
+90,505,21.6111666666667
+90,506,20.7645
+90,507,27.0721666666667
+90,508,21.7805
+90,509,17.907
+90,510,25.654
+90,511,24.0453333333333
+90,512,25.9291666666667
+90,513,20.1718333333333
+90,514,25.4635
+90,515,21.4418333333333
+90,516,19.685
+90,517,27.0086666666667
+90,518,23.3045
+90,519,26.289
+90,520,19.5156666666667
+90,521,19.6003333333333
+90,522,25.781
+90,523,25.3788333333333
+90,524,21.1243333333333
+90,525,27.2203333333333
+90,526,28.956
+90,527,18.0551666666667
+90,528,23.6643333333333
+90,529,26.3525
+90,530,22.3731666666667
+90,531,25.9291666666667
+90,532,18.034
+90,533,20.6586666666667
+90,534,19.6003333333333
+90,535,20.0025
+90,536,20.6163333333333
+90,537,23.5373333333333
+90,538,25.5481666666667
+90,539,26.5853333333333
+90,540,25.8868333333333
+90,541,22.9658333333333
+90,542,23.9818333333333
+90,543,22.3943333333333
+90,544,24.0453333333333
+90,545,20.4046666666667
+90,546,19.1558333333333
+90,547,21.4206666666667
+90,548,18.5631666666667
+90,549,22.9658333333333
+90,550,21.2513333333333
+90,551,22.2038333333333
+90,552,31.75
+90,553,28.7866666666667
+90,554,24.1723333333333
+90,555,23.6855
+90,556,24.5321666666667
+90,557,20.828
+90,558,20.4046666666667
+90,559,19.5156666666667
+90,560,20.3623333333333
+90,561,23.749
+90,562,30.1413333333333
+90,563,26.3948333333333
+90,564,25.5058333333333
+90,565,21.7805
+90,566,20.4681666666667
+90,567,18.4785
+90,568,22.3731666666667
+90,569,22.3096666666667
+90,570,25.4423333333333
+90,571,20.066
+90,572,24.4686666666667
+90,573,21.844
+90,574,19.7696666666667
+90,575,27.3896666666667
+90,576,21.463
+90,577,20.9338333333333
+90,578,22.4155
+90,579,25.3153333333333
+90,580,26.6065
+90,581,24.638
+90,582,22.7118333333333
+90,583,22.86
+90,584,19.812
+90,585,26.5853333333333
+90,586,18.3515
+90,587,27.5166666666667
+90,588,17.78
+90,589,28.3633333333333
+90,590,24.9978333333333
+90,591,18.6901666666667
+90,592,22.1191666666667
+90,593,18.0763333333333
+90,594,17.2931666666667
+90,595,22.6271666666667
+90,596,23.4315
+90,597,24.9555
+90,598,20.8068333333333
+90,599,19.9178333333333
+90,600,19.0711666666667
+90,601,20.0448333333333
+90,602,29.2946666666667
+90,603,18.288
+90,604,19.304
+90,605,28.0881666666667
+90,606,21.717
+90,607,21.6323333333333
+90,608,19.1135
+90,609,26.416
+90,610,25.2518333333333
+90,611,22.4578333333333
+90,612,21.209
+90,613,24.5533333333333
+90,614,26.0138333333333
+90,615,26.1408333333333
+90,616,22.9446666666667
+90,617,20.6163333333333
+90,618,19.4733333333333
+90,619,20.7856666666667
+90,620,21.2936666666667
+90,621,25.8656666666667
+90,622,22.86
+90,623,25.527
+90,624,26.2678333333333
+90,625,25.019
+90,626,23.876
+90,627,21.844
+90,628,21.1031666666667
+90,629,22.8388333333333
+90,630,26.8816666666667
+90,631,23.3891666666667
+90,632,20.9338333333333
+90,633,21.8228333333333
+90,634,26.3736666666667
+90,635,29.3581666666667
+90,636,21.7805
+90,637,20.2776666666667
+90,638,20.0236666666667
+90,639,22.5848333333333
+90,640,30.7763333333333
+90,641,23.9395
+90,642,23.6431666666667
+90,643,26.543
+90,644,31.3266666666667
+90,645,20.955
+90,646,20.9761666666667
+90,647,20.8703333333333
+90,648,26.3736666666667
+90,649,24.3416666666667
+90,650,24.8285
+90,651,20.701
+90,652,23.7913333333333
+90,653,19.7273333333333
+90,654,23.4103333333333
+90,655,25.654
+90,656,24.257
+90,657,29.972
+90,658,25.8233333333333
+90,659,21.5476666666667
+90,660,26.7546666666667
+90,661,26.2255
+90,662,24.8496666666667
+90,663,24.1935
+90,664,25.019
+90,665,22.7965
+90,666,22.225
+90,667,20.6375
+90,668,22.5425
+90,669,18.5631666666667
+90,670,27.0086666666667
+90,671,21.717
+90,672,19.9601666666667
+90,673,21.7805
+90,674,18.669
+90,675,21.3148333333333
+90,676,18.669
+90,677,26.5218333333333
+90,678,19.431
+90,679,26.7123333333333
+90,680,20.6798333333333
+90,681,25.2306666666667
+90,682,23.8971666666667
+90,683,21.209
+90,684,25.654
+90,685,29.1888333333333
+90,686,26.9663333333333
+90,687,23.2621666666667
+90,688,25.0613333333333
+90,689,23.368
+90,690,21.717
+90,691,18.0128333333333
+90,692,28.9136666666667
+90,693,26.4371666666667
+90,694,20.2776666666667
+90,695,25.7175
+90,696,25.4
+90,697,27.7706666666667
+90,698,27.6436666666667
+90,699,23.0716666666667
+90,700,25.3576666666667
+90,701,22.3943333333333
+90,702,18.6266666666667
+90,703,25.6116666666667
+90,704,22.0556666666667
+90,705,25.8233333333333
+90,706,20.32
+90,707,25.2095
+90,708,19.2828333333333
+90,709,26.67
+90,710,31.6018333333333
+90,711,24.7226666666667
+90,712,23.749
+90,713,24.638
+90,714,24.5745
+90,715,25.1883333333333
+90,716,21.082
+90,717,26.0561666666667
+90,718,20.4258333333333
+90,719,17.5048333333333
+90,720,23.5796666666667
+90,721,19.05
+90,722,18.923
+90,723,20.7433333333333
+90,724,17.9281666666667
+90,725,27.4743333333333
+90,726,28.2998333333333
+90,727,19.1346666666667
+90,728,21.59
+90,729,28.2786666666667
+90,730,17.9493333333333
+90,731,20.5105
+90,732,21.0396666666667
+90,733,25.8021666666667
+90,734,20.2776666666667
+90,735,22.2461666666667
+90,736,28.2363333333333
+90,737,31.6018333333333
+90,738,20.2141666666667
+90,739,24.511
+90,740,28.8713333333333
+90,741,27.4743333333333
+90,742,19.7485
+90,743,29.4216666666667
+90,744,21.6746666666667
+90,745,18.4573333333333
+90,746,26.3736666666667
+90,747,21.0185
+90,748,26.2043333333333
+90,749,22.4366666666667
+90,750,24.5745
+90,751,27.1145
+90,752,28.8078333333333
+90,753,22.5425
+90,754,26.1831666666667
+90,755,23.7913333333333
+90,756,23.1351666666667
+90,757,24.765
+90,758,23.4738333333333
+90,759,22.3096666666667
+90,760,24.5321666666667
+90,761,18.0763333333333
+90,762,20.1295
+90,763,18.3091666666667
+90,764,25.8445
+90,765,21.844
+90,766,28.575
+90,767,20.6586666666667
+90,768,19.9813333333333
+90,769,28.8925
+90,770,17.7376666666667
+90,771,22.7753333333333
+90,772,24.511
+90,773,22.7541666666667
+90,774,21.2725
+90,775,18.8383333333333
+90,776,21.0608333333333
+90,777,17.399
+90,778,20.1718333333333
+90,779,23.495
+90,780,25.8233333333333
+90,781,29.1041666666667
+90,782,22.2673333333333
+90,783,21.59
+90,784,28.2363333333333
+90,785,19.8966666666667
+90,786,19.7696666666667
+90,787,20.2353333333333
+90,788,17.5048333333333
+90,789,23.876
+90,790,26.67
+90,791,23.0293333333333
+90,792,23.2833333333333
+90,793,25.019
+90,794,19.9813333333333
+90,795,20.9126666666667
+90,796,17.399
+90,797,31.623
+90,798,27.6225
+90,799,18.9441666666667
+90,800,16.6793333333333
+90,801,20.0025
+90,802,22.1615
+90,803,21.59
+90,804,21.8016666666667
+90,805,23.8971666666667
+90,806,24.8708333333333
+90,807,25.5058333333333
+90,808,21.463
+90,809,22.0768333333333
+90,810,20.1718333333333
+90,811,30.1836666666667
+90,812,22.0768333333333
+90,813,26.5641666666667
+90,814,22.7753333333333
+90,815,24.13
+90,816,26.8393333333333
+90,817,23.8971666666667
+90,818,24.7226666666667
+90,819,20.2565
+90,820,27.8553333333333
+90,821,24.9766666666667
+90,822,20.828
+90,823,19.9178333333333
+90,824,24.0241666666667
+90,825,23.1351666666667
+90,826,21.6111666666667
+90,827,25.6116666666667
+90,828,23.622
+90,829,19.9813333333333
+90,830,24.1935
+90,831,19.05
+90,832,26.4583333333333
+90,833,24.7015
+90,834,27.3685
+90,835,25.0401666666667
+90,836,25.0401666666667
+90,837,21.4206666666667
+90,838,22.3731666666667
+90,839,31.9616666666667
+90,840,20.9338333333333
+90,841,20.5316666666667
+90,842,29.9296666666667
+90,843,23.3045
+90,844,21.8016666666667
+90,845,23.3045
+90,846,23.5796666666667
+90,847,31.8346666666667
+90,848,27.8976666666667
+90,849,19.6215
+90,850,20.8703333333333
+90,851,25.5905
+90,852,18.3726666666667
+90,853,26.0561666666667
+90,854,19.304
+90,855,25.7598333333333
+90,856,27.5378333333333
+90,857,21.59
+90,858,24.1723333333333
+90,859,22.5001666666667
+90,860,19.7696666666667
+90,861,28.3845
+90,862,21.8863333333333
+90,863,24.4686666666667
+90,864,21.1243333333333
+90,865,26.2255
+90,866,25.7598333333333
+90,867,23.0293333333333
+90,868,23.9606666666667
+90,869,19.685
+90,870,25.9291666666667
+90,871,23.9183333333333
+90,872,29.6968333333333
+90,873,25.0825
+90,874,27.1145
+90,875,20.193
+90,876,25.8656666666667
+90,877,26.6065
+90,878,25.5481666666667
+90,879,22.1403333333333
+90,880,25.1883333333333
+90,881,21.3571666666667
+90,882,22.86
+90,883,26.8181666666667
+90,884,24.7015
+90,885,23.6431666666667
+90,886,24.7438333333333
+90,887,25.0613333333333
+90,888,21.59
+90,889,21.5053333333333
+90,890,30.8398333333333
+90,891,24.2993333333333
+90,892,24.0876666666667
+90,893,19.7696666666667
+90,894,21.082
+90,895,28.5326666666667
+90,896,18.542
+90,897,19.6215
+90,898,21.2513333333333
+90,899,17.4625
+90,900,23.114
+90,901,25.1036666666667
+90,902,25.7386666666667
+90,903,22.6483333333333
+90,904,20.1506666666667
+90,905,22.9446666666667
+90,906,23.876
+90,907,24.2146666666667
+90,908,24.4898333333333
+90,909,20.3623333333333
+90,910,23.5161666666667
+90,911,20.0448333333333
+90,912,27.559
+90,913,25.9926666666667
+90,914,24.9978333333333
+90,915,24.5321666666667
+90,916,21.7593333333333
+90,917,26.924
+90,918,19.6003333333333
+90,919,22.8176666666667
+90,920,27.3685
+90,921,25.3365
+90,922,19.6426666666667
+90,923,14.2663333333333
+90,924,21.717
+90,925,20.6586666666667
+90,926,23.5161666666667
+90,927,21.844
+90,928,20.5951666666667
+90,929,20.0025
+90,930,21.9921666666667
+90,931,22.9446666666667
+90,932,28.575
+90,933,24.5745
+90,934,23.749
+90,935,21.9286666666667
+90,936,24.765
+90,937,23.3045
+90,938,26.7123333333333
+90,939,26.5218333333333
+90,940,23.8336666666667
+90,941,19.8543333333333
+90,942,25.2095
+90,943,27.1568333333333
+90,944,21.0185
+90,945,25.4211666666667
+90,946,22.5213333333333
+90,947,23.5585
+90,948,24.5533333333333
+90,949,23.5373333333333
+90,950,20.7221666666667
+90,951,22.8388333333333
+90,952,24.8496666666667
+90,953,23.4315
+90,954,27.7706666666667
+90,955,20.3623333333333
+90,956,21.1243333333333
+90,957,21.3995
+90,958,22.0133333333333
+90,959,21.2936666666667
+90,960,22.352
+90,961,24.4475
+90,962,19.7908333333333
+90,963,18.6266666666667
+90,964,19.0711666666667
+90,965,20.5105
+90,966,22.3731666666667
+90,967,21.9075
+90,968,29.1041666666667
+90,969,20.32
+90,970,22.4155
+90,971,21.2513333333333
+90,972,22.4366666666667
+90,973,19.4945
+90,974,24.0876666666667
+90,975,26.1831666666667
+90,976,24.892
+90,977,26.6276666666667
+90,978,24.3205
+90,979,26.0985
+90,980,26.4583333333333
+90,981,25.8868333333333
+90,982,25.0401666666667
+90,983,25.2941666666667
+90,984,24.2993333333333
+90,985,17.9281666666667
+90,986,22.3096666666667
+90,987,14.478
+90,988,26.8181666666667
+90,989,22.86
+90,990,20.2565
+90,991,18.161
+90,992,23.6431666666667
+90,993,21.336
+90,994,24.4263333333333
+90,995,22.5213333333333
+90,996,22.733
+90,997,23.1775
+90,998,24.8285
+90,999,22.2673333333333
+90,1000,24.4898333333333
+91,1,26.0773333333333
+91,2,31.6018333333333
+91,3,24.5533333333333
+91,4,26.4583333333333
+91,5,29.845
+91,6,20.6375
+91,7,31.7923333333333
+91,8,20.6586666666667
+91,9,29.337
+91,10,27.1568333333333
+91,11,28.7655
+91,12,27.3261666666667
+91,13,24.765
+91,14,20.5528333333333
+91,15,25.7175
+91,16,26.9875
+91,17,23.3468333333333
+91,18,22.6271666666667
+91,19,22.5213333333333
+91,20,25.3576666666667
+91,21,29.4851666666667
+91,22,30.3741666666667
+91,23,25.0401666666667
+91,24,30.5858333333333
+91,25,25.2518333333333
+91,26,25.2095
+91,27,26.3948333333333
+91,28,23.5585
+91,29,24.6803333333333
+91,30,26.543
+91,31,27.9611666666667
+91,32,28.0881666666667
+91,33,22.1403333333333
+91,34,21.9498333333333
+91,35,21.3148333333333
+91,36,23.6431666666667
+91,37,22.8811666666667
+91,38,28.2786666666667
+91,39,23.495
+91,40,19.685
+91,41,26.0773333333333
+91,42,29.1041666666667
+91,43,25.0401666666667
+91,44,22.9446666666667
+91,45,18.9018333333333
+91,46,22.5213333333333
+91,47,25.8445
+91,48,24.511
+91,49,26.162
+91,50,24.8708333333333
+91,51,24.13
+91,52,21.3571666666667
+91,53,27.6225
+91,54,24.765
+91,55,25.3153333333333
+91,56,26.162
+91,57,21.9921666666667
+91,58,21.5688333333333
+91,59,25.4846666666667
+91,60,26.1408333333333
+91,61,28.1516666666667
+91,62,27.4743333333333
+91,63,21.1455
+91,64,27.686
+91,65,24.1935
+91,66,22.6695
+91,67,29.0406666666667
+91,68,25.146
+91,69,27.432
+91,70,21.8863333333333
+91,71,24.3205
+91,72,28.0458333333333
+91,73,23.2833333333333
+91,74,23.622
+91,75,25.8868333333333
+91,76,17.4836666666667
+91,77,25.3153333333333
+91,78,26.9028333333333
+91,79,29.9085
+91,80,23.9606666666667
+91,81,25.4
+91,82,23.7066666666667
+91,83,22.9023333333333
+91,84,20.4893333333333
+91,85,25.1671666666667
+91,86,27.7706666666667
+91,87,26.3313333333333
+91,88,28.7655
+91,89,22.5425
+91,90,23.749
+91,91,30.0778333333333
+91,92,28.7866666666667
+91,93,22.4366666666667
+91,94,24.765
+91,95,23.8971666666667
+91,96,28.0035
+91,97,32.8718333333333
+91,98,29.5275
+91,99,27.9611666666667
+91,100,25.8868333333333
+91,101,26.67
+91,102,22.7965
+91,103,27.1991666666667
+91,104,26.1196666666667
+91,105,23.9183333333333
+91,106,25.2941666666667
+91,107,22.7541666666667
+91,108,23.1563333333333
+91,109,27.3473333333333
+91,110,27.94
+91,111,29.3581666666667
+91,112,29.4005
+91,113,31.1785
+91,114,21.5476666666667
+91,115,20.6375
+91,116,19.812
+91,117,24.0876666666667
+91,118,32.2156666666667
+91,119,22.5213333333333
+91,120,24.5533333333333
+91,121,27.7918333333333
+91,122,28.1728333333333
+91,123,26.5006666666667
+91,124,28.0458333333333
+91,125,24.5745
+91,126,35.8986666666667
+91,127,20.6798333333333
+91,128,31.3901666666667
+91,129,26.6276666666667
+91,130,29.1888333333333
+91,131,20.7433333333333
+91,132,24.8285
+91,133,24.3205
+91,134,26.7546666666667
+91,135,21.9921666666667
+91,136,24.1723333333333
+91,137,25.8021666666667
+91,138,25.654
+91,139,28.5538333333333
+91,140,24.765
+91,141,31.3478333333333
+91,142,24.7015
+91,143,22.2885
+91,144,25.1671666666667
+91,145,21.2513333333333
+91,146,25.8021666666667
+91,147,25.1036666666667
+91,148,28.2151666666667
+91,149,21.1031666666667
+91,150,32.0251666666667
+91,151,29.1465
+91,152,22.1826666666667
+91,153,23.368
+91,154,23.3468333333333
+91,155,30.607
+91,156,25.781
+91,157,20.8703333333333
+91,158,23.7278333333333
+91,159,24.8285
+91,160,23.368
+91,161,22.2885
+91,162,25.5905
+91,163,25.527
+91,164,22.6483333333333
+91,165,26.7123333333333
+91,166,23.7066666666667
+91,167,25.6116666666667
+91,168,26.4371666666667
+91,169,25.4423333333333
+91,170,23.3256666666667
+91,171,24.257
+91,172,25.4
+91,173,23.1351666666667
+91,174,26.162
+91,175,24.7861666666667
+91,176,21.4418333333333
+91,177,28.1516666666667
+91,178,24.2146666666667
+91,179,25.3365
+91,180,21.3783333333333
+91,181,32.385
+91,182,21.8016666666667
+91,183,25.2941666666667
+91,184,24.0453333333333
+91,185,29.5698333333333
+91,186,25.0401666666667
+91,187,23.4315
+91,188,25.3153333333333
+91,189,25.4211666666667
+91,190,30.48
+91,191,29.1888333333333
+91,192,33.3163333333333
+91,193,16.1713333333333
+91,194,27.9188333333333
+91,195,23.6431666666667
+91,196,25.5905
+91,197,26.3525
+91,198,25.8233333333333
+91,199,31.242
+91,200,28.956
+91,201,25.5905
+91,202,27.6225
+91,203,22.1826666666667
+91,204,24.7861666666667
+91,205,20.32
+91,206,28.7443333333333
+91,207,24.7226666666667
+91,208,19.8755
+91,209,31.5806666666667
+91,210,26.543
+91,211,26.6065
+91,212,23.6008333333333
+91,213,26.6065
+91,214,26.5853333333333
+91,215,30.1201666666667
+91,216,22.098
+91,217,28.321
+91,218,26.5641666666667
+91,219,28.4691666666667
+91,220,23.8336666666667
+91,221,23.114
+91,222,30.8398333333333
+91,223,30.3106666666667
+91,224,20.955
+91,225,17.3143333333333
+91,226,23.0081666666667
+91,227,25.146
+91,228,22.8176666666667
+91,229,27.2838333333333
+91,230,24.2993333333333
+91,231,25.9291666666667
+91,232,25.9503333333333
+91,233,21.1878333333333
+91,234,27.813
+91,235,28.9136666666667
+91,236,22.1615
+91,237,22.0556666666667
+91,238,25.5058333333333
+91,239,29.718
+91,240,25.654
+91,241,29.2311666666667
+91,242,23.9606666666667
+91,243,21.9498333333333
+91,244,24.9343333333333
+91,245,19.4098333333333
+91,246,21.5688333333333
+91,247,26.7335
+91,248,25.0401666666667
+91,249,24.6803333333333
+91,250,23.114
+91,251,25.7386666666667
+91,252,26.2466666666667
+91,253,23.0716666666667
+91,254,24.0241666666667
+91,255,27.9611666666667
+91,256,25.654
+91,257,27.686
+91,258,26.7546666666667
+91,259,22.8811666666667
+91,260,27.7071666666667
+91,261,21.1455
+91,262,27.686
+91,263,30.7763333333333
+91,264,20.7856666666667
+91,265,21.7381666666667
+91,266,29.591
+91,267,21.2301666666667
+91,268,29.6756666666667
+91,269,25.5905
+91,270,25.8656666666667
+91,271,27.4743333333333
+91,272,26.3948333333333
+91,273,28.5961666666667
+91,274,34.2265
+91,275,21.1455
+91,276,22.5001666666667
+91,277,24.2146666666667
+91,278,25.6963333333333
+91,279,26.9875
+91,280,27.0933333333333
+91,281,28.5961666666667
+91,282,26.2255
+91,283,27.9188333333333
+91,284,28.8713333333333
+91,285,25.4635
+91,286,22.6906666666667
+91,287,30.1836666666667
+91,288,28.4056666666667
+91,289,21.59
+91,290,30.1413333333333
+91,291,30.3318333333333
+91,292,24.0876666666667
+91,293,27.5378333333333
+91,294,27.559
+91,295,26.8816666666667
+91,296,29.5698333333333
+91,297,26.7335
+91,298,23.0716666666667
+91,299,20.8915
+91,300,23.6855
+91,301,25.6116666666667
+91,302,24.1723333333333
+91,303,31.623
+91,304,20.9126666666667
+91,305,21.3995
+91,306,27.6225
+91,307,24.9555
+91,308,29.464
+91,309,28.5538333333333
+91,310,22.2038333333333
+91,311,26.7123333333333
+91,312,20.0236666666667
+91,313,22.1403333333333
+91,314,22.0556666666667
+91,315,25.9291666666667
+91,316,20.8703333333333
+91,317,26.0138333333333
+91,318,21.3148333333333
+91,319,20.5528333333333
+91,320,24.4898333333333
+91,321,32.1945
+91,322,24.8708333333333
+91,323,31.623
+91,324,26.9875
+91,325,27.4531666666667
+91,326,24.8496666666667
+91,327,24.2358333333333
+91,328,22.987
+91,329,25.9291666666667
+91,330,22.0345
+91,331,26.5853333333333
+91,332,26.2466666666667
+91,333,23.3891666666667
+91,334,23.876
+91,335,22.1403333333333
+91,336,24.3416666666667
+91,337,26.2466666666667
+91,338,28.067
+91,339,23.4526666666667
+91,340,22.5425
+91,341,17.3778333333333
+91,342,19.812
+91,343,32.9565
+91,344,26.1831666666667
+91,345,23.4315
+91,346,23.876
+91,347,28.4268333333333
+91,348,32.4908333333333
+91,349,27.3261666666667
+91,350,27.2838333333333
+91,351,23.7701666666667
+91,352,21.0396666666667
+91,353,26.3101666666667
+91,354,23.1775
+91,355,23.5373333333333
+91,356,31.4536666666667
+91,357,26.0561666666667
+91,358,25.2941666666667
+91,359,20.3835
+91,360,29.4216666666667
+91,361,25.4635
+91,362,26.1196666666667
+91,363,26.67
+91,364,31.6441666666667
+91,365,30.5435
+91,366,25.0825
+91,367,25.9715
+91,368,26.9028333333333
+91,369,22.9446666666667
+91,370,20.1083333333333
+91,371,25.4423333333333
+91,372,27.4108333333333
+91,373,28.7866666666667
+91,374,28.2786666666667
+91,375,24.13
+91,376,24.8708333333333
+91,377,24.003
+91,378,25.8233333333333
+91,379,21.6535
+91,380,28.5961666666667
+91,381,26.8605
+91,382,25.0613333333333
+91,383,26.2678333333333
+91,384,22.4578333333333
+91,385,25.8868333333333
+91,386,25.9291666666667
+91,387,28.3633333333333
+91,388,25.9715
+91,389,24.3628333333333
+91,390,29.337
+91,391,27.5378333333333
+91,392,22.1403333333333
+91,393,26.8181666666667
+91,394,29.9296666666667
+91,395,29.2946666666667
+91,396,24.765
+91,397,27.8976666666667
+91,398,22.479
+91,399,25.5693333333333
+91,400,24.9978333333333
+91,401,25.2095
+91,402,22.8811666666667
+91,403,25.5058333333333
+91,404,25.0825
+91,405,16.4465
+91,406,28.4056666666667
+91,407,23.1351666666667
+91,408,24.3416666666667
+91,409,28.067
+91,410,26.3525
+91,411,27.051
+91,412,21.971
+91,413,21.5688333333333
+91,414,21.59
+91,415,24.003
+91,416,31.9828333333333
+91,417,29.464
+91,418,26.9451666666667
+91,419,20.6375
+91,420,27.686
+91,421,29.3581666666667
+91,422,25.3576666666667
+91,423,24.7861666666667
+91,424,19.9601666666667
+91,425,26.797
+91,426,26.2466666666667
+91,427,26.9663333333333
+91,428,26.3101666666667
+91,429,26.3525
+91,430,21.8016666666667
+91,431,29.5486666666667
+91,432,25.527
+91,433,27.9611666666667
+91,434,25.9926666666667
+91,435,24.7015
+91,436,27.0933333333333
+91,437,28.7655
+91,438,29.1676666666667
+91,439,24.9343333333333
+91,440,23.8548333333333
+91,441,25.019
+91,442,21.1878333333333
+91,443,20.8915
+91,444,24.511
+91,445,22.7753333333333
+91,446,21.5476666666667
+91,447,27.686
+91,448,24.5956666666667
+91,449,24.8285
+91,450,25.3365
+91,451,21.2513333333333
+91,452,24.9131666666667
+91,453,27.6013333333333
+91,454,24.7015
+91,455,29.3581666666667
+91,456,23.5373333333333
+91,457,27.0086666666667
+91,458,21.4841666666667
+91,459,20.9126666666667
+91,460,26.0985
+91,461,18.6478333333333
+91,462,21.2301666666667
+91,463,30.1201666666667
+91,464,22.987
+91,465,19.4521666666667
+91,466,23.495
+91,467,27.0298333333333
+91,468,25.8656666666667
+91,469,23.8971666666667
+91,470,27.9611666666667
+91,471,26.8605
+91,472,21.717
+91,473,26.2466666666667
+91,474,24.2358333333333
+91,475,26.1831666666667
+91,476,25.7598333333333
+91,477,22.8388333333333
+91,478,27.7495
+91,479,19.9178333333333
+91,480,22.4366666666667
+91,481,23.6431666666667
+91,482,24.8285
+91,483,26.2043333333333
+91,484,24.1935
+91,485,29.9931666666667
+91,486,24.1935
+91,487,30.9033333333333
+91,488,25.527
+91,489,33.0623333333333
+91,490,22.8811666666667
+91,491,22.4366666666667
+91,492,23.495
+91,493,30.6493333333333
+91,494,22.225
+91,495,28.448
+91,496,25.5058333333333
+91,497,23.8971666666667
+91,498,26.6488333333333
+91,499,24.4898333333333
+91,500,26.7546666666667
+91,501,28.0035
+91,502,24.5533333333333
+91,503,23.2621666666667
+91,504,23.7701666666667
+91,505,28.8501666666667
+91,506,24.3205
+91,507,22.1615
+91,508,23.5373333333333
+91,509,24.4686666666667
+91,510,27.2415
+91,511,25.4846666666667
+91,512,28.956
+91,513,23.6855
+91,514,26.8816666666667
+91,515,25.0401666666667
+91,516,26.289
+91,517,26.3525
+91,518,26.8393333333333
+91,519,25.2306666666667
+91,520,22.6695
+91,521,27.4743333333333
+91,522,23.495
+91,523,26.9028333333333
+91,524,28.6173333333333
+91,525,24.4475
+91,526,20.7856666666667
+91,527,27.6436666666667
+91,528,23.1563333333333
+91,529,21.7805
+91,530,22.9235
+91,531,24.4686666666667
+91,532,26.9663333333333
+91,533,29.4005
+91,534,28.1516666666667
+91,535,25.6751666666667
+91,536,22.7965
+91,537,24.8496666666667
+91,538,26.8393333333333
+91,539,24.8708333333333
+91,540,19.3251666666667
+91,541,26.7335
+91,542,29.1888333333333
+91,543,22.7965
+91,544,21.5053333333333
+91,545,24.7861666666667
+91,546,24.5745
+91,547,22.1191666666667
+91,548,28.2575
+91,549,27.3896666666667
+91,550,26.9451666666667
+91,551,25.1036666666667
+91,552,22.9235
+91,553,27.8553333333333
+91,554,24.9555
+91,555,27.7495
+91,556,30.48
+91,557,27.6648333333333
+91,558,22.9023333333333
+91,559,27.3685
+91,560,27.7071666666667
+91,561,29.9296666666667
+91,562,19.5791666666667
+91,563,23.5796666666667
+91,564,26.7758333333333
+91,565,28.5115
+91,566,23.749
+91,567,27.5378333333333
+91,568,27.8341666666667
+91,569,26.7546666666667
+91,570,35.1366666666667
+91,571,21.59
+91,572,32.385
+91,573,27.9188333333333
+91,574,26.4795
+91,575,27.178
+91,576,30.0355
+91,577,28.575
+91,578,25.9926666666667
+91,579,24.2993333333333
+91,580,28.702
+91,581,20.5316666666667
+91,582,27.7706666666667
+91,583,22.1826666666667
+91,584,29.1041666666667
+91,585,28.1728333333333
+91,586,26.289
+91,587,28.8078333333333
+91,588,25.9503333333333
+91,589,25.8021666666667
+91,590,27.432
+91,591,26.9663333333333
+91,592,25.3788333333333
+91,593,26.2678333333333
+91,594,31.0303333333333
+91,595,25.4211666666667
+91,596,23.0716666666667
+91,597,26.1831666666667
+91,598,27.7283333333333
+91,599,21.2936666666667
+91,600,27.3685
+91,601,23.4103333333333
+91,602,26.7758333333333
+91,603,30.9033333333333
+91,604,25.3788333333333
+91,605,26.2255
+91,606,25.908
+91,607,21.4841666666667
+91,608,21.7381666666667
+91,609,23.2621666666667
+91,610,23.6008333333333
+91,611,24.9343333333333
+91,612,24.892
+91,613,24.3205
+91,614,23.5373333333333
+91,615,25.1036666666667
+91,616,31.9828333333333
+91,617,20.828
+91,618,21.4206666666667
+91,619,20.8491666666667
+91,620,27.8341666666667
+91,621,25.5481666666667
+91,622,32.2368333333333
+91,623,26.3101666666667
+91,624,18.7325
+91,625,25.7598333333333
+91,626,25.3576666666667
+91,627,24.4898333333333
+91,628,24.6803333333333
+91,629,21.4841666666667
+91,630,22.352
+91,631,26.1408333333333
+91,632,30.3106666666667
+91,633,21.717
+91,634,30.7975
+91,635,33.5703333333333
+91,636,21.9498333333333
+91,637,23.1775
+91,638,21.7805
+91,639,27.7283333333333
+91,640,19.3675
+91,641,22.3943333333333
+91,642,26.4583333333333
+91,643,30.2471666666667
+91,644,26.3313333333333
+91,645,22.9023333333333
+91,646,20.7856666666667
+91,647,32.6178333333333
+91,648,21.6746666666667
+91,649,27.2415
+91,650,27.305
+91,651,24.4263333333333
+91,652,21.4206666666667
+91,653,22.5848333333333
+91,654,30.988
+91,655,28.7231666666667
+91,656,31.877
+91,657,25.8656666666667
+91,658,22.733
+91,659,24.5956666666667
+91,660,28.8713333333333
+91,661,20.7433333333333
+91,662,24.4051666666667
+91,663,27.7918333333333
+91,664,21.3148333333333
+91,665,23.3468333333333
+91,666,24.892
+91,667,28.4691666666667
+91,668,27.6225
+91,669,26.4583333333333
+91,670,35.4965
+91,671,25.8233333333333
+91,672,25.0401666666667
+91,673,26.7335
+91,674,27.2626666666667
+91,675,23.4315
+91,676,28.5115
+91,677,28.9136666666667
+91,678,24.6591666666667
+91,679,27.1145
+91,680,21.6111666666667
+91,681,27.1145
+91,682,27.9188333333333
+91,683,23.3045
+91,684,25.273
+91,685,24.4263333333333
+91,686,23.7278333333333
+91,687,28.2575
+91,688,22.1615
+91,689,29.083
+91,690,26.2678333333333
+91,691,24.7861666666667
+91,692,21.2936666666667
+91,693,28.4056666666667
+91,694,27.8976666666667
+91,695,25.8656666666667
+91,696,28.1093333333333
+91,697,25.9715
+91,698,29.7391666666667
+91,699,23.495
+91,700,17.2296666666667
+91,701,25.1036666666667
+91,702,24.4051666666667
+91,703,23.2198333333333
+91,704,23.1986666666667
+91,705,31.4113333333333
+91,706,26.7123333333333
+91,707,27.1145
+91,708,22.7753333333333
+91,709,19.8543333333333
+91,710,23.6855
+91,711,20.8491666666667
+91,712,27.9611666666667
+91,713,28.067
+91,714,28.2998333333333
+91,715,31.0938333333333
+91,716,21.4206666666667
+91,717,25.019
+91,718,24.5321666666667
+91,719,28.8078333333333
+91,720,27.3685
+91,721,26.6276666666667
+91,722,22.6906666666667
+91,723,31.0091666666667
+91,724,22.0133333333333
+91,725,27.1145
+91,726,27.4108333333333
+91,727,21.5476666666667
+91,728,29.4216666666667
+91,729,28.7866666666667
+91,730,28.0881666666667
+91,731,28.4056666666667
+91,732,24.0876666666667
+91,733,23.0716666666667
+91,734,27.7495
+91,735,25.273
+91,736,24.0665
+91,737,22.2885
+91,738,28.5115
+91,739,30.3953333333333
+91,740,25.0613333333333
+91,741,29.21
+91,742,26.0138333333333
+91,743,23.5373333333333
+91,744,26.0985
+91,745,27.6013333333333
+91,746,26.2043333333333
+91,747,23.1986666666667
+91,748,22.6271666666667
+91,749,24.9343333333333
+91,750,28.9348333333333
+91,751,26.8605
+91,752,27.7071666666667
+91,753,24.511
+91,754,23.5796666666667
+91,755,32.8506666666667
+91,756,22.3731666666667
+91,757,30.353
+91,758,32.0463333333333
+91,759,24.1723333333333
+91,760,29.5698333333333
+91,761,22.7118333333333
+91,762,27.9823333333333
+91,763,25.7175
+91,764,26.289
+91,765,26.3101666666667
+91,766,24.5745
+91,767,29.9508333333333
+91,768,19.3886666666667
+91,769,29.7603333333333
+91,770,29.0195
+91,771,26.5853333333333
+91,772,24.4686666666667
+91,773,23.9606666666667
+91,774,21.9498333333333
+91,775,24.4051666666667
+91,776,30.9456666666667
+91,777,20.5105
+91,778,27.5378333333333
+91,779,24.2781666666667
+91,780,28.1305
+91,781,21.0608333333333
+91,782,24.0665
+91,783,21.8863333333333
+91,784,29.6756666666667
+91,785,23.8971666666667
+91,786,23.241
+91,787,27.3261666666667
+91,788,27.3896666666667
+91,789,27.3261666666667
+91,790,24.4686666666667
+91,791,30.9245
+91,792,19.812
+91,793,28.6596666666667
+91,794,23.7278333333333
+91,795,25.654
+91,796,20.4893333333333
+91,797,20.1083333333333
+91,798,25.6751666666667
+91,799,22.3943333333333
+91,800,26.0138333333333
+91,801,22.2461666666667
+91,802,24.0241666666667
+91,803,27.6225
+91,804,22.0345
+91,805,23.5373333333333
+91,806,30.3741666666667
+91,807,37.1263333333333
+91,808,27.7495
+91,809,25.5058333333333
+91,810,28.4056666666667
+91,811,27.5166666666667
+91,812,28.194
+91,813,34.7345
+91,814,24.0665
+91,815,28.1305
+91,816,22.0768333333333
+91,817,23.876
+91,818,27.305
+91,819,19.177
+91,820,25.2306666666667
+91,821,25.2095
+91,822,26.1831666666667
+91,823,20.5316666666667
+91,824,27.5166666666667
+91,825,27.3473333333333
+91,826,28.8925
+91,827,24.892
+91,828,28.6173333333333
+91,829,26.8181666666667
+91,830,27.686
+91,831,24.0453333333333
+91,832,22.0133333333333
+91,833,25.9926666666667
+91,834,25.527
+91,835,29.972
+91,836,25.8445
+91,837,24.0241666666667
+91,838,27.8765
+91,839,22.733
+91,840,25.4846666666667
+91,841,24.0876666666667
+91,842,21.6111666666667
+91,843,26.7758333333333
+91,844,23.4103333333333
+91,845,26.4795
+91,846,34.9673333333333
+91,847,27.9611666666667
+91,848,20.7221666666667
+91,849,26.3948333333333
+91,850,20.574
+91,851,20.828
+91,852,24.765
+91,853,24.7226666666667
+91,854,24.5745
+91,855,30.861
+91,856,25.0401666666667
+91,857,27.3685
+91,858,22.7753333333333
+91,859,19.5791666666667
+91,860,24.2781666666667
+91,861,23.8971666666667
+91,862,27.7495
+91,863,24.7438333333333
+91,864,23.5161666666667
+91,865,26.8816666666667
+91,866,23.3891666666667
+91,867,24.0665
+91,868,27.1356666666667
+91,869,20.193
+91,870,25.7598333333333
+91,871,19.3251666666667
+91,872,27.5166666666667
+91,873,25.8656666666667
+91,874,31.2843333333333
+91,875,32.8083333333333
+91,876,21.5476666666667
+91,877,22.6906666666667
+91,878,30.0566666666667
+91,879,22.479
+91,880,21.6111666666667
+91,881,27.7918333333333
+91,882,21.336
+91,883,21.5688333333333
+91,884,24.0453333333333
+91,885,20.701
+91,886,25.7598333333333
+91,887,28.5961666666667
+91,888,27.6225
+91,889,27.3473333333333
+91,890,29.1253333333333
+91,891,21.082
+91,892,27.4743333333333
+91,893,25.781
+91,894,29.1465
+91,895,24.0665
+91,896,28.7443333333333
+91,897,24.8496666666667
+91,898,28.7231666666667
+91,899,28.067
+91,900,23.6431666666667
+91,901,32.1945
+91,902,25.4846666666667
+91,903,30.1836666666667
+91,904,23.368
+91,905,21.5476666666667
+91,906,22.7118333333333
+91,907,27.94
+91,908,28.5115
+91,909,28.2786666666667
+91,910,20.8491666666667
+91,911,26.5853333333333
+91,912,26.0773333333333
+91,913,29.7391666666667
+91,914,23.5796666666667
+91,915,24.6168333333333
+91,916,27.9823333333333
+91,917,26.3313333333333
+91,918,26.8816666666667
+91,919,21.9286666666667
+91,920,24.0876666666667
+91,921,29.2946666666667
+91,922,26.1196666666667
+91,923,26.924
+91,924,24.6168333333333
+91,925,24.9555
+91,926,22.8388333333333
+91,927,24.9766666666667
+91,928,26.289
+91,929,24.384
+91,930,24.4686666666667
+91,931,24.2146666666667
+91,932,27.051
+91,933,22.733
+91,934,24.4686666666667
+91,935,33.3586666666667
+91,936,28.5326666666667
+91,937,20.9338333333333
+91,938,22.606
+91,939,24.4475
+91,940,28.067
+91,941,24.7226666666667
+91,942,27.5166666666667
+91,943,23.241
+91,944,25.3365
+91,945,20.1083333333333
+91,946,23.2833333333333
+91,947,26.0138333333333
+91,948,25.7386666666667
+91,949,28.1093333333333
+91,950,22.7965
+91,951,24.9555
+91,952,24.9131666666667
+91,953,28.2575
+91,954,26.5218333333333
+91,955,23.2833333333333
+91,956,26.8393333333333
+91,957,27.3473333333333
+91,958,24.4475
+91,959,24.0453333333333
+91,960,23.876
+91,961,24.8708333333333
+91,962,23.4315
+91,963,22.479
+91,964,28.1516666666667
+91,965,21.717
+91,966,30.1413333333333
+91,967,28.0881666666667
+91,968,31.8981666666667
+91,969,27.94
+91,970,29.4005
+91,971,26.9451666666667
+91,972,26.0138333333333
+91,973,25.7386666666667
+91,974,24.8708333333333
+91,975,25.8868333333333
+91,976,25.8021666666667
+91,977,30.8398333333333
+91,978,23.7701666666667
+91,979,22.6906666666667
+91,980,24.9766666666667
+91,981,24.0876666666667
+91,982,32.1098333333333
+91,983,28.0881666666667
+91,984,20.1083333333333
+91,985,25.273
+91,986,26.8816666666667
+91,987,28.8501666666667
+91,988,21.8651666666667
+91,989,31.7923333333333
+91,990,18.4361666666667
+91,991,19.0923333333333
+91,992,27.1991666666667
+91,993,24.8073333333333
+91,994,24.3628333333333
+91,995,22.8176666666667
+91,996,29.3793333333333
+91,997,22.0556666666667
+91,998,25.6963333333333
+91,999,23.3468333333333
+91,1000,34.0995
+92,1,24.638
+92,2,21.0185
+92,3,23.61184
+92,4,22.1936733333333
+92,5,25.4956733333333
+92,6,16.4685133333333
+92,7,19.5791666666667
+92,8,25.6760133333333
+92,9,20.9025066666667
+92,10,30.8212066666667
+92,11,29.19984
+92,12,19.5690066666667
+92,13,23.749
+92,14,24.0351733333333
+92,15,33.0835
+92,16,24.31034
+92,17,18.3735133333333
+92,18,27.0620066666667
+92,19,23.241
+92,20,22.2038333333333
+92,21,28.3955066666667
+92,22,22.97684
+92,23,25.9715
+92,24,27.2423466666667
+92,25,28.7655
+92,26,32.4485
+92,27,27.6225
+92,28,27.6225
+92,29,28.31084
+92,30,31.1471733333333
+92,31,22.8811666666667
+92,32,19.23034
+92,33,25.6650066666667
+92,34,26.3635066666667
+92,35,13.7481733333333
+92,36,33.1156733333333
+92,37,22.4476733333333
+92,38,26.5438466666667
+92,39,28.4166733333333
+92,40,25.6023533333333
+92,41,23.22068
+92,42,19.9500066666667
+92,43,22.4696866666667
+92,44,23.1148466666667
+92,45,27.6648333333333
+92,46,29.5698333333333
+92,47,18.4370133333333
+92,48,23.1250066666667
+92,49,23.8235066666667
+92,50,20.8288466666667
+92,51,25.2095
+92,52,20.9126666666667
+92,53,20.5426733333333
+92,54,26.7021733333333
+92,55,23.0928333333333
+92,56,22.26818
+92,57,20.9126666666667
+92,58,22.72284
+92,59,28.7866666666667
+92,60,37.4015
+92,61,33.9843533333333
+92,62,23.48484
+92,63,28.3955066666667
+92,64,16.81734
+92,65,25.8868333333333
+92,66,38.34384
+92,67,20.62734
+92,68,21.9820066666667
+92,69,26.2475133333333
+92,70,27.73934
+92,71,27.5166666666667
+92,72,20.2565
+92,73,21.07184
+92,74,28.7341733333333
+92,75,18.9983533333333
+92,76,27.2203333333333
+92,77,27.7706666666667
+92,78,27.6335066666667
+92,79,20.5113466666667
+92,80,20.8830333333333
+92,81,33.44418
+92,82,28.16352
+92,83,32.62884
+92,84,28.956
+92,85,21.1141733333333
+92,86,29.7391666666667
+92,87,30.9786866666667
+92,88,19.47418
+92,89,26.7445066666667
+92,90,23.59152
+92,91,30.9668333333333
+92,92,22.3943333333333
+92,93,29.2946666666667
+92,94,20.3945066666667
+92,95,33.9835066666667
+92,96,26.5006666666667
+92,97,14.6795066666667
+92,98,26.5006666666667
+92,99,34.13252
+92,100,27.5065066666667
+92,101,23.8548333333333
+92,102,35.9621666666667
+92,103,16.5218533333333
+92,104,30.0778333333333
+92,105,26.0036733333333
+92,106,28.56484
+92,107,34.8090066666667
+92,108,27.1365133333333
+92,109,25.6328333333333
+92,110,28.5326666666667
+92,111,26.4795
+92,112,31.6975066666667
+92,113,32.8100266666667
+92,114,26.2475133333333
+92,115,28.1728333333333
+92,116,22.9776866666667
+92,117,25.1248333333333
+92,118,24.1410066666667
+92,119,23.29434
+92,120,20.701
+92,121,23.5373333333333
+92,122,26.6276666666667
+92,123,23.73884
+92,124,27.7605066666667
+92,125,22.5535066666667
+92,126,24.5330133333333
+92,127,25.89784
+92,128,17.3575133333333
+92,129,28.0255133333333
+92,130,28.4065133333333
+92,131,17.5048333333333
+92,132,20.9236733333333
+92,133,25.5591733333333
+92,134,28.2050066666667
+92,135,28.8400066666667
+92,136,23.61184
+92,137,20.4681666666667
+92,138,21.1455
+92,139,32.12084
+92,140,27.9611666666667
+92,141,18.7536666666667
+92,142,20.6163333333333
+92,143,32.3121866666667
+92,144,28.31084
+92,145,23.368
+92,146,33.5491666666667
+92,147,24.0775066666667
+92,148,18.00352
+92,149,22.3630066666667
+92,150,19.0288333333333
+92,151,24.31034
+92,152,31.67634
+92,153,24.2993333333333
+92,154,23.8235066666667
+92,155,25.7395133333333
+92,156,25.44318
+92,157,22.8921733333333
+92,158,34.5863333333333
+92,159,25.8656666666667
+92,160,15.53718
+92,161,21.56968
+92,162,29.76118
+92,163,32.3858466666667
+92,164,31.3478333333333
+92,165,24.1621733333333
+92,166,27.6868466666667
+92,167,30.7246866666667
+92,168,24.6701733333333
+92,169,28.3955066666667
+92,170,21.9820066666667
+92,171,24.9343333333333
+92,172,18.5005133333333
+92,173,25.3153333333333
+92,174,28.0678466666667
+92,175,21.4536866666667
+92,176,17.31518
+92,177,25.77084
+92,178,28.9348333333333
+92,179,32.31134
+92,180,30.4588333333333
+92,181,24.1410066666667
+92,182,18.6063466666667
+92,183,28.4700133333333
+92,184,25.4745066666667
+92,185,23.5695066666667
+92,186,24.0140066666667
+92,187,15.5998333333333
+92,188,16.6590133333333
+92,189,25.9935133333333
+92,190,30.39618
+92,191,28.3320066666667
+92,192,26.67
+92,193,24.511
+92,194,24.9241733333333
+92,195,23.4323466666667
+92,196,21.9193533333333
+92,197,24.69134
+92,198,25.83434
+92,199,30.2895
+92,200,20.2040066666667
+92,201,23.3265133333333
+92,202,19.1778466666667
+92,203,29.3590133333333
+92,204,20.193
+92,205,28.067
+92,206,34.1841666666667
+92,207,32.8405066666667
+92,208,34.7768333333333
+92,209,33.8243333333333
+92,210,22.1826666666667
+92,211,24.2781666666667
+92,212,22.1200133333333
+92,213,26.53284
+92,214,33.8141733333333
+92,215,20.1506666666667
+92,216,19.5063533333333
+92,217,22.5966866666667
+92,218,19.8230066666667
+92,219,25.7496733333333
+92,220,20.99818
+92,221,29.77134
+92,222,19.7595066666667
+92,223,28.4590066666667
+92,224,27.99334
+92,225,38.3125133333333
+92,226,24.37384
+92,227,36.6183333333333
+92,228,27.0730133333333
+92,229,24.2476866666667
+92,230,24.74468
+92,231,30.2683333333333
+92,232,26.5015133333333
+92,233,30.4808466666667
+92,234,27.60218
+92,235,36.7140066666667
+92,236,23.09368
+92,237,35.5075066666667
+92,238,17.3465066666667
+92,239,21.4113533333333
+92,240,31.3478333333333
+92,241,22.3096666666667
+92,242,29.21
+92,243,27.2533533333333
+92,244,26.5751733333333
+92,245,31.1785
+92,246,23.3265133333333
+92,247,20.1295
+92,248,18.1093533333333
+92,249,15.24
+92,250,36.5666866666667
+92,251,21.6120133333333
+92,252,28.1093333333333
+92,253,23.1775
+92,254,26.6175066666667
+92,255,18.1186666666667
+92,256,26.2365066666667
+92,257,27.4531666666667
+92,258,28.321
+92,259,30.4588333333333
+92,260,24.43734
+92,261,27.1466733333333
+92,262,30.4588333333333
+92,263,22.27834
+92,264,17.7910066666667
+92,265,24.50084
+92,266,26.9350066666667
+92,267,17.6640066666667
+92,268,21.77034
+92,269,28.73502
+92,270,27.3168533333333
+92,271,24.9140133333333
+92,272,30.1845133333333
+92,273,21.4638466666667
+92,274,26.02484
+92,275,19.8865066666667
+92,276,25.781
+92,277,25.654
+92,278,27.8765
+92,279,27.1466733333333
+92,280,23.2731733333333
+92,281,22.3333733333333
+92,282,23.241
+92,283,24.8505133333333
+92,284,24.638
+92,285,29.6545
+92,286,30.3750133333333
+92,287,21.9075
+92,288,31.242
+92,289,28.4065133333333
+92,290,27.7715133333333
+92,291,32.87268
+92,292,23.54834
+92,293,26.035
+92,294,22.3841733333333
+92,295,18.1186666666667
+92,296,26.8613466666667
+92,297,26.0985
+92,298,27.7605066666667
+92,299,23.0090133333333
+92,300,29.6333333333333
+92,301,16.3406666666667
+92,302,22.0556666666667
+92,303,23.5060066666667
+92,304,28.6071733333333
+92,305,26.84018
+92,306,20.23618
+92,307,26.67
+92,308,16.8063333333333
+92,309,28.829
+92,310,27.99334
+92,311,29.6020066666667
+92,312,23.3265133333333
+92,313,17.3143333333333
+92,314,23.9081733333333
+92,315,32.7236666666667
+92,316,23.8446733333333
+92,317,24.6701733333333
+92,318,24.003
+92,319,24.4593533333333
+92,320,27.15768
+92,321,23.80234
+92,322,23.79218
+92,323,24.6600133333333
+92,324,25.2848533333333
+92,325,24.7015
+92,326,18.40484
+92,327,33.1156733333333
+92,328,25.9300133333333
+92,329,26.4371666666667
+92,330,26.7021733333333
+92,331,26.035
+92,332,26.9561733333333
+92,333,22.6805066666667
+92,334,15.6633333333333
+92,335,21.4316733333333
+92,336,31.04134
+92,337,26.3525
+92,338,24.0986733333333
+92,339,29.38018
+92,340,24.0571866666667
+92,341,21.6543466666667
+92,342,33.3586666666667
+92,343,24.6066733333333
+92,344,23.8980133333333
+92,345,20.56384
+92,346,36.7351733333333
+92,347,26.3110133333333
+92,348,16.9028533333333
+92,349,25.4110066666667
+92,350,24.3526733333333
+92,351,19.3277066666667
+92,352,22.72284
+92,353,38.3963333333333
+92,354,25.3153333333333
+92,355,28.5335133333333
+92,356,24.5753466666667
+92,357,31.3055
+92,358,26.2255
+92,359,27.559
+92,360,27.051
+92,361,28.0145066666667
+92,362,26.162
+92,363,32.7871666666667
+92,364,22.0031733333333
+92,365,20.2886733333333
+92,366,25.019
+92,367,21.9921666666667
+92,368,27.9086733333333
+92,369,21.463
+92,370,37.2431733333333
+92,371,23.29434
+92,372,19.7485
+92,373,24.0986733333333
+92,374,25.7496733333333
+92,375,27.8773466666667
+92,376,20.94484
+92,377,23.7066666666667
+92,378,26.34234
+92,379,29.4005
+92,380,28.05684
+92,381,23.7278333333333
+92,382,34.63036
+92,383,23.80234
+92,384,20.5105
+92,385,29.1676666666667
+92,386,22.1615
+92,387,26.1095066666667
+92,388,19.01952
+92,389,21.6746666666667
+92,390,24.257
+92,391,19.4953466666667
+92,392,29.464
+92,393,27.48534
+92,394,22.2360066666667
+92,395,24.3628333333333
+92,396,26.9663333333333
+92,397,26.3635066666667
+92,398,27.8146933333333
+92,399,19.0711666666667
+92,400,28.9035066666667
+92,401,24.30018
+92,402,26.9028333333333
+92,403,22.02434
+92,404,22.77618
+92,405,23.9395
+92,406,28.37434
+92,407,27.0086666666667
+92,408,22.225
+92,409,30.2268466666667
+92,410,23.1148466666667
+92,411,24.4796733333333
+92,412,22.1623466666667
+92,413,19.9398466666667
+92,414,34.5651666666667
+92,415,24.37384
+92,416,22.3630066666667
+92,417,22.2995066666667
+92,418,33.3696733333333
+92,419,23.04034
+92,420,37.06368
+92,421,28.69184
+92,422,21.3571666666667
+92,423,35.9621666666667
+92,424,28.6495066666667
+92,425,32.639
+92,426,19.16684
+92,427,25.7598333333333
+92,428,23.9615133333333
+92,429,28.7866666666667
+92,430,28.6808333333333
+92,431,23.2198333333333
+92,432,23.1046866666667
+92,433,23.1986666666667
+92,434,27.1255066666667
+92,435,29.2735
+92,436,23.5373333333333
+92,437,22.01418
+92,438,28.6071733333333
+92,439,29.51734
+92,440,29.3793333333333
+92,441,21.37918
+92,442,21.8761733333333
+92,443,27.53868
+92,444,23.73884
+92,445,21.8126733333333
+92,446,17.7808466666667
+92,447,29.9305133333333
+92,448,28.6173333333333
+92,449,18.84934
+92,450,24.4060133333333
+92,451,25.62352
+92,452,25.4321733333333
+92,453,28.1313466666667
+92,454,24.2045066666667
+92,455,27.3160066666667
+92,456,26.5641666666667
+92,457,30.5011666666667
+92,458,24.8191866666667
+92,459,19.6325066666667
+92,460,31.75
+92,461,25.8555066666667
+92,462,19.9500066666667
+92,463,24.11984
+92,464,37.20084
+92,465,26.3313333333333
+92,466,24.4483466666667
+92,467,14.6693466666667
+92,468,29.9931666666667
+92,469,22.6170066666667
+92,470,18.9873466666667
+92,471,27.9510066666667
+92,472,25.7386666666667
+92,473,21.2301666666667
+92,474,22.8286733333333
+92,475,35.8461733333333
+92,476,30.3115133333333
+92,477,32.5975133333333
+92,478,16.78686
+92,479,15.8335133333333
+92,480,24.4695133333333
+92,481,25.58034
+92,482,28.8078333333333
+92,483,20.56384
+92,484,18.1195133333333
+92,485,21.0625266666667
+92,486,30.7551666666667
+92,487,22.7651733333333
+92,488,22.8388333333333
+92,489,19.10334
+92,490,30.91434
+92,491,24.1308466666667
+92,492,29.39034
+92,493,23.4433533333333
+92,494,25.527
+92,495,18.8180133333333
+92,496,23.4526666666667
+92,497,25.1146733333333
+92,498,25.06218
+92,499,20.4690133333333
+92,500,18.0246866666667
+92,501,22.4366666666667
+92,502,24.37384
+92,503,29.51734
+92,504,24.4686666666667
+92,505,30.8186666666667
+92,506,19.7171733333333
+92,507,31.1370133333333
+92,508,30.3741666666667
+92,509,28.1313466666667
+92,510,19.4521666666667
+92,511,32.512
+92,512,23.8548333333333
+92,513,32.4908333333333
+92,514,26.1205133333333
+92,515,27.29484
+92,516,31.0938333333333
+92,517,23.84552
+92,518,23.3468333333333
+92,519,25.4423333333333
+92,520,26.7335
+92,521,23.6863466666667
+92,522,20.5223533333333
+92,523,31.2640133333333
+92,524,30.1311733333333
+92,525,26.6810066666667
+92,526,31.84652
+92,527,30.0355
+92,528,27.6436666666667
+92,529,20.24634
+92,530,24.5956666666667
+92,531,25.2840066666667
+92,532,23.0928333333333
+92,533,28.702
+92,534,28.9568466666667
+92,535,27.1145
+92,536,26.3635066666667
+92,537,20.5113466666667
+92,538,24.638
+92,539,23.0293333333333
+92,540,32.2791666666667
+92,541,24.74468
+92,542,20.4055133333333
+92,543,28.11018
+92,544,25.527
+92,545,30.7763333333333
+92,546,25.4846666666667
+92,547,24.7971733333333
+92,548,23.61184
+92,549,25.8555066666667
+92,550,27.92984
+92,551,30.0566666666667
+92,552,20.1413533333333
+92,553,19.0288333333333
+92,554,22.8710066666667
+92,555,23.3586866666667
+92,556,30.7026733333333
+92,557,30.4165
+92,558,25.6015066666667
+92,559,26.8181666666667
+92,560,23.1046866666667
+92,561,23.5593466666667
+92,562,29.6121666666667
+92,563,25.0825
+92,564,26.8291733333333
+92,565,18.4158466666667
+92,566,25.64384
+92,567,30.8398333333333
+92,568,30.06852
+92,569,23.6541733333333
+92,570,25.4110066666667
+92,571,26.9146866666667
+92,572,21.89734
+92,573,21.1031666666667
+92,574,23.04034
+92,575,26.7978466666667
+92,576,22.9235
+92,577,24.4161733333333
+92,578,32.9040066666667
+92,579,24.6388466666667
+92,580,28.4691666666667
+92,581,22.86
+92,582,25.0943533333333
+92,583,22.7440066666667
+92,584,20.6798333333333
+92,585,23.73884
+92,586,24.5745
+92,587,26.53284
+92,588,30.4071866666667
+92,589,19.1355133333333
+92,590,24.0140066666667
+92,591,22.8710066666667
+92,592,21.2835066666667
+92,593,28.3633333333333
+92,594,18.542
+92,595,26.07818
+92,596,26.9875
+92,597,28.7443333333333
+92,598,22.97684
+92,599,24.94534
+92,600,26.6911666666667
+92,601,29.0516733333333
+92,602,28.5225066666667
+92,603,31.6873466666667
+92,604,23.6228466666667
+92,605,18.034
+92,606,22.65934
+92,607,32.5755
+92,608,22.7118333333333
+92,609,31.9515066666667
+92,610,22.8286733333333
+92,611,27.3371733333333
+92,612,28.0145066666667
+92,613,31.93034
+92,614,20.69084
+92,615,23.8133466666667
+92,616,21.717
+92,617,15.5261733333333
+92,618,35.53968
+92,619,32.7668466666667
+92,620,27.7816733333333
+92,621,25.781
+92,622,21.3995
+92,623,26.0460066666667
+92,624,20.6696733333333
+92,625,22.5535066666667
+92,626,18.7113333333333
+92,627,22.6170066666667
+92,628,22.3740133333333
+92,629,18.15084
+92,630,31.3376733333333
+92,631,16.3838466666667
+92,632,27.6546733333333
+92,633,22.987
+92,634,33.8878333333333
+92,635,29.1888333333333
+92,636,28.9145133333333
+92,637,31.7610066666667
+92,638,23.2096733333333
+92,639,28.7765066666667
+92,640,20.8821866666667
+92,641,29.50718
+92,642,21.1666666666667
+92,643,22.90318
+92,644,25.7496733333333
+92,645,24.0038466666667
+92,646,27.5276733333333
+92,647,26.6276666666667
+92,648,28.9983333333333
+92,649,17.2296666666667
+92,650,27.33802
+92,651,19.8865066666667
+92,652,23.3256666666667
+92,653,24.6591666666667
+92,654,27.5598466666667
+92,655,29.0415133333333
+92,656,29.4851666666667
+92,657,22.71268
+92,658,18.4785
+92,659,28.8713333333333
+92,660,33.1478466666667
+92,661,27.5166666666667
+92,662,25.89784
+92,663,28.2998333333333
+92,664,25.77084
+92,665,40.8728333333333
+92,666,16.6158333333333
+92,667,25.4745066666667
+92,668,27.1356666666667
+92,669,25.0401666666667
+92,670,31.1996666666667
+92,671,23.5161666666667
+92,672,23.1360133333333
+92,673,28.3320066666667
+92,674,21.77034
+92,675,27.5810133333333
+92,676,25.17902
+92,677,21.5688333333333
+92,678,32.3536733333333
+92,679,32.48152
+92,680,22.0455066666667
+92,681,22.2360066666667
+92,682,25.6446866666667
+92,683,23.9606666666667
+92,684,19.86534
+92,685,27.3905133333333
+92,686,24.75484
+92,687,24.1520133333333
+92,688,20.1506666666667
+92,689,28.6495066666667
+92,690,21.88718
+92,691,35.179
+92,692,22.7550133333333
+92,693,24.5855066666667
+92,694,29.9940133333333
+92,695,31.4113333333333
+92,696,22.21484
+92,697,24.81834
+92,698,34.8191666666667
+92,699,25.7285066666667
+92,700,23.4738333333333
+92,701,28.8408533333333
+92,702,25.32634
+92,703,25.8665133333333
+92,704,28.6173333333333
+92,705,23.79218
+92,706,26.33218
+92,707,22.733
+92,708,26.6488333333333
+92,709,27.3473333333333
+92,710,31.22168
+92,711,25.8868333333333
+92,712,27.9086733333333
+92,713,30.5756733333333
+92,714,30.53334
+92,715,23.2731733333333
+92,716,21.2310133333333
+92,717,27.2000133333333
+92,718,28.2998333333333
+92,719,26.8605
+92,720,26.4380133333333
+92,721,26.7656733333333
+92,722,26.2161866666667
+92,723,26.72334
+92,724,23.86584
+92,725,25.1476933333333
+92,726,23.47468
+92,727,23.1267
+92,728,30.25902
+92,729,28.575
+92,730,23.368
+92,731,22.479
+92,732,34.9885
+92,733,23.6643333333333
+92,734,27.9721733333333
+92,735,28.0991733333333
+92,736,25.23236
+92,737,30.77718
+92,738,30.8186666666667
+92,739,22.1403333333333
+92,740,27.2101733333333
+92,741,29.9508333333333
+92,742,25.8665133333333
+92,743,24.4796733333333
+92,744,16.3618333333333
+92,745,33.02
+92,746,34.38652
+92,747,25.1036666666667
+92,748,24.2053533333333
+92,749,25.0410133333333
+92,750,27.1365133333333
+92,751,23.7066666666667
+92,752,27.2000133333333
+92,753,21.2936666666667
+92,754,29.8873333333333
+92,755,35.03168
+92,756,45.5083333333333
+92,757,29.2523333333333
+92,758,20.16252
+92,759,29.4961733333333
+92,760,20.8601733333333
+92,761,30.8728533333333
+92,762,24.3848466666667
+92,763,22.0345
+92,764,21.9286666666667
+92,765,20.6485066666667
+92,766,36.2796666666667
+92,767,19.91868
+92,768,21.5688333333333
+92,769,23.4636733333333
+92,770,27.3685
+92,771,20.0025
+92,772,26.9028333333333
+92,773,25.0410133333333
+92,774,27.305
+92,775,25.6751666666667
+92,776,20.5756933333333
+92,777,27.8976666666667
+92,778,20.7755066666667
+92,779,35.03168
+92,780,24.0986733333333
+92,781,27.7605066666667
+92,782,23.35784
+92,783,23.2621666666667
+92,784,23.8870066666667
+92,785,26.8190133333333
+92,786,29.7290066666667
+92,787,22.225
+92,788,19.4733333333333
+92,789,25.8868333333333
+92,790,17.3896866666667
+92,791,22.2360066666667
+92,792,26.8816666666667
+92,793,32.0886666666667
+92,794,28.9035066666667
+92,795,31.0515
+92,796,27.9721733333333
+92,797,22.15134
+92,798,24.2256733333333
+92,799,19.99234
+92,800,30.48
+92,801,14.3298333333333
+92,802,22.2673333333333
+92,803,25.0401666666667
+92,804,21.5908466666667
+92,805,22.5636666666667
+92,806,30.5341866666667
+92,807,17.1560066666667
+92,808,23.7913333333333
+92,809,19.41068
+92,810,17.0925066666667
+92,811,24.56434
+92,812,23.0928333333333
+92,813,23.6228466666667
+92,814,27.8875066666667
+92,815,19.6215
+92,816,17.9713466666667
+92,817,20.2565
+92,818,28.6071733333333
+92,819,24.0673466666667
+92,820,35.10534
+92,821,19.22018
+92,822,22.0353466666667
+92,823,19.5800133333333
+92,824,18.3201733333333
+92,825,23.5796666666667
+92,826,17.7181933333333
+92,827,28.5335133333333
+92,828,18.0661733333333
+92,829,30.97784
+92,830,19.9931866666667
+92,831,20.9456866666667
+92,832,27.10434
+92,833,21.3148333333333
+92,834,15.7056666666667
+92,835,20.8398533333333
+92,836,22.2893466666667
+92,837,31.3266666666667
+92,838,18.2033333333333
+92,839,23.4323466666667
+92,840,30.8931733333333
+92,841,20.81784
+92,842,26.5641666666667
+92,843,32.7033466666667
+92,844,31.1903533333333
+92,845,23.99284
+92,846,28.702
+92,847,19.6638333333333
+92,848,25.5693333333333
+92,849,28.6706733333333
+92,850,21.9820066666667
+92,851,20.7755066666667
+92,852,25.32634
+92,853,27.8350133333333
+92,854,21.3783333333333
+92,855,26.1628466666667
+92,856,25.9935133333333
+92,857,23.41118
+92,858,29.2210066666667
+92,859,24.6921866666667
+92,860,21.38934
+92,861,22.7965
+92,862,27.6225
+92,863,20.0033466666667
+92,864,19.3463333333333
+92,865,24.8606733333333
+92,866,18.5843333333333
+92,867,26.924
+92,868,32.9573466666667
+92,869,26.0985
+92,870,30.89402
+92,871,19.2625133333333
+92,872,25.7175
+92,873,28.16352
+92,874,23.7066666666667
+92,875,21.5688333333333
+92,876,27.0086666666667
+92,877,23.0191733333333
+92,878,28.5860066666667
+92,879,28.56484
+92,880,18.6800066666667
+92,881,26.5971866666667
+92,882,25.8233333333333
+92,883,19.0508466666667
+92,884,28.74518
+92,885,25.4635
+92,886,25.07234
+92,887,25.1248333333333
+92,888,21.7491733333333
+92,889,28.7765066666667
+92,890,28.5656866666667
+92,891,31.2631666666667
+92,892,28.4598533333333
+92,893,22.1615
+92,894,26.3000066666667
+92,895,18.59534
+92,896,25.0300066666667
+92,897,22.4366666666667
+92,898,28.3633333333333
+92,899,29.39034
+92,900,23.8125
+92,901,21.25218
+92,902,29.4961733333333
+92,903,29.8560066666667
+92,904,26.27884
+92,905,21.1776733333333
+92,906,24.638
+92,907,25.2416733333333
+92,908,31.496
+92,909,27.2203333333333
+92,910,27.5276733333333
+92,911,26.3736666666667
+92,912,26.02484
+92,913,23.8768466666667
+92,914,15.113
+92,915,22.4163466666667
+92,916,26.67
+92,917,25.00884
+92,918,25.1248333333333
+92,919,15.1773466666667
+92,920,22.6805066666667
+92,921,31.1895066666667
+92,922,21.89734
+92,923,25.1671666666667
+92,924,23.8125
+92,925,28.60802
+92,926,21.1675133333333
+92,927,23.8336666666667
+92,928,29.07284
+92,929,30.4275066666667
+92,930,28.0458333333333
+92,931,32.99968
+92,932,31.9210266666667
+92,933,20.9660066666667
+92,934,23.83536
+92,935,22.53234
+92,936,40.5341666666667
+92,937,31.2106733333333
+92,938,20.11934
+92,939,20.9973333333333
+92,940,17.7275066666667
+92,941,21.1878333333333
+92,942,24.4161733333333
+92,943,27.9721733333333
+92,944,21.4740066666667
+92,945,24.0775066666667
+92,946,14.9013333333333
+92,947,25.2941666666667
+92,948,18.6800066666667
+92,949,24.7336733333333
+92,950,23.4323466666667
+92,951,26.416
+92,952,23.8870066666667
+92,953,26.2365066666667
+92,954,16.8385066666667
+92,955,12.9548466666667
+92,956,33.95218
+92,957,21.4951733333333
+92,958,26.5116733333333
+92,959,26.4371666666667
+92,960,31.6865
+92,961,27.65552
+92,962,17.3676733333333
+92,963,24.7235133333333
+92,964,17.7283533333333
+92,965,31.5916733333333
+92,966,25.4855133333333
+92,967,29.9508333333333
+92,968,21.9718466666667
+92,969,30.02534
+92,970,20.61718
+92,971,27.8773466666667
+92,972,24.6591666666667
+92,973,28.6385
+92,974,26.543
+92,975,28.8298466666667
+92,976,28.7443333333333
+92,977,40.9160133333333
+92,978,27.9611666666667
+92,979,28.8501666666667
+92,980,28.6071733333333
+92,981,27.6546733333333
+92,982,23.4221866666667
+92,983,33.1156733333333
+92,984,21.89734
+92,985,25.83434
+92,986,30.2268466666667
+92,987,31.0938333333333
+92,988,25.07234
+92,989,20.32
+92,990,23.0505
+92,991,25.25268
+92,992,16.9231733333333
+92,993,20.4791733333333
+92,994,28.94584
+92,995,27.3896666666667
+92,996,18.9136866666667
+92,997,20.9126666666667
+92,998,32.5771933333333
+92,999,31.61284
+92,1000,17.9510266666667
+93,1,23.5373333333333
+93,2,19.7273333333333
+93,3,20.0871666666667
+93,4,20.0236666666667
+93,5,22.3731666666667
+93,6,23.5585
+93,7,25.8233333333333
+93,8,18.8595
+93,9,19.8543333333333
+93,10,23.6431666666667
+93,11,19.4098333333333
+93,12,25.7598333333333
+93,13,19.7273333333333
+93,14,17.5048333333333
+93,15,24.0453333333333
+93,16,21.7805
+93,17,23.241
+93,18,21.9286666666667
+93,19,24.7438333333333
+93,20,21.463
+93,21,18.5631666666667
+93,22,24.4051666666667
+93,23,22.479
+93,24,27.305
+93,25,20.1506666666667
+93,26,26.5218333333333
+93,27,20.1718333333333
+93,28,28.321
+93,29,19.05
+93,30,25.3365
+93,31,19.7485
+93,32,21.209
+93,33,21.971
+93,34,23.3256666666667
+93,35,22.479
+93,36,19.4945
+93,37,16.8063333333333
+93,38,20.9338333333333
+93,39,19.685
+93,40,19.8331666666667
+93,41,22.0133333333333
+93,42,20.6163333333333
+93,43,22.0768333333333
+93,44,19.812
+93,45,26.0985
+93,46,19.5791666666667
+93,47,21.7381666666667
+93,48,25.146
+93,49,18.4785
+93,50,20.0448333333333
+93,51,22.5636666666667
+93,52,23.0505
+93,53,20.0871666666667
+93,54,20.0871666666667
+93,55,21.59
+93,56,18.034
+93,57,26.0138333333333
+93,58,18.796
+93,59,22.606
+93,60,18.5843333333333
+93,61,26.0561666666667
+93,62,18.4785
+93,63,21.9075
+93,64,21.9921666666667
+93,65,21.2301666666667
+93,66,24.2781666666667
+93,67,17.4413333333333
+93,68,18.7113333333333
+93,69,17.907
+93,70,20.0025
+93,71,26.3736666666667
+93,72,19.6638333333333
+93,73,20.9761666666667
+93,74,24.0665
+93,75,21.1878333333333
+93,76,24.3416666666667
+93,77,20.3623333333333
+93,78,20.0025
+93,79,16.9968333333333
+93,80,20.828
+93,81,20.0871666666667
+93,82,21.9286666666667
+93,83,16.2136666666667
+93,84,18.2668333333333
+93,85,19.9601666666667
+93,86,24.2781666666667
+93,87,22.0768333333333
+93,88,17.5683333333333
+93,89,19.7908333333333
+93,90,19.8755
+93,91,19.1558333333333
+93,92,17.8435
+93,93,20.2565
+93,94,24.5956666666667
+93,95,24.7226666666667
+93,96,20.8915
+93,97,21.4206666666667
+93,98,21.3148333333333
+93,99,16.1925
+93,100,24.1511666666667
+93,101,19.3886666666667
+93,102,16.6793333333333
+93,103,19.304
+93,104,17.5683333333333
+93,105,21.8651666666667
+93,106,23.114
+93,107,17.8223333333333
+93,108,25.0613333333333
+93,109,21.8651666666667
+93,110,22.4366666666667
+93,111,20.701
+93,112,20.1506666666667
+93,113,23.8971666666667
+93,114,24.638
+93,115,20.6586666666667
+93,116,21.4841666666667
+93,117,23.8971666666667
+93,118,25.8021666666667
+93,119,21.9921666666667
+93,120,17.0815
+93,121,21.9498333333333
+93,122,18.7748333333333
+93,123,21.3148333333333
+93,124,23.6008333333333
+93,125,18.4573333333333
+93,126,20.4046666666667
+93,127,19.4945
+93,128,20.4046666666667
+93,129,19.9813333333333
+93,130,17.9916666666667
+93,131,19.0076666666667
+93,132,24.8708333333333
+93,133,24.9555
+93,134,16.2348333333333
+93,135,22.479
+93,136,23.5373333333333
+93,137,22.8811666666667
+93,138,20.3411666666667
+93,139,23.7913333333333
+93,140,18.1821666666667
+93,141,20.1506666666667
+93,142,17.4413333333333
+93,143,22.1403333333333
+93,144,21.6746666666667
+93,145,22.5636666666667
+93,146,20.4258333333333
+93,147,22.6695
+93,148,25.3788333333333
+93,149,19.7696666666667
+93,150,19.9813333333333
+93,151,23.0928333333333
+93,152,19.431
+93,153,19.2828333333333
+93,154,20.1295
+93,155,20.066
+93,156,19.9178333333333
+93,157,22.4155
+93,158,17.8435
+93,159,21.971
+93,160,20.0448333333333
+93,161,16.9333333333333
+93,162,19.7696666666667
+93,163,20.8703333333333
+93,164,17.3778333333333
+93,165,23.0928333333333
+93,166,23.6855
+93,167,19.2405
+93,168,18.9441666666667
+93,169,18.0763333333333
+93,170,26.3736666666667
+93,171,19.2828333333333
+93,172,22.9658333333333
+93,173,24.892
+93,174,20.1083333333333
+93,175,25.6116666666667
+93,176,18.796
+93,177,24.5956666666667
+93,178,17.5471666666667
+93,179,26.3101666666667
+93,180,18.6478333333333
+93,181,25.5481666666667
+93,182,23.7278333333333
+93,183,15.6633333333333
+93,184,21.7805
+93,185,20.3835
+93,186,21.3148333333333
+93,187,14.605
+93,188,20.7433333333333
+93,189,21.6323333333333
+93,190,22.0345
+93,191,22.8176666666667
+93,192,27.432
+93,193,21.9921666666667
+93,194,21.717
+93,195,21.7805
+93,196,21.336
+93,197,22.2038333333333
+93,198,20.5951666666667
+93,199,20.4681666666667
+93,200,23.1563333333333
+93,201,20.066
+93,202,21.8228333333333
+93,203,21.8651666666667
+93,204,19.4733333333333
+93,205,23.7701666666667
+93,206,26.1196666666667
+93,207,18.5843333333333
+93,208,27.2838333333333
+93,209,20.4893333333333
+93,210,20.828
+93,211,21.4841666666667
+93,212,22.733
+93,213,18.0763333333333
+93,214,21.1878333333333
+93,215,22.3308333333333
+93,216,20.9126666666667
+93,217,22.733
+93,218,22.7541666666667
+93,219,21.2301666666667
+93,220,20.9761666666667
+93,221,23.0716666666667
+93,222,19.812
+93,223,21.3783333333333
+93,224,27.3896666666667
+93,225,20.0871666666667
+93,226,22.606
+93,227,24.6591666666667
+93,228,15.5151666666667
+93,229,20.5528333333333
+93,230,22.6906666666667
+93,231,19.3463333333333
+93,232,20.5316666666667
+93,233,17.1873333333333
+93,234,23.2198333333333
+93,235,20.1083333333333
+93,236,19.1981666666667
+93,237,25.6116666666667
+93,238,22.1615
+93,239,19.7908333333333
+93,240,21.0185
+93,241,23.0716666666667
+93,242,21.1243333333333
+93,243,21.4418333333333
+93,244,20.8068333333333
+93,245,20.447
+93,246,22.7541666666667
+93,247,16.3618333333333
+93,248,21.336
+93,249,27.051
+93,250,19.1346666666667
+93,251,19.9601666666667
+93,252,21.6535
+93,253,28.067
+93,254,18.8171666666667
+93,255,26.6065
+93,256,23.114
+93,257,22.7753333333333
+93,258,20.9338333333333
+93,259,21.9921666666667
+93,260,23.4103333333333
+93,261,17.8435
+93,262,19.0923333333333
+93,263,21.6535
+93,264,24.0241666666667
+93,265,22.9023333333333
+93,266,23.5585
+93,267,15.5575
+93,268,23.7913333333333
+93,269,24.2146666666667
+93,270,24.9978333333333
+93,271,19.0076666666667
+93,272,24.1935
+93,273,15.7268333333333
+93,274,18.542
+93,275,22.1826666666667
+93,276,25.8021666666667
+93,277,21.0396666666667
+93,278,20.6586666666667
+93,279,19.7273333333333
+93,280,20.6798333333333
+93,281,19.6638333333333
+93,282,18.3303333333333
+93,283,18.3091666666667
+93,284,21.9498333333333
+93,285,19.0711666666667
+93,286,25.9291666666667
+93,287,19.4098333333333
+93,288,23.6855
+93,289,19.0288333333333
+93,290,18.0975
+93,291,21.6746666666667
+93,292,22.225
+93,293,19.4945
+93,294,25.0825
+93,295,20.2988333333333
+93,296,21.8863333333333
+93,297,24.8285
+93,298,22.8176666666667
+93,299,22.8388333333333
+93,300,24.2146666666667
+93,301,21.4418333333333
+93,302,24.13
+93,303,20.066
+93,304,20.574
+93,305,17.9705
+93,306,24.5956666666667
+93,307,18.542
+93,308,18.6055
+93,309,24.257
+93,310,17.1873333333333
+93,311,19.2616666666667
+93,312,21.8228333333333
+93,313,20.8703333333333
+93,314,24.2781666666667
+93,315,23.9606666666667
+93,316,19.558
+93,317,22.987
+93,318,24.3416666666667
+93,319,22.7541666666667
+93,320,19.2193333333333
+93,321,25.5905
+93,322,21.2301666666667
+93,323,20.0448333333333
+93,324,21.5688333333333
+93,325,22.86
+93,326,20.5316666666667
+93,327,21.8651666666667
+93,328,22.2885
+93,329,23.1775
+93,330,26.8605
+93,331,19.0288333333333
+93,332,19.812
+93,333,23.3256666666667
+93,334,19.1981666666667
+93,335,20.3411666666667
+93,336,18.5843333333333
+93,337,18.7536666666667
+93,338,26.8181666666667
+93,339,17.653
+93,340,21.5688333333333
+93,341,24.9131666666667
+93,342,24.3205
+93,343,18.7325
+93,344,19.5791666666667
+93,345,21.2936666666667
+93,346,21.6746666666667
+93,347,19.3463333333333
+93,348,20.9338333333333
+93,349,22.2673333333333
+93,350,18.3515
+93,351,18.7748333333333
+93,352,18.9441666666667
+93,353,20.7433333333333
+93,354,19.939
+93,355,21.5688333333333
+93,356,19.8966666666667
+93,357,25.3576666666667
+93,358,19.3886666666667
+93,359,17.6741666666667
+93,360,21.6535
+93,361,20.5105
+93,362,21.2725
+93,363,21.1666666666667
+93,364,21.8651666666667
+93,365,25.3788333333333
+93,366,18.4361666666667
+93,367,25.3576666666667
+93,368,30.0778333333333
+93,369,19.6426666666667
+93,370,21.971
+93,371,19.8543333333333
+93,372,26.1831666666667
+93,373,23.0505
+93,374,23.2621666666667
+93,375,20.7856666666667
+93,376,23.622
+93,377,20.5951666666667
+93,378,19.7908333333333
+93,379,21.7593333333333
+93,380,19.6638333333333
+93,381,19.0076666666667
+93,382,15.1553333333333
+93,383,18.9018333333333
+93,384,24.2358333333333
+93,385,22.733
+93,386,20.4681666666667
+93,387,18.7536666666667
+93,388,27.2838333333333
+93,389,22.5636666666667
+93,390,19.431
+93,391,20.6375
+93,392,19.7696666666667
+93,393,20.066
+93,394,23.5796666666667
+93,395,19.8966666666667
+93,396,21.5688333333333
+93,397,22.098
+93,398,24.003
+93,399,21.717
+93,400,24.5533333333333
+93,401,21.8016666666667
+93,402,26.2678333333333
+93,403,20.7856666666667
+93,404,26.1196666666667
+93,405,18.6055
+93,406,21.6535
+93,407,19.9813333333333
+93,408,15.1553333333333
+93,409,18.923
+93,410,22.5001666666667
+93,411,21.6323333333333
+93,412,20.6798333333333
+93,413,19.4945
+93,414,26.3101666666667
+93,415,20.4046666666667
+93,416,17.8646666666667
+93,417,27.9188333333333
+93,418,26.289
+93,419,19.939
+93,420,23.368
+93,421,22.7753333333333
+93,422,18.4573333333333
+93,423,21.1455
+93,424,22.0133333333333
+93,425,20.3623333333333
+93,426,19.1135
+93,427,19.6003333333333
+93,428,21.3571666666667
+93,429,22.8176666666667
+93,430,24.2993333333333
+93,431,24.5321666666667
+93,432,17.7376666666667
+93,433,18.5631666666667
+93,434,16.2983333333333
+93,435,22.0556666666667
+93,436,20.4681666666667
+93,437,23.7278333333333
+93,438,21.971
+93,439,25.0825
+93,440,24.4051666666667
+93,441,17.907
+93,442,25.2518333333333
+93,443,22.4155
+93,444,16.0231666666667
+93,445,21.6746666666667
+93,446,23.368
+93,447,24.0665
+93,448,20.3411666666667
+93,449,19.5791666666667
+93,450,19.5791666666667
+93,451,22.2038333333333
+93,452,24.13
+93,453,17.6318333333333
+93,454,21.9921666666667
+93,455,23.1986666666667
+93,456,17.4625
+93,457,18.1821666666667
+93,458,20.2988333333333
+93,459,27.5801666666667
+93,460,26.8181666666667
+93,461,23.8125
+93,462,26.8181666666667
+93,463,22.5213333333333
+93,464,24.4686666666667
+93,465,20.5316666666667
+93,466,26.289
+93,467,21.4418333333333
+93,468,19.5791666666667
+93,469,16.4888333333333
+93,470,21.5476666666667
+93,471,18.542
+93,472,18.796
+93,473,19.812
+93,474,22.2673333333333
+93,475,21.3783333333333
+93,476,25.6116666666667
+93,477,18.8595
+93,478,18.2245
+93,479,20.8491666666667
+93,480,18.6266666666667
+93,481,21.3783333333333
+93,482,25.5058333333333
+93,483,20.6375
+93,484,22.2038333333333
+93,485,21.7593333333333
+93,486,22.6483333333333
+93,487,26.8605
+93,488,18.6478333333333
+93,489,21.5688333333333
+93,490,19.0076666666667
+93,491,20.1506666666667
+93,492,22.0768333333333
+93,493,23.5796666666667
+93,494,18.4996666666667
+93,495,21.9286666666667
+93,496,26.3948333333333
+93,497,20.6375
+93,498,26.5853333333333
+93,499,21.1455
+93,500,20.574
+93,501,27.0086666666667
+93,502,23.495
+93,503,20.4681666666667
+93,504,20.8491666666667
+93,505,21.1455
+93,506,17.8858333333333
+93,507,18.8806666666667
+93,508,20.0236666666667
+93,509,25.0613333333333
+93,510,22.0133333333333
+93,511,26.5006666666667
+93,512,19.3463333333333
+93,513,24.4898333333333
+93,514,25.4423333333333
+93,515,21.2936666666667
+93,516,19.939
+93,517,20.4258333333333
+93,518,20.9338333333333
+93,519,24.7226666666667
+93,520,18.6266666666667
+93,521,24.4051666666667
+93,522,18.2456666666667
+93,523,20.066
+93,524,25.7598333333333
+93,525,25.527
+93,526,18.034
+93,527,25.654
+93,528,24.9131666666667
+93,529,24.9343333333333
+93,530,18.0763333333333
+93,531,20.193
+93,532,20.1083333333333
+93,533,23.3045
+93,534,25.654
+93,535,24.257
+93,536,20.1295
+93,537,17.7165
+93,538,21.5688333333333
+93,539,16.4465
+93,540,21.082
+93,541,17.3778333333333
+93,542,16.51
+93,543,24.3416666666667
+93,544,24.9555
+93,545,22.6483333333333
+93,546,19.3675
+93,547,20.6586666666667
+93,548,21.8863333333333
+93,549,23.4315
+93,550,19.0288333333333
+93,551,21.6111666666667
+93,552,20.7645
+93,553,23.2833333333333
+93,554,20.0025
+93,555,24.2781666666667
+93,556,20.7856666666667
+93,557,17.653
+93,558,19.9813333333333
+93,559,18.6901666666667
+93,560,21.4418333333333
+93,561,21.463
+93,562,27.7283333333333
+93,563,22.3731666666667
+93,564,18.6901666666667
+93,565,23.8336666666667
+93,566,24.2146666666667
+93,567,18.9441666666667
+93,568,21.8228333333333
+93,569,18.4785
+93,570,22.3308333333333
+93,571,14.8378333333333
+93,572,17.8223333333333
+93,573,24.2781666666667
+93,574,20.5105
+93,575,23.368
+93,576,20.2565
+93,577,22.6906666666667
+93,578,26.8605
+93,579,27.432
+93,580,23.7278333333333
+93,581,22.098
+93,582,18.4785
+93,583,27.051
+93,584,20.0448333333333
+93,585,17.9493333333333
+93,586,22.8811666666667
+93,587,23.6431666666667
+93,588,19.685
+93,589,17.3143333333333
+93,590,25.5058333333333
+93,591,22.2885
+93,592,22.2038333333333
+93,593,21.59
+93,594,21.9075
+93,595,21.5688333333333
+93,596,21.463
+93,597,23.114
+93,598,18.796
+93,599,17.3143333333333
+93,600,20.0871666666667
+93,601,23.1563333333333
+93,602,22.098
+93,603,19.3675
+93,604,24.0876666666667
+93,605,23.6431666666667
+93,606,22.4155
+93,607,26.3101666666667
+93,608,22.7965
+93,609,24.9978333333333
+93,610,23.0928333333333
+93,611,23.749
+93,612,17.9916666666667
+93,613,20.2988333333333
+93,614,19.8966666666667
+93,615,18.8171666666667
+93,616,24.4686666666667
+93,617,25.0825
+93,618,26.1831666666667
+93,619,28.3421666666667
+93,620,22.2038333333333
+93,621,22.3943333333333
+93,622,27.6013333333333
+93,623,26.9028333333333
+93,624,18.9865
+93,625,23.114
+93,626,24.9978333333333
+93,627,20.193
+93,628,22.0768333333333
+93,629,20.9973333333333
+93,630,20.1506666666667
+93,631,18.6266666666667
+93,632,24.8496666666667
+93,633,21.6111666666667
+93,634,19.2616666666667
+93,635,22.0556666666667
+93,636,17.399
+93,637,22.987
+93,638,20.828
+93,639,23.8971666666667
+93,640,21.0608333333333
+93,641,20.5951666666667
+93,642,21.2301666666667
+93,643,25.019
+93,644,19.3675
+93,645,19.7696666666667
+93,646,21.9286666666667
+93,647,21.8651666666667
+93,648,20.8915
+93,649,21.4418333333333
+93,650,20.3623333333333
+93,651,20.2353333333333
+93,652,18.3515
+93,653,19.4733333333333
+93,654,17.9916666666667
+93,655,23.1563333333333
+93,656,20.7645
+93,657,22.9658333333333
+93,658,19.3886666666667
+93,659,20.32
+93,660,21.4418333333333
+93,661,21.59
+93,662,19.812
+93,663,20.8915
+93,664,24.1088333333333
+93,665,24.2146666666667
+93,666,23.3468333333333
+93,667,17.4836666666667
+93,668,18.9441666666667
+93,669,20.193
+93,670,19.4733333333333
+93,671,20.2565
+93,672,22.479
+93,673,22.5636666666667
+93,674,19.685
+93,675,22.8388333333333
+93,676,24.8285
+93,677,20.701
+93,678,24.6803333333333
+93,679,19.7485
+93,680,17.6318333333333
+93,681,16.1925
+93,682,24.6803333333333
+93,683,25.3788333333333
+93,684,16.9121666666667
+93,685,25.0613333333333
+93,686,19.1135
+93,687,21.1878333333333
+93,688,28.1305
+93,689,19.939
+93,690,19.3463333333333
+93,691,15.5998333333333
+93,692,17.8858333333333
+93,693,21.6323333333333
+93,694,24.7226666666667
+93,695,17.9916666666667
+93,696,22.5848333333333
+93,697,22.098
+93,698,20.6586666666667
+93,699,19.3251666666667
+93,700,25.2095
+93,701,23.0081666666667
+93,702,21.7381666666667
+93,703,20.0236666666667
+93,704,16.6793333333333
+93,705,20.7221666666667
+93,706,19.1558333333333
+93,707,19.3251666666667
+93,708,19.8543333333333
+93,709,17.4625
+93,710,20.2353333333333
+93,711,16.2983333333333
+93,712,25.4635
+93,713,25.0613333333333
+93,714,18.9865
+93,715,24.3205
+93,716,21.6746666666667
+93,717,24.9766666666667
+93,718,25.4846666666667
+93,719,21.2725
+93,720,22.479
+93,721,20.3835
+93,722,19.812
+93,723,21.8016666666667
+93,724,15.8115
+93,725,21.209
+93,726,22.3731666666667
+93,727,20.6163333333333
+93,728,27.2415
+93,729,14.1816666666667
+93,730,24.4263333333333
+93,731,20.955
+93,732,22.2461666666667
+93,733,17.8435
+93,734,22.4155
+93,735,17.9916666666667
+93,736,20.1718333333333
+93,737,24.3628333333333
+93,738,21.3995
+93,739,23.9606666666667
+93,740,20.3623333333333
+93,741,22.2038333333333
+93,742,17.9493333333333
+93,743,21.971
+93,744,21.9286666666667
+93,745,23.8125
+93,746,23.2621666666667
+93,747,22.5213333333333
+93,748,18.6478333333333
+93,749,21.9498333333333
+93,750,19.177
+93,751,17.1873333333333
+93,752,18.796
+93,753,27.432
+93,754,21.7805
+93,755,25.1248333333333
+93,756,18.8595
+93,757,20.4258333333333
+93,758,21.9498333333333
+93,759,22.2461666666667
+93,760,20.1083333333333
+93,761,20.9126666666667
+93,762,20.1295
+93,763,16.9121666666667
+93,764,26.2255
+93,765,22.733
+93,766,18.8595
+93,767,25.4
+93,768,21.59
+93,769,19.3675
+93,770,23.1986666666667
+93,771,22.606
+93,772,18.0128333333333
+93,773,16.637
+93,774,25.3365
+93,775,20.7221666666667
+93,776,24.5533333333333
+93,777,22.1615
+93,778,17.145
+93,779,24.892
+93,780,19.1346666666667
+93,781,17.399
+93,782,23.0505
+93,783,19.685
+93,784,23.114
+93,785,20.0025
+93,786,18.4573333333333
+93,787,23.4738333333333
+93,788,20.574
+93,789,23.9606666666667
+93,790,26.416
+93,791,24.003
+93,792,21.8863333333333
+93,793,18.034
+93,794,25.4
+93,795,19.8755
+93,796,22.3943333333333
+93,797,24.892
+93,798,22.4155
+93,799,20.1506666666667
+93,800,25.4635
+93,801,21.3783333333333
+93,802,23.6643333333333
+93,803,22.1826666666667
+93,804,20.4893333333333
+93,805,18.6266666666667
+93,806,21.7593333333333
+93,807,18.6478333333333
+93,808,25.5481666666667
+93,809,23.4103333333333
+93,810,20.0448333333333
+93,811,20.4258333333333
+93,812,24.8496666666667
+93,813,20.8915
+93,814,23.2833333333333
+93,815,24.8073333333333
+93,816,18.3726666666667
+93,817,22.4155
+93,818,17.3778333333333
+93,819,18.4996666666667
+93,820,20.8915
+93,821,21.1243333333333
+93,822,21.8228333333333
+93,823,20.8491666666667
+93,824,18.0551666666667
+93,825,21.9498333333333
+93,826,20.5528333333333
+93,827,19.2193333333333
+93,828,23.368
+93,829,27.7071666666667
+93,830,21.0185
+93,831,19.4521666666667
+93,832,17.9916666666667
+93,833,16.6158333333333
+93,834,25.2095
+93,835,19.7061666666667
+93,836,22.6906666666667
+93,837,26.3736666666667
+93,838,21.7593333333333
+93,839,16.9968333333333
+93,840,21.59
+93,841,18.3091666666667
+93,842,22.5213333333333
+93,843,17.8223333333333
+93,844,24.5533333333333
+93,845,23.9183333333333
+93,846,24.7861666666667
+93,847,23.6431666666667
+93,848,20.0236666666667
+93,849,22.1826666666667
+93,850,20.574
+93,851,23.3256666666667
+93,852,19.8755
+93,853,20.1718333333333
+93,854,17.8435
+93,855,22.4366666666667
+93,856,18.8383333333333
+93,857,25.908
+93,858,25.1883333333333
+93,859,25.1036666666667
+93,860,21.9921666666667
+93,861,21.2936666666667
+93,862,24.9766666666667
+93,863,24.0453333333333
+93,864,22.9658333333333
+93,865,21.1031666666667
+93,866,17.272
+93,867,21.6535
+93,868,22.2461666666667
+93,869,23.8336666666667
+93,870,28.3633333333333
+93,871,15.3035
+93,872,22.0768333333333
+93,873,18.2456666666667
+93,874,23.1775
+93,875,21.59
+93,876,21.6323333333333
+93,877,14.8378333333333
+93,878,15.8961666666667
+93,879,18.8806666666667
+93,880,19.6426666666667
+93,881,19.3463333333333
+93,882,21.1243333333333
+93,883,24.003
+93,884,14.1605
+93,885,22.733
+93,886,22.352
+93,887,22.5848333333333
+93,888,23.7066666666667
+93,889,16.3195
+93,890,21.1878333333333
+93,891,27.432
+93,892,21.1031666666667
+93,893,22.7541666666667
+93,894,19.7908333333333
+93,895,25.2095
+93,896,25.6963333333333
+93,897,18.161
+93,898,21.7381666666667
+93,899,17.7588333333333
+93,900,23.749
+93,901,20.7645
+93,902,21.3571666666667
+93,903,17.1026666666667
+93,904,17.6953333333333
+93,905,19.8755
+93,906,18.1186666666667
+93,907,29.6756666666667
+93,908,18.2245
+93,909,22.7541666666667
+93,910,21.4418333333333
+93,911,16.5311666666667
+93,912,19.9178333333333
+93,913,21.7805
+93,914,23.0081666666667
+93,915,23.6431666666667
+93,916,19.3251666666667
+93,917,19.685
+93,918,16.4465
+93,919,22.0133333333333
+93,920,20.32
+93,921,21.5265
+93,922,24.9131666666667
+93,923,23.5585
+93,924,21.5265
+93,925,19.8966666666667
+93,926,19.7485
+93,927,21.4841666666667
+93,928,19.2616666666667
+93,929,23.7701666666667
+93,930,18.9653333333333
+93,931,24.3205
+93,932,18.7325
+93,933,22.1615
+93,934,20.574
+93,935,19.3675
+93,936,18.6901666666667
+93,937,21.59
+93,938,20.1083333333333
+93,939,20.701
+93,940,24.4686666666667
+93,941,21.6323333333333
+93,942,21.0396666666667
+93,943,23.7066666666667
+93,944,20.5105
+93,945,24.7226666666667
+93,946,21.3995
+93,947,19.9813333333333
+93,948,17.2085
+93,949,25.2941666666667
+93,950,16.4465
+93,951,18.415
+93,952,22.5425
+93,953,22.1191666666667
+93,954,23.5161666666667
+93,955,20.193
+93,956,23.9818333333333
+93,957,22.86
+93,958,18.8806666666667
+93,959,23.3891666666667
+93,960,22.4366666666667
+93,961,21.4841666666667
+93,962,22.0345
+93,963,17.5471666666667
+93,964,21.3148333333333
+93,965,21.3571666666667
+93,966,19.2616666666667
+93,967,26.4795
+93,968,21.3783333333333
+93,969,17.7165
+93,970,22.3096666666667
+93,971,20.574
+93,972,25.3788333333333
+93,973,18.9865
+93,974,27.0721666666667
+93,975,19.7485
+93,976,20.7433333333333
+93,977,23.6008333333333
+93,978,21.4418333333333
+93,979,22.2885
+93,980,20.6798333333333
+93,981,20.4681666666667
+93,982,20.6163333333333
+93,983,19.7273333333333
+93,984,28.0458333333333
+93,985,22.0768333333333
+93,986,25.7175
+93,987,22.1191666666667
+93,988,18.1398333333333
+93,989,22.5001666666667
+93,990,19.177
+93,991,23.3891666666667
+93,992,22.1191666666667
+93,993,19.5156666666667
+93,994,19.558
+93,995,19.0711666666667
+93,996,20.0448333333333
+93,997,19.4733333333333
+93,998,20.9761666666667
+93,999,20.5105
+93,1000,28.6596666666667
+94,1,20.8491666666667
+94,2,28.5538333333333
+94,3,18.034
+94,4,32.1945
+94,5,27.7918333333333
+94,6,23.1351666666667
+94,7,30.5011666666667
+94,8,26.7758333333333
+94,9,28.7866666666667
+94,10,23.5373333333333
+94,11,25.654
+94,12,22.098
+94,13,22.9023333333333
+94,14,29.0618333333333
+94,15,30.099
+94,16,28.7866666666667
+94,17,19.558
+94,18,33.3798333333333
+94,19,26.3948333333333
+94,20,30.099
+94,21,31.877
+94,22,30.734
+94,23,24.0453333333333
+94,24,24.1723333333333
+94,25,30.4588333333333
+94,26,23.8336666666667
+94,27,24.2146666666667
+94,28,23.114
+94,29,20.4258333333333
+94,30,25.6963333333333
+94,31,27.6436666666667
+94,32,19.7061666666667
+94,33,25.908
+94,34,16.6793333333333
+94,35,19.7273333333333
+94,36,26.5006666666667
+94,37,21.1666666666667
+94,38,24.765
+94,39,18.3091666666667
+94,40,21.9921666666667
+94,41,20.3623333333333
+94,42,25.3365
+94,43,18.7113333333333
+94,44,22.0133333333333
+94,45,21.1243333333333
+94,46,25.4
+94,47,27.2203333333333
+94,48,17.526
+94,49,22.86
+94,50,19.7908333333333
+94,51,28.1516666666667
+94,52,22.4578333333333
+94,53,21.1243333333333
+94,54,22.1615
+94,55,23.0716666666667
+94,56,26.0985
+94,57,17.8646666666667
+94,58,27.7283333333333
+94,59,26.5006666666667
+94,60,17.78
+94,61,16.0443333333333
+94,62,25.0613333333333
+94,63,26.4371666666667
+94,64,22.3096666666667
+94,65,23.0293333333333
+94,66,23.7278333333333
+94,67,26.8605
+94,68,24.2993333333333
+94,69,24.9131666666667
+94,70,27.5378333333333
+94,71,26.0773333333333
+94,72,29.6756666666667
+94,73,21.7381666666667
+94,74,19.8543333333333
+94,75,18.2456666666667
+94,76,23.4315
+94,77,25.2306666666667
+94,78,28.6385
+94,79,30.0143333333333
+94,80,25.4846666666667
+94,81,24.003
+94,82,29.3581666666667
+94,83,21.3783333333333
+94,84,16.0443333333333
+94,85,20.1295
+94,86,26.6911666666667
+94,87,23.6643333333333
+94,88,23.5585
+94,89,28.194
+94,90,23.2833333333333
+94,91,26.9451666666667
+94,92,28.7231666666667
+94,93,28.8713333333333
+94,94,32.2368333333333
+94,95,21.2725
+94,96,29.1465
+94,97,25.4
+94,98,25.3576666666667
+94,99,29.7603333333333
+94,100,19.0288333333333
+94,101,35.3271666666667
+94,102,34.0148333333333
+94,103,23.7913333333333
+94,104,26.289
+94,105,31.4536666666667
+94,106,24.1511666666667
+94,107,23.1563333333333
+94,108,21.4841666666667
+94,109,22.9658333333333
+94,110,24.13
+94,111,22.1403333333333
+94,112,21.3148333333333
+94,113,23.7066666666667
+94,114,25.908
+94,115,23.6855
+94,116,24.3205
+94,117,26.543
+94,118,29.464
+94,119,25.3788333333333
+94,120,23.4103333333333
+94,121,22.0768333333333
+94,122,27.7918333333333
+94,123,33.1046666666667
+94,124,26.1196666666667
+94,125,31.0303333333333
+94,126,20.066
+94,127,23.0293333333333
+94,128,25.6751666666667
+94,129,20.2353333333333
+94,130,20.2353333333333
+94,131,22.5848333333333
+94,132,21.6111666666667
+94,133,25.4211666666667
+94,134,17.653
+94,135,25.4
+94,136,24.8073333333333
+94,137,17.1873333333333
+94,138,16.4676666666667
+94,139,25.654
+94,140,29.464
+94,141,28.2363333333333
+94,142,18.8383333333333
+94,143,22.3943333333333
+94,144,20.8068333333333
+94,145,25.8021666666667
+94,146,19.2405
+94,147,25.019
+94,148,31.3055
+94,149,26.3948333333333
+94,150,24.511
+94,151,27.8765
+94,152,26.67
+94,153,26.8181666666667
+94,154,28.067
+94,155,31.6018333333333
+94,156,27.6013333333333
+94,157,18.9441666666667
+94,158,28.4903333333333
+94,159,28.321
+94,160,23.1351666666667
+94,161,25.2306666666667
+94,162,27.305
+94,163,13.9276666666667
+94,164,29.464
+94,165,17.399
+94,166,30.226
+94,167,22.0768333333333
+94,168,31.877
+94,169,25.5693333333333
+94,170,23.6008333333333
+94,171,18.542
+94,172,26.6065
+94,173,23.6643333333333
+94,174,20.1506666666667
+94,175,20.7221666666667
+94,176,25.1671666666667
+94,177,27.5801666666667
+94,178,26.2678333333333
+94,179,20.9973333333333
+94,180,23.9395
+94,181,23.622
+94,182,24.9131666666667
+94,183,34.163
+94,184,20.955
+94,185,23.4315
+94,186,25.4
+94,187,25.2095
+94,188,22.5425
+94,189,25.8656666666667
+94,190,29.3793333333333
+94,191,31.369
+94,192,29.9508333333333
+94,193,21.2725
+94,194,24.13
+94,195,25.1248333333333
+94,196,24.3628333333333
+94,197,22.8811666666667
+94,198,28.0458333333333
+94,199,29.464
+94,200,29.4428333333333
+94,201,15.3881666666667
+94,202,20.4046666666667
+94,203,32.0675
+94,204,25.908
+94,205,17.6106666666667
+94,206,24.6803333333333
+94,207,24.3205
+94,208,27.178
+94,209,31.1996666666667
+94,210,25.6116666666667
+94,211,26.797
+94,212,32.1098333333333
+94,213,24.892
+94,214,22.1403333333333
+94,215,24.9766666666667
+94,216,22.6906666666667
+94,217,27.4743333333333
+94,218,24.257
+94,219,24.9555
+94,220,27.3473333333333
+94,221,27.6013333333333
+94,222,30.607
+94,223,15.875
+94,224,26.8816666666667
+94,225,20.7433333333333
+94,226,21.1243333333333
+94,227,29.1041666666667
+94,228,24.9978333333333
+94,229,19.3463333333333
+94,230,25.9926666666667
+94,231,27.813
+94,232,31.1573333333333
+94,233,23.114
+94,234,22.733
+94,235,30.6281666666667
+94,236,18.9018333333333
+94,237,27.559
+94,238,19.5156666666667
+94,239,27.4531666666667
+94,240,27.7918333333333
+94,241,32.4485
+94,242,33.2316666666667
+94,243,32.6813333333333
+94,244,23.5585
+94,245,23.0716666666667
+94,246,25.9503333333333
+94,247,25.3788333333333
+94,248,24.9343333333333
+94,249,29.9508333333333
+94,250,36.8935
+94,251,30.5646666666667
+94,252,25.8233333333333
+94,253,27.5801666666667
+94,254,21.5053333333333
+94,255,26.8393333333333
+94,256,18.0128333333333
+94,257,21.5476666666667
+94,258,26.0561666666667
+94,259,27.305
+94,260,26.7335
+94,261,23.0505
+94,262,26.4795
+94,263,25.146
+94,264,30.7551666666667
+94,265,29.718
+94,266,29.9931666666667
+94,267,27.8765
+94,268,21.082
+94,269,17.9705
+94,270,20.4681666666667
+94,271,21.336
+94,272,27.7706666666667
+94,273,25.4211666666667
+94,274,23.8125
+94,275,26.2466666666667
+94,276,26.6911666666667
+94,277,26.4795
+94,278,21.3995
+94,279,25.4
+94,280,33.4645
+94,281,26.2043333333333
+94,282,22.1615
+94,283,27.6013333333333
+94,284,20.1506666666667
+94,285,34.6286666666667
+94,286,21.4206666666667
+94,287,27.8341666666667
+94,288,26.0985
+94,289,21.3995
+94,290,18.6901666666667
+94,291,26.3525
+94,292,27.6436666666667
+94,293,24.7861666666667
+94,294,19.9813333333333
+94,295,23.8548333333333
+94,296,17.399
+94,297,21.7593333333333
+94,298,24.5745
+94,299,26.7335
+94,300,25.8021666666667
+94,301,23.3045
+94,302,23.1351666666667
+94,303,23.5373333333333
+94,304,30.1625
+94,305,24.5956666666667
+94,306,22.0556666666667
+94,307,27.3473333333333
+94,308,29.4216666666667
+94,309,27.0721666666667
+94,310,21.8016666666667
+94,311,28.0458333333333
+94,312,24.6168333333333
+94,313,31.496
+94,314,23.1986666666667
+94,315,29.845
+94,316,27.813
+94,317,15.3458333333333
+94,318,26.7335
+94,319,26.9451666666667
+94,320,27.7495
+94,321,29.337
+94,322,27.1991666666667
+94,323,24.003
+94,324,28.6173333333333
+94,325,22.5213333333333
+94,326,29.8238333333333
+94,327,22.5425
+94,328,42.5661666666667
+94,329,24.4263333333333
+94,330,30.7128333333333
+94,331,29.5698333333333
+94,332,16.1925
+94,333,26.6276666666667
+94,334,27.2626666666667
+94,335,23.2833333333333
+94,336,36.7665
+94,337,26.797
+94,338,23.749
+94,339,28.1093333333333
+94,340,25.5905
+94,341,28.5326666666667
+94,342,19.5368333333333
+94,343,21.844
+94,344,28.8713333333333
+94,345,26.0773333333333
+94,346,26.1196666666667
+94,347,18.5208333333333
+94,348,22.6695
+94,349,20.6798333333333
+94,350,25.4
+94,351,28.575
+94,352,23.9183333333333
+94,353,26.4371666666667
+94,354,21.1031666666667
+94,355,22.0133333333333
+94,356,24.8708333333333
+94,357,25.273
+94,358,22.606
+94,359,18.4996666666667
+94,360,27.4955
+94,361,25.3365
+94,362,21.9075
+94,363,21.2513333333333
+94,364,24.1088333333333
+94,365,22.6906666666667
+94,366,27.686
+94,367,26.3313333333333
+94,368,20.701
+94,369,21.2301666666667
+94,370,25.6116666666667
+94,371,18.2033333333333
+94,372,19.9178333333333
+94,373,18.6055
+94,374,24.4898333333333
+94,375,24.13
+94,376,22.9446666666667
+94,377,25.1248333333333
+94,378,25.8656666666667
+94,379,18.796
+94,380,26.7335
+94,381,22.1615
+94,382,28.575
+94,383,26.7758333333333
+94,384,20.9338333333333
+94,385,24.3628333333333
+94,386,23.2621666666667
+94,387,25.9503333333333
+94,388,25.527
+94,389,23.114
+94,390,23.6008333333333
+94,391,25.8021666666667
+94,392,28.448
+94,393,30.3741666666667
+94,394,21.6323333333333
+94,395,29.6756666666667
+94,396,26.797
+94,397,26.162
+94,398,22.8388333333333
+94,399,26.3313333333333
+94,400,25.8021666666667
+94,401,25.5058333333333
+94,402,18.8595
+94,403,22.4578333333333
+94,404,23.7701666666667
+94,405,21.3148333333333
+94,406,20.7433333333333
+94,407,25.3576666666667
+94,408,22.1826666666667
+94,409,25.908
+94,410,25.8656666666667
+94,411,19.177
+94,412,23.3256666666667
+94,413,20.7221666666667
+94,414,25.6328333333333
+94,415,29.1253333333333
+94,416,26.3525
+94,417,18.3938333333333
+94,418,26.5006666666667
+94,419,29.0406666666667
+94,420,23.2833333333333
+94,421,28.8078333333333
+94,422,24.8708333333333
+94,423,24.3628333333333
+94,424,31.242
+94,425,25.146
+94,426,28.8501666666667
+94,427,27.0086666666667
+94,428,31.4748333333333
+94,429,31.7923333333333
+94,430,19.3251666666667
+94,431,23.4526666666667
+94,432,24.8708333333333
+94,433,29.2735
+94,434,22.9446666666667
+94,435,22.9023333333333
+94,436,21.3148333333333
+94,437,20.2776666666667
+94,438,29.0406666666667
+94,439,26.5006666666667
+94,440,25.146
+94,441,25.8656666666667
+94,442,24.257
+94,443,30.9245
+94,444,25.019
+94,445,23.7913333333333
+94,446,24.6591666666667
+94,447,23.622
+94,448,30.4376666666667
+94,449,23.6643333333333
+94,450,23.622
+94,451,24.4263333333333
+94,452,22.1615
+94,453,19.4521666666667
+94,454,23.1563333333333
+94,455,19.6638333333333
+94,456,20.9126666666667
+94,457,19.5156666666667
+94,458,23.876
+94,459,25.2306666666667
+94,460,24.2993333333333
+94,461,22.6695
+94,462,26.924
+94,463,16.9756666666667
+94,464,18.0551666666667
+94,465,27.3685
+94,466,25.0613333333333
+94,467,24.1511666666667
+94,468,20.9126666666667
+94,469,19.7485
+94,470,21.4841666666667
+94,471,26.3736666666667
+94,472,28.9348333333333
+94,473,18.288
+94,474,22.1191666666667
+94,475,22.987
+94,476,20.6375
+94,477,24.6168333333333
+94,478,20.1295
+94,479,25.8021666666667
+94,480,26.797
+94,481,28.0246666666667
+94,482,20.4046666666667
+94,483,27.8341666666667
+94,484,25.3153333333333
+94,485,25.019
+94,486,25.2306666666667
+94,487,27.4531666666667
+94,488,24.9978333333333
+94,489,26.6911666666667
+94,490,24.13
+94,491,31.8981666666667
+94,492,28.8078333333333
+94,493,23.3891666666667
+94,494,16.51
+94,495,28.6173333333333
+94,496,23.5373333333333
+94,497,26.4583333333333
+94,498,23.9183333333333
+94,499,31.9828333333333
+94,500,19.8543333333333
+94,501,24.2781666666667
+94,502,24.7438333333333
+94,503,26.7335
+94,504,32.5755
+94,505,17.6741666666667
+94,506,25.9926666666667
+94,507,34.0571666666667
+94,508,25.1036666666667
+94,509,32.766
+94,510,21.9921666666667
+94,511,24.4051666666667
+94,512,27.3685
+94,513,26.1408333333333
+94,514,17.8011666666667
+94,515,20.1718333333333
+94,516,22.9235
+94,517,28.321
+94,518,25.7386666666667
+94,519,26.416
+94,520,21.5476666666667
+94,521,25.4846666666667
+94,522,29.6121666666667
+94,523,27.4955
+94,524,30.1201666666667
+94,525,19.685
+94,526,18.4573333333333
+94,527,22.1403333333333
+94,528,24.3205
+94,529,20.2353333333333
+94,530,23.5373333333333
+94,531,27.686
+94,532,29.337
+94,533,23.6431666666667
+94,534,25.7386666666667
+94,535,27.6013333333333
+94,536,30.9668333333333
+94,537,22.86
+94,538,22.9658333333333
+94,539,23.9606666666667
+94,540,25.6963333333333
+94,541,21.8651666666667
+94,542,30.607
+94,543,21.5688333333333
+94,544,25.7598333333333
+94,545,27.7071666666667
+94,546,22.352
+94,547,28.702
+94,548,28.6385
+94,549,24.6591666666667
+94,550,21.2936666666667
+94,551,17.272
+94,552,24.7861666666667
+94,553,28.7443333333333
+94,554,22.987
+94,555,27.2415
+94,556,27.4531666666667
+94,557,19.2405
+94,558,19.1135
+94,559,27.6013333333333
+94,560,31.115
+94,561,23.5585
+94,562,31.7711666666667
+94,563,23.9395
+94,564,20.1718333333333
+94,565,32.004
+94,566,25.908
+94,567,26.7758333333333
+94,568,24.8285
+94,569,27.1568333333333
+94,570,33.1681666666667
+94,571,21.3148333333333
+94,572,22.225
+94,573,23.7278333333333
+94,574,25.5481666666667
+94,575,23.4738333333333
+94,576,28.8713333333333
+94,577,23.0716666666667
+94,578,25.1883333333333
+94,579,29.464
+94,580,20.8915
+94,581,22.7965
+94,582,27.8765
+94,583,21.082
+94,584,27.4743333333333
+94,585,30.5011666666667
+94,586,21.1031666666667
+94,587,27.9823333333333
+94,588,29.2311666666667
+94,589,23.1351666666667
+94,590,27.178
+94,591,25.1883333333333
+94,592,24.1088333333333
+94,593,32.9988333333333
+94,594,26.3525
+94,595,19.1135
+94,596,24.7438333333333
+94,597,25.5693333333333
+94,598,24.0876666666667
+94,599,24.9766666666667
+94,600,24.4898333333333
+94,601,28.0246666666667
+94,602,28.702
+94,603,24.892
+94,604,27.432
+94,605,22.225
+94,606,21.5053333333333
+94,607,28.829
+94,608,28.448
+94,609,29.4005
+94,610,25.5481666666667
+94,611,24.9978333333333
+94,612,27.8553333333333
+94,613,25.0401666666667
+94,614,21.9286666666667
+94,615,24.0453333333333
+94,616,20.1083333333333
+94,617,26.8393333333333
+94,618,19.3251666666667
+94,619,22.6271666666667
+94,620,22.5636666666667
+94,621,25.4423333333333
+94,622,29.9085
+94,623,23.2833333333333
+94,624,22.2038333333333
+94,625,29.1041666666667
+94,626,28.1728333333333
+94,627,23.5161666666667
+94,628,25.146
+94,629,29.21
+94,630,26.289
+94,631,22.8388333333333
+94,632,26.7335
+94,633,26.6488333333333
+94,634,27.0721666666667
+94,635,32.7236666666667
+94,636,26.5641666666667
+94,637,28.2786666666667
+94,638,19.4521666666667
+94,639,30.4165
+94,640,20.7221666666667
+94,641,20.5316666666667
+94,642,26.3525
+94,643,19.3886666666667
+94,644,25.019
+94,645,28.956
+94,646,20.828
+94,647,17.9916666666667
+94,648,20.7645
+94,649,30.3953333333333
+94,650,25.9715
+94,651,21.717
+94,652,28.4691666666667
+94,653,21.971
+94,654,29.3581666666667
+94,655,21.6323333333333
+94,656,21.463
+94,657,34.2688333333333
+94,658,27.1356666666667
+94,659,25.5693333333333
+94,660,23.8548333333333
+94,661,24.8496666666667
+94,662,19.7696666666667
+94,663,25.7598333333333
+94,664,21.463
+94,665,26.1831666666667
+94,666,27.7283333333333
+94,667,20.1083333333333
+94,668,25.908
+94,669,20.5105
+94,670,26.4371666666667
+94,671,27.1356666666667
+94,672,29.6545
+94,673,26.8605
+94,674,24.257
+94,675,30.1625
+94,676,20.0871666666667
+94,677,18.9441666666667
+94,678,21.4206666666667
+94,679,20.3411666666667
+94,680,25.3576666666667
+94,681,24.638
+94,682,30.0778333333333
+94,683,27.7071666666667
+94,684,26.5218333333333
+94,685,18.3091666666667
+94,686,24.9766666666667
+94,687,26.4371666666667
+94,688,35.7293333333333
+94,689,24.0453333333333
+94,690,18.4785
+94,691,30.0355
+94,692,30.1836666666667
+94,693,38.8831666666667
+94,694,23.3256666666667
+94,695,15.7903333333333
+94,696,25.1248333333333
+94,697,23.5161666666667
+94,698,20.2776666666667
+94,699,30.1625
+94,700,22.6906666666667
+94,701,28.575
+94,702,24.2993333333333
+94,703,22.3308333333333
+94,704,23.5585
+94,705,28.9136666666667
+94,706,26.3101666666667
+94,707,22.5001666666667
+94,708,20.8703333333333
+94,709,25.5481666666667
+94,710,30.0143333333333
+94,711,29.3793333333333
+94,712,26.797
+94,713,22.0133333333333
+94,714,21.8228333333333
+94,715,28.6173333333333
+94,716,34.3535
+94,717,26.5006666666667
+94,718,23.876
+94,719,28.575
+94,720,22.987
+94,721,28.067
+94,722,25.6116666666667
+94,723,34.3746666666667
+94,724,26.2043333333333
+94,725,22.3943333333333
+94,726,26.5853333333333
+94,727,24.9343333333333
+94,728,22.5001666666667
+94,729,29.21
+94,730,20.7433333333333
+94,731,24.638
+94,732,21.1455
+94,733,19.685
+94,734,28.8501666666667
+94,735,21.209
+94,736,20.4893333333333
+94,737,31.0091666666667
+94,738,24.3205
+94,739,27.7706666666667
+94,740,26.6488333333333
+94,741,30.0355
+94,742,30.0566666666667
+94,743,25.6963333333333
+94,744,25.2095
+94,745,25.0825
+94,746,25.9926666666667
+94,747,25.5481666666667
+94,748,23.2198333333333
+94,749,25.8233333333333
+94,750,21.2301666666667
+94,751,26.3525
+94,752,18.0128333333333
+94,753,25.9926666666667
+94,754,20.6375
+94,755,22.5425
+94,756,21.209
+94,757,22.2885
+94,758,26.6488333333333
+94,759,14.5203333333333
+94,760,25.4846666666667
+94,761,26.2043333333333
+94,762,21.6111666666667
+94,763,16.4676666666667
+94,764,25.9503333333333
+94,765,21.3571666666667
+94,766,28.2998333333333
+94,767,30.3318333333333
+94,768,26.67
+94,769,27.3473333333333
+94,770,20.0448333333333
+94,771,24.1723333333333
+94,772,20.9126666666667
+94,773,22.9235
+94,774,19.6003333333333
+94,775,22.6271666666667
+94,776,26.9875
+94,777,33.9936666666667
+94,778,31.3901666666667
+94,779,29.0406666666667
+94,780,20.7645
+94,781,32.893
+94,782,23.5161666666667
+94,783,20.2353333333333
+94,784,27.178
+94,785,29.2946666666667
+94,786,27.6648333333333
+94,787,19.0288333333333
+94,788,20.0871666666667
+94,789,25.654
+94,790,27.0086666666667
+94,791,21.0608333333333
+94,792,32.7871666666667
+94,793,25.5905
+94,794,22.6695
+94,795,27.559
+94,796,25.0401666666667
+94,797,30.48
+94,798,23.5796666666667
+94,799,22.1191666666667
+94,800,26.7123333333333
+94,801,24.8073333333333
+94,802,22.8811666666667
+94,803,27.5801666666667
+94,804,26.2255
+94,805,30.48
+94,806,27.432
+94,807,22.1826666666667
+94,808,26.3736666666667
+94,809,33.02
+94,810,25.4635
+94,811,20.8915
+94,812,20.2988333333333
+94,813,24.5956666666667
+94,814,24.3416666666667
+94,815,19.0923333333333
+94,816,18.4573333333333
+94,817,26.6276666666667
+94,818,20.6375
+94,819,22.8176666666667
+94,820,29.7815
+94,821,26.6488333333333
+94,822,27.4531666666667
+94,823,26.7123333333333
+94,824,24.5533333333333
+94,825,21.6111666666667
+94,826,26.7546666666667
+94,827,23.3045
+94,828,25.1036666666667
+94,829,22.3096666666667
+94,830,30.2048333333333
+94,831,31.5171666666667
+94,832,29.083
+94,833,22.987
+94,834,34.3111666666667
+94,835,19.05
+94,836,31.6018333333333
+94,837,30.1201666666667
+94,838,21.8228333333333
+94,839,23.5161666666667
+94,840,24.0453333333333
+94,841,21.9498333333333
+94,842,28.5961666666667
+94,843,16.764
+94,844,22.4578333333333
+94,845,26.035
+94,846,23.749
+94,847,28.3633333333333
+94,848,30.1201666666667
+94,849,28.9771666666667
+94,850,29.2735
+94,851,23.6643333333333
+94,852,29.9508333333333
+94,853,26.67
+94,854,27.2203333333333
+94,855,28.9983333333333
+94,856,22.2461666666667
+94,857,22.3943333333333
+94,858,25.146
+94,859,25.5693333333333
+94,860,21.59
+94,861,27.9188333333333
+94,862,23.4103333333333
+94,863,26.924
+94,864,27.7495
+94,865,26.0138333333333
+94,866,26.289
+94,867,27.6225
+94,868,23.1351666666667
+94,869,22.6483333333333
+94,870,20.2565
+94,871,30.226
+94,872,35.0096666666667
+94,873,23.6643333333333
+94,874,24.765
+94,875,24.003
+94,876,27.5801666666667
+94,877,24.2993333333333
+94,878,28.6173333333333
+94,879,24.4686666666667
+94,880,25.4
+94,881,18.7325
+94,882,17.8011666666667
+94,883,24.765
+94,884,30.8821666666667
+94,885,22.606
+94,886,27.813
+94,887,27.4955
+94,888,18.4996666666667
+94,889,16.0443333333333
+94,890,20.447
+94,891,19.3463333333333
+94,892,23.7066666666667
+94,893,20.1083333333333
+94,894,28.829
+94,895,26.3313333333333
+94,896,19.2193333333333
+94,897,24.6803333333333
+94,898,23.2198333333333
+94,899,29.5275
+94,900,22.9446666666667
+94,901,27.4531666666667
+94,902,24.2146666666667
+94,903,20.2565
+94,904,25.7386666666667
+94,905,27.813
+94,906,20.0448333333333
+94,907,21.3783333333333
+94,908,26.162
+94,909,27.813
+94,910,32.893
+94,911,23.8971666666667
+94,912,25.908
+94,913,21.2936666666667
+94,914,21.59
+94,915,24.4475
+94,916,30.7763333333333
+94,917,20.8703333333333
+94,918,20.828
+94,919,25.908
+94,920,26.3101666666667
+94,921,29.6333333333333
+94,922,28.2575
+94,923,28.1305
+94,924,24.5321666666667
+94,925,23.7066666666667
+94,926,26.3101666666667
+94,927,18.7536666666667
+94,928,28.6808333333333
+94,929,26.2043333333333
+94,930,26.1196666666667
+94,931,18.4996666666667
+94,932,30.8398333333333
+94,933,25.5481666666667
+94,934,19.2193333333333
+94,935,27.051
+94,936,28.4903333333333
+94,937,24.6168333333333
+94,938,18.8171666666667
+94,939,21.8228333333333
+94,940,26.289
+94,941,24.7226666666667
+94,942,28.4903333333333
+94,943,22.4578333333333
+94,944,24.4051666666667
+94,945,29.7391666666667
+94,946,15.9173333333333
+94,947,21.463
+94,948,27.4108333333333
+94,949,24.0876666666667
+94,950,20.6163333333333
+94,951,27.8341666666667
+94,952,27.5801666666667
+94,953,21.1031666666667
+94,954,23.7913333333333
+94,955,25.273
+94,956,25.5058333333333
+94,957,21.9498333333333
+94,958,36.4278333333333
+94,959,26.3736666666667
+94,960,22.1615
+94,961,25.4211666666667
+94,962,23.6855
+94,963,22.5213333333333
+94,964,22.3308333333333
+94,965,19.7061666666667
+94,966,23.495
+94,967,28.9983333333333
+94,968,34.8403333333333
+94,969,21.9075
+94,970,29.4851666666667
+94,971,23.2621666666667
+94,972,22.733
+94,973,19.8966666666667
+94,974,28.8501666666667
+94,975,27.686
+94,976,25.1036666666667
+94,977,22.606
+94,978,27.7495
+94,979,26.1196666666667
+94,980,26.289
+94,981,30.9245
+94,982,31.4113333333333
+94,983,28.1516666666667
+94,984,26.924
+94,985,24.1511666666667
+94,986,19.0076666666667
+94,987,21.8228333333333
+94,988,27.178
+94,989,22.7753333333333
+94,990,24.0876666666667
+94,991,22.5425
+94,992,25.5693333333333
+94,993,21.4206666666667
+94,994,26.2466666666667
+94,995,22.2038333333333
+94,996,22.2673333333333
+94,997,29.337
+94,998,32.7236666666667
+94,999,23.7701666666667
+94,1000,27.3685
+95,1,27.7706666666667
+95,2,32.258
+95,3,28.9136666666667
+95,4,32.6813333333333
+95,5,25.6116666666667
+95,6,33.655
+95,7,28.575
+95,8,27.4743333333333
+95,9,31.9616666666667
+95,10,28.956
+95,11,37.592
+95,12,28.1516666666667
+95,13,31.75
+95,14,27.178
+95,15,34.3746666666667
+95,16,26.035
+95,17,34.036
+95,18,19.7273333333333
+95,19,34.8403333333333
+95,20,37.1686666666667
+95,21,28.4903333333333
+95,22,33.274
+95,23,32.258
+95,24,33.8666666666667
+95,25,36.1103333333333
+95,26,38.862
+95,27,34.2053333333333
+95,28,34.6286666666667
+95,29,24.8073333333333
+95,30,31.877
+95,31,30.353
+95,32,28.194
+95,33,32.3426666666667
+95,34,31.1573333333333
+95,35,29.6333333333333
+95,36,27.5166666666667
+95,37,27.813
+95,38,35.7716666666667
+95,39,30.0566666666667
+95,40,27.559
+95,41,32.8083333333333
+95,42,22.6906666666667
+95,43,29.21
+95,44,26.924
+95,45,29.972
+95,46,30.1413333333333
+95,47,35.4753333333333
+95,48,32.258
+95,49,21.1666666666667
+95,50,33.5703333333333
+95,51,29.464
+95,52,27.6013333333333
+95,53,25.1036666666667
+95,54,23.876
+95,55,38.227
+95,56,33.02
+95,57,24.257
+95,58,30.988
+95,59,31.75
+95,60,28.4056666666667
+95,61,25.9503333333333
+95,62,23.9183333333333
+95,63,31.1573333333333
+95,64,27.559
+95,65,34.7133333333333
+95,66,31.9616666666667
+95,67,20.3623333333333
+95,68,30.353
+95,69,23.7913333333333
+95,70,28.1516666666667
+95,71,27.305
+95,72,32.9353333333333
+95,73,25.0613333333333
+95,74,27.3896666666667
+95,75,25.1036666666667
+95,76,29.591
+95,77,38.4386666666667
+95,78,27.6436666666667
+95,79,29.0406666666667
+95,80,25.8656666666667
+95,81,38.354
+95,82,22.733
+95,83,24.384
+95,84,37.2956666666667
+95,85,32.5966666666667
+95,86,26.7546666666667
+95,87,22.606
+95,88,32.3426666666667
+95,89,21.336
+95,90,33.1893333333333
+95,91,29.718
+95,92,23.6643333333333
+95,93,31.0303333333333
+95,94,36.7453333333333
+95,95,26.2043333333333
+95,96,28.7443333333333
+95,97,24.8496666666667
+95,98,25.273
+95,99,27.305
+95,100,25.3153333333333
+95,101,31.4113333333333
+95,102,28.321
+95,103,32.8083333333333
+95,104,31.115
+95,105,33.655
+95,106,24.892
+95,107,26.6276666666667
+95,108,35.8986666666667
+95,109,31.5806666666667
+95,110,33.3586666666667
+95,111,21.6323333333333
+95,112,27.813
+95,113,33.274
+95,114,26.2043333333333
+95,115,28.829
+95,116,27.3473333333333
+95,117,33.9513333333333
+95,118,35.7293333333333
+95,119,30.861
+95,120,27.8553333333333
+95,121,21.4206666666667
+95,122,26.3313333333333
+95,123,33.4433333333333
+95,124,28.067
+95,125,25.6116666666667
+95,126,33.4856666666667
+95,127,22.6483333333333
+95,128,24.7226666666667
+95,129,33.4856666666667
+95,130,26.7123333333333
+95,131,35.2636666666667
+95,132,32.512
+95,133,28.321
+95,134,24.1723333333333
+95,135,20.6586666666667
+95,136,23.5373333333333
+95,137,20.9973333333333
+95,138,24.9343333333333
+95,139,33.6126666666667
+95,140,28.4903333333333
+95,141,28.321
+95,142,30.6493333333333
+95,143,29.845
+95,144,37.211
+95,145,29.337
+95,146,30.1413333333333
+95,147,34.3746666666667
+95,148,38.5656666666667
+95,149,34.4593333333333
+95,150,25.0613333333333
+95,151,28.702
+95,152,27.432
+95,153,23.5796666666667
+95,154,27.7706666666667
+95,155,26.5006666666667
+95,156,25.3153333333333
+95,157,38.1423333333333
+95,158,35.179
+95,159,29.5063333333333
+95,160,24.0876666666667
+95,161,28.067
+95,162,30.5646666666667
+95,163,28.8713333333333
+95,164,30.734
+95,165,29.4216666666667
+95,166,30.3106666666667
+95,167,32.0886666666667
+95,168,25.3153333333333
+95,169,29.4216666666667
+95,170,20.5316666666667
+95,171,25.3576666666667
+95,172,25.908
+95,173,29.1253333333333
+95,174,25.6116666666667
+95,175,26.797
+95,176,24.0876666666667
+95,177,30.5646666666667
+95,178,29.083
+95,179,32.0886666666667
+95,180,26.543
+95,181,28.4903333333333
+95,182,29.6333333333333
+95,183,39.878
+95,184,30.607
+95,185,30.3953333333333
+95,186,21.8863333333333
+95,187,33.2316666666667
+95,188,36.5336666666667
+95,189,35.8986666666667
+95,190,29.845
+95,191,30.734
+95,192,31.3266666666667
+95,193,28.575
+95,194,25.273
+95,195,25.1883333333333
+95,196,35.687
+95,197,31.877
+95,198,32.385
+95,199,30.5223333333333
+95,200,35.56
+95,201,33.9936666666667
+95,202,23.495
+95,203,27.0933333333333
+95,204,25.4423333333333
+95,205,22.5213333333333
+95,206,26.8816666666667
+95,207,30.3106666666667
+95,208,30.48
+95,209,28.9983333333333
+95,210,26.2043333333333
+95,211,26.7546666666667
+95,212,26.8393333333333
+95,213,22.2673333333333
+95,214,29.4216666666667
+95,215,30.5646666666667
+95,216,29.591
+95,217,27.9823333333333
+95,218,30.7763333333333
+95,219,30.988
+95,220,32.0886666666667
+95,221,29.6756666666667
+95,222,35.306
+95,223,22.7753333333333
+95,224,33.4433333333333
+95,225,29.3793333333333
+95,226,36.8723333333333
+95,227,32.004
+95,228,31.4113333333333
+95,229,29.591
+95,230,28.2786666666667
+95,231,32.2156666666667
+95,232,34.798
+95,233,24.3416666666667
+95,234,34.163
+95,235,33.909
+95,236,29.972
+95,237,31.3266666666667
+95,238,26.416
+95,239,27.7706666666667
+95,240,24.0453333333333
+95,241,34.2476666666667
+95,242,28.2786666666667
+95,243,28.956
+95,244,25.273
+95,245,33.4433333333333
+95,246,30.607
+95,247,36.4066666666667
+95,248,29.5486666666667
+95,249,29.337
+95,250,28.829
+95,251,27.6013333333333
+95,252,34.7133333333333
+95,253,30.988
+95,254,31.6653333333333
+95,255,27.7706666666667
+95,256,30.1413333333333
+95,257,32.1733333333333
+95,258,27.3473333333333
+95,259,32.258
+95,260,28.321
+95,261,32.8506666666667
+95,262,33.147
+95,263,30.2683333333333
+95,264,32.893
+95,265,29.4216666666667
+95,266,28.1516666666667
+95,267,29.718
+95,268,25.527
+95,269,28.7866666666667
+95,270,26.7546666666667
+95,271,25.9926666666667
+95,272,32.9776666666667
+95,273,32.512
+95,274,33.147
+95,275,35.687
+95,276,22.7753333333333
+95,277,26.7123333333333
+95,278,32.1733333333333
+95,279,33.9513333333333
+95,280,33.8243333333333
+95,281,26.3313333333333
+95,282,22.5636666666667
+95,283,21.9286666666667
+95,284,31.4113333333333
+95,285,34.036
+95,286,30.0566666666667
+95,287,26.035
+95,288,30.3106666666667
+95,289,35.433
+95,290,33.3163333333333
+95,291,30.9456666666667
+95,292,38.862
+95,293,23.114
+95,294,39.4546666666667
+95,295,39.0313333333333
+95,296,33.3163333333333
+95,297,25.6963333333333
+95,298,27.559
+95,299,24.384
+95,300,33.6973333333333
+95,301,21.6746666666667
+95,302,26.8816666666667
+95,303,30.9456666666667
+95,304,37.084
+95,305,30.4376666666667
+95,306,27.6013333333333
+95,307,30.8186666666667
+95,308,30.9033333333333
+95,309,31.4536666666667
+95,310,37.6766666666667
+95,311,29.9296666666667
+95,312,34.8826666666667
+95,313,34.8403333333333
+95,314,28.1093333333333
+95,315,29.6333333333333
+95,316,27.432
+95,317,26.0773333333333
+95,318,20.8703333333333
+95,319,31.75
+95,320,34.163
+95,321,28.6596666666667
+95,322,30.1836666666667
+95,323,21.3783333333333
+95,324,24.257
+95,325,28.575
+95,326,25.019
+95,327,31.75
+95,328,29.6756666666667
+95,329,26.543
+95,330,34.9673333333333
+95,331,30.8186666666667
+95,332,30.099
+95,333,26.416
+95,334,30.226
+95,335,32.1733333333333
+95,336,29.1253333333333
+95,337,23.3256666666667
+95,338,28.702
+95,339,31.496
+95,340,25.1036666666667
+95,341,29.1253333333333
+95,342,27.6013333333333
+95,343,29.0406666666667
+95,344,26.7546666666667
+95,345,30.5646666666667
+95,346,31.369
+95,347,29.6756666666667
+95,348,29.7603333333333
+95,349,28.7443333333333
+95,350,37.4226666666667
+95,351,30.0143333333333
+95,352,30.5223333333333
+95,353,30.226
+95,354,24.638
+95,355,32.3003333333333
+95,356,26.162
+95,357,23.368
+95,358,28.6596666666667
+95,359,28.6596666666667
+95,360,29.4216666666667
+95,361,26.035
+95,362,28.702
+95,363,27.4743333333333
+95,364,25.019
+95,365,29.6756666666667
+95,366,22.9446666666667
+95,367,27.8976666666667
+95,368,26.5853333333333
+95,369,24.892
+95,370,34.0783333333333
+95,371,34.5863333333333
+95,372,27.813
+95,373,28.194
+95,374,34.671
+95,375,31.9193333333333
+95,376,25.4846666666667
+95,377,36.7453333333333
+95,378,25.019
+95,379,29.2946666666667
+95,380,35.8986666666667
+95,381,26.5853333333333
+95,382,33.3163333333333
+95,383,34.3746666666667
+95,384,33.02
+95,385,29.1676666666667
+95,386,29.6333333333333
+95,387,25.146
+95,388,28.0246666666667
+95,389,24.7226666666667
+95,390,31.9616666666667
+95,391,33.5703333333333
+95,392,24.8073333333333
+95,393,32.2156666666667
+95,394,31.1573333333333
+95,395,37.2956666666667
+95,396,26.289
+95,397,30.099
+95,398,36.7876666666667
+95,399,25.3576666666667
+95,400,29.8873333333333
+95,401,30.861
+95,402,27.2626666666667
+95,403,34.5863333333333
+95,404,27.7706666666667
+95,405,31.0303333333333
+95,406,28.9983333333333
+95,407,28.2363333333333
+95,408,27.6436666666667
+95,409,29.0406666666667
+95,410,26.5853333333333
+95,411,28.3633333333333
+95,412,27.051
+95,413,27.2203333333333
+95,414,29.464
+95,415,29.6756666666667
+95,416,28.2786666666667
+95,417,29.21
+95,418,34.7133333333333
+95,419,26.289
+95,420,32.8083333333333
+95,421,29.1676666666667
+95,422,23.9183333333333
+95,423,32.131
+95,424,36.576
+95,425,33.2316666666667
+95,426,29.1676666666667
+95,427,25.3576666666667
+95,428,25.273
+95,429,35.7293333333333
+95,430,34.9673333333333
+95,431,38.862
+95,432,28.829
+95,433,25.8656666666667
+95,434,24.4686666666667
+95,435,31.7923333333333
+95,436,32.7236666666667
+95,437,30.48
+95,438,38.862
+95,439,34.5863333333333
+95,440,32.0463333333333
+95,441,25.9926666666667
+95,442,25.0613333333333
+95,443,32.8506666666667
+95,444,23.2833333333333
+95,445,35.0943333333333
+95,446,23.9606666666667
+95,447,31.242
+95,448,29.6333333333333
+95,449,30.734
+95,450,29.0406666666667
+95,451,26.1196666666667
+95,452,28.4056666666667
+95,453,33.8243333333333
+95,454,26.8393333333333
+95,455,26.6276666666667
+95,456,29.845
+95,457,24.7226666666667
+95,458,30.861
+95,459,28.1516666666667
+95,460,26.2043333333333
+95,461,31.8346666666667
+95,462,23.4103333333333
+95,463,32.3426666666667
+95,464,34.9673333333333
+95,465,35.3483333333333
+95,466,30.2683333333333
+95,467,28.2786666666667
+95,468,33.02
+95,469,25.4423333333333
+95,470,26.9663333333333
+95,471,32.004
+95,472,35.8563333333333
+95,473,29.464
+95,474,29.1253333333333
+95,475,29.9296666666667
+95,476,31.75
+95,477,34.5863333333333
+95,478,28.9983333333333
+95,479,28.2363333333333
+95,480,24.9343333333333
+95,481,29.4216666666667
+95,482,34.5863333333333
+95,483,30.0143333333333
+95,484,32.8083333333333
+95,485,26.7123333333333
+95,486,30.1413333333333
+95,487,29.2946666666667
+95,488,24.4686666666667
+95,489,29.6333333333333
+95,490,35.4753333333333
+95,491,29.1676666666667
+95,492,33.4856666666667
+95,493,26.5006666666667
+95,494,35.5176666666667
+95,495,29.8873333333333
+95,496,34.2053333333333
+95,497,31.75
+95,498,37.4226666666667
+95,499,32.131
+95,500,24.511
+95,501,25.8656666666667
+95,502,35.306
+95,503,35.3906666666667
+95,504,33.8666666666667
+95,505,36.1103333333333
+95,506,32.3426666666667
+95,507,31.0726666666667
+95,508,25.4
+95,509,25.273
+95,510,23.4103333333333
+95,511,38.5233333333333
+95,512,30.7763333333333
+95,513,33.02
+95,514,29.2946666666667
+95,515,21.717
+95,516,32.385
+95,517,25.908
+95,518,33.5703333333333
+95,519,29.083
+95,520,36.0256666666667
+95,521,34.7556666666667
+95,522,36.5336666666667
+95,523,31.7076666666667
+95,524,33.3163333333333
+95,525,28.1093333333333
+95,526,32.5966666666667
+95,527,36.703
+95,528,28.5326666666667
+95,529,34.2053333333333
+95,530,24.13
+95,531,29.7603333333333
+95,532,28.8713333333333
+95,533,26.543
+95,534,29.845
+95,535,32.4696666666667
+95,536,32.3003333333333
+95,537,34.7556666666667
+95,538,25.6963333333333
+95,539,24.0453333333333
+95,540,18.6266666666667
+95,541,31.9193333333333
+95,542,23.4103333333333
+95,543,29.718
+95,544,31.5383333333333
+95,545,26.1196666666667
+95,546,23.8336666666667
+95,547,39.2006666666667
+95,548,30.6493333333333
+95,549,36.7876666666667
+95,550,38.6926666666667
+95,551,27.3473333333333
+95,552,35.8563333333333
+95,553,27.2203333333333
+95,554,31.623
+95,555,29.21
+95,556,34.417
+95,557,22.5213333333333
+95,558,29.2946666666667
+95,559,34.925
+95,560,27.5166666666667
+95,561,31.877
+95,562,33.9513333333333
+95,563,24.5533333333333
+95,564,35.8986666666667
+95,565,27.178
+95,566,43.7303333333333
+95,567,37.8036666666667
+95,568,35.687
+95,569,32.512
+95,570,27.6013333333333
+95,571,27.0933333333333
+95,572,36.576
+95,573,31.0303333333333
+95,574,33.782
+95,575,31.9193333333333
+95,576,33.4856666666667
+95,577,27.051
+95,578,26.7123333333333
+95,579,22.6483333333333
+95,580,29.972
+95,581,33.02
+95,582,31.623
+95,583,29.6333333333333
+95,584,26.67
+95,585,21.9286666666667
+95,586,26.543
+95,587,32.004
+95,588,27.305
+95,589,30.8186666666667
+95,590,25.9926666666667
+95,591,39.6663333333333
+95,592,30.7763333333333
+95,593,39.878
+95,594,22.0133333333333
+95,595,24.9343333333333
+95,596,30.7763333333333
+95,597,23.6643333333333
+95,598,29.21
+95,599,27.0933333333333
+95,600,31.3266666666667
+95,601,24.892
+95,602,35.433
+95,603,28.5326666666667
+95,604,25.6116666666667
+95,605,33.4433333333333
+95,606,27.0933333333333
+95,607,28.9983333333333
+95,608,28.1516666666667
+95,609,39.0313333333333
+95,610,26.3313333333333
+95,611,25.7386666666667
+95,612,25.4423333333333
+95,613,33.6973333333333
+95,614,27.1356666666667
+95,615,28.6596666666667
+95,616,28.6173333333333
+95,617,25.1883333333333
+95,618,30.353
+95,619,31.5806666666667
+95,620,33.6973333333333
+95,621,25.0613333333333
+95,622,28.702
+95,623,27.4743333333333
+95,624,37.6343333333333
+95,625,32.8083333333333
+95,626,35.687
+95,627,33.5703333333333
+95,628,25.4
+95,629,32.6813333333333
+95,630,25.7386666666667
+95,631,38.0153333333333
+95,632,31.4536666666667
+95,633,35.6446666666667
+95,634,32.131
+95,635,27.0933333333333
+95,636,26.67
+95,637,33.9513333333333
+95,638,30.7763333333333
+95,639,27.6436666666667
+95,640,28.067
+95,641,33.782
+95,642,28.0246666666667
+95,643,30.3953333333333
+95,644,30.607
+95,645,30.988
+95,646,30.1836666666667
+95,647,31.0726666666667
+95,648,27.559
+95,649,23.7913333333333
+95,650,38.481
+95,651,29.2523333333333
+95,652,35.687
+95,653,28.067
+95,654,33.782
+95,655,32.004
+95,656,23.368
+95,657,32.9776666666667
+95,658,29.718
+95,659,30.3953333333333
+95,660,34.3746666666667
+95,661,31.115
+95,662,35.0096666666667
+95,663,29.5063333333333
+95,664,34.671
+95,665,29.21
+95,666,29.8026666666667
+95,667,23.6643333333333
+95,668,29.6756666666667
+95,669,27.2626666666667
+95,670,26.7123333333333
+95,671,26.3313333333333
+95,672,33.4856666666667
+95,673,29.2946666666667
+95,674,34.6286666666667
+95,675,28.5326666666667
+95,676,33.8243333333333
+95,677,25.1036666666667
+95,678,30.9033333333333
+95,679,27.94
+95,680,27.1356666666667
+95,681,37.973
+95,682,19.2193333333333
+95,683,26.289
+95,684,21.1666666666667
+95,685,29.1253333333333
+95,686,24.6803333333333
+95,687,27.1356666666667
+95,688,23.4526666666667
+95,689,34.7133333333333
+95,690,26.8393333333333
+95,691,26.9663333333333
+95,692,25.4846666666667
+95,693,30.4376666666667
+95,694,36.6183333333333
+95,695,28.6596666666667
+95,696,29.1253333333333
+95,697,34.5863333333333
+95,698,29.6756666666667
+95,699,26.7546666666667
+95,700,32.8506666666667
+95,701,20.3623333333333
+95,702,34.671
+95,703,29.2946666666667
+95,704,21.7593333333333
+95,705,33.274
+95,706,32.639
+95,707,28.5326666666667
+95,708,31.242
+95,709,28.194
+95,710,32.9776666666667
+95,711,34.798
+95,712,37.9306666666667
+95,713,35.2636666666667
+95,714,28.4056666666667
+95,715,27.813
+95,716,34.1206666666667
+95,717,36.068
+95,718,25.5693333333333
+95,719,27.0086666666667
+95,720,35.687
+95,721,39.3276666666667
+95,722,27.178
+95,723,35.8986666666667
+95,724,37.338
+95,725,27.559
+95,726,28.702
+95,727,36.703
+95,728,32.5543333333333
+95,729,35.6023333333333
+95,730,36.449
+95,731,32.893
+95,732,33.782
+95,733,29.6333333333333
+95,734,28.6173333333333
+95,735,29.6333333333333
+95,736,23.0716666666667
+95,737,31.115
+95,738,25.3153333333333
+95,739,28.9136666666667
+95,740,30.9456666666667
+95,741,35.6023333333333
+95,742,20.9973333333333
+95,743,27.6436666666667
+95,744,29.9296666666667
+95,745,28.4056666666667
+95,746,26.289
+95,747,31.242
+95,748,31.1996666666667
+95,749,27.305
+95,750,33.5703333333333
+95,751,29.21
+95,752,31.3266666666667
+95,753,33.401
+95,754,28.9983333333333
+95,755,29.337
+95,756,32.9353333333333
+95,757,33.1046666666667
+95,758,32.0886666666667
+95,759,28.1093333333333
+95,760,32.8083333333333
+95,761,29.972
+95,762,27.1356666666667
+95,763,27.7283333333333
+95,764,28.7443333333333
+95,765,30.4376666666667
+95,766,27.305
+95,767,32.9776666666667
+95,768,31.369
+95,769,31.877
+95,770,30.9033333333333
+95,771,24.4686666666667
+95,772,29.5486666666667
+95,773,29.1676666666667
+95,774,32.6813333333333
+95,775,28.5326666666667
+95,776,27.6436666666667
+95,777,27.2203333333333
+95,778,40.259
+95,779,25.527
+95,780,19.6003333333333
+95,781,32.8083333333333
+95,782,27.8976666666667
+95,783,25.0613333333333
+95,784,27.3896666666667
+95,785,24.4263333333333
+95,786,33.147
+95,787,34.2476666666667
+95,788,26.0773333333333
+95,789,32.766
+95,790,26.5006666666667
+95,791,31.496
+95,792,32.0463333333333
+95,793,30.9033333333333
+95,794,25.019
+95,795,29.8026666666667
+95,796,27.813
+95,797,33.4856666666667
+95,798,34.1206666666667
+95,799,29.2523333333333
+95,800,31.496
+95,801,34.8403333333333
+95,802,23.5373333333333
+95,803,32.512
+95,804,31.2843333333333
+95,805,25.9503333333333
+95,806,27.6013333333333
+95,807,26.5006666666667
+95,808,25.3576666666667
+95,809,26.1196666666667
+95,810,24.765
+95,811,24.8073333333333
+95,812,38.9466666666667
+95,813,25.4846666666667
+95,814,35.5176666666667
+95,815,37.1263333333333
+95,816,33.6126666666667
+95,817,25.146
+95,818,31.877
+95,819,31.9193333333333
+95,820,22.9023333333333
+95,821,32.893
+95,822,34.8826666666667
+95,823,30.3106666666667
+95,824,25.5693333333333
+95,825,29.0406666666667
+95,826,31.0303333333333
+95,827,32.512
+95,828,25.3153333333333
+95,829,20.0236666666667
+95,830,28.9136666666667
+95,831,24.0876666666667
+95,832,21.082
+95,833,26.416
+95,834,19.6003333333333
+95,835,23.3256666666667
+95,836,33.1046666666667
+95,837,26.416
+95,838,29.7603333333333
+95,839,33.7396666666667
+95,840,26.924
+95,841,28.067
+95,842,32.3426666666667
+95,843,26.416
+95,844,33.655
+95,845,23.7066666666667
+95,846,33.0623333333333
+95,847,30.6493333333333
+95,848,35.433
+95,849,31.6653333333333
+95,850,38.9466666666667
+95,851,29.2946666666667
+95,852,36.068
+95,853,24.4263333333333
+95,854,32.8506666666667
+95,855,28.4903333333333
+95,856,30.9456666666667
+95,857,27.4743333333333
+95,858,27.7706666666667
+95,859,29.8873333333333
+95,860,26.5853333333333
+95,861,24.9343333333333
+95,862,23.622
+95,863,27.2626666666667
+95,864,29.845
+95,865,26.1196666666667
+95,866,26.7546666666667
+95,867,30.3106666666667
+95,868,24.9766666666667
+95,869,32.131
+95,870,28.6173333333333
+95,871,33.6126666666667
+95,872,26.3313333333333
+95,873,25.5693333333333
+95,874,27.1356666666667
+95,875,26.7546666666667
+95,876,28.9136666666667
+95,877,35.3906666666667
+95,878,31.496
+95,879,36.6183333333333
+95,880,26.8816666666667
+95,881,32.258
+95,882,24.9343333333333
+95,883,32.1733333333333
+95,884,26.9663333333333
+95,885,30.226
+95,886,37.846
+95,887,27.8976666666667
+95,888,28.9136666666667
+95,889,29.845
+95,890,31.623
+95,891,33.401
+95,892,30.226
+95,893,25.654
+95,894,29.3793333333333
+95,895,30.2683333333333
+95,896,31.2843333333333
+95,897,31.5383333333333
+95,898,30.2683333333333
+95,899,31.6653333333333
+95,900,30.1413333333333
+95,901,29.083
+95,902,29.5486666666667
+95,903,33.274
+95,904,28.1516666666667
+95,905,30.1413333333333
+95,906,34.5863333333333
+95,907,25.6116666666667
+95,908,26.7123333333333
+95,909,35.052
+95,910,30.3953333333333
+95,911,23.6643333333333
+95,912,32.4273333333333
+95,913,33.8666666666667
+95,914,30.7763333333333
+95,915,26.2466666666667
+95,916,36.83
+95,917,28.575
+95,918,32.004
+95,919,37.338
+95,920,30.7763333333333
+95,921,25.6963333333333
+95,922,33.5703333333333
+95,923,29.1676666666667
+95,924,37.4226666666667
+95,925,24.511
+95,926,23.4103333333333
+95,927,26.9663333333333
+95,928,31.369
+95,929,30.9033333333333
+95,930,25.4846666666667
+95,931,31.0726666666667
+95,932,25.9926666666667
+95,933,21.1243333333333
+95,934,28.7866666666667
+95,935,38.1846666666667
+95,936,37.0416666666667
+95,937,28.7866666666667
+95,938,31.623
+95,939,29.5486666666667
+95,940,32.3426666666667
+95,941,32.1733333333333
+95,942,41.0633333333333
+95,943,32.7236666666667
+95,944,23.368
+95,945,22.1403333333333
+95,946,30.0566666666667
+95,947,28.0246666666667
+95,948,22.987
+95,949,34.8403333333333
+95,950,30.6493333333333
+95,951,32.131
+95,952,37.9306666666667
+95,953,33.528
+95,954,23.4526666666667
+95,955,25.9503333333333
+95,956,34.163
+95,957,29.337
+95,958,36.1103333333333
+95,959,26.7123333333333
+95,960,26.0773333333333
+95,961,30.5646666666667
+95,962,28.4903333333333
+95,963,29.8026666666667
+95,964,29.591
+95,965,24.0453333333333
+95,966,29.4216666666667
+95,967,24.8496666666667
+95,968,33.1046666666667
+95,969,31.7923333333333
+95,970,27.9823333333333
+95,971,28.829
+95,972,25.4423333333333
+95,973,32.8083333333333
+95,974,24.2146666666667
+95,975,25.1883333333333
+95,976,27.6013333333333
+95,977,34.3323333333333
+95,978,25.527
+95,979,26.924
+95,980,25.4423333333333
+95,981,43.0106666666667
+95,982,30.4376666666667
+95,983,31.877
+95,984,33.02
+95,985,24.6803333333333
+95,986,30.9456666666667
+95,987,39.116
+95,988,25.1036666666667
+95,989,32.8506666666667
+95,990,30.353
+95,991,24.765
+95,992,23.495
+95,993,31.9193333333333
+95,994,29.7603333333333
+95,995,30.6916666666667
+95,996,35.7293333333333
+95,997,30.3953333333333
+95,998,28.2363333333333
+95,999,26.416
+95,1000,33.6126666666667
+96,1,17.3143333333333
+96,2,20.4046666666667
+96,3,17.6318333333333
+96,4,20.193
+96,5,21.3995
+96,6,19.3463333333333
+96,7,19.4945
+96,8,23.3468333333333
+96,9,19.2193333333333
+96,10,27.5378333333333
+96,11,14.2663333333333
+96,12,18.0975
+96,13,22.098
+96,14,22.098
+96,15,18.3091666666667
+96,16,17.3778333333333
+96,17,16.1501666666667
+96,18,16.891
+96,19,16.1501666666667
+96,20,22.1615
+96,21,19.2828333333333
+96,22,16.0655
+96,23,26.035
+96,24,17.7376666666667
+96,25,18.4573333333333
+96,26,21.5476666666667
+96,27,18.7325
+96,28,22.9023333333333
+96,29,19.8966666666667
+96,30,16.9968333333333
+96,31,18.8806666666667
+96,32,20.447
+96,33,24.9555
+96,34,22.2038333333333
+96,35,16.0231666666667
+96,36,20.2776666666667
+96,37,16.5523333333333
+96,38,20.0025
+96,39,17.7376666666667
+96,40,22.2461666666667
+96,41,19.7485
+96,42,17.2508333333333
+96,43,21.463
+96,44,17.8435
+96,45,20.574
+96,46,18.4996666666667
+96,47,23.876
+96,48,19.4733333333333
+96,49,19.1981666666667
+96,50,22.9446666666667
+96,51,16.6793333333333
+96,52,21.9075
+96,53,17.1026666666667
+96,54,18.0128333333333
+96,55,19.1346666666667
+96,56,20.9761666666667
+96,57,22.7965
+96,58,21.5476666666667
+96,59,19.9601666666667
+96,60,21.1666666666667
+96,61,19.3251666666667
+96,62,17.3778333333333
+96,63,19.9178333333333
+96,64,16.2348333333333
+96,65,13.9065
+96,66,15.9385
+96,67,23.4738333333333
+96,68,19.177
+96,69,19.8543333333333
+96,70,14.3086666666667
+96,71,23.3256666666667
+96,72,14.224
+96,73,18.415
+96,74,16.129
+96,75,18.3938333333333
+96,76,16.1713333333333
+96,77,20.2353333333333
+96,78,18.6478333333333
+96,79,23.9818333333333
+96,80,22.3731666666667
+96,81,20.4681666666667
+96,82,23.749
+96,83,19.6638333333333
+96,84,18.7325
+96,85,23.3045
+96,86,17.4625
+96,87,20.6798333333333
+96,88,17.3566666666667
+96,89,22.7541666666667
+96,90,18.7748333333333
+96,91,17.6953333333333
+96,92,22.8388333333333
+96,93,21.0396666666667
+96,94,17.3566666666667
+96,95,19.8543333333333
+96,96,24.7226666666667
+96,97,19.5791666666667
+96,98,25.7175
+96,99,18.7536666666667
+96,100,11.5146666666667
+96,101,18.1186666666667
+96,102,20.6586666666667
+96,103,19.431
+96,104,17.1238333333333
+96,105,17.3355
+96,106,15.1553333333333
+96,107,16.7851666666667
+96,108,17.1238333333333
+96,109,20.6375
+96,110,18.4785
+96,111,22.225
+96,112,22.0556666666667
+96,113,22.4155
+96,114,18.6478333333333
+96,115,17.2508333333333
+96,116,15.8538333333333
+96,117,15.1976666666667
+96,118,20.8068333333333
+96,119,19.304
+96,120,23.7278333333333
+96,121,17.272
+96,122,14.9225
+96,123,21.6111666666667
+96,124,14.859
+96,125,20.2776666666667
+96,126,19.7908333333333
+96,127,17.5895
+96,128,19.5791666666667
+96,129,20.0236666666667
+96,130,20.5105
+96,131,19.9813333333333
+96,132,23.368
+96,133,20.8703333333333
+96,134,20.0448333333333
+96,135,20.2353333333333
+96,136,23.9183333333333
+96,137,16.9545
+96,138,14.4568333333333
+96,139,23.876
+96,140,18.0975
+96,141,19.2828333333333
+96,142,15.2188333333333
+96,143,20.7856666666667
+96,144,18.796
+96,145,23.6643333333333
+96,146,15.7268333333333
+96,147,22.5636666666667
+96,148,18.1821666666667
+96,149,18.2668333333333
+96,150,19.3463333333333
+96,151,20.1506666666667
+96,152,19.2405
+96,153,18.1186666666667
+96,154,19.9178333333333
+96,155,20.8491666666667
+96,156,16.383
+96,157,18.7536666666667
+96,158,18.9018333333333
+96,159,17.907
+96,160,26.2255
+96,161,20.2565
+96,162,21.1878333333333
+96,163,22.3731666666667
+96,164,15.9385
+96,165,19.8543333333333
+96,166,19.9813333333333
+96,167,18.5208333333333
+96,168,20.5951666666667
+96,169,21.5688333333333
+96,170,22.987
+96,171,16.8486666666667
+96,172,19.8543333333333
+96,173,23.6431666666667
+96,174,21.209
+96,175,24.9978333333333
+96,176,20.066
+96,177,16.51
+96,178,18.8806666666667
+96,179,17.3778333333333
+96,180,15.875
+96,181,16.6793333333333
+96,182,20.066
+96,183,21.2725
+96,184,19.7061666666667
+96,185,19.1981666666667
+96,186,18.8595
+96,187,20.701
+96,188,24.4898333333333
+96,189,17.4201666666667
+96,190,20.5528333333333
+96,191,20.1718333333333
+96,192,17.7376666666667
+96,193,20.2141666666667
+96,194,18.4785
+96,195,23.0081666666667
+96,196,18.2668333333333
+96,197,17.6741666666667
+96,198,18.9653333333333
+96,199,16.7005
+96,200,20.2141666666667
+96,201,20.8068333333333
+96,202,20.1295
+96,203,21.8228333333333
+96,204,15.367
+96,205,24.765
+96,206,21.5265
+96,207,24.3628333333333
+96,208,18.8595
+96,209,20.2776666666667
+96,210,20.1506666666667
+96,211,16.4041666666667
+96,212,18.9441666666667
+96,213,17.8011666666667
+96,214,20.9338333333333
+96,215,21.8863333333333
+96,216,18.3726666666667
+96,217,15.3035
+96,218,17.018
+96,219,16.764
+96,220,22.0345
+96,221,18.0128333333333
+96,222,21.3995
+96,223,20.0448333333333
+96,224,13.9911666666667
+96,225,18.542
+96,226,19.05
+96,227,17.2508333333333
+96,228,17.8646666666667
+96,229,19.3675
+96,230,17.4625
+96,231,18.034
+96,232,14.8166666666667
+96,233,23.1775
+96,234,17.7588333333333
+96,235,24.1511666666667
+96,236,21.9498333333333
+96,237,16.9968333333333
+96,238,22.1826666666667
+96,239,13.1233333333333
+96,240,18.6478333333333
+96,241,21.9921666666667
+96,242,18.8383333333333
+96,243,20.0236666666667
+96,244,20.7221666666667
+96,245,18.9653333333333
+96,246,19.5791666666667
+96,247,21.4841666666667
+96,248,19.6638333333333
+96,249,21.844
+96,250,22.5636666666667
+96,251,21.0185
+96,252,17.9281666666667
+96,253,15.8326666666667
+96,254,19.9601666666667
+96,255,17.5471666666667
+96,256,25.019
+96,257,20.9338333333333
+96,258,21.8651666666667
+96,259,17.8011666666667
+96,260,24.8708333333333
+96,261,21.8228333333333
+96,262,22.86
+96,263,25.5058333333333
+96,264,17.2508333333333
+96,265,18.3303333333333
+96,266,20.0236666666667
+96,267,20.574
+96,268,14.0123333333333
+96,269,19.6638333333333
+96,270,18.542
+96,271,16.7216666666667
+96,272,20.193
+96,273,20.7221666666667
+96,274,24.4686666666667
+96,275,17.5895
+96,276,17.9281666666667
+96,277,19.7485
+96,278,24.8073333333333
+96,279,14.4356666666667
+96,280,20.3411666666667
+96,281,24.003
+96,282,20.4046666666667
+96,283,22.86
+96,284,21.4841666666667
+96,285,21.6111666666667
+96,286,24.6168333333333
+96,287,21.5688333333333
+96,288,19.6426666666667
+96,289,17.4201666666667
+96,290,19.7273333333333
+96,291,19.5368333333333
+96,292,21.2936666666667
+96,293,19.6426666666667
+96,294,15.0706666666667
+96,295,19.05
+96,296,20.6163333333333
+96,297,15.0283333333333
+96,298,18.0128333333333
+96,299,16.5735
+96,300,24.4263333333333
+96,301,16.1925
+96,302,17.6953333333333
+96,303,22.5001666666667
+96,304,14.4145
+96,305,17.272
+96,306,16.7428333333333
+96,307,19.685
+96,308,18.1398333333333
+96,309,23.6431666666667
+96,310,17.399
+96,311,20.447
+96,312,17.6318333333333
+96,313,20.7856666666667
+96,314,18.8595
+96,315,20.5316666666667
+96,316,23.9818333333333
+96,317,17.1238333333333
+96,318,21.3571666666667
+96,319,18.6055
+96,320,17.526
+96,321,21.4841666666667
+96,322,22.8811666666667
+96,323,18.4573333333333
+96,324,19.6638333333333
+96,325,18.0551666666667
+96,326,18.4361666666667
+96,327,25.654
+96,328,17.145
+96,329,17.9281666666667
+96,330,19.6426666666667
+96,331,18.1398333333333
+96,332,18.1821666666667
+96,333,19.8755
+96,334,19.4733333333333
+96,335,16.8486666666667
+96,336,20.6586666666667
+96,337,15.621
+96,338,16.9756666666667
+96,339,17.5683333333333
+96,340,19.7908333333333
+96,341,23.4103333333333
+96,342,19.9178333333333
+96,343,23.114
+96,344,20.193
+96,345,18.1398333333333
+96,346,20.574
+96,347,22.4366666666667
+96,348,18.1186666666667
+96,349,20.1295
+96,350,19.3675
+96,351,17.9916666666667
+96,352,18.923
+96,353,18.3515
+96,354,14.8378333333333
+96,355,16.1501666666667
+96,356,20.9126666666667
+96,357,16.0443333333333
+96,358,22.6271666666667
+96,359,21.2725
+96,360,14.9436666666667
+96,361,14.6896666666667
+96,362,19.7696666666667
+96,363,20.955
+96,364,21.5265
+96,365,20.6798333333333
+96,366,15.5786666666667
+96,367,21.1878333333333
+96,368,18.3938333333333
+96,369,20.2353333333333
+96,370,17.526
+96,371,18.8383333333333
+96,372,17.6953333333333
+96,373,17.1873333333333
+96,374,12.9963333333333
+96,375,20.9126666666667
+96,376,24.13
+96,377,15.6633333333333
+96,378,19.177
+96,379,20.1083333333333
+96,380,17.4625
+96,381,21.59
+96,382,23.749
+96,383,20.7433333333333
+96,384,19.6638333333333
+96,385,20.1083333333333
+96,386,21.5476666666667
+96,387,21.844
+96,388,17.8858333333333
+96,389,18.7536666666667
+96,390,24.1511666666667
+96,391,21.209
+96,392,17.4413333333333
+96,393,18.8806666666667
+96,394,17.145
+96,395,20.701
+96,396,16.8063333333333
+96,397,20.5105
+96,398,17.1238333333333
+96,399,19.8331666666667
+96,400,22.225
+96,401,18.7748333333333
+96,402,19.0923333333333
+96,403,21.0608333333333
+96,404,21.6958333333333
+96,405,22.7753333333333
+96,406,17.4201666666667
+96,407,21.6323333333333
+96,408,26.4371666666667
+96,409,23.749
+96,410,17.4201666666667
+96,411,22.5213333333333
+96,412,20.2565
+96,413,22.3096666666667
+96,414,23.5161666666667
+96,415,21.2936666666667
+96,416,18.6055
+96,417,19.1346666666667
+96,418,19.685
+96,419,21.5053333333333
+96,420,21.6535
+96,421,20.828
+96,422,18.0975
+96,423,26.0561666666667
+96,424,18.6055
+96,425,20.5316666666667
+96,426,18.5843333333333
+96,427,16.5735
+96,428,18.5631666666667
+96,429,18.7113333333333
+96,430,17.7588333333333
+96,431,20.1718333333333
+96,432,16.5946666666667
+96,433,17.1661666666667
+96,434,18.9653333333333
+96,435,18.5631666666667
+96,436,18.9653333333333
+96,437,18.5631666666667
+96,438,17.0815
+96,439,24.5956666666667
+96,440,20.701
+96,441,19.3675
+96,442,22.0133333333333
+96,443,21.3783333333333
+96,444,17.9281666666667
+96,445,18.3303333333333
+96,446,19.2193333333333
+96,447,17.907
+96,448,18.8595
+96,449,19.8331666666667
+96,450,25.019
+96,451,18.034
+96,452,16.7216666666667
+96,453,16.0231666666667
+96,454,18.9441666666667
+96,455,20.0025
+96,456,20.0025
+96,457,18.542
+96,458,21.5688333333333
+96,459,14.986
+96,460,18.4573333333333
+96,461,18.034
+96,462,21.3995
+96,463,18.542
+96,464,20.574
+96,465,19.2405
+96,466,22.0768333333333
+96,467,22.0556666666667
+96,468,17.9493333333333
+96,469,18.1186666666667
+96,470,19.1135
+96,471,16.256
+96,472,20.5951666666667
+96,473,21.6323333333333
+96,474,19.1346666666667
+96,475,21.5688333333333
+96,476,22.7541666666667
+96,477,18.161
+96,478,20.701
+96,479,20.6375
+96,480,16.1078333333333
+96,481,20.828
+96,482,18.0763333333333
+96,483,21.7593333333333
+96,484,23.7066666666667
+96,485,18.6478333333333
+96,486,17.5683333333333
+96,487,18.9018333333333
+96,488,16.3406666666667
+96,489,21.3995
+96,490,19.6215
+96,491,15.5575
+96,492,19.4945
+96,493,21.717
+96,494,18.034
+96,495,20.6375
+96,496,16.2771666666667
+96,497,19.8966666666667
+96,498,24.7226666666667
+96,499,20.8491666666667
+96,500,23.495
+96,501,21.6535
+96,502,22.1615
+96,503,20.447
+96,504,23.114
+96,505,20.4046666666667
+96,506,19.0288333333333
+96,507,18.3091666666667
+96,508,15.8326666666667
+96,509,19.4521666666667
+96,510,21.7381666666667
+96,511,16.129
+96,512,21.6535
+96,513,17.018
+96,514,19.6215
+96,515,21.0608333333333
+96,516,16.5523333333333
+96,517,16.7851666666667
+96,518,18.5843333333333
+96,519,22.1403333333333
+96,520,17.8011666666667
+96,521,17.2931666666667
+96,522,22.0345
+96,523,21.7593333333333
+96,524,18.5631666666667
+96,525,24.6168333333333
+96,526,19.0076666666667
+96,527,15.7903333333333
+96,528,21.0396666666667
+96,529,19.8755
+96,530,18.1398333333333
+96,531,22.4366666666667
+96,532,22.2673333333333
+96,533,21.8863333333333
+96,534,24.3416666666667
+96,535,22.1826666666667
+96,536,23.114
+96,537,21.5053333333333
+96,538,19.0288333333333
+96,539,20.1295
+96,540,17.3566666666667
+96,541,23.4526666666667
+96,542,19.4733333333333
+96,543,19.4521666666667
+96,544,20.4681666666667
+96,545,22.6271666666667
+96,546,18.1186666666667
+96,547,20.955
+96,548,22.1826666666667
+96,549,23.3891666666667
+96,550,17.9281666666667
+96,551,18.542
+96,552,17.4201666666667
+96,553,19.9813333333333
+96,554,13.0598333333333
+96,555,17.2931666666667
+96,556,20.701
+96,557,22.6695
+96,558,18.7113333333333
+96,559,16.8275
+96,560,19.1346666666667
+96,561,20.2353333333333
+96,562,21.4841666666667
+96,563,20.8068333333333
+96,564,19.2193333333333
+96,565,20.8915
+96,566,20.8068333333333
+96,567,19.2405
+96,568,14.8166666666667
+96,569,18.6901666666667
+96,570,20.7433333333333
+96,571,20.0236666666667
+96,572,20.2988333333333
+96,573,20.0448333333333
+96,574,24.003
+96,575,21.8016666666667
+96,576,18.3515
+96,577,14.0546666666667
+96,578,18.6901666666667
+96,579,21.1666666666667
+96,580,17.4201666666667
+96,581,21.971
+96,582,18.9865
+96,583,22.2038333333333
+96,584,17.9493333333333
+96,585,18.1398333333333
+96,586,22.9235
+96,587,21.5265
+96,588,20.3835
+96,589,18.6266666666667
+96,590,20.6163333333333
+96,591,16.1925
+96,592,18.8383333333333
+96,593,19.5156666666667
+96,594,19.4733333333333
+96,595,18.0763333333333
+96,596,21.1243333333333
+96,597,20.0025
+96,598,17.4413333333333
+96,599,14.1816666666667
+96,600,21.6746666666667
+96,601,13.1868333333333
+96,602,18.7113333333333
+96,603,20.3835
+96,604,16.8063333333333
+96,605,18.7325
+96,606,19.3463333333333
+96,607,24.4686666666667
+96,608,20.7433333333333
+96,609,21.3148333333333
+96,610,19.5791666666667
+96,611,20.2988333333333
+96,612,20.8491666666667
+96,613,20.4046666666667
+96,614,21.2936666666667
+96,615,17.4836666666667
+96,616,18.669
+96,617,17.3778333333333
+96,618,18.4996666666667
+96,619,17.4413333333333
+96,620,19.812
+96,621,15.7903333333333
+96,622,21.9498333333333
+96,623,15.7903333333333
+96,624,16.9121666666667
+96,625,22.0345
+96,626,25.6963333333333
+96,627,19.8755
+96,628,21.1031666666667
+96,629,23.2621666666667
+96,630,21.3995
+96,631,17.399
+96,632,20.4893333333333
+96,633,22.9023333333333
+96,634,21.59
+96,635,20.574
+96,636,18.5631666666667
+96,637,19.0288333333333
+96,638,22.2885
+96,639,20.1295
+96,640,18.7536666666667
+96,641,16.9121666666667
+96,642,22.2461666666667
+96,643,18.6055
+96,644,20.7645
+96,645,19.4098333333333
+96,646,21.463
+96,647,21.5688333333333
+96,648,16.8486666666667
+96,649,20.2988333333333
+96,650,21.0608333333333
+96,651,16.3195
+96,652,17.9281666666667
+96,653,19.7485
+96,654,21.3995
+96,655,20.1506666666667
+96,656,18.4573333333333
+96,657,19.8331666666667
+96,658,20.9126666666667
+96,659,19.0288333333333
+96,660,19.7908333333333
+96,661,20.0236666666667
+96,662,21.463
+96,663,21.9286666666667
+96,664,15.748
+96,665,19.2828333333333
+96,666,16.4465
+96,667,13.1233333333333
+96,668,21.8651666666667
+96,669,20.6375
+96,670,17.2085
+96,671,19.2828333333333
+96,672,22.6483333333333
+96,673,19.5368333333333
+96,674,17.272
+96,675,19.3251666666667
+96,676,19.558
+96,677,19.4521666666667
+96,678,17.9281666666667
+96,679,16.637
+96,680,16.6581666666667
+96,681,20.8491666666667
+96,682,14.2875
+96,683,22.3731666666667
+96,684,15.8961666666667
+96,685,18.1398333333333
+96,686,19.4945
+96,687,24.0665
+96,688,18.5208333333333
+96,689,17.5048333333333
+96,690,15.3035
+96,691,19.4098333333333
+96,692,21.1031666666667
+96,693,18.2668333333333
+96,694,17.2296666666667
+96,695,20.5316666666667
+96,696,14.3721666666667
+96,697,18.3726666666667
+96,698,21.8016666666667
+96,699,21.3571666666667
+96,700,19.1135
+96,701,19.431
+96,702,17.7165
+96,703,20.3411666666667
+96,704,16.9545
+96,705,18.8806666666667
+96,706,19.0711666666667
+96,707,15.875
+96,708,19.304
+96,709,20.7645
+96,710,18.669
+96,711,19.8331666666667
+96,712,19.6215
+96,713,16.5523333333333
+96,714,19.3463333333333
+96,715,13.8218333333333
+96,716,14.2663333333333
+96,717,20.9126666666667
+96,718,19.9178333333333
+96,719,22.987
+96,720,21.6323333333333
+96,721,18.4361666666667
+96,722,15.8326666666667
+96,723,16.764
+96,724,15.621
+96,725,23.5373333333333
+96,726,15.3458333333333
+96,727,22.1826666666667
+96,728,20.2988333333333
+96,729,22.5001666666667
+96,730,22.6271666666667
+96,731,23.2833333333333
+96,732,16.9121666666667
+96,733,16.5311666666667
+96,734,18.9653333333333
+96,735,23.4738333333333
+96,736,22.1191666666667
+96,737,15.4516666666667
+96,738,15.0071666666667
+96,739,19.0711666666667
+96,740,22.7965
+96,741,17.6741666666667
+96,742,16.9756666666667
+96,743,20.574
+96,744,16.002
+96,745,19.3251666666667
+96,746,24.6591666666667
+96,747,25.2941666666667
+96,748,17.8646666666667
+96,749,22.2673333333333
+96,750,22.606
+96,751,22.0345
+96,752,19.3675
+96,753,19.5368333333333
+96,754,18.7325
+96,755,15.2823333333333
+96,756,22.479
+96,757,20.7856666666667
+96,758,22.9023333333333
+96,759,22.0345
+96,760,17.272
+96,761,17.399
+96,762,15.0283333333333
+96,763,15.1553333333333
+96,764,15.3458333333333
+96,765,18.6901666666667
+96,766,21.4841666666667
+96,767,17.4413333333333
+96,768,20.2776666666667
+96,769,19.431
+96,770,16.764
+96,771,20.1083333333333
+96,772,17.2508333333333
+96,773,18.5843333333333
+96,774,12.8693333333333
+96,775,19.9178333333333
+96,776,17.6106666666667
+96,777,20.7856666666667
+96,778,20.8068333333333
+96,779,18.2456666666667
+96,780,16.5735
+96,781,22.8811666666667
+96,782,17.0391666666667
+96,783,28.5961666666667
+96,784,17.6106666666667
+96,785,18.2456666666667
+96,786,18.8383333333333
+96,787,19.7273333333333
+96,788,17.9916666666667
+96,789,18.7536666666667
+96,790,19.1981666666667
+96,791,19.939
+96,792,16.9968333333333
+96,793,21.4418333333333
+96,794,19.0923333333333
+96,795,16.0866666666667
+96,796,18.796
+96,797,21.717
+96,798,18.7748333333333
+96,799,20.828
+96,800,16.8275
+96,801,18.1186666666667
+96,802,23.2833333333333
+96,803,20.0448333333333
+96,804,19.4945
+96,805,18.4573333333333
+96,806,15.8326666666667
+96,807,19.1558333333333
+96,808,21.1666666666667
+96,809,18.7325
+96,810,18.7536666666667
+96,811,22.2885
+96,812,21.717
+96,813,24.892
+96,814,22.4155
+96,815,14.986
+96,816,17.8223333333333
+96,817,20.8703333333333
+96,818,18.7325
+96,819,18.7536666666667
+96,820,19.7061666666667
+96,821,20.1718333333333
+96,822,18.415
+96,823,21.0396666666667
+96,824,18.4573333333333
+96,825,22.9235
+96,826,22.2885
+96,827,19.3886666666667
+96,828,20.701
+96,829,17.4413333333333
+96,830,19.2616666666667
+96,831,15.7903333333333
+96,832,20.6586666666667
+96,833,21.9075
+96,834,17.4836666666667
+96,835,22.0768333333333
+96,836,18.2456666666667
+96,837,18.796
+96,838,18.1398333333333
+96,839,20.9126666666667
+96,840,15.8538333333333
+96,841,14.4991666666667
+96,842,17.2508333333333
+96,843,21.6746666666667
+96,844,17.7588333333333
+96,845,20.701
+96,846,20.193
+96,847,25.4211666666667
+96,848,18.3938333333333
+96,849,17.0391666666667
+96,850,19.812
+96,851,18.9865
+96,852,20.5316666666667
+96,853,18.5631666666667
+96,854,16.4465
+96,855,20.9973333333333
+96,856,18.923
+96,857,22.606
+96,858,19.4733333333333
+96,859,18.7748333333333
+96,860,18.6055
+96,861,18.288
+96,862,22.7753333333333
+96,863,23.1775
+96,864,20.0871666666667
+96,865,23.0293333333333
+96,866,22.7118333333333
+96,867,20.2353333333333
+96,868,18.8383333333333
+96,869,20.1083333333333
+96,870,20.955
+96,871,23.2621666666667
+96,872,17.8646666666667
+96,873,19.3886666666667
+96,874,21.3148333333333
+96,875,18.7113333333333
+96,876,18.3938333333333
+96,877,19.7485
+96,878,17.145
+96,879,20.2353333333333
+96,880,20.4258333333333
+96,881,20.193
+96,882,17.272
+96,883,20.6163333333333
+96,884,19.685
+96,885,19.8331666666667
+96,886,19.0288333333333
+96,887,14.224
+96,888,16.5523333333333
+96,889,22.4366666666667
+96,890,18.9441666666667
+96,891,20.6586666666667
+96,892,20.1295
+96,893,21.1878333333333
+96,894,18.4361666666667
+96,895,19.9178333333333
+96,896,16.2771666666667
+96,897,17.4836666666667
+96,898,21.0608333333333
+96,899,16.3195
+96,900,20.0236666666667
+96,901,21.6535
+96,902,23.1986666666667
+96,903,24.13
+96,904,19.4733333333333
+96,905,20.955
+96,906,21.9075
+96,907,21.717
+96,908,15.9596666666667
+96,909,18.8171666666667
+96,910,21.4841666666667
+96,911,18.4361666666667
+96,912,18.0128333333333
+96,913,19.1346666666667
+96,914,15.9596666666667
+96,915,21.3995
+96,916,17.7165
+96,917,22.4155
+96,918,19.0711666666667
+96,919,20.9761666666667
+96,920,21.8863333333333
+96,921,15.3881666666667
+96,922,20.2776666666667
+96,923,17.018
+96,924,17.4625
+96,925,17.4836666666667
+96,926,16.9545
+96,927,21.6535
+96,928,19.3886666666667
+96,929,17.9705
+96,930,19.6215
+96,931,20.4046666666667
+96,932,19.7061666666667
+96,933,18.4573333333333
+96,934,19.5791666666667
+96,935,24.3416666666667
+96,936,17.0603333333333
+96,937,24.4475
+96,938,18.3726666666667
+96,939,21.5265
+96,940,20.0871666666667
+96,941,20.8491666666667
+96,942,20.4258333333333
+96,943,19.7273333333333
+96,944,19.8331666666667
+96,945,23.3256666666667
+96,946,18.4361666666667
+96,947,18.8171666666667
+96,948,21.2936666666667
+96,949,20.828
+96,950,17.2085
+96,951,16.9756666666667
+96,952,19.6003333333333
+96,953,17.6318333333333
+96,954,17.4201666666667
+96,955,21.717
+96,956,17.5471666666667
+96,957,19.8331666666667
+96,958,18.161
+96,959,19.1558333333333
+96,960,15.5998333333333
+96,961,20.447
+96,962,20.828
+96,963,18.415
+96,964,19.9601666666667
+96,965,20.5528333333333
+96,966,19.5368333333333
+96,967,21.2513333333333
+96,968,22.4155
+96,969,17.4836666666667
+96,970,22.5425
+96,971,18.2245
+96,972,22.86
+96,973,19.0288333333333
+96,974,19.1135
+96,975,20.2141666666667
+96,976,19.1346666666667
+96,977,19.1558333333333
+96,978,18.2033333333333
+96,979,18.1186666666667
+96,980,16.3406666666667
+96,981,21.2936666666667
+96,982,25.7175
+96,983,16.4041666666667
+96,984,17.2508333333333
+96,985,20.828
+96,986,24.4898333333333
+96,987,20.4046666666667
+96,988,17.7588333333333
+96,989,24.8708333333333
+96,990,22.3943333333333
+96,991,21.8228333333333
+96,992,23.1563333333333
+96,993,23.6643333333333
+96,994,17.9281666666667
+96,995,24.9555
+96,996,20.7856666666667
+96,997,21.6746666666667
+96,998,17.3566666666667
+96,999,13.1233333333333
+96,1000,15.9173333333333
+97,1,23.0928333333333
+97,2,24.6803333333333
+97,3,27.5801666666667
+97,4,24.3205
+97,5,28.7443333333333
+97,6,22.6483333333333
+97,7,29.7391666666667
+97,8,20.7433333333333
+97,9,22.2038333333333
+97,10,26.035
+97,11,21.3995
+97,12,22.0556666666667
+97,13,21.336
+97,14,22.0133333333333
+97,15,26.8181666666667
+97,16,24.7226666666667
+97,17,25.5693333333333
+97,18,27.8765
+97,19,25.8021666666667
+97,20,24.4051666666667
+97,21,25.9291666666667
+97,22,22.9446666666667
+97,23,23.4315
+97,24,27.9823333333333
+97,25,30.4376666666667
+97,26,26.7335
+97,27,21.0608333333333
+97,28,25.273
+97,29,29.972
+97,30,30.9245
+97,31,18.3938333333333
+97,32,22.2885
+97,33,21.2513333333333
+97,34,23.495
+97,35,22.3731666666667
+97,36,25.5058333333333
+97,37,24.3416666666667
+97,38,22.3943333333333
+97,39,29.0406666666667
+97,40,23.7278333333333
+97,41,27.178
+97,42,20.5951666666667
+97,43,29.5063333333333
+97,44,27.6013333333333
+97,45,30.988
+97,46,24.0241666666667
+97,47,26.0561666666667
+97,48,17.6953333333333
+97,49,24.257
+97,50,23.1563333333333
+97,51,23.6643333333333
+97,52,29.2311666666667
+97,53,26.289
+97,54,25.7598333333333
+97,55,25.3788333333333
+97,56,25.0613333333333
+97,57,23.0505
+97,58,26.2678333333333
+97,59,23.5585
+97,60,26.5853333333333
+97,61,28.7655
+97,62,28.9136666666667
+97,63,23.3468333333333
+97,64,24.9343333333333
+97,65,28.575
+97,66,23.8971666666667
+97,67,24.384
+97,68,25.4635
+97,69,24.638
+97,70,23.114
+97,71,25.8445
+97,72,29.337
+97,73,29.2735
+97,74,23.9183333333333
+97,75,26.0138333333333
+97,76,23.2833333333333
+97,77,26.162
+97,78,29.3793333333333
+97,79,27.686
+97,80,25.019
+97,81,25.5905
+97,82,27.6436666666667
+97,83,21.5053333333333
+97,84,25.019
+97,85,26.289
+97,86,22.0345
+97,87,32.3638333333333
+97,88,25.146
+97,89,23.6643333333333
+97,90,20.193
+97,91,28.4056666666667
+97,92,25.8233333333333
+97,93,32.7025
+97,94,25.6963333333333
+97,95,25.0613333333333
+97,96,28.9771666666667
+97,97,17.399
+97,98,22.0133333333333
+97,99,24.9343333333333
+97,100,20.2565
+97,101,23.749
+97,102,25.5058333333333
+97,103,21.5688333333333
+97,104,21.4841666666667
+97,105,23.0505
+97,106,21.209
+97,107,24.4686666666667
+97,108,27.1356666666667
+97,109,21.3783333333333
+97,110,26.67
+97,111,29.4428333333333
+97,112,21.1878333333333
+97,113,24.9766666666667
+97,114,19.3886666666667
+97,115,27.8341666666667
+97,116,23.0081666666667
+97,117,24.7438333333333
+97,118,19.9601666666667
+97,119,22.2461666666667
+97,120,24.3628333333333
+97,121,28.7866666666667
+97,122,24.5533333333333
+97,123,23.1563333333333
+97,124,23.9606666666667
+97,125,22.9658333333333
+97,126,19.7696666666667
+97,127,19.4945
+97,128,21.8651666666667
+97,129,26.4795
+97,130,23.1563333333333
+97,131,28.7866666666667
+97,132,26.1196666666667
+97,133,26.1831666666667
+97,134,23.4738333333333
+97,135,23.7066666666667
+97,136,27.0933333333333
+97,137,27.9188333333333
+97,138,26.9875
+97,139,27.2203333333333
+97,140,24.6591666666667
+97,141,23.8125
+97,142,22.5848333333333
+97,143,22.225
+97,144,24.257
+97,145,23.0293333333333
+97,146,25.2941666666667
+97,147,26.9028333333333
+97,148,24.5321666666667
+97,149,23.9395
+97,150,29.1041666666667
+97,151,23.2621666666667
+97,152,25.8233333333333
+97,153,24.5533333333333
+97,154,23.5585
+97,155,25.9926666666667
+97,156,24.2146666666667
+97,157,24.9555
+97,158,20.6586666666667
+97,159,22.1826666666667
+97,160,32.512
+97,161,22.352
+97,162,21.4841666666667
+97,163,25.4
+97,164,26.2466666666667
+97,165,27.4955
+97,166,27.94
+97,167,21.59
+97,168,18.3726666666667
+97,169,27.0933333333333
+97,170,24.5956666666667
+97,171,21.971
+97,172,26.5853333333333
+97,173,26.0773333333333
+97,174,26.4371666666667
+97,175,30.861
+97,176,22.9446666666667
+97,177,22.4578333333333
+97,178,25.0401666666667
+97,179,24.2993333333333
+97,180,26.416
+97,181,25.146
+97,182,23.6431666666667
+97,183,18.0551666666667
+97,184,28.3421666666667
+97,185,24.0241666666667
+97,186,25.8445
+97,187,22.1615
+97,188,24.8708333333333
+97,189,22.4155
+97,190,24.892
+97,191,22.9235
+97,192,23.1351666666667
+97,193,21.5265
+97,194,24.4686666666667
+97,195,24.3416666666667
+97,196,24.0453333333333
+97,197,30.7763333333333
+97,198,20.5951666666667
+97,199,30.0778333333333
+97,200,25.3153333333333
+97,201,25.4
+97,202,24.892
+97,203,22.7118333333333
+97,204,23.1351666666667
+97,205,22.733
+97,206,26.3313333333333
+97,207,24.7861666666667
+97,208,29.4428333333333
+97,209,22.3096666666667
+97,210,31.7076666666667
+97,211,28.2786666666667
+97,212,19.7485
+97,213,20.1506666666667
+97,214,23.7066666666667
+97,215,20.32
+97,216,24.2993333333333
+97,217,28.6596666666667
+97,218,26.1408333333333
+97,219,27.1145
+97,220,20.5951666666667
+97,221,19.304
+97,222,22.5636666666667
+97,223,21.4206666666667
+97,224,24.384
+97,225,23.4315
+97,226,26.8393333333333
+97,227,27.305
+97,228,26.3525
+97,229,31.4113333333333
+97,230,22.7965
+97,231,23.8548333333333
+97,232,18.8595
+97,233,30.8398333333333
+97,234,21.3783333333333
+97,235,27.051
+97,236,28.5326666666667
+97,237,24.3628333333333
+97,238,24.5745
+97,239,29.972
+97,240,26.7335
+97,241,28.4268333333333
+97,242,25.781
+97,243,21.844
+97,244,24.3416666666667
+97,245,26.7123333333333
+97,246,24.9766666666667
+97,247,27.0086666666667
+97,248,25.4
+97,249,22.1826666666667
+97,250,27.5166666666667
+97,251,19.5791666666667
+97,252,24.8708333333333
+97,253,27.4531666666667
+97,254,26.5006666666667
+97,255,27.6013333333333
+97,256,25.146
+97,257,26.7335
+97,258,23.8548333333333
+97,259,27.2838333333333
+97,260,24.3628333333333
+97,261,23.5796666666667
+97,262,22.3731666666667
+97,263,21.2513333333333
+97,264,25.9715
+97,265,23.6008333333333
+97,266,24.5956666666667
+97,267,29.1676666666667
+97,268,20.701
+97,269,27.94
+97,270,20.6586666666667
+97,271,24.1723333333333
+97,272,20.7645
+97,273,26.3525
+97,274,28.4056666666667
+97,275,29.9508333333333
+97,276,24.765
+97,277,26.8181666666667
+97,278,24.8073333333333
+97,279,30.4588333333333
+97,280,26.1831666666667
+97,281,24.7015
+97,282,21.6111666666667
+97,283,22.4578333333333
+97,284,27.3473333333333
+97,285,23.7701666666667
+97,286,27.6436666666667
+97,287,28.829
+97,288,28.5538333333333
+97,289,25.1883333333333
+97,290,20.701
+97,291,24.9766666666667
+97,292,24.8073333333333
+97,293,26.3101666666667
+97,294,23.8548333333333
+97,295,27.9188333333333
+97,296,25.3576666666667
+97,297,23.0505
+97,298,26.67
+97,299,26.6911666666667
+97,300,28.6385
+97,301,26.2043333333333
+97,302,25.5693333333333
+97,303,20.7645
+97,304,25.6963333333333
+97,305,23.5373333333333
+97,306,28.9348333333333
+97,307,26.6911666666667
+97,308,23.3045
+97,309,22.6271666666667
+97,310,22.7965
+97,311,25.8868333333333
+97,312,29.0618333333333
+97,313,22.2673333333333
+97,314,22.1403333333333
+97,315,27.3896666666667
+97,316,25.5058333333333
+97,317,22.2673333333333
+97,318,23.5796666666667
+97,319,24.9131666666667
+97,320,17.4625
+97,321,24.0453333333333
+97,322,24.6168333333333
+97,323,25.7386666666667
+97,324,23.368
+97,325,27.305
+97,326,21.6958333333333
+97,327,19.7273333333333
+97,328,19.8331666666667
+97,329,29.464
+97,330,22.4155
+97,331,24.3416666666667
+97,332,29.1253333333333
+97,333,20.7221666666667
+97,334,28.4056666666667
+97,335,24.6803333333333
+97,336,23.3468333333333
+97,337,26.924
+97,338,25.8656666666667
+97,339,25.9291666666667
+97,340,20.4258333333333
+97,341,27.6225
+97,342,22.9658333333333
+97,343,20.574
+97,344,28.702
+97,345,26.162
+97,346,22.2038333333333
+97,347,26.8181666666667
+97,348,22.2673333333333
+97,349,20.9126666666667
+97,350,22.0556666666667
+97,351,25.4211666666667
+97,352,22.2038333333333
+97,353,29.6121666666667
+97,354,26.1831666666667
+97,355,26.3313333333333
+97,356,30.099
+97,357,22.4155
+97,358,28.8501666666667
+97,359,25.3365
+97,360,24.9978333333333
+97,361,26.2678333333333
+97,362,29.3158333333333
+97,363,26.1196666666667
+97,364,21.336
+97,365,24.892
+97,366,21.6323333333333
+97,367,25.3788333333333
+97,368,22.098
+97,369,28.7866666666667
+97,370,31.6441666666667
+97,371,22.3096666666667
+97,372,26.9875
+97,373,24.1511666666667
+97,374,22.7753333333333
+97,375,26.924
+97,376,22.3943333333333
+97,377,25.8656666666667
+97,378,21.1666666666667
+97,379,22.6271666666667
+97,380,23.876
+97,381,23.9395
+97,382,20.7221666666667
+97,383,27.0933333333333
+97,384,23.1775
+97,385,26.7546666666667
+97,386,25.7598333333333
+97,387,18.923
+97,388,29.0406666666667
+97,389,27.6648333333333
+97,390,23.3045
+97,391,27.6013333333333
+97,392,23.2833333333333
+97,393,22.4366666666667
+97,394,28.9136666666667
+97,395,24.5745
+97,396,25.5693333333333
+97,397,23.6431666666667
+97,398,24.9131666666667
+97,399,27.0298333333333
+97,400,23.3891666666667
+97,401,23.6643333333333
+97,402,28.5115
+97,403,20.9761666666667
+97,404,26.1196666666667
+97,405,20.8703333333333
+97,406,24.2781666666667
+97,407,21.209
+97,408,22.7753333333333
+97,409,22.0556666666667
+97,410,25.2095
+97,411,30.2048333333333
+97,412,22.6483333333333
+97,413,25.9926666666667
+97,414,21.6535
+97,415,25.4
+97,416,24.638
+97,417,29.464
+97,418,24.1088333333333
+97,419,22.1826666666667
+97,420,23.114
+97,421,25.2306666666667
+97,422,23.8971666666667
+97,423,23.3468333333333
+97,424,25.273
+97,425,23.6643333333333
+97,426,26.6065
+97,427,24.4898333333333
+97,428,19.5368333333333
+97,429,29.21
+97,430,23.8971666666667
+97,431,27.8765
+97,432,25.9926666666667
+97,433,19.8755
+97,434,22.7965
+97,435,24.2993333333333
+97,436,26.67
+97,437,31.3055
+97,438,22.9235
+97,439,27.5378333333333
+97,440,22.5001666666667
+97,441,24.4686666666667
+97,442,22.0556666666667
+97,443,22.606
+97,444,25.3788333333333
+97,445,31.8558333333333
+97,446,31.623
+97,447,25.1671666666667
+97,448,25.7175
+97,449,26.4795
+97,450,26.035
+97,451,22.2461666666667
+97,452,28.4268333333333
+97,453,28.8925
+97,454,24.5745
+97,455,31.2843333333333
+97,456,23.9395
+97,457,21.3148333333333
+97,458,24.0453333333333
+97,459,27.6013333333333
+97,460,32.4908333333333
+97,461,17.4836666666667
+97,462,29.0406666666667
+97,463,27.1991666666667
+97,464,21.2513333333333
+97,465,24.6168333333333
+97,466,26.6488333333333
+97,467,26.7546666666667
+97,468,28.1728333333333
+97,469,24.2993333333333
+97,470,22.2673333333333
+97,471,27.3261666666667
+97,472,22.5213333333333
+97,473,20.3623333333333
+97,474,20.574
+97,475,22.3731666666667
+97,476,24.6168333333333
+97,477,28.0458333333333
+97,478,22.9235
+97,479,25.273
+97,480,22.7753333333333
+97,481,25.019
+97,482,20.8703333333333
+97,483,23.1775
+97,484,24.1935
+97,485,28.829
+97,486,27.3896666666667
+97,487,25.6963333333333
+97,488,26.289
+97,489,26.5641666666667
+97,490,25.2095
+97,491,25.9503333333333
+97,492,25.4846666666667
+97,493,23.7278333333333
+97,494,24.2358333333333
+97,495,22.5636666666667
+97,496,23.6643333333333
+97,497,19.7696666666667
+97,498,26.0985
+97,499,25.8445
+97,500,17.1238333333333
+97,501,22.5848333333333
+97,502,31.0091666666667
+97,503,30.1625
+97,504,22.4155
+97,505,27.8765
+97,506,21.844
+97,507,25.7175
+97,508,25.9291666666667
+97,509,27.5801666666667
+97,510,20.5951666666667
+97,511,22.3096666666667
+97,512,26.3101666666667
+97,513,28.7866666666667
+97,514,26.2043333333333
+97,515,25.2941666666667
+97,516,23.1986666666667
+97,517,21.9075
+97,518,22.5848333333333
+97,519,27.4743333333333
+97,520,25.3576666666667
+97,521,27.9823333333333
+97,522,25.6328333333333
+97,523,22.9023333333333
+97,524,26.289
+97,525,30.2895
+97,526,26.3948333333333
+97,527,26.7758333333333
+97,528,28.8713333333333
+97,529,26.5641666666667
+97,530,24.4263333333333
+97,531,19.685
+97,532,24.4898333333333
+97,533,20.0871666666667
+97,534,22.5001666666667
+97,535,28.3421666666667
+97,536,23.9818333333333
+97,537,20.193
+97,538,26.8393333333333
+97,539,20.9973333333333
+97,540,29.9296666666667
+97,541,25.7386666666667
+97,542,25.7598333333333
+97,543,25.6963333333333
+97,544,23.3045
+97,545,23.1775
+97,546,28.194
+97,547,26.0985
+97,548,25.8233333333333
+97,549,20.5951666666667
+97,550,24.5321666666667
+97,551,27.2415
+97,552,19.6426666666667
+97,553,20.5528333333333
+97,554,28.2363333333333
+97,555,24.765
+97,556,25.9503333333333
+97,557,26.1196666666667
+97,558,22.1191666666667
+97,559,29.2311666666667
+97,560,24.7226666666667
+97,561,20.193
+97,562,31.8135
+97,563,24.7015
+97,564,26.0773333333333
+97,565,24.257
+97,566,23.0928333333333
+97,567,26.5853333333333
+97,568,23.1563333333333
+97,569,26.3525
+97,570,24.7226666666667
+97,571,27.4531666666667
+97,572,26.1408333333333
+97,573,24.765
+97,574,30.1836666666667
+97,575,17.5471666666667
+97,576,26.8181666666667
+97,577,26.6276666666667
+97,578,21.4841666666667
+97,579,31.9828333333333
+97,580,23.114
+97,581,28.2575
+97,582,24.2358333333333
+97,583,21.336
+97,584,28.2575
+97,585,21.8651666666667
+97,586,26.8393333333333
+97,587,20.0448333333333
+97,588,25.8656666666667
+97,589,18.8171666666667
+97,590,24.4051666666667
+97,591,21.9286666666667
+97,592,27.2203333333333
+97,593,26.7546666666667
+97,594,23.241
+97,595,24.3416666666667
+97,596,26.3101666666667
+97,597,26.5218333333333
+97,598,27.5166666666667
+97,599,21.4206666666667
+97,600,25.3365
+97,601,25.5481666666667
+97,602,24.7015
+97,603,22.6271666666667
+97,604,32.1521666666667
+97,605,26.035
+97,606,26.5853333333333
+97,607,21.1031666666667
+97,608,24.892
+97,609,23.9395
+97,610,27.2838333333333
+97,611,25.527
+97,612,26.9028333333333
+97,613,19.2616666666667
+97,614,26.2678333333333
+97,615,24.6168333333333
+97,616,20.0448333333333
+97,617,22.5001666666667
+97,618,22.1615
+97,619,19.4945
+97,620,20.1718333333333
+97,621,21.6746666666667
+97,622,26.2043333333333
+97,623,18.4785
+97,624,21.844
+97,625,24.3628333333333
+97,626,25.3365
+97,627,22.8811666666667
+97,628,16.9545
+97,629,32.8718333333333
+97,630,24.3628333333333
+97,631,24.2993333333333
+97,632,19.3886666666667
+97,633,21.9075
+97,634,24.1723333333333
+97,635,23.1351666666667
+97,636,23.2833333333333
+97,637,24.4475
+97,638,31.6865
+97,639,27.2415
+97,640,24.8496666666667
+97,641,30.3953333333333
+97,642,23.7278333333333
+97,643,21.4841666666667
+97,644,31.75
+97,645,24.5321666666667
+97,646,26.3313333333333
+97,647,25.3788333333333
+97,648,21.3571666666667
+97,649,27.3685
+97,650,21.5476666666667
+97,651,29.845
+97,652,24.8285
+97,653,24.1511666666667
+97,654,23.495
+97,655,27.0933333333333
+97,656,22.4366666666667
+97,657,22.4366666666667
+97,658,24.8073333333333
+97,659,25.527
+97,660,20.2565
+97,661,23.3891666666667
+97,662,21.336
+97,663,23.4738333333333
+97,664,22.0133333333333
+97,665,25.6963333333333
+97,666,26.543
+97,667,26.9451666666667
+97,668,23.2198333333333
+97,669,18.9865
+97,670,27.1991666666667
+97,671,25.781
+97,672,23.876
+97,673,27.2203333333333
+97,674,24.638
+97,675,20.5316666666667
+97,676,23.7701666666667
+97,677,25.5905
+97,678,24.5533333333333
+97,679,21.4841666666667
+97,680,25.019
+97,681,21.4841666666667
+97,682,22.479
+97,683,19.7908333333333
+97,684,21.5053333333333
+97,685,20.5951666666667
+97,686,25.2518333333333
+97,687,27.6013333333333
+97,688,27.3685
+97,689,27.1145
+97,690,24.0665
+97,691,29.21
+97,692,25.8656666666667
+97,693,28.3845
+97,694,25.2095
+97,695,23.3468333333333
+97,696,24.0241666666667
+97,697,30.3741666666667
+97,698,20.3835
+97,699,24.5745
+97,700,25.7386666666667
+97,701,26.4795
+97,702,27.6436666666667
+97,703,27.2626666666667
+97,704,16.7428333333333
+97,705,26.0985
+97,706,26.797
+97,707,23.6431666666667
+97,708,23.8971666666667
+97,709,24.2146666666667
+97,710,26.9451666666667
+97,711,25.6751666666667
+97,712,28.321
+97,713,30.5858333333333
+97,714,28.2786666666667
+97,715,26.1196666666667
+97,716,23.622
+97,717,23.7066666666667
+97,718,25.4211666666667
+97,719,21.7805
+97,720,24.6591666666667
+97,721,25.4
+97,722,20.3835
+97,723,20.1083333333333
+97,724,22.5213333333333
+97,725,23.9606666666667
+97,726,27.4955
+97,727,18.923
+97,728,26.0138333333333
+97,729,25.4635
+97,730,26.6488333333333
+97,731,26.8393333333333
+97,732,29.6545
+97,733,25.8445
+97,734,21.3148333333333
+97,735,23.1986666666667
+97,736,20.4681666666667
+97,737,24.8285
+97,738,21.0608333333333
+97,739,21.4841666666667
+97,740,24.4475
+97,741,21.0396666666667
+97,742,24.9343333333333
+97,743,24.1723333333333
+97,744,23.4738333333333
+97,745,22.987
+97,746,23.7701666666667
+97,747,22.7965
+97,748,23.9183333333333
+97,749,27.3261666666667
+97,750,21.8651666666667
+97,751,24.8708333333333
+97,752,28.6385
+97,753,25.0613333333333
+97,754,27.178
+97,755,21.8863333333333
+97,756,23.9183333333333
+97,757,24.6803333333333
+97,758,26.0985
+97,759,19.4521666666667
+97,760,29.7815
+97,761,26.4583333333333
+97,762,28.8078333333333
+97,763,23.3045
+97,764,26.2466666666667
+97,765,25.273
+97,766,22.3731666666667
+97,767,19.558
+97,768,24.7438333333333
+97,769,28.1728333333333
+97,770,22.7541666666667
+97,771,26.162
+97,772,22.7118333333333
+97,773,23.4526666666667
+97,774,26.0773333333333
+97,775,26.543
+97,776,21.3783333333333
+97,777,22.6271666666667
+97,778,25.9715
+97,779,27.2626666666667
+97,780,26.797
+97,781,29.4216666666667
+97,782,24.0876666666667
+97,783,21.7805
+97,784,21.3571666666667
+97,785,21.971
+97,786,17.7588333333333
+97,787,29.8661666666667
+97,788,26.5218333333333
+97,789,23.3468333333333
+97,790,22.1615
+97,791,25.2518333333333
+97,792,21.463
+97,793,17.4625
+97,794,23.3045
+97,795,27.2203333333333
+97,796,22.098
+97,797,26.6065
+97,798,26.035
+97,799,24.3416666666667
+97,800,28.7655
+97,801,20.6375
+97,802,29.5486666666667
+97,803,22.4155
+97,804,26.9663333333333
+97,805,24.9766666666667
+97,806,25.8233333333333
+97,807,23.0505
+97,808,31.0515
+97,809,28.0458333333333
+97,810,23.6431666666667
+97,811,22.0133333333333
+97,812,23.5796666666667
+97,813,29.3793333333333
+97,814,25.4211666666667
+97,815,20.0025
+97,816,17.8435
+97,817,22.6271666666667
+97,818,28.8713333333333
+97,819,27.94
+97,820,23.5585
+97,821,22.0768333333333
+97,822,26.67
+97,823,30.6493333333333
+97,824,19.939
+97,825,23.6643333333333
+97,826,25.654
+97,827,25.3365
+97,828,24.2993333333333
+97,829,24.638
+97,830,22.352
+97,831,28.9983333333333
+97,832,24.2358333333333
+97,833,25.8233333333333
+97,834,24.0453333333333
+97,835,24.892
+97,836,27.2626666666667
+97,837,29.0618333333333
+97,838,25.019
+97,839,28.2998333333333
+97,840,18.2668333333333
+97,841,23.7701666666667
+97,842,22.6695
+97,843,27.559
+97,844,23.3256666666667
+97,845,21.59
+97,846,27.305
+97,847,21.2301666666667
+97,848,30.5223333333333
+97,849,24.2358333333333
+97,850,19.812
+97,851,20.828
+97,852,24.3628333333333
+97,853,22.9235
+97,854,24.8708333333333
+97,855,20.9126666666667
+97,856,25.3788333333333
+97,857,25.9926666666667
+97,858,24.0876666666667
+97,859,22.225
+97,860,23.0928333333333
+97,861,28.6596666666667
+97,862,20.574
+97,863,17.7588333333333
+97,864,21.4841666666667
+97,865,23.7701666666667
+97,866,21.9921666666667
+97,867,24.9343333333333
+97,868,22.4155
+97,869,20.6798333333333
+97,870,28.0881666666667
+97,871,23.7913333333333
+97,872,27.7706666666667
+97,873,24.1088333333333
+97,874,24.9766666666667
+97,875,27.9823333333333
+97,876,21.463
+97,877,23.0293333333333
+97,878,22.9658333333333
+97,879,29.1465
+97,880,28.2575
+97,881,22.733
+97,882,29.1253333333333
+97,883,28.3633333333333
+97,884,24.4051666666667
+97,885,23.6855
+97,886,20.9126666666667
+97,887,29.2311666666667
+97,888,27.94
+97,889,23.2621666666667
+97,890,23.368
+97,891,27.0298333333333
+97,892,26.7123333333333
+97,893,25.2306666666667
+97,894,20.2988333333333
+97,895,22.3731666666667
+97,896,27.7918333333333
+97,897,21.6323333333333
+97,898,26.3101666666667
+97,899,20.7221666666667
+97,900,27.9823333333333
+97,901,27.7283333333333
+97,902,24.892
+97,903,23.4103333333333
+97,904,27.5166666666667
+97,905,25.7598333333333
+97,906,24.7226666666667
+97,907,24.8073333333333
+97,908,21.2725
+97,909,23.0505
+97,910,23.8971666666667
+97,911,21.9498333333333
+97,912,24.9555
+97,913,29.3581666666667
+97,914,28.6596666666667
+97,915,24.6803333333333
+97,916,29.9296666666667
+97,917,22.5636666666667
+97,918,21.9921666666667
+97,919,28.3421666666667
+97,920,16.2983333333333
+97,921,26.2043333333333
+97,922,23.114
+97,923,26.3736666666667
+97,924,27.1356666666667
+97,925,24.4263333333333
+97,926,22.606
+97,927,23.7278333333333
+97,928,31.5171666666667
+97,929,26.0561666666667
+97,930,27.3473333333333
+97,931,22.7541666666667
+97,932,26.9663333333333
+97,933,19.812
+97,934,28.9348333333333
+97,935,20.2141666666667
+97,936,19.3463333333333
+97,937,23.4526666666667
+97,938,25.0825
+97,939,25.5693333333333
+97,940,17.5471666666667
+97,941,25.0613333333333
+97,942,21.6746666666667
+97,943,23.2621666666667
+97,944,25.2095
+97,945,28.0458333333333
+97,946,25.654
+97,947,25.8656666666667
+97,948,23.6431666666667
+97,949,24.0665
+97,950,25.8021666666667
+97,951,29.337
+97,952,23.7913333333333
+97,953,28.956
+97,954,23.6643333333333
+97,955,24.13
+97,956,20.4258333333333
+97,957,23.5585
+97,958,23.4103333333333
+97,959,26.3525
+97,960,29.2311666666667
+97,961,28.9348333333333
+97,962,24.0453333333333
+97,963,25.8021666666667
+97,964,27.051
+97,965,24.9978333333333
+97,966,24.7226666666667
+97,967,26.6911666666667
+97,968,25.5905
+97,969,32.5543333333333
+97,970,26.416
+97,971,24.0876666666667
+97,972,23.5373333333333
+97,973,19.3463333333333
+97,974,25.5693333333333
+97,975,30.1836666666667
+97,976,24.1088333333333
+97,977,27.5801666666667
+97,978,25.2518333333333
+97,979,24.2781666666667
+97,980,24.9978333333333
+97,981,24.6168333333333
+97,982,26.5218333333333
+97,983,23.0716666666667
+97,984,26.924
+97,985,25.0825
+97,986,24.4475
+97,987,21.6535
+97,988,33.2951666666667
+97,989,28.2786666666667
+97,990,25.019
+97,991,29.1253333333333
+97,992,27.3261666666667
+97,993,24.6803333333333
+97,994,28.2998333333333
+97,995,24.0876666666667
+97,996,23.9818333333333
+97,997,24.4051666666667
+97,998,25.8445
+97,999,31.2631666666667
+97,1000,27.9611666666667
+98,1,30.0566666666667
+98,2,17.5683333333333
+98,3,27.7283333333333
+98,4,27.305
+98,5,19.8966666666667
+98,6,28.2363333333333
+98,7,17.9493333333333
+98,8,40.005
+98,9,21.1243333333333
+98,10,18.1186666666667
+98,11,21.336
+98,12,21.5053333333333
+98,13,21.9286666666667
+98,14,16.764
+98,15,21.971
+98,16,23.7066666666667
+98,17,27.6436666666667
+98,18,19.9813333333333
+98,19,21.9286666666667
+98,20,16.2983333333333
+98,21,21.0396666666667
+98,22,24.384
+98,23,25.4846666666667
+98,24,22.1403333333333
+98,25,25.9503333333333
+98,26,25.527
+98,27,28.448
+98,28,30.3953333333333
+98,29,25.9503333333333
+98,30,18.2033333333333
+98,31,23.5796666666667
+98,32,24.9766666666667
+98,33,19.812
+98,34,19.3886666666667
+98,35,20.828
+98,36,26.3736666666667
+98,37,16.9333333333333
+98,38,22.6483333333333
+98,39,23.3256666666667
+98,40,23.622
+98,41,19.6003333333333
+98,42,20.828
+98,43,20.066
+98,44,25.8656666666667
+98,45,25.8656666666667
+98,46,19.1346666666667
+98,47,28.575
+98,48,24.1723333333333
+98,49,24.638
+98,50,27.3473333333333
+98,51,23.9183333333333
+98,52,19.2616666666667
+98,53,19.5156666666667
+98,54,20.6163333333333
+98,55,19.558
+98,56,20.32
+98,57,19.0076666666667
+98,58,29.6333333333333
+98,59,28.321
+98,60,18.1186666666667
+98,61,25.781
+98,62,23.3256666666667
+98,63,19.6426666666667
+98,64,21.1243333333333
+98,65,17.78
+98,66,30.8186666666667
+98,67,26.797
+98,68,18.3303333333333
+98,69,26.1196666666667
+98,70,24.8496666666667
+98,71,23.5373333333333
+98,72,23.114
+98,73,26.3736666666667
+98,74,15.8326666666667
+98,75,19.2616666666667
+98,76,22.352
+98,77,36.3643333333333
+98,78,24.638
+98,79,27.3473333333333
+98,80,21.7593333333333
+98,81,28.4903333333333
+98,82,20.3623333333333
+98,83,22.6483333333333
+98,84,27.4743333333333
+98,85,27.2626666666667
+98,86,16.8486666666667
+98,87,24.765
+98,88,16.6793333333333
+98,89,24.257
+98,90,25.7386666666667
+98,91,23.5373333333333
+98,92,26.0773333333333
+98,93,29.0406666666667
+98,94,28.2786666666667
+98,95,23.9183333333333
+98,96,20.447
+98,97,20.6163333333333
+98,98,26.7546666666667
+98,99,20.9973333333333
+98,100,29.591
+98,101,23.3256666666667
+98,102,23.4103333333333
+98,103,17.3566666666667
+98,104,20.955
+98,105,29.1676666666667
+98,106,15.8326666666667
+98,107,28.6596666666667
+98,108,34.5016666666667
+98,109,19.6426666666667
+98,110,18.4996666666667
+98,111,19.6003333333333
+98,112,23.0293333333333
+98,113,21.2936666666667
+98,114,31.496
+98,115,21.4206666666667
+98,116,21.5053333333333
+98,117,22.2673333333333
+98,118,20.1083333333333
+98,119,19.939
+98,120,21.6746666666667
+98,121,20.6163333333333
+98,122,20.9973333333333
+98,123,23.7913333333333
+98,124,30.3106666666667
+98,125,21.336
+98,126,16.129
+98,127,18.8383333333333
+98,128,27.559
+98,129,35.9833333333333
+98,130,19.177
+98,131,26.035
+98,132,27.4743333333333
+98,133,22.5636666666667
+98,134,21.3783333333333
+98,135,29.464
+98,136,22.479
+98,137,21.463
+98,138,25.019
+98,139,21.463
+98,140,30.1836666666667
+98,141,24.511
+98,142,23.7913333333333
+98,143,16.2136666666667
+98,144,17.6953333333333
+98,145,21.1243333333333
+98,146,26.0773333333333
+98,147,23.749
+98,148,23.368
+98,149,19.7273333333333
+98,150,23.7913333333333
+98,151,22.1403333333333
+98,152,21.9286666666667
+98,153,23.3256666666667
+98,154,21.463
+98,155,21.1243333333333
+98,156,25.146
+98,157,24.511
+98,158,17.0603333333333
+98,159,16.764
+98,160,20.7433333333333
+98,161,22.733
+98,162,22.352
+98,163,25.9926666666667
+98,164,28.956
+98,165,20.066
+98,166,31.4113333333333
+98,167,20.1083333333333
+98,168,29.591
+98,169,29.083
+98,170,25.6963333333333
+98,171,28.8713333333333
+98,172,30.5223333333333
+98,173,31.1996666666667
+98,174,24.638
+98,175,23.495
+98,176,20.701
+98,177,21.209
+98,178,22.3096666666667
+98,179,37.338
+98,180,25.4
+98,181,21.6746666666667
+98,182,17.5683333333333
+98,183,25.5693333333333
+98,184,18.5843333333333
+98,185,31.3266666666667
+98,186,19.431
+98,187,20.8703333333333
+98,188,27.7283333333333
+98,189,22.4366666666667
+98,190,22.479
+98,191,20.1506666666667
+98,192,21.717
+98,193,24.0876666666667
+98,194,20.2353333333333
+98,195,21.2513333333333
+98,196,28.9136666666667
+98,197,21.6323333333333
+98,198,22.5636666666667
+98,199,21.7593333333333
+98,200,20.4046666666667
+98,201,17.7376666666667
+98,202,25.3576666666667
+98,203,18.3726666666667
+98,204,22.0133333333333
+98,205,24.384
+98,206,27.3896666666667
+98,207,19.0076666666667
+98,208,16.637
+98,209,25.273
+98,210,25.2306666666667
+98,211,31.0303333333333
+98,212,26.0773333333333
+98,213,22.8176666666667
+98,214,23.2833333333333
+98,215,22.987
+98,216,23.9183333333333
+98,217,25.273
+98,218,22.098
+98,219,19.5156666666667
+98,220,22.0133333333333
+98,221,21.209
+98,222,27.0933333333333
+98,223,26.543
+98,224,26.035
+98,225,22.6483333333333
+98,226,25.146
+98,227,14.5626666666667
+98,228,18.7113333333333
+98,229,27.559
+98,230,22.3943333333333
+98,231,22.098
+98,232,20.5316666666667
+98,233,20.066
+98,234,22.6906666666667
+98,235,27.6436666666667
+98,236,18.415
+98,237,20.1506666666667
+98,238,25.4423333333333
+98,239,25.0613333333333
+98,240,19.812
+98,241,23.1986666666667
+98,242,19.2193333333333
+98,243,32.4273333333333
+98,244,22.9446666666667
+98,245,29.083
+98,246,22.9446666666667
+98,247,17.399
+98,248,31.115
+98,249,18.6266666666667
+98,250,26.4583333333333
+98,251,19.8966666666667
+98,252,30.353
+98,253,18.0763333333333
+98,254,24.5956666666667
+98,255,17.272
+98,256,20.9126666666667
+98,257,18.9653333333333
+98,258,22.3096666666667
+98,259,30.988
+98,260,25.908
+98,261,19.4733333333333
+98,262,24.4686666666667
+98,263,30.226
+98,264,28.1093333333333
+98,265,26.289
+98,266,29.4216666666667
+98,267,20.6163333333333
+98,268,31.242
+98,269,24.5533333333333
+98,270,21.844
+98,271,22.225
+98,272,23.0716666666667
+98,273,27.2626666666667
+98,274,30.5646666666667
+98,275,17.5683333333333
+98,276,22.1826666666667
+98,277,33.6973333333333
+98,278,18.5843333333333
+98,279,26.67
+98,280,21.3783333333333
+98,281,30.607
+98,282,27.2626666666667
+98,283,22.86
+98,284,24.638
+98,285,25.4423333333333
+98,286,22.098
+98,287,21.9286666666667
+98,288,22.987
+98,289,21.717
+98,290,19.8966666666667
+98,291,18.7536666666667
+98,292,23.4103333333333
+98,293,22.8176666666667
+98,294,19.2193333333333
+98,295,34.5863333333333
+98,296,30.0566666666667
+98,297,22.5636666666667
+98,298,20.066
+98,299,28.5326666666667
+98,300,18.923
+98,301,24.384
+98,302,17.145
+98,303,20.1083333333333
+98,304,21.6323333333333
+98,305,18.034
+98,306,21.6323333333333
+98,307,18.7536666666667
+98,308,19.8966666666667
+98,309,21.1666666666667
+98,310,20.955
+98,311,18.3726666666667
+98,312,26.035
+98,313,26.289
+98,314,25.2306666666667
+98,315,23.876
+98,316,31.242
+98,317,27.3473333333333
+98,318,28.4056666666667
+98,319,17.3566666666667
+98,320,22.4366666666667
+98,321,25.6963333333333
+98,322,26.162
+98,323,26.2043333333333
+98,324,28.702
+98,325,21.8016666666667
+98,326,22.0556666666667
+98,327,36.0256666666667
+98,328,29.21
+98,329,25.7386666666667
+98,330,21.082
+98,331,19.558
+98,332,22.4366666666667
+98,333,30.099
+98,334,24.257
+98,335,27.3896666666667
+98,336,27.5166666666667
+98,337,27.559
+98,338,29.718
+98,339,24.6803333333333
+98,340,17.2296666666667
+98,341,28.448
+98,342,27.8976666666667
+98,343,31.5383333333333
+98,344,29.7603333333333
+98,345,26.9663333333333
+98,346,22.479
+98,347,23.241
+98,348,22.733
+98,349,30.5223333333333
+98,350,20.701
+98,351,21.5053333333333
+98,352,18.1186666666667
+98,353,30.6493333333333
+98,354,31.242
+98,355,22.3943333333333
+98,356,26.543
+98,357,34.417
+98,358,24.6803333333333
+98,359,30.8186666666667
+98,360,19.5156666666667
+98,361,23.114
+98,362,24.003
+98,363,22.8176666666667
+98,364,20.6163333333333
+98,365,23.1563333333333
+98,366,25.4846666666667
+98,367,23.4103333333333
+98,368,28.575
+98,369,26.289
+98,370,25.654
+98,371,21.209
+98,372,18.923
+98,373,23.114
+98,374,19.7696666666667
+98,375,22.0133333333333
+98,376,17.907
+98,377,26.3736666666667
+98,378,21.59
+98,379,34.1206666666667
+98,380,23.9183333333333
+98,381,23.5796666666667
+98,382,20.4046666666667
+98,383,19.939
+98,384,20.701
+98,385,18.3303333333333
+98,386,29.6333333333333
+98,387,32.2156666666667
+98,388,25.019
+98,389,22.3096666666667
+98,390,34.1206666666667
+98,391,21.0396666666667
+98,392,26.3313333333333
+98,393,21.6323333333333
+98,394,21.971
+98,395,20.9973333333333
+98,396,21.463
+98,397,17.7376666666667
+98,398,23.622
+98,399,25.4423333333333
+98,400,26.4583333333333
+98,401,19.8966666666667
+98,402,29.5063333333333
+98,403,28.1516666666667
+98,404,16.4676666666667
+98,405,27.2203333333333
+98,406,20.2776666666667
+98,407,25.4423333333333
+98,408,24.0453333333333
+98,409,22.987
+98,410,24.6803333333333
+98,411,18.7536666666667
+98,412,20.9973333333333
+98,413,15.3246666666667
+98,414,25.908
+98,415,20.574
+98,416,25.3576666666667
+98,417,28.4056666666667
+98,418,26.8393333333333
+98,419,23.5373333333333
+98,420,26.035
+98,421,16.764
+98,422,19.3463333333333
+98,423,25.9926666666667
+98,424,26.2043333333333
+98,425,17.1873333333333
+98,426,19.3463333333333
+98,427,22.6906666666667
+98,428,18.4996666666667
+98,429,24.765
+98,430,28.5326666666667
+98,431,21.2513333333333
+98,432,27.1356666666667
+98,433,22.352
+98,434,25.273
+98,435,26.7546666666667
+98,436,19.431
+98,437,24.5533333333333
+98,438,29.5063333333333
+98,439,23.4526666666667
+98,440,24.0876666666667
+98,441,22.5636666666667
+98,442,22.3096666666667
+98,443,25.7386666666667
+98,444,24.892
+98,445,33.9513333333333
+98,446,25.8656666666667
+98,447,29.5486666666667
+98,448,16.9333333333333
+98,449,21.463
+98,450,22.2673333333333
+98,451,35.56
+98,452,27.178
+98,453,24.9343333333333
+98,454,23.5373333333333
+98,455,26.416
+98,456,21.463
+98,457,20.9973333333333
+98,458,28.9983333333333
+98,459,24.5956666666667
+98,460,20.9126666666667
+98,461,18.5843333333333
+98,462,24.5533333333333
+98,463,19.812
+98,464,27.3473333333333
+98,465,22.1403333333333
+98,466,26.6276666666667
+98,467,21.844
+98,468,24.257
+98,469,23.368
+98,470,31.115
+98,471,18.6266666666667
+98,472,27.0933333333333
+98,473,19.7273333333333
+98,474,31.623
+98,475,22.733
+98,476,18.2456666666667
+98,477,28.321
+98,478,16.6793333333333
+98,479,33.909
+98,480,22.225
+98,481,26.797
+98,482,25.4
+98,483,30.2683333333333
+98,484,24.003
+98,485,28.448
+98,486,26.543
+98,487,20.4046666666667
+98,488,23.6643333333333
+98,489,18.2456666666667
+98,490,15.8326666666667
+98,491,14.224
+98,492,24.9766666666667
+98,493,20.6163333333333
+98,494,29.845
+98,495,20.4893333333333
+98,496,20.447
+98,497,32.3426666666667
+98,498,30.9033333333333
+98,499,23.1563333333333
+98,500,30.3106666666667
+98,501,27.813
+98,502,17.3566666666667
+98,503,24.0453333333333
+98,504,26.543
+98,505,19.177
+98,506,23.241
+98,507,27.9823333333333
+98,508,17.018
+98,509,22.479
+98,510,22.1826666666667
+98,511,17.4836666666667
+98,512,22.1826666666667
+98,513,24.1723333333333
+98,514,30.48
+98,515,18.8806666666667
+98,516,25.146
+98,517,28.956
+98,518,24.1723333333333
+98,519,28.1516666666667
+98,520,21.717
+98,521,22.9446666666667
+98,522,19.2616666666667
+98,523,18.415
+98,524,27.9823333333333
+98,525,25.0613333333333
+98,526,28.2786666666667
+98,527,27.4743333333333
+98,528,21.844
+98,529,23.0293333333333
+98,530,19.8543333333333
+98,531,24.4686666666667
+98,532,29.845
+98,533,23.9183333333333
+98,534,16.2983333333333
+98,535,23.3256666666667
+98,536,21.971
+98,537,24.892
+98,538,19.8543333333333
+98,539,20.574
+98,540,21.5476666666667
+98,541,32.2156666666667
+98,542,21.5053333333333
+98,543,21.1243333333333
+98,544,29.337
+98,545,26.8393333333333
+98,546,30.9033333333333
+98,547,26.543
+98,548,25.3576666666667
+98,549,21.8863333333333
+98,550,19.304
+98,551,21.1666666666667
+98,552,24.7226666666667
+98,553,20.7433333333333
+98,554,20.3623333333333
+98,555,17.8646666666667
+98,556,21.463
+98,557,16.3406666666667
+98,558,21.8016666666667
+98,559,23.1986666666667
+98,560,32.131
+98,561,22.8176666666667
+98,562,21.8863333333333
+98,563,23.0716666666667
+98,564,30.226
+98,565,19.1346666666667
+98,566,19.6426666666667
+98,567,28.9983333333333
+98,568,29.1676666666667
+98,569,23.9606666666667
+98,570,20.4893333333333
+98,571,27.051
+98,572,24.6803333333333
+98,573,20.447
+98,574,25.781
+98,575,27.7706666666667
+98,576,30.7763333333333
+98,577,23.2833333333333
+98,578,26.8393333333333
+98,579,18.161
+98,580,28.2786666666667
+98,581,26.162
+98,582,22.5636666666667
+98,583,21.209
+98,584,20.574
+98,585,23.4526666666667
+98,586,24.384
+98,587,25.4846666666667
+98,588,21.1666666666667
+98,589,23.2833333333333
+98,590,32.0886666666667
+98,591,24.13
+98,592,25.9926666666667
+98,593,24.13
+98,594,36.957
+98,595,22.733
+98,596,24.2146666666667
+98,597,37.1263333333333
+98,598,18.8806666666667
+98,599,20.4046666666667
+98,600,21.2936666666667
+98,601,29.1253333333333
+98,602,20.6586666666667
+98,603,24.765
+98,604,20.32
+98,605,26.6276666666667
+98,606,27.2626666666667
+98,607,18.7536666666667
+98,608,25.6963333333333
+98,609,23.0293333333333
+98,610,32.2156666666667
+98,611,20.1506666666667
+98,612,21.3783333333333
+98,613,17.0603333333333
+98,614,23.0293333333333
+98,615,18.8383333333333
+98,616,23.622
+98,617,22.0556666666667
+98,618,24.511
+98,619,20.066
+98,620,27.7706666666667
+98,621,25.5693333333333
+98,622,43.6033333333333
+98,623,22.0133333333333
+98,624,18.923
+98,625,19.431
+98,626,22.9446666666667
+98,627,25.9926666666667
+98,628,22.8176666666667
+98,629,23.0293333333333
+98,630,19.4733333333333
+98,631,26.3313333333333
+98,632,18.2456666666667
+98,633,19.4733333333333
+98,634,18.034
+98,635,26.67
+98,636,18.4573333333333
+98,637,25.8656666666667
+98,638,23.9183333333333
+98,639,25.3153333333333
+98,640,19.9813333333333
+98,641,25.654
+98,642,22.6906666666667
+98,643,25.019
+98,644,26.3313333333333
+98,645,17.4836666666667
+98,646,19.7696666666667
+98,647,22.4366666666667
+98,648,28.829
+98,649,20.828
+98,650,24.2993333333333
+98,651,18.3303333333333
+98,652,20.2776666666667
+98,653,17.6106666666667
+98,654,21.1243333333333
+98,655,22.352
+98,656,19.0923333333333
+98,657,19.05
+98,658,30.2683333333333
+98,659,18.923
+98,660,21.8863333333333
+98,661,26.797
+98,662,23.495
+98,663,27.4743333333333
+98,664,28.2363333333333
+98,665,24.5533333333333
+98,666,25.6116666666667
+98,667,23.4526666666667
+98,668,23.241
+98,669,21.463
+98,670,25.1036666666667
+98,671,14.5203333333333
+98,672,20.2776666666667
+98,673,26.6276666666667
+98,674,21.6323333333333
+98,675,22.5213333333333
+98,676,33.147
+98,677,25.0613333333333
+98,678,19.304
+98,679,19.304
+98,680,15.9173333333333
+98,681,23.2833333333333
+98,682,25.654
+98,683,23.2833333333333
+98,684,22.4366666666667
+98,685,30.2683333333333
+98,686,30.6916666666667
+98,687,25.8233333333333
+98,688,22.3096666666667
+98,689,28.321
+98,690,24.5533333333333
+98,691,25.3576666666667
+98,692,18.8806666666667
+98,693,26.543
+98,694,24.9766666666667
+98,695,28.1516666666667
+98,696,27.9823333333333
+98,697,26.289
+98,698,23.7913333333333
+98,699,22.4366666666667
+98,700,27.4743333333333
+98,701,14.5203333333333
+98,702,22.733
+98,703,25.654
+98,704,18.3303333333333
+98,705,20.701
+98,706,24.7226666666667
+98,707,26.9663333333333
+98,708,22.86
+98,709,28.321
+98,710,22.5213333333333
+98,711,22.098
+98,712,22.479
+98,713,24.257
+98,714,22.1826666666667
+98,715,16.764
+98,716,22.4366666666667
+98,717,22.352
+98,718,21.844
+98,719,25.527
+98,720,30.48
+98,721,26.289
+98,722,25.0613333333333
+98,723,31.369
+98,724,17.6953333333333
+98,725,18.2033333333333
+98,726,23.5373333333333
+98,727,26.3736666666667
+98,728,23.749
+98,729,27.178
+98,730,23.8336666666667
+98,731,19.8543333333333
+98,732,21.209
+98,733,31.4113333333333
+98,734,25.654
+98,735,27.2203333333333
+98,736,26.3313333333333
+98,737,22.4366666666667
+98,738,22.6906666666667
+98,739,18.7536666666667
+98,740,26.289
+98,741,29.6333333333333
+98,742,26.3313333333333
+98,743,23.495
+98,744,20.4046666666667
+98,745,24.511
+98,746,17.3143333333333
+98,747,29.591
+98,748,32.4696666666667
+98,749,24.1723333333333
+98,750,23.5373333333333
+98,751,26.2043333333333
+98,752,43.1376666666667
+98,753,28.8713333333333
+98,754,22.6906666666667
+98,755,23.8336666666667
+98,756,26.162
+98,757,22.1403333333333
+98,758,23.1563333333333
+98,759,20.4046666666667
+98,760,17.6106666666667
+98,761,16.51
+98,762,28.0246666666667
+98,763,32.6813333333333
+98,764,30.3953333333333
+98,765,22.86
+98,766,31.496
+98,767,19.3463333333333
+98,768,16.0443333333333
+98,769,28.3633333333333
+98,770,22.0556666666667
+98,771,25.8656666666667
+98,772,24.5956666666667
+98,773,26.3736666666667
+98,774,21.59
+98,775,18.542
+98,776,22.5636666666667
+98,777,28.575
+98,778,28.4056666666667
+98,779,17.8646666666667
+98,780,24.0876666666667
+98,781,30.5646666666667
+98,782,23.749
+98,783,24.765
+98,784,20.193
+98,785,22.3096666666667
+98,786,24.0876666666667
+98,787,26.2043333333333
+98,788,27.8976666666667
+98,789,19.7696666666667
+98,790,22.7753333333333
+98,791,28.4903333333333
+98,792,28.2786666666667
+98,793,23.4103333333333
+98,794,26.3313333333333
+98,795,28.829
+98,796,32.0886666666667
+98,797,25.527
+98,798,26.4583333333333
+98,799,26.67
+98,800,23.622
+98,801,25.8656666666667
+98,802,24.9766666666667
+98,803,24.4263333333333
+98,804,24.384
+98,805,17.5683333333333
+98,806,23.1563333333333
+98,807,26.5006666666667
+98,808,21.463
+98,809,18.669
+98,810,25.7386666666667
+98,811,17.145
+98,812,26.7123333333333
+98,813,28.0246666666667
+98,814,36.449
+98,815,24.765
+98,816,23.622
+98,817,26.2043333333333
+98,818,23.6643333333333
+98,819,29.0406666666667
+98,820,29.718
+98,821,16.002
+98,822,32.766
+98,823,21.717
+98,824,34.3746666666667
+98,825,26.4583333333333
+98,826,20.6586666666667
+98,827,27.6436666666667
+98,828,24.2993333333333
+98,829,17.3143333333333
+98,830,24.3416666666667
+98,831,22.7753333333333
+98,832,16.7216666666667
+98,833,24.892
+98,834,31.0726666666667
+98,835,27.9823333333333
+98,836,23.9606666666667
+98,837,27.559
+98,838,36.6606666666667
+98,839,32.893
+98,840,26.2043333333333
+98,841,29.464
+98,842,20.447
+98,843,21.59
+98,844,23.241
+98,845,25.654
+98,846,13.462
+98,847,21.6746666666667
+98,848,29.2523333333333
+98,849,25.908
+98,850,21.336
+98,851,23.0716666666667
+98,852,17.78
+98,853,20.5316666666667
+98,854,19.3463333333333
+98,855,22.9023333333333
+98,856,31.7923333333333
+98,857,29.464
+98,858,26.2466666666667
+98,859,34.6286666666667
+98,860,28.448
+98,861,19.558
+98,862,22.1403333333333
+98,863,19.0076666666667
+98,864,20.6586666666667
+98,865,29.845
+98,866,16.4253333333333
+98,867,19.431
+98,868,26.3313333333333
+98,869,21.209
+98,870,25.1036666666667
+98,871,21.8016666666667
+98,872,25.5693333333333
+98,873,27.051
+98,874,26.0773333333333
+98,875,18.8806666666667
+98,876,22.6906666666667
+98,877,22.8176666666667
+98,878,24.4686666666667
+98,879,19.5156666666667
+98,880,30.3106666666667
+98,881,22.0556666666667
+98,882,19.6426666666667
+98,883,22.9446666666667
+98,884,14.5626666666667
+98,885,21.2936666666667
+98,886,21.2513333333333
+98,887,17.2296666666667
+98,888,23.876
+98,889,23.5373333333333
+98,890,24.003
+98,891,21.4206666666667
+98,892,24.2993333333333
+98,893,18.923
+98,894,20.4893333333333
+98,895,38.0153333333333
+98,896,27.0086666666667
+98,897,16.2136666666667
+98,898,19.304
+98,899,23.9606666666667
+98,900,26.3313333333333
+98,901,21.8863333333333
+98,902,24.257
+98,903,29.7603333333333
+98,904,18.8806666666667
+98,905,31.2843333333333
+98,906,21.1243333333333
+98,907,21.2513333333333
+98,908,19.304
+98,909,19.2193333333333
+98,910,23.8336666666667
+98,911,20.6586666666667
+98,912,26.7123333333333
+98,913,28.067
+98,914,28.5326666666667
+98,915,23.114
+98,916,33.4856666666667
+98,917,28.4056666666667
+98,918,17.2296666666667
+98,919,22.0556666666667
+98,920,22.6483333333333
+98,921,18.161
+98,922,29.972
+98,923,21.7593333333333
+98,924,16.1713333333333
+98,925,20.3623333333333
+98,926,18.3726666666667
+98,927,21.971
+98,928,25.1883333333333
+98,929,21.3783333333333
+98,930,22.6483333333333
+98,931,23.495
+98,932,28.6596666666667
+98,933,17.018
+98,934,29.7603333333333
+98,935,16.7216666666667
+98,936,34.8826666666667
+98,937,21.8863333333333
+98,938,24.9343333333333
+98,939,20.447
+98,940,22.8176666666667
+98,941,24.0453333333333
+98,942,24.8496666666667
+98,943,21.9286666666667
+98,944,20.955
+98,945,27.432
+98,946,22.86
+98,947,28.2786666666667
+98,948,25.273
+98,949,18.923
+98,950,21.082
+98,951,23.1986666666667
+98,952,22.3943333333333
+98,953,24.4263333333333
+98,954,18.6266666666667
+98,955,27.0086666666667
+98,956,23.7066666666667
+98,957,29.083
+98,958,22.8176666666667
+98,959,18.923
+98,960,19.685
+98,961,24.511
+98,962,25.1036666666667
+98,963,23.8336666666667
+98,964,16.6793333333333
+98,965,19.05
+98,966,19.0923333333333
+98,967,18.923
+98,968,19.1346666666667
+98,969,19.3463333333333
+98,970,23.0716666666667
+98,971,25.3153333333333
+98,972,29.0406666666667
+98,973,26.924
+98,974,23.2833333333333
+98,975,20.4893333333333
+98,976,23.368
+98,977,31.2843333333333
+98,978,23.114
+98,979,28.956
+98,980,16.51
+98,981,26.924
+98,982,19.5156666666667
+98,983,26.797
+98,984,19.1346666666667
+98,985,23.368
+98,986,29.9296666666667
+98,987,30.2683333333333
+98,988,19.812
+98,989,20.9973333333333
+98,990,26.2043333333333
+98,991,28.2786666666667
+98,992,23.9183333333333
+98,993,29.7603333333333
+98,994,23.5373333333333
+98,995,25.019
+98,996,27.3473333333333
+98,997,27.813
+98,998,27.3896666666667
+98,999,22.0556666666667
+98,1000,32.004
+99,1,31.8135
+99,2,33.401
+99,3,39.9838333333333
+99,4,29.1041666666667
+99,5,41.9946666666667
+99,6,36.576
+99,7,28.5115
+99,8,34.4805
+99,9,37.9941666666667
+99,10,27.0298333333333
+99,11,29.337
+99,12,32.766
+99,13,35.6658333333333
+99,14,29.5698333333333
+99,15,27.1991666666667
+99,16,44.0055
+99,17,33.7396666666667
+99,18,29.8661666666667
+99,19,37.1475
+99,20,30.8398333333333
+99,21,36.3008333333333
+99,22,32.7871666666667
+99,23,35.5388333333333
+99,24,27.813
+99,25,40.513
+99,26,35.2848333333333
+99,27,34.7556666666667
+99,28,46.228
+99,29,41.0421666666667
+99,30,34.5863333333333
+99,31,34.1841666666667
+99,32,37.8248333333333
+99,33,36.3643333333333
+99,34,32.6178333333333
+99,35,35.5388333333333
+99,36,32.2368333333333
+99,37,41.8041666666667
+99,38,39.0736666666667
+99,39,35.6658333333333
+99,40,38.2058333333333
+99,41,31.7076666666667
+99,42,34.417
+99,43,35.814
+99,44,32.7871666666667
+99,45,40.8728333333333
+99,46,21.6323333333333
+99,47,31.7288333333333
+99,48,29.7603333333333
+99,49,29.9508333333333
+99,50,23.0293333333333
+99,51,34.0995
+99,52,38.5656666666667
+99,53,37.592
+99,54,30.9456666666667
+99,55,37.0628333333333
+99,56,41.7618333333333
+99,57,30.7763333333333
+99,58,33.4221666666667
+99,59,32.3003333333333
+99,60,33.147
+99,61,44.2383333333333
+99,62,32.0463333333333
+99,63,34.5863333333333
+99,64,32.9776666666667
+99,65,33.5068333333333
+99,66,40.9575
+99,67,33.0411666666667
+99,68,37.5496666666667
+99,69,22.1826666666667
+99,70,35.0943333333333
+99,71,40.0261666666667
+99,72,38.5021666666667
+99,73,34.8191666666667
+99,74,28.9771666666667
+99,75,35.56
+99,76,37.5285
+99,77,31.7076666666667
+99,78,36.8511666666667
+99,79,30.607
+99,80,33.8455
+99,81,32.9353333333333
+99,82,32.9565
+99,83,33.8243333333333
+99,84,38.0365
+99,85,32.0886666666667
+99,86,40.6823333333333
+99,87,35.0731666666667
+99,88,37.6343333333333
+99,89,37.1475
+99,90,35.5388333333333
+99,91,38.9255
+99,92,29.1253333333333
+99,93,29.5698333333333
+99,94,34.8615
+99,95,35.687
+99,96,33.4645
+99,97,36.957
+99,98,34.8826666666667
+99,99,28.2363333333333
+99,100,32.0251666666667
+99,101,37.1263333333333
+99,102,34.4381666666667
+99,103,34.7556666666667
+99,104,34.9885
+99,105,33.4856666666667
+99,106,32.893
+99,107,42.4391666666667
+99,108,44.3441666666667
+99,109,37.0628333333333
+99,110,29.2946666666667
+99,111,36.068
+99,112,43.0106666666667
+99,113,27.3473333333333
+99,114,41.8676666666667
+99,115,34.1841666666667
+99,116,34.4805
+99,117,32.7236666666667
+99,118,39.5181666666667
+99,119,47.7096666666667
+99,120,37.2745
+99,121,35.2636666666667
+99,122,28.1516666666667
+99,123,39.9626666666667
+99,124,31.5171666666667
+99,125,30.6281666666667
+99,126,45.5506666666667
+99,127,38.3751666666667
+99,128,38.6715
+99,129,39.6028333333333
+99,130,35.3483333333333
+99,131,37.4438333333333
+99,132,38.5445
+99,133,39.7298333333333
+99,134,38.5868333333333
+99,135,38.2058333333333
+99,136,38.1
+99,137,37.0416666666667
+99,138,33.3798333333333
+99,139,27.94
+99,140,30.48
+99,141,37.4015
+99,142,33.6338333333333
+99,143,36.9993333333333
+99,144,32.893
+99,145,35.3906666666667
+99,146,29.7391666666667
+99,147,33.6761666666667
+99,148,36.0468333333333
+99,149,31.115
+99,150,36.2161666666667
+99,151,33.274
+99,152,38.2058333333333
+99,153,30.9456666666667
+99,154,28.4056666666667
+99,155,43.1588333333333
+99,156,34.6498333333333
+99,157,38.6291666666667
+99,158,42.9471666666667
+99,159,39.7298333333333
+99,160,39.9838333333333
+99,161,31.1573333333333
+99,162,46.228
+99,163,26.9451666666667
+99,164,37.0628333333333
+99,165,31.5171666666667
+99,166,45.2331666666667
+99,167,40.0685
+99,168,30.6281666666667
+99,169,32.766
+99,170,38.227
+99,171,43.4763333333333
+99,172,23.6643333333333
+99,173,36.3643333333333
+99,174,33.8455
+99,175,29.9085
+99,176,43.9208333333333
+99,177,32.8295
+99,178,40.4071666666667
+99,179,35.6446666666667
+99,180,37.8036666666667
+99,181,40.4283333333333
+99,182,24.8073333333333
+99,183,33.1681666666667
+99,184,33.5068333333333
+99,185,41.9735
+99,186,33.7185
+99,187,31.3901666666667
+99,188,28.7231666666667
+99,189,29.9296666666667
+99,190,38.3963333333333
+99,191,35.4965
+99,192,37.1263333333333
+99,193,28.448
+99,194,28.4056666666667
+99,195,34.3958333333333
+99,196,42.1851666666667
+99,197,34.9885
+99,198,45.847
+99,199,31.3055
+99,200,31.496
+99,201,43.688
+99,202,34.036
+99,203,37.4015
+99,204,36.4066666666667
+99,205,33.2105
+99,206,31.877
+99,207,30.226
+99,208,31.1785
+99,209,37.1263333333333
+99,210,36.9358333333333
+99,211,34.3323333333333
+99,212,39.2853333333333
+99,213,34.5016666666667
+99,214,35.5811666666667
+99,215,34.5651666666667
+99,216,37.7825
+99,217,22.479
+99,218,35.3695
+99,219,36.7665
+99,220,39.0525
+99,221,36.8511666666667
+99,222,41.275
+99,223,37.3168333333333
+99,224,38.3963333333333
+99,225,39.5605
+99,226,40.767
+99,227,34.7345
+99,228,34.1418333333333
+99,229,34.7133333333333
+99,230,35.5176666666667
+99,231,29.0618333333333
+99,232,34.8191666666667
+99,233,34.6498333333333
+99,234,32.5966666666667
+99,235,35.179
+99,236,31.5171666666667
+99,237,34.7768333333333
+99,238,31.4325
+99,239,40.3436666666667
+99,240,29.337
+99,241,37.7401666666667
+99,242,34.4381666666667
+99,243,28.956
+99,244,43.8573333333333
+99,245,33.2951666666667
+99,246,35.8351666666667
+99,247,37.4015
+99,248,37.1051666666667
+99,249,31.6653333333333
+99,250,42.5873333333333
+99,251,31.369
+99,252,30.7975
+99,253,32.8718333333333
+99,254,34.1841666666667
+99,255,24.4898333333333
+99,256,40.386
+99,257,38.7985
+99,258,41.3808333333333
+99,259,40.7035
+99,260,37.2533333333333
+99,261,41.021
+99,262,35.2848333333333
+99,263,33.0835
+99,264,31.3266666666667
+99,265,28.0458333333333
+99,266,30.8398333333333
+99,267,29.8238333333333
+99,268,40.5341666666667
+99,269,35.9198333333333
+99,270,26.924
+99,271,25.9926666666667
+99,272,37.719
+99,273,33.909
+99,274,33.7185
+99,275,36.2373333333333
+99,276,31.1785
+99,277,34.0571666666667
+99,278,33.4433333333333
+99,279,41.1268333333333
+99,280,33.3375
+99,281,28.7655
+99,282,37.0416666666667
+99,283,28.575
+99,284,33.5491666666667
+99,285,34.6498333333333
+99,286,30.9668333333333
+99,287,34.6286666666667
+99,288,36.1738333333333
+99,289,30.5011666666667
+99,290,43.2435
+99,291,32.5755
+99,292,36.6606666666667
+99,293,32.8295
+99,294,35.7716666666667
+99,295,36.83
+99,296,28.5115
+99,297,26.8181666666667
+99,298,34.3535
+99,299,36.7241666666667
+99,300,43.307
+99,301,45.4025
+99,302,35.0308333333333
+99,303,37.0628333333333
+99,304,25.8021666666667
+99,305,44.2595
+99,306,26.035
+99,307,41.8253333333333
+99,308,47.6673333333333
+99,309,41.783
+99,310,37.3803333333333
+99,311,36.7241666666667
+99,312,32.4696666666667
+99,313,32.8083333333333
+99,314,32.9565
+99,315,37.8883333333333
+99,316,33.0411666666667
+99,317,33.6973333333333
+99,318,38.2058333333333
+99,319,36.9146666666667
+99,320,32.9988333333333
+99,321,34.8403333333333
+99,322,40.6188333333333
+99,323,32.2791666666667
+99,324,36.4913333333333
+99,325,27.4743333333333
+99,326,35.0731666666667
+99,327,36.4066666666667
+99,328,36.6606666666667
+99,329,29.1041666666667
+99,330,36.5548333333333
+99,331,39.2006666666667
+99,332,47.3498333333333
+99,333,36.2161666666667
+99,334,44.577
+99,335,33.8455
+99,336,36.8511666666667
+99,337,41.5501666666667
+99,338,30.5435
+99,339,30.353
+99,340,39.4123333333333
+99,341,40.2378333333333
+99,342,36.1526666666667
+99,343,38.9043333333333
+99,344,32.5755
+99,345,32.8295
+99,346,31.2843333333333
+99,347,43.1376666666667
+99,348,33.274
+99,349,31.496
+99,350,41.4655
+99,351,30.3106666666667
+99,352,36.0256666666667
+99,353,35.687
+99,354,41.8253333333333
+99,355,45.8893333333333
+99,356,25.0613333333333
+99,357,42.1428333333333
+99,358,34.2476666666667
+99,359,30.7763333333333
+99,360,26.0985
+99,361,48.6833333333333
+99,362,37.2956666666667
+99,363,34.1841666666667
+99,364,32.639
+99,365,34.3958333333333
+99,366,32.6813333333333
+99,367,27.2203333333333
+99,368,32.6813333333333
+99,369,30.4588333333333
+99,370,34.3746666666667
+99,371,37.6131666666667
+99,372,34.3323333333333
+99,373,36.83
+99,374,37.1898333333333
+99,375,37.4438333333333
+99,376,35.2848333333333
+99,377,44.2595
+99,378,40.4495
+99,379,41.91
+99,380,33.6338333333333
+99,381,25.2095
+99,382,33.909
+99,383,23.6643333333333
+99,384,26.1831666666667
+99,385,32.639
+99,386,27.2838333333333
+99,387,36.6183333333333
+99,388,37.2745
+99,389,28.4903333333333
+99,390,39.6451666666667
+99,391,26.7123333333333
+99,392,46.2703333333333
+99,393,39.2218333333333
+99,394,28.321
+99,395,30.7763333333333
+99,396,32.9565
+99,397,31.369
+99,398,34.5228333333333
+99,399,30.3318333333333
+99,400,34.4593333333333
+99,401,37.5073333333333
+99,402,23.241
+99,403,36.7241666666667
+99,404,43.0741666666667
+99,405,35.8351666666667
+99,406,29.1676666666667
+99,407,36.5336666666667
+99,408,30.6281666666667
+99,409,29.083
+99,410,32.9141666666667
+99,411,34.163
+99,412,32.385
+99,413,37.6555
+99,414,46.5666666666667
+99,415,34.798
+99,416,32.9353333333333
+99,417,37.5285
+99,418,39.4123333333333
+99,419,33.274
+99,420,34.6286666666667
+99,421,36.9358333333333
+99,422,31.8346666666667
+99,423,36.2796666666667
+99,424,32.8718333333333
+99,425,34.0571666666667
+99,426,38.5021666666667
+99,427,32.766
+99,428,41.8676666666667
+99,429,33.1893333333333
+99,430,36.9146666666667
+99,431,30.2048333333333
+99,432,32.7448333333333
+99,433,32.4696666666667
+99,434,36.5548333333333
+99,435,30.0778333333333
+99,436,35.814
+99,437,30.9668333333333
+99,438,40.0261666666667
+99,439,33.147
+99,440,29.9508333333333
+99,441,37.9306666666667
+99,442,30.3953333333333
+99,443,39.6451666666667
+99,444,30.2471666666667
+99,445,37.1263333333333
+99,446,35.814
+99,447,35.5388333333333
+99,448,33.2316666666667
+99,449,33.7608333333333
+99,450,32.004
+99,451,24.257
+99,452,39.7721666666667
+99,453,33.7608333333333
+99,454,28.9771666666667
+99,455,34.4593333333333
+99,456,38.5868333333333
+99,457,36.9358333333333
+99,458,29.9931666666667
+99,459,33.1258333333333
+99,460,25.9926666666667
+99,461,35.2425
+99,462,32.131
+99,463,37.0205
+99,464,32.2156666666667
+99,465,40.4283333333333
+99,466,32.131
+99,467,38.2058333333333
+99,468,39.1583333333333
+99,469,34.9461666666667
+99,470,38.2905
+99,471,26.8393333333333
+99,472,37.084
+99,473,33.0623333333333
+99,474,35.1578333333333
+99,475,39.8991666666667
+99,476,33.8243333333333
+99,477,40.9363333333333
+99,478,37.2321666666667
+99,479,32.6601666666667
+99,480,40.7035
+99,481,39.5605
+99,482,30.8398333333333
+99,483,36.9358333333333
+99,484,35.1155
+99,485,38.354
+99,486,35.941
+99,487,30.7128333333333
+99,488,33.6973333333333
+99,489,33.7396666666667
+99,490,35.4118333333333
+99,491,34.7133333333333
+99,492,36.1738333333333
+99,493,35.814
+99,494,33.02
+99,495,33.782
+99,496,41.2961666666667
+99,497,37.6131666666667
+99,498,39.1795
+99,499,39.5605
+99,500,38.227
+99,501,31.2208333333333
+99,502,29.8026666666667
+99,503,29.8026666666667
+99,504,31.2631666666667
+99,505,45.9528333333333
+99,506,28.7655
+99,507,39.9838333333333
+99,508,37.973
+99,509,29.3581666666667
+99,510,42.0793333333333
+99,511,37.8883333333333
+99,512,41.8465
+99,513,43.307
+99,514,37.2321666666667
+99,515,42.9683333333333
+99,516,33.4645
+99,517,31.2631666666667
+99,518,28.7443333333333
+99,519,32.2368333333333
+99,520,35.2001666666667
+99,521,26.6276666666667
+99,522,30.4165
+99,523,33.2951666666667
+99,524,42.8413333333333
+99,525,44.323
+99,526,29.7815
+99,527,28.5326666666667
+99,528,30.8821666666667
+99,529,35.56
+99,530,40.5976666666667
+99,531,26.8393333333333
+99,532,34.0148333333333
+99,533,31.5806666666667
+99,534,32.0675
+99,535,35.8775
+99,536,37.6766666666667
+99,537,25.8656666666667
+99,538,32.4061666666667
+99,539,38.8196666666667
+99,540,37.2533333333333
+99,541,41.402
+99,542,42.8201666666667
+99,543,42.7143333333333
+99,544,29.0406666666667
+99,545,39.4758333333333
+99,546,24.6803333333333
+99,547,32.5755
+99,548,32.4908333333333
+99,549,38.2058333333333
+99,550,42.4815
+99,551,38.1635
+99,552,37.9306666666667
+99,553,35.941
+99,554,29.1888333333333
+99,555,33.1258333333333
+99,556,30.7551666666667
+99,557,31.9193333333333
+99,558,34.4381666666667
+99,559,35.7505
+99,560,38.481
+99,561,28.3845
+99,562,33.9301666666667
+99,563,28.702
+99,564,33.909
+99,565,41.021
+99,566,36.5971666666667
+99,567,38.1
+99,568,40.2378333333333
+99,569,36.8088333333333
+99,570,36.9358333333333
+99,571,41.5925
+99,572,27.94
+99,573,31.75
+99,574,37.0205
+99,575,32.1733333333333
+99,576,32.5331666666667
+99,577,37.6555
+99,578,38.4386666666667
+99,579,34.1206666666667
+99,580,30.099
+99,581,41.1056666666667
+99,582,39.6663333333333
+99,583,29.4851666666667
+99,584,33.2951666666667
+99,585,45.5295
+99,586,33.9301666666667
+99,587,27.1991666666667
+99,588,37.1263333333333
+99,589,30.6281666666667
+99,590,29.5486666666667
+99,591,34.798
+99,592,28.448
+99,593,30.2471666666667
+99,594,29.2523333333333
+99,595,29.2523333333333
+99,596,37.7825
+99,597,24.6168333333333
+99,598,25.7598333333333
+99,599,32.8295
+99,600,33.8455
+99,601,33.4645
+99,602,44.8945
+99,603,36.703
+99,604,34.2476666666667
+99,605,35.9833333333333
+99,606,34.9461666666667
+99,607,35.5176666666667
+99,608,32.7236666666667
+99,609,31.369
+99,610,33.2951666666667
+99,611,37.5496666666667
+99,612,41.529
+99,613,29.6545
+99,614,36.1738333333333
+99,615,35.56
+99,616,43.2223333333333
+99,617,26.4371666666667
+99,618,27.1356666666667
+99,619,38.9043333333333
+99,620,36.703
+99,621,34.2265
+99,622,22.098
+99,623,36.0468333333333
+99,624,43.0318333333333
+99,625,38.4598333333333
+99,626,34.6498333333333
+99,627,32.766
+99,628,38.4598333333333
+99,629,31.6865
+99,630,35.3906666666667
+99,631,37.1686666666667
+99,632,36.7453333333333
+99,633,29.6333333333333
+99,634,41.1903333333333
+99,635,36.068
+99,636,29.7815
+99,637,32.2156666666667
+99,638,45.466
+99,639,30.9245
+99,640,28.9983333333333
+99,641,28.0246666666667
+99,642,37.2321666666667
+99,643,34.1841666666667
+99,644,39.6875
+99,645,31.1361666666667
+99,646,30.734
+99,647,33.2951666666667
+99,648,33.5491666666667
+99,649,31.496
+99,650,40.2801666666667
+99,651,38.7773333333333
+99,652,30.6705
+99,653,43.0741666666667
+99,654,31.4113333333333
+99,655,28.067
+99,656,34.9885
+99,657,35.814
+99,658,39.2641666666667
+99,659,39.9838333333333
+99,660,30.7128333333333
+99,661,31.7923333333333
+99,662,28.0881666666667
+99,663,28.0458333333333
+99,664,32.4061666666667
+99,665,32.8506666666667
+99,666,36.9993333333333
+99,667,26.8181666666667
+99,668,36.8088333333333
+99,669,43.6668333333333
+99,670,39.37
+99,671,31.5806666666667
+99,672,36.449
+99,673,43.8785
+99,674,34.5863333333333
+99,675,33.909
+99,676,37.9095
+99,677,37.2956666666667
+99,678,36.0468333333333
+99,679,35.56
+99,680,32.2791666666667
+99,681,34.6921666666667
+99,682,33.8455
+99,683,44.0055
+99,684,36.8935
+99,685,32.0886666666667
+99,686,31.4113333333333
+99,687,29.8238333333333
+99,688,31.2208333333333
+99,689,34.7133333333333
+99,690,31.4113333333333
+99,691,36.8088333333333
+99,692,40.2801666666667
+99,693,32.8506666666667
+99,694,39.8991666666667
+99,695,36.7665
+99,696,35.5388333333333
+99,697,29.718
+99,698,28.5961666666667
+99,699,35.8775
+99,700,37.6343333333333
+99,701,35.3906666666667
+99,702,41.656
+99,703,32.4273333333333
+99,704,34.3323333333333
+99,705,47.9001666666667
+99,706,41.529
+99,707,38.2481666666667
+99,708,34.29
+99,709,29.21
+99,710,34.163
+99,711,29.464
+99,712,36.703
+99,713,26.4371666666667
+99,714,41.148
+99,715,39.0101666666667
+99,716,35.2213333333333
+99,717,39.0525
+99,718,41.4866666666667
+99,719,25.4211666666667
+99,720,27.6013333333333
+99,721,30.3953333333333
+99,722,42.418
+99,723,31.6441666666667
+99,724,32.1521666666667
+99,725,37.973
+99,726,25.5481666666667
+99,727,28.702
+99,728,29.2946666666667
+99,729,50.9905
+99,730,27.2415
+99,731,32.5331666666667
+99,732,34.9038333333333
+99,733,37.0416666666667
+99,734,33.6126666666667
+99,735,33.655
+99,736,29.718
+99,737,38.481
+99,738,42.2063333333333
+99,739,39.7086666666667
+99,740,41.3808333333333
+99,741,38.9466666666667
+99,742,36.4066666666667
+99,743,34.4593333333333
+99,744,38.3751666666667
+99,745,34.4805
+99,746,36.8511666666667
+99,747,38.9043333333333
+99,748,35.8563333333333
+99,749,45.4871666666667
+99,750,36.1738333333333
+99,751,33.1681666666667
+99,752,36.6183333333333
+99,753,36.9146666666667
+99,754,32.5331666666667
+99,755,28.2575
+99,756,28.7866666666667
+99,757,43.688
+99,758,34.163
+99,759,37.4438333333333
+99,760,32.1733333333333
+99,761,33.6126666666667
+99,762,28.8501666666667
+99,763,42.8625
+99,764,28.5115
+99,765,25.3365
+99,766,29.3793333333333
+99,767,39.2853333333333
+99,768,39.0101666666667
+99,769,37.592
+99,770,33.9513333333333
+99,771,32.2791666666667
+99,772,34.1418333333333
+99,773,36.6395
+99,774,30.4588333333333
+99,775,42.8836666666667
+99,776,35.4753333333333
+99,777,32.1945
+99,778,30.988
+99,779,31.9616666666667
+99,780,35.2213333333333
+99,781,37.8671666666667
+99,782,36.3643333333333
+99,783,39.0101666666667
+99,784,35.1578333333333
+99,785,38.7138333333333
+99,786,30.0143333333333
+99,787,36.449
+99,788,36.8723333333333
+99,789,30.4165
+99,790,31.5383333333333
+99,791,35.1578333333333
+99,792,38.1
+99,793,37.2956666666667
+99,794,32.5543333333333
+99,795,36.3855
+99,796,30.7551666666667
+99,797,27.9611666666667
+99,798,31.623
+99,799,37.4226666666667
+99,800,32.766
+99,801,38.7985
+99,802,37.6131666666667
+99,803,32.5331666666667
+99,804,37.1263333333333
+99,805,34.9461666666667
+99,806,29.4216666666667
+99,807,33.2316666666667
+99,808,30.734
+99,809,36.4913333333333
+99,810,43.0106666666667
+99,811,37.8248333333333
+99,812,34.1418333333333
+99,813,34.7133333333333
+99,814,35.306
+99,815,43.4763333333333
+99,816,31.6653333333333
+99,817,29.5486666666667
+99,818,32.893
+99,819,33.9725
+99,820,38.4386666666667
+99,821,31.7076666666667
+99,822,34.1841666666667
+99,823,31.5806666666667
+99,824,34.6921666666667
+99,825,37.7613333333333
+99,826,27.559
+99,827,35.3695
+99,828,32.3426666666667
+99,829,37.9518333333333
+99,830,34.9038333333333
+99,831,35.7928333333333
+99,832,36.0891666666667
+99,833,31.75
+99,834,39.6028333333333
+99,835,33.9513333333333
+99,836,31.1361666666667
+99,837,37.6555
+99,838,28.4268333333333
+99,839,33.8243333333333
+99,840,35.2213333333333
+99,841,41.3173333333333
+99,842,36.5548333333333
+99,843,30.7975
+99,844,30.7128333333333
+99,845,35.941
+99,846,36.8088333333333
+99,847,31.9616666666667
+99,848,34.3111666666667
+99,849,31.5171666666667
+99,850,33.5068333333333
+99,851,35.4118333333333
+99,852,34.0571666666667
+99,853,33.9725
+99,854,34.1841666666667
+99,855,48.4081666666667
+99,856,37.2745
+99,857,27.8341666666667
+99,858,42.3968333333333
+99,859,27.4531666666667
+99,860,38.4386666666667
+99,861,36.0468333333333
+99,862,39.1795
+99,863,36.195
+99,864,31.1361666666667
+99,865,31.9405
+99,866,38.5656666666667
+99,867,35.1578333333333
+99,868,33.4433333333333
+99,869,37.7401666666667
+99,870,36.957
+99,871,41.4231666666667
+99,872,43.8361666666667
+99,873,40.9363333333333
+99,874,44.5135
+99,875,35.2001666666667
+99,876,46.0163333333333
+99,877,32.1945
+99,878,37.9518333333333
+99,879,35.052
+99,880,45.2331666666667
+99,881,36.703
+99,882,32.4061666666667
+99,883,39.4758333333333
+99,884,33.2951666666667
+99,885,34.6498333333333
+99,886,38.3116666666667
+99,887,35.6235
+99,888,31.4536666666667
+99,889,37.0416666666667
+99,890,27.7283333333333
+99,891,22.9658333333333
+99,892,40.6611666666667
+99,893,36.3643333333333
+99,894,29.4216666666667
+99,895,42.7778333333333
+99,896,31.1573333333333
+99,897,30.7551666666667
+99,898,36.9781666666667
+99,899,39.3488333333333
+99,900,28.2575
+99,901,31.9405
+99,902,38.5233333333333
+99,903,37.9095
+99,904,33.7396666666667
+99,905,40.1955
+99,906,34.3111666666667
+99,907,41.2326666666667
+99,908,31.7076666666667
+99,909,27.2203333333333
+99,910,37.4861666666667
+99,911,41.529
+99,912,36.9146666666667
+99,913,38.2905
+99,914,32.5966666666667
+99,915,48.0695
+99,916,34.3323333333333
+99,917,35.2213333333333
+99,918,36.9146666666667
+99,919,30.9456666666667
+99,920,35.9621666666667
+99,921,43.18
+99,922,39.7721666666667
+99,923,32.3003333333333
+99,924,28.1093333333333
+99,925,44.1536666666667
+99,926,36.4913333333333
+99,927,45.9951666666667
+99,928,31.8135
+99,929,28.448
+99,930,33.6338333333333
+99,931,46.482
+99,932,34.9038333333333
+99,933,39.1795
+99,934,21.4841666666667
+99,935,34.036
+99,936,34.417
+99,937,29.464
+99,938,30.7975
+99,939,33.5703333333333
+99,940,32.3426666666667
+99,941,28.9983333333333
+99,942,40.1743333333333
+99,943,39.5816666666667
+99,944,33.6761666666667
+99,945,30.8398333333333
+99,946,42.0581666666667
+99,947,43.688
+99,948,37.8883333333333
+99,949,35.0731666666667
+99,950,35.7928333333333
+99,951,35.5176666666667
+99,952,37.4861666666667
+99,953,46.1856666666667
+99,954,30.1836666666667
+99,955,22.9446666666667
+99,956,38.6503333333333
+99,957,30.2471666666667
+99,958,42.3545
+99,959,36.83
+99,960,31.9616666666667
+99,961,33.5491666666667
+99,962,38.862
+99,963,37.9941666666667
+99,964,32.4485
+99,965,35.3906666666667
+99,966,33.5491666666667
+99,967,29.8661666666667
+99,968,33.9513333333333
+99,969,40.132
+99,970,38.0788333333333
+99,971,40.3225
+99,972,29.972
+99,973,33.8666666666667
+99,974,32.4273333333333
+99,975,31.3266666666667
+99,976,32.385
+99,977,32.9776666666667
+99,978,35.1155
+99,979,36.0468333333333
+99,980,40.1743333333333
+99,981,35.2636666666667
+99,982,37.6555
+99,983,20.9973333333333
+99,984,36.3855
+99,985,27.7495
+99,986,41.5501666666667
+99,987,40.513
+99,988,26.7123333333333
+99,989,37.846
+99,990,42.2486666666667
+99,991,40.0473333333333
+99,992,32.1521666666667
+99,993,34.8826666666667
+99,994,34.4805
+99,995,45.1061666666667
+99,996,27.7283333333333
+99,997,33.1046666666667
+99,998,41.8676666666667
+99,999,37.9306666666667
+99,1000,31.0938333333333
+100,1,25.2941666666667
+100,2,26.2678333333333
+100,3,26.797
+100,4,23.0081666666667
+100,5,22.6483333333333
+100,6,26.5641666666667
+100,7,26.9451666666667
+100,8,30.0143333333333
+100,9,22.3731666666667
+100,10,23.7066666666667
+100,11,22.9023333333333
+100,12,27.5801666666667
+100,13,28.0881666666667
+100,14,28.2363333333333
+100,15,23.3256666666667
+100,16,28.448
+100,17,32.1945
+100,18,24.1088333333333
+100,19,29.3158333333333
+100,20,30.7551666666667
+100,21,25.4423333333333
+100,22,30.5435
+100,23,28.575
+100,24,31.4748333333333
+100,25,31.5383333333333
+100,26,23.749
+100,27,27.0298333333333
+100,28,31.4325
+100,29,26.5218333333333
+100,30,27.5801666666667
+100,31,24.638
+100,32,32.512
+100,33,25.9291666666667
+100,34,26.035
+100,35,24.9343333333333
+100,36,25.8233333333333
+100,37,25.5481666666667
+100,38,27.6436666666667
+100,39,26.1196666666667
+100,40,25.527
+100,41,30.4376666666667
+100,42,26.1196666666667
+100,43,23.3256666666667
+100,44,30.2683333333333
+100,45,31.2843333333333
+100,46,20.8703333333333
+100,47,26.1196666666667
+100,48,28.7866666666667
+100,49,25.9926666666667
+100,50,29.5275
+100,51,26.2255
+100,52,27.1991666666667
+100,53,26.035
+100,54,30.861
+100,55,28.067
+100,56,32.8295
+100,57,22.6483333333333
+100,58,29.0195
+100,59,28.1305
+100,60,30.099
+100,61,29.3158333333333
+100,62,23.0928333333333
+100,63,26.9663333333333
+100,64,24.9766666666667
+100,65,23.8336666666667
+100,66,22.5848333333333
+100,67,32.258
+100,68,25.654
+100,69,28.8501666666667
+100,70,25.273
+100,71,32.6601666666667
+100,72,29.0195
+100,73,28.7231666666667
+100,74,28.2151666666667
+100,75,26.289
+100,76,26.289
+100,77,35.7081666666667
+100,78,28.194
+100,79,30.2683333333333
+100,80,27.4531666666667
+100,81,25.4
+100,82,25.3153333333333
+100,83,36.8723333333333
+100,84,29.21
+100,85,25.146
+100,86,24.4898333333333
+100,87,25.3153333333333
+100,88,30.9033333333333
+100,89,26.797
+100,90,28.1305
+100,91,27.4743333333333
+100,92,29.1253333333333
+100,93,30.5011666666667
+100,94,33.8455
+100,95,34.4805
+100,96,24.6168333333333
+100,97,35.3906666666667
+100,98,24.5321666666667
+100,99,23.8336666666667
+100,100,28.8078333333333
+100,101,21.463
+100,102,30.734
+100,103,32.0675
+100,104,25.4423333333333
+100,105,23.2833333333333
+100,106,25.7386666666667
+100,107,33.782
+100,108,28.6596666666667
+100,109,30.3953333333333
+100,110,33.9301666666667
+100,111,25.019
+100,112,34.5228333333333
+100,113,30.7763333333333
+100,114,36.2373333333333
+100,115,27.7495
+100,116,25.6116666666667
+100,117,26.162
+100,118,28.575
+100,119,27.7071666666667
+100,120,26.7335
+100,121,28.956
+100,122,32.5966666666667
+100,123,33.2528333333333
+100,124,34.0783333333333
+100,125,30.8821666666667
+100,126,27.2838333333333
+100,127,26.6276666666667
+100,128,31.8135
+100,129,28.448
+100,130,27.1568333333333
+100,131,28.829
+100,132,32.4696666666667
+100,133,21.8651666666667
+100,134,24.9555
+100,135,28.6385
+100,136,32.6813333333333
+100,137,29.972
+100,138,36.6606666666667
+100,139,30.1836666666667
+100,140,25.9926666666667
+100,141,31.5383333333333
+100,142,33.0835
+100,143,24.6803333333333
+100,144,26.7335
+100,145,24.7015
+100,146,24.257
+100,147,37.084
+100,148,34.0995
+100,149,27.2415
+100,150,29.1888333333333
+100,151,24.7015
+100,152,29.5698333333333
+100,153,25.527
+100,154,24.4686666666667
+100,155,27.559
+100,156,28.9136666666667
+100,157,30.1201666666667
+100,158,27.813
+100,159,30.5223333333333
+100,160,26.2466666666667
+100,161,29.9296666666667
+100,162,29.1253333333333
+100,163,34.8191666666667
+100,164,30.7128333333333
+100,165,28.8925
+100,166,27.8765
+100,167,22.0556666666667
+100,168,25.9503333333333
+100,169,30.4588333333333
+100,170,26.0138333333333
+100,171,25.1883333333333
+100,172,27.051
+100,173,29.6121666666667
+100,174,30.4165
+100,175,20.2988333333333
+100,176,26.9028333333333
+100,177,27.8553333333333
+100,178,27.6225
+100,179,22.2461666666667
+100,180,23.495
+100,181,25.8233333333333
+100,182,28.2786666666667
+100,183,25.4211666666667
+100,184,29.6121666666667
+100,185,24.8708333333333
+100,186,29.464
+100,187,28.8501666666667
+100,188,24.0453333333333
+100,189,27.0721666666667
+100,190,27.3261666666667
+100,191,24.1511666666667
+100,192,26.0985
+100,193,31.6441666666667
+100,194,28.8078333333333
+100,195,25.8656666666667
+100,196,26.543
+100,197,24.9131666666667
+100,198,25.8233333333333
+100,199,25.019
+100,200,30.4588333333333
+100,201,24.4051666666667
+100,202,32.9353333333333
+100,203,27.1568333333333
+100,204,30.5223333333333
+100,205,30.353
+100,206,23.5161666666667
+100,207,26.0985
+100,208,27.9611666666667
+100,209,23.4315
+100,210,30.0566666666667
+100,211,29.2946666666667
+100,212,25.4211666666667
+100,213,31.0515
+100,214,25.6963333333333
+100,215,32.893
+100,216,25.2306666666667
+100,217,27.1568333333333
+100,218,33.0835
+100,219,26.3948333333333
+100,220,28.0458333333333
+100,221,24.2358333333333
+100,222,31.242
+100,223,36.4913333333333
+100,224,33.0835
+100,225,27.6013333333333
+100,226,25.6751666666667
+100,227,33.5703333333333
+100,228,21.1878333333333
+100,229,28.5115
+100,230,22.1826666666667
+100,231,26.797
+100,232,31.5171666666667
+100,233,29.7391666666667
+100,234,25.6963333333333
+100,235,30.9668333333333
+100,236,30.1625
+100,237,33.5068333333333
+100,238,29.2735
+100,239,27.9823333333333
+100,240,26.5218333333333
+100,241,31.2631666666667
+100,242,24.8708333333333
+100,243,29.7603333333333
+100,244,27.5801666666667
+100,245,25.2306666666667
+100,246,33.0835
+100,247,26.8181666666667
+100,248,28.2151666666667
+100,249,25.9715
+100,250,31.9193333333333
+100,251,21.1243333333333
+100,252,23.0505
+100,253,26.5006666666667
+100,254,33.8243333333333
+100,255,22.2885
+100,256,30.1625
+100,257,29.6968333333333
+100,258,22.0556666666667
+100,259,32.5966666666667
+100,260,22.6483333333333
+100,261,25.654
+100,262,26.0561666666667
+100,263,31.9193333333333
+100,264,27.1145
+100,265,24.9766666666667
+100,266,28.2151666666667
+100,267,29.1253333333333
+100,268,25.2518333333333
+100,269,24.6591666666667
+100,270,25.1248333333333
+100,271,29.2311666666667
+100,272,28.7866666666667
+100,273,29.718
+100,274,28.9771666666667
+100,275,29.0618333333333
+100,276,26.4371666666667
+100,277,27.9188333333333
+100,278,27.3685
+100,279,39.37
+100,280,22.9235
+100,281,32.258
+100,282,26.1196666666667
+100,283,25.273
+100,284,31.1996666666667
+100,285,28.7231666666667
+100,286,30.9456666666667
+100,287,26.4795
+100,288,24.9131666666667
+100,289,26.3313333333333
+100,290,25.2941666666667
+100,291,28.448
+100,292,28.194
+100,293,21.463
+100,294,26.5641666666667
+100,295,24.2993333333333
+100,296,27.432
+100,297,31.6018333333333
+100,298,25.8868333333333
+100,299,28.194
+100,300,30.7763333333333
+100,301,35.6235
+100,302,27.7071666666667
+100,303,33.0835
+100,304,28.067
+100,305,27.1991666666667
+100,306,29.9931666666667
+100,307,22.9023333333333
+100,308,29.1676666666667
+100,309,26.0773333333333
+100,310,30.3318333333333
+100,311,28.3633333333333
+100,312,32.4273333333333
+100,313,29.0618333333333
+100,314,33.5915
+100,315,29.1888333333333
+100,316,28.6173333333333
+100,317,24.8285
+100,318,37.2956666666667
+100,319,28.5115
+100,320,27.6648333333333
+100,321,28.5326666666667
+100,322,24.765
+100,323,24.8285
+100,324,29.1041666666667
+100,325,31.5595
+100,326,31.8346666666667
+100,327,27.0086666666667
+100,328,24.9131666666667
+100,329,29.972
+100,330,27.1145
+100,331,26.0773333333333
+100,332,29.21
+100,333,23.0716666666667
+100,334,31.9828333333333
+100,335,30.9033333333333
+100,336,26.2043333333333
+100,337,29.2523333333333
+100,338,37.2533333333333
+100,339,24.9978333333333
+100,340,28.2151666666667
+100,341,23.9818333333333
+100,342,28.7655
+100,343,31.7711666666667
+100,344,24.9766666666667
+100,345,24.6591666666667
+100,346,21.9921666666667
+100,347,18.2456666666667
+100,348,21.1878333333333
+100,349,22.733
+100,350,26.9028333333333
+100,351,30.7551666666667
+100,352,23.3256666666667
+100,353,24.1935
+100,354,35.6658333333333
+100,355,35.3906666666667
+100,356,29.0406666666667
+100,357,28.3845
+100,358,35.7081666666667
+100,359,33.6338333333333
+100,360,26.1831666666667
+100,361,26.797
+100,362,28.7231666666667
+100,363,21.1031666666667
+100,364,28.829
+100,365,27.7706666666667
+100,366,32.3638333333333
+100,367,26.9875
+100,368,35.8775
+100,369,33.2951666666667
+100,370,26.9028333333333
+100,371,27.8976666666667
+100,372,23.8971666666667
+100,373,33.4645
+100,374,25.5693333333333
+100,375,27.1568333333333
+100,376,36.195
+100,377,33.2105
+100,378,36.0256666666667
+100,379,27.5166666666667
+100,380,29.2735
+100,381,27.4531666666667
+100,382,23.7701666666667
+100,383,34.9673333333333
+100,384,23.3891666666667
+100,385,24.6168333333333
+100,386,24.5956666666667
+100,387,25.5481666666667
+100,388,29.464
+100,389,23.6431666666667
+100,390,27.9611666666667
+100,391,30.9456666666667
+100,392,34.0148333333333
+100,393,29.21
+100,394,33.9936666666667
+100,395,27.8341666666667
+100,396,21.9286666666667
+100,397,25.527
+100,398,25.4846666666667
+100,399,22.6906666666667
+100,400,30.3106666666667
+100,401,29.3793333333333
+100,402,28.5115
+100,403,21.209
+100,404,28.9983333333333
+100,405,25.8233333333333
+100,406,24.1935
+100,407,27.7495
+100,408,26.4583333333333
+100,409,31.3478333333333
+100,410,28.956
+100,411,25.6328333333333
+100,412,25.4846666666667
+100,413,28.1516666666667
+100,414,28.4268333333333
+100,415,25.8445
+100,416,28.3633333333333
+100,417,33.401
+100,418,25.6116666666667
+100,419,22.4155
+100,420,27.5166666666667
+100,421,21.9921666666667
+100,422,28.3421666666667
+100,423,26.5853333333333
+100,424,28.5115
+100,425,25.2518333333333
+100,426,23.0928333333333
+100,427,32.0675
+100,428,28.7866666666667
+100,429,27.0721666666667
+100,430,26.162
+100,431,28.0035
+100,432,27.5378333333333
+100,433,29.7603333333333
+100,434,29.337
+100,435,27.6013333333333
+100,436,35.052
+100,437,32.1098333333333
+100,438,32.0886666666667
+100,439,21.6958333333333
+100,440,28.5326666666667
+100,441,30.0355
+100,442,29.4428333333333
+100,443,29.8873333333333
+100,444,27.4743333333333
+100,445,31.5595
+100,446,30.3318333333333
+100,447,23.5161666666667
+100,448,31.1785
+100,449,25.2306666666667
+100,450,26.4795
+100,451,29.337
+100,452,27.7071666666667
+100,453,28.3845
+100,454,26.289
+100,455,26.9663333333333
+100,456,27.178
+100,457,26.0138333333333
+100,458,24.257
+100,459,25.5693333333333
+100,460,24.4898333333333
+100,461,22.2673333333333
+100,462,27.3261666666667
+100,463,22.733
+100,464,25.019
+100,465,29.21
+100,466,33.7396666666667
+100,467,26.8605
+100,468,33.4856666666667
+100,469,26.162
+100,470,29.7603333333333
+100,471,21.6323333333333
+100,472,34.0571666666667
+100,473,27.2626666666667
+100,474,31.496
+100,475,26.9663333333333
+100,476,26.7335
+100,477,25.5693333333333
+100,478,24.892
+100,479,25.908
+100,480,26.289
+100,481,33.8455
+100,482,32.5543333333333
+100,483,30.0566666666667
+100,484,25.527
+100,485,24.1935
+100,486,24.3416666666667
+100,487,28.2786666666667
+100,488,24.892
+100,489,31.8135
+100,490,26.543
+100,491,20.4258333333333
+100,492,31.1785
+100,493,28.2998333333333
+100,494,30.6281666666667
+100,495,35.9198333333333
+100,496,25.6963333333333
+100,497,28.4903333333333
+100,498,26.6911666666667
+100,499,27.7071666666667
+100,500,27.7918333333333
+100,501,32.9353333333333
+100,502,31.8346666666667
+100,503,34.7345
+100,504,27.8976666666667
+100,505,31.0303333333333
+100,506,24.1935
+100,507,33.0623333333333
+100,508,29.718
+100,509,27.5166666666667
+100,510,23.9606666666667
+100,511,27.94
+100,512,31.0515
+100,513,20.5316666666667
+100,514,28.9983333333333
+100,515,24.2781666666667
+100,516,28.2998333333333
+100,517,29.845
+100,518,31.3478333333333
+100,519,29.1676666666667
+100,520,26.7758333333333
+100,521,28.8925
+100,522,27.4743333333333
+100,523,23.8336666666667
+100,524,25.9926666666667
+100,525,26.8605
+100,526,30.2048333333333
+100,527,29.3581666666667
+100,528,26.2255
+100,529,27.4531666666667
+100,530,29.21
+100,531,33.8666666666667
+100,532,24.4686666666667
+100,533,28.6385
+100,534,41.5501666666667
+100,535,25.527
+100,536,26.2466666666667
+100,537,35.052
+100,538,33.655
+100,539,24.8073333333333
+100,540,24.4263333333333
+100,541,31.115
+100,542,24.9131666666667
+100,543,20.2988333333333
+100,544,34.2053333333333
+100,545,28.9983333333333
+100,546,27.1568333333333
+100,547,27.5378333333333
+100,548,29.337
+100,549,32.8718333333333
+100,550,34.1206666666667
+100,551,27.178
+100,552,24.765
+100,553,36.2161666666667
+100,554,32.8718333333333
+100,555,27.5378333333333
+100,556,27.305
+100,557,28.1093333333333
+100,558,30.6916666666667
+100,559,28.0458333333333
+100,560,30.1625
+100,561,30.099
+100,562,26.6276666666667
+100,563,27.7706666666667
+100,564,28.575
+100,565,29.8026666666667
+100,566,30.5858333333333
+100,567,33.4433333333333
+100,568,23.9183333333333
+100,569,33.6973333333333
+100,570,34.4381666666667
+100,571,29.3581666666667
+100,572,27.4531666666667
+100,573,27.6436666666667
+100,574,26.7335
+100,575,23.9606666666667
+100,576,29.083
+100,577,28.321
+100,578,26.1831666666667
+100,579,26.1831666666667
+100,580,25.9291666666667
+100,581,29.591
+100,582,25.5481666666667
+100,583,31.3478333333333
+100,584,24.7438333333333
+100,585,22.5636666666667
+100,586,31.9405
+100,587,28.8925
+100,588,31.2843333333333
+100,589,30.1201666666667
+100,590,24.5956666666667
+100,591,26.5006666666667
+100,592,29.2523333333333
+100,593,26.1831666666667
+100,594,28.9348333333333
+100,595,26.2466666666667
+100,596,30.3953333333333
+100,597,27.3685
+100,598,24.0876666666667
+100,599,22.2885
+100,600,20.2141666666667
+100,601,29.5698333333333
+100,602,35.2425
+100,603,36.3431666666667
+100,604,29.9931666666667
+100,605,24.9766666666667
+100,606,24.9555
+100,607,28.067
+100,608,27.3473333333333
+100,609,27.6013333333333
+100,610,30.2048333333333
+100,611,25.6751666666667
+100,612,31.8981666666667
+100,613,29.2946666666667
+100,614,27.1145
+100,615,28.7443333333333
+100,616,29.9931666666667
+100,617,24.9343333333333
+100,618,23.4526666666667
+100,619,28.2786666666667
+100,620,21.3783333333333
+100,621,28.2575
+100,622,29.5698333333333
+100,623,32.131
+100,624,27.6225
+100,625,30.0778333333333
+100,626,26.8393333333333
+100,627,28.6596666666667
+100,628,30.861
+100,629,26.4583333333333
+100,630,26.2043333333333
+100,631,27.5801666666667
+100,632,27.2838333333333
+100,633,33.2528333333333
+100,634,26.8181666666667
+100,635,23.6643333333333
+100,636,31.6441666666667
+100,637,25.2518333333333
+100,638,26.3736666666667
+100,639,25.3153333333333
+100,640,30.48
+100,641,32.7871666666667
+100,642,25.7598333333333
+100,643,29.5275
+100,644,21.59
+100,645,32.7448333333333
+100,646,32.131
+100,647,33.9936666666667
+100,648,24.1935
+100,649,31.369
+100,650,30.607
+100,651,26.6911666666667
+100,652,32.7448333333333
+100,653,25.3153333333333
+100,654,30.1201666666667
+100,655,29.0406666666667
+100,656,29.0195
+100,657,25.4846666666667
+100,658,35.2425
+100,659,28.1093333333333
+100,660,27.0933333333333
+100,661,26.2466666666667
+100,662,27.9611666666667
+100,663,28.4903333333333
+100,664,26.4583333333333
+100,665,29.3793333333333
+100,666,26.2043333333333
+100,667,34.1841666666667
+100,668,28.4903333333333
+100,669,27.4743333333333
+100,670,30.6916666666667
+100,671,33.6338333333333
+100,672,32.2368333333333
+100,673,29.3793333333333
+100,674,27.6648333333333
+100,675,24.5956666666667
+100,676,27.7918333333333
+100,677,22.8176666666667
+100,678,31.9405
+100,679,29.4428333333333
+100,680,27.8553333333333
+100,681,29.21
+100,682,29.8661666666667
+100,683,34.544
+100,684,26.3101666666667
+100,685,30.9033333333333
+100,686,27.7283333333333
+100,687,36.8723333333333
+100,688,27.1568333333333
+100,689,25.9926666666667
+100,690,32.512
+100,691,29.8026666666667
+100,692,29.0618333333333
+100,693,28.575
+100,694,27.7283333333333
+100,695,22.0556666666667
+100,696,24.9766666666667
+100,697,25.2306666666667
+100,698,34.6921666666667
+100,699,26.9028333333333
+100,700,28.7231666666667
+100,701,23.7066666666667
+100,702,30.7763333333333
+100,703,20.4681666666667
+100,704,27.2626666666667
+100,705,28.9983333333333
+100,706,33.6761666666667
+100,707,28.194
+100,708,28.5115
+100,709,24.0876666666667
+100,710,29.2523333333333
+100,711,28.1516666666667
+100,712,31.9405
+100,713,22.6695
+100,714,28.4903333333333
+100,715,37.6131666666667
+100,716,27.1145
+100,717,27.1145
+100,718,29.1888333333333
+100,719,28.8925
+100,720,33.0835
+100,721,27.1145
+100,722,29.3158333333333
+100,723,28.194
+100,724,24.3205
+100,725,25.2941666666667
+100,726,30.861
+100,727,24.8496666666667
+100,728,27.686
+100,729,23.5373333333333
+100,730,32.7871666666667
+100,731,26.7335
+100,732,29.2735
+100,733,27.813
+100,734,23.114
+100,735,29.9085
+100,736,28.6596666666667
+100,737,30.1413333333333
+100,738,29.2311666666667
+100,739,29.3581666666667
+100,740,30.1413333333333
+100,741,30.2683333333333
+100,742,24.6803333333333
+100,743,31.3901666666667
+100,744,22.1615
+100,745,23.7701666666667
+100,746,29.1676666666667
+100,747,23.6431666666667
+100,748,24.4898333333333
+100,749,27.94
+100,750,22.5425
+100,751,32.0675
+100,752,29.8661666666667
+100,753,27.2203333333333
+100,754,26.4583333333333
+100,755,21.2513333333333
+100,756,23.8125
+100,757,33.3375
+100,758,26.5853333333333
+100,759,36.9993333333333
+100,760,19.9601666666667
+100,761,26.0985
+100,762,29.4851666666667
+100,763,22.9658333333333
+100,764,31.4748333333333
+100,765,21.7593333333333
+100,766,20.1718333333333
+100,767,24.9343333333333
+100,768,25.2518333333333
+100,769,34.9885
+100,770,24.3416666666667
+100,771,26.7123333333333
+100,772,24.8285
+100,773,20.9338333333333
+100,774,26.3948333333333
+100,775,29.8238333333333
+100,776,27.813
+100,777,27.9611666666667
+100,778,33.8455
+100,779,21.7381666666667
+100,780,29.7391666666667
+100,781,30.988
+100,782,30.2471666666667
+100,783,31.9193333333333
+100,784,24.7015
+100,785,29.0195
+100,786,24.1511666666667
+100,787,28.8713333333333
+100,788,32.1521666666667
+100,789,30.3741666666667
+100,790,28.1093333333333
+100,791,28.829
+100,792,23.7701666666667
+100,793,24.1511666666667
+100,794,22.2038333333333
+100,795,27.8553333333333
+100,796,26.8605
+100,797,33.6338333333333
+100,798,26.035
+100,799,27.5801666666667
+100,800,26.1196666666667
+100,801,25.7386666666667
+100,802,37.2533333333333
+100,803,32.7871666666667
+100,804,27.4108333333333
+100,805,30.607
+100,806,25.4423333333333
+100,807,27.178
+100,808,25.0613333333333
+100,809,26.0561666666667
+100,810,26.1408333333333
+100,811,27.6436666666667
+100,812,26.8393333333333
+100,813,32.1098333333333
+100,814,30.5646666666667
+100,815,28.9983333333333
+100,816,33.6973333333333
+100,817,27.813
+100,818,23.8125
+100,819,28.4691666666667
+100,820,25.6751666666667
+100,821,30.3741666666667
+100,822,23.7066666666667
+100,823,29.3793333333333
+100,824,23.3891666666667
+100,825,25.4211666666667
+100,826,23.0928333333333
+100,827,31.0091666666667
+100,828,23.5796666666667
+100,829,31.3901666666667
+100,830,25.5905
+100,831,29.1676666666667
+100,832,26.9028333333333
+100,833,27.5166666666667
+100,834,31.1573333333333
+100,835,25.8868333333333
+100,836,23.1563333333333
+100,837,26.5218333333333
+100,838,31.8981666666667
+100,839,27.0298333333333
+100,840,28.0458333333333
+100,841,23.3891666666667
+100,842,28.1516666666667
+100,843,24.9131666666667
+100,844,38.3116666666667
+100,845,25.4846666666667
+100,846,31.0515
+100,847,21.8863333333333
+100,848,21.6323333333333
+100,849,25.527
+100,850,28.6596666666667
+100,851,31.369
+100,852,26.543
+100,853,22.86
+100,854,28.0881666666667
+100,855,22.9446666666667
+100,856,32.1733333333333
+100,857,31.7288333333333
+100,858,27.8765
+100,859,26.67
+100,860,22.2461666666667
+100,861,23.368
+100,862,26.2255
+100,863,28.194
+100,864,29.9085
+100,865,29.8238333333333
+100,866,23.9606666666667
+100,867,24.1723333333333
+100,868,34.0571666666667
+100,869,32.9141666666667
+100,870,30.7128333333333
+100,871,26.2678333333333
+100,872,29.1465
+100,873,27.1568333333333
+100,874,27.2626666666667
+100,875,29.0618333333333
+100,876,32.5966666666667
+100,877,22.0556666666667
+100,878,24.7226666666667
+100,879,28.7231666666667
+100,880,27.4743333333333
+100,881,26.8605
+100,882,28.0881666666667
+100,883,26.416
+100,884,33.6126666666667
+100,885,29.5486666666667
+100,886,29.0195
+100,887,28.2363333333333
+100,888,24.638
+100,889,24.5745
+100,890,29.9508333333333
+100,891,23.7913333333333
+100,892,24.9978333333333
+100,893,30.099
+100,894,30.2683333333333
+100,895,27.7918333333333
+100,896,27.0933333333333
+100,897,28.3845
+100,898,18.6901666666667
+100,899,33.4645
+100,900,29.2946666666667
+100,901,28.5115
+100,902,30.4588333333333
+100,903,26.8605
+100,904,32.1098333333333
+100,905,26.797
+100,906,28.4903333333333
+100,907,23.9183333333333
+100,908,22.5001666666667
+100,909,36.4278333333333
+100,910,25.3576666666667
+100,911,28.6808333333333
+100,912,26.6065
+100,913,27.5801666666667
+100,914,25.781
+100,915,21.9498333333333
+100,916,26.5218333333333
+100,917,26.2255
+100,918,25.2941666666667
+100,919,33.5915
+100,920,24.8496666666667
+100,921,23.1351666666667
+100,922,23.749
+100,923,29.718
+100,924,33.3586666666667
+100,925,25.8868333333333
+100,926,26.9663333333333
+100,927,31.0515
+100,928,39.2218333333333
+100,929,23.9606666666667
+100,930,24.4686666666667
+100,931,27.5378333333333
+100,932,28.3845
+100,933,31.2631666666667
+100,934,30.5858333333333
+100,935,27.1356666666667
+100,936,30.6493333333333
+100,937,27.7706666666667
+100,938,24.9555
+100,939,22.86
+100,940,29.5275
+100,941,27.4108333333333
+100,942,38.0365
+100,943,26.5006666666667
+100,944,30.0355
+100,945,27.1568333333333
+100,946,29.591
+100,947,24.638
+100,948,28.0458333333333
+100,949,29.083
+100,950,27.2838333333333
+100,951,27.2203333333333
+100,952,28.1516666666667
+100,953,26.5006666666667
+100,954,22.5848333333333
+100,955,29.21
+100,956,25.019
+100,957,25.7175
+100,958,34.9673333333333
+100,959,28.4903333333333
+100,960,24.4263333333333
+100,961,33.1681666666667
+100,962,27.8341666666667
+100,963,24.003
+100,964,23.8971666666667
+100,965,32.0675
+100,966,29.4216666666667
+100,967,32.004
+100,968,19.3463333333333
+100,969,24.9766666666667
+100,970,26.6911666666667
+100,971,28.5326666666667
+100,972,33.2951666666667
+100,973,29.3158333333333
+100,974,26.2678333333333
+100,975,32.4273333333333
+100,976,24.5745
+100,977,22.2461666666667
+100,978,31.0938333333333
+100,979,35.4753333333333
+100,980,24.1088333333333
+100,981,29.464
+100,982,25.5058333333333
+100,983,34.2688333333333
+100,984,19.7273333333333
+100,985,28.2998333333333
+100,986,30.5011666666667
+100,987,22.5001666666667
+100,988,27.2203333333333
+100,989,40.259
+100,990,21.9286666666667
+100,991,28.3421666666667
+100,992,25.146
+100,993,27.051
+100,994,23.4103333333333
+100,995,19.939
+100,996,25.4
+100,997,24.3628333333333
+100,998,31.7288333333333
+100,999,29.8873333333333
+100,1000,23.749
diff --git a/materials/worksheet_04/tests_worksheet_04.R b/materials/worksheet_04/tests_worksheet_04.R
new file mode 100644
index 0000000..b29d681
--- /dev/null
+++ b/materials/worksheet_04/tests_worksheet_04.R
@@ -0,0 +1,741 @@
+library(digest)
+library(testthat)
+
+test_1.0 <- function() {
+ test_that('Did not assign answer to an object called "answer1.0"', {
+ expect_true(exists("answer1.0"))
+ })
+
+ test_that('Solution should be a string of ALL the following characters ("A", "B", "C", "D", and "E")', {
+ expect_match(answer1.0, "^[aA|bB|cC|dD|eE]{5}$")
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer1.0)), "aa817d77bfc37cf923b17fe3465952f0")
+ })
+
+ print("Success!")
+}
+
+test_1.1 <- function() {
+ test_that('Did not assign answer to an object called "answer1.1"', {
+ expect_true(exists("answer1.1"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", or "D")', {
+ expect_match(answer1.1, "a|b|c|d", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer1.1))
+ if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Think about how the shape of the bootstrap distribution is affected by sample size")
+ } else if (answer_hash == "6e7a8c1c098e8817e3df3fd1b21149d1") {
+ print("The centre of the bootstrap distribution may not be the same, but the standard deviation is a good estimate of the standard error of an estimator")
+ } else if (answer_hash == "d110f00cfb1b248e835137025804a23b") {
+ print("Think about the pennies example fromv modern dive")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "127a2ec00989b9f7faf671ed470be7f8")
+ })
+
+ print("Success!")
+}
+
+test_2.0 <- function() {
+ test_that('Did not assign answer to an object called "pop_mean"', {
+ expect_true(exists("pop_mean"))
+ })
+ test_that("Answer object should be a single number, not a dataframe", {
+ expect_false("data.frame" %in% class(pop_mean))
+ })
+ answer_as_numeric <- as.numeric(pop_mean)
+ test_that("Solution should be a single number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000000)), "47ec131903ad9e44ca74761a81ba7e29")
+ })
+
+ print("Success!")
+}
+
+test_2.1 <- function() {
+ test_that('Did not assign answer to an object called "answer2.1"', {
+ expect_true(exists("answer2.1"))
+ })
+
+ answer_as_numeric <- as.numeric(answer2.1)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution should be an integer", {
+ expect_true(answer_as_numeric %% 1 == 0)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_true(digest(as.integer(answer_as_numeric)) == "7c7124efff5c7039a1b1e7cba65c5379" | digest(as.integer(answer_as_numeric)) == "9d08099943f8627959cfb8ecee0d2f5d" | digest(as.integer(answer_as_numeric)) == "8eaca7c9b35d05ab15c9125bc92372fa")
+ })
+
+ print("Success!")
+}
+
+test_2.2 <- function() {
+ test_that('Did not assign answer to an object called "sample_1"', {
+ expect_true(exists("sample_1"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sample_1))
+ })
+
+ expected_colnames <- c("diameter")
+ given_colnames <- colnames(sample_1)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sample_1))), "2bbdc9479e5ddf03425adc57599af655")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sample_1$diameter))), "1d7b23b077358cf4fa53bf3d1e1d81d8")
+ })
+
+ print("Success!")
+}
+
+test_2.3 <- function() {
+ test_that('Did not assign answer to an object called "upper_quantile"', {
+ expect_true(exists("upper_quantile"))
+ })
+
+ answer_as_numeric <- as.numeric(upper_quantile)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric) * 1000000), "f7be34588ada5ef454b8117a06dd0d33")
+ })
+
+ print("Success!")
+}
+
+test_2.4 <- function() {
+ test_that('Did not assign answer to an object called "answer2.4"', {
+ expect_true(exists("answer2.4"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer2.4, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.4))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("Revisit the definition of a quantile")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_2.5 <- function() {
+ test_that('Did not assign answer to an object called "lower_quantile"', {
+ expect_true(exists("lower_quantile"))
+ })
+
+ answer_as_numeric <- as.numeric(lower_quantile)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric) * 1000000), "50f9a6d45084d41172a5f0fefc4178a5")
+ })
+
+ print("Success!")
+}
+
+test_2.6 <- function() {
+ test_that('Did not assign answer to an object called "sample_quantile_plot"', {
+ expect_true(exists("sample_quantile_plot"))
+ })
+ properties <- c(sample_quantile_plot$layers[[1]]$mapping, sample_quantile_plot$mapping)
+
+ test_that("Plot should have diameter on the x-axis", {
+ expect_true("diameter" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot does not have the correct layers", {
+ expect_true("GeomBar" %in% class(sample_quantile_plot$layers[[1]]$geom))
+ expect_true("GeomVline" %in% class(sample_quantile_plot$layers[[2]]$geom))
+ expect_true("GeomVline" %in% class(sample_quantile_plot$layers[[3]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", sample_quantile_plot$layers[[1]])[["stat_params"]][["binwidth"]]) * 1000),
+ "998633da79c2a3f44fe6482751ba47e1"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(sample_quantile_plot$data)), "2bbdc9479e5ddf03425adc57599af655")
+ expect_equal(digest(as.integer(sum(sample_quantile_plot$data$diameter) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ })
+
+ test_that("Vertical line layers are not in the correct locations", {
+ expect_equal(digest(as.numeric(sample_quantile_plot$layers[[2]]$data) * 1000000), "cbca884fded8a271a9d2c0cafee98a90")
+ expect_equal(digest(as.numeric(sample_quantile_plot$layers[[3]]$data) * 1000000), "e202f4968c4813a4470552909accad76")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(sample_quantile_plot$labels$x == "diameter")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(sample_quantile_plot$labels))
+ })
+
+ print("Success!")
+}
+
+test_2.7 <- function() {
+ test_that('Did not assign answer to an object called "p_below"', {
+ expect_true(exists("p_below"))
+ })
+
+ answer_as_numeric <- as.numeric(p_below)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000000)), "19fdc64eb993dca43f6f6d5136ae0208")
+ })
+
+ print("Success!")
+}
+
+test_2.8 <- function() {
+ test_that('Did not assign answer to an object called "p_between"', {
+ expect_true(exists("p_between"))
+ })
+
+ answer_as_numeric <- as.numeric(p_between)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric * 1000000)), "f4ea81e7a356c1aea215c7f4295cc2e2")
+ })
+
+ print("Success!")
+}
+
+test_2.9 <- function() {
+ test_that('Did not assign answer to an object called "answer2.9"', {
+ expect_true(exists("answer2.9"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", or "D")', {
+ expect_match(answer2.9, "a|b|c|d", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.9))
+ if (answer_hash == "127a2ec00989b9f7faf671ed470be7f8") {
+ print("If 25% of the observations fall below lower_quantile and 25% fall above upper_quantile, what proportion lie between the two?")
+ } else if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba") {
+ print("Revisit the definition of a quantile: if 75% of the observations lie below, what proportion lie above?")
+ } else if (answer_hash == "d110f00cfb1b248e835137025804a23b") {
+ print("Revisit the definition of a quantile")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "6e7a8c1c098e8817e3df3fd1b21149d1")
+ })
+
+ print("Success!")
+}
+
+test_2.10 <- function() {
+ test_that('Did not assign answer to an object called "answer2.10"', {
+ expect_true(exists("answer2.10"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer2.10, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer2.10))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("Revisit the definition of quantiles. If 10% of the observation lie below the lower quantile and 40% lie above the upper quantile, what proportion lie between?")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_3.0 <- function() {
+ test_that('Did not assign answer to an object called "sample_2"', {
+ expect_true(exists("sample_2"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sample_2))
+ })
+
+ expected_colnames <- c("diameter")
+ given_colnames <- colnames(sample_2)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sample_2))), "7d2842cab7725fd8f382293e410d42b2")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sample_2$diameter) * 1000000)), "e1e301e732cbe4988c21ffec8bc2c7e3")
+ })
+
+ print("Success!")
+}
+
+test_3.1 <- function() {
+ test_that('Did not assign answer to an object called "bootstrap_dist"', {
+ expect_true(exists("bootstrap_dist"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(bootstrap_dist))
+ })
+
+ expected_colnames <- c("mean_diameter")
+ given_colnames <- colnames(bootstrap_dist)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(bootstrap_dist))), "b6a6227038bf9be67533a45a6511cc7e")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(bootstrap_dist$mean_diameter) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ })
+
+ print("Success!")
+}
+
+test_3.2 <- function() {
+ test_that('Did not assign answer to an object called "ci"', {
+ expect_true(exists("ci"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(ci))
+ })
+
+ expected_colnames <- c("ci_lower", "ci_upper")
+ given_colnames <- colnames(ci)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(ci$ci_lower) * 1000000), "d4ef090268118448c4f4b8f7c2cef425")
+ expect_equal(digest(as.integer(ci$ci_upper) * 1000000), "9e62aede040a3339d7fe4f57cb3b61da")
+ })
+
+ print("Success!")
+}
+
+test_3.3 <- function() {
+ test_that('Did not assign answer to an object called "ci_plot"', {
+ expect_true(exists("ci_plot"))
+ })
+ properties <- c(ci_plot$layers[[1]]$mapping, ci_plot$mapping)
+
+ test_that("Plot should have mean_diameter on the x-axis", {
+ expect_true("mean_diameter" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Plot does not have the correct layers", {
+ expect_true("GeomBar" %in% class(ci_plot$layers[[1]]$geom))
+ expect_true("GeomVline" %in% class(ci_plot$layers[[3]]$geom))
+ })
+
+ test_that("Plot does not have the correct bin width", {
+ expect_equal(
+ digest(as.integer(mget("stat_params", ci_plot$layers[[1]])[["stat_params"]][["binwidth"]])),
+ "4b5630ee914e848e8d07221556b0a2fb"
+ )
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(nrow(ci_plot$data)), "b6a6227038bf9be67533a45a6511cc7e")
+ expect_equal(digest(as.integer(sum(ci_plot$data$mean_diameter) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(ci_plot$labels$x == "mean_diameter")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(ci_plot$labels))
+ })
+
+ print("Success!")
+}
+
+test_3.4 <- function() {
+ test_that('Did not assign answer to an object called "answer3.4"', {
+ expect_true(exists("answer3.4"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.4, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.4))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("Take a look at the mapping for the different layers of the plot")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_3.5 <- function() {
+ test_that('Did not assign answer to an object called "answer3.5"', {
+ expect_true(exists("answer3.5"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.5, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.5))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Compare the ranges of the sample ID column")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_3.6 <- function() {
+ test_that('Did not assign answer to an object called "answer3.6"', {
+ expect_true(exists("answer3.6"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.6, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.6))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("Compare the ranges of the sample ID column")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_3.7 <- function() {
+ test_that('Did not assign answer to an object called "sampling_dist_estimate"', {
+ expect_true(exists("sampling_dist_estimate"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(sampling_dist_estimate))
+ })
+
+ expected_colnames <- c("replicate", "bootstrap_mean")
+ given_colnames <- colnames(sampling_dist_estimate)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(sampling_dist_estimate))), "b6a6227038bf9be67533a45a6511cc7e")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(sampling_dist_estimate$bootstrap_mean) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ })
+
+ print("Success!")
+}
+
+test_3.8 <- function() {
+ test_that('Did not assign answer to an object called "intervals"', {
+ expect_true(exists("intervals"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(intervals))
+ })
+
+ expected_colnames <- c("sample_id", "ci_lower", "ci_upper")
+ given_colnames <- colnames(intervals)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(intervals))), "5d6e7fe43b3b73e5fd2961d5162486fa")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(intervals$ci_lower) * 100000)), "475863f7b59a7ac90ba822dc3f1e28f3")
+ expect_equal(digest(as.integer(sum(intervals$ci_upper) * 100000)), "f487416aca9e23b69bc7dee15ed812ca")
+ })
+
+ print("Success!")
+}
+
+test_3.9 <- function() {
+ test_that('Did not assign answer to an object called "intervals_captured"', {
+ expect_true(exists("intervals_captured"))
+ })
+
+ test_that("Solution should be a data frame", {
+ expect_true("data.frame" %in% class(intervals_captured))
+ })
+
+ expected_colnames <- c("sample_id", "ci_lower", "ci_upper", "captured")
+ given_colnames <- colnames(intervals_captured)
+ test_that("Data frame does not have the correct columns", {
+ expect_equal(length(setdiff(
+ union(expected_colnames, given_colnames),
+ intersect(expected_colnames, given_colnames)
+ )), 0)
+ })
+
+ test_that("Data frame does not contain the correct number of rows", {
+ expect_equal(digest(as.integer(nrow(intervals_captured))), "5d6e7fe43b3b73e5fd2961d5162486fa")
+ })
+
+ test_that("Data frame does not contain the correct data", {
+ expect_equal(digest(as.integer(sum(intervals_captured$ci_lower) * 1000000)), "5e2e6071008dd2bd800537489b3a59c5")
+ expect_equal(digest(as.integer(sum(intervals_captured$ci_upper) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ expect_equal(digest(as.integer(sum(intervals_captured$captured))), "e444a32cd8c806b12b8baff9696a342f")
+ })
+
+ print("Success!")
+}
+
+test_3.10 <- function() {
+ test_that('Did not assign answer to an object called "many_ci_plot"', {
+ expect_true(exists("many_ci_plot"))
+ })
+ properties <- c(many_ci_plot$layers[[1]]$mapping, many_ci_plot$mapping)
+
+ test_that("Lower boundary of x-axis segments should be ci_lower", {
+ expect_true("ci_lower" == rlang::get_expr(properties$x))
+ })
+
+ test_that("Upper boundary of x-axis segments should be ci_upper", {
+ expect_true("ci_upper" == rlang::get_expr(properties$xend))
+ })
+
+ test_that("Plot does not use the correct data", {
+ expect_equal(digest(as.integer(sum(many_ci_plot$data$ci_lower) * 1000000)), "5e2e6071008dd2bd800537489b3a59c5")
+ expect_equal(digest(as.integer(sum(many_ci_plot$data$ci_upper) * 1000000)), "c7f66da1cae4f223b9bae717f05900f7")
+ expect_equal(digest(as.integer(sum(many_ci_plot$data$captured))), "e444a32cd8c806b12b8baff9696a342f")
+ })
+
+ test_that("x-axis label should be descriptive and human readable", {
+ expect_false(ci_plot$labels$x == "ci_lower")
+ })
+
+ test_that("Plot should have a title", {
+ expect_true("title" %in% names(ci_plot$labels))
+ })
+
+ print("Success!")
+}
+
+test_3.11 <- function() {
+ test_that('Did not assign answer to an object called "answer3.11"', {
+ expect_true(exists("answer3.11"))
+ })
+
+ answer_as_numeric <- as.numeric(answer3.11)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution should be an integer", {
+ expect_true(answer_as_numeric %% 1 == 0)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric)), "e444a32cd8c806b12b8baff9696a342f")
+ })
+
+ print("Success!")
+}
+
+test_3.12 <- function() {
+ test_that('Did not assign answer to an object called "answer3.12"', {
+ expect_true(exists("answer3.12"))
+ })
+
+ answer_as_numeric <- as.numeric(answer3.12)
+ test_that("Solution should be a number", {
+ expect_false(is.na(answer_as_numeric))
+ })
+
+ test_that("Solution should be an integer", {
+ expect_true(answer_as_numeric %% 1 == 0)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(as.integer(answer_as_numeric)), "5ea3aa881cac20eac898460bc769efae")
+ })
+
+ print("Success!")
+}
+
+test_3.13 <- function() {
+ test_that('Did not assign answer to an object called "answer3.13"', {
+ expect_true(exists("answer3.13"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer3.13, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer3.13))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("These are two common interpretations of a confidence interval. HOWEVER, note that we DO NOT say 'The interval has a 90% CHANCE OF CAPTURING THE TRUE PARAMETER'.")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_4.0 <- function() {
+ test_that('Did not assign answer to an object called "answer4.0"', {
+ expect_true(exists("answer4.0"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer4.0, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.0))
+ if (answer_hash == "05ca18b596514af73f6880309a21b5dd") {
+ print("This is a common interpretation of confidence intervals. Once an interval is calculated, it either captures or does not capture the true parameter (i.e., the probability of the interval capturing the interval is either 0 or 1)")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d2a90307aac5ae8d0ef58e2fe730d38b")
+ })
+
+ print("Success!")
+}
+
+test_4.1 <- function() {
+ test_that('Did not assign answer to an object called "answer4.1"', {
+ expect_true(exists("answer4.1"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", "D", "E", "F", "G", "H", "I")', {
+ expect_match(answer4.1, "a|b|c|d|e|f|g|h|i", ignore.case = TRUE)
+ })
+
+ test_that("Solution is incorrect", {
+ expect_equal(digest(tolower(answer4.1)), "fe98eba4312fd761affde1df9b1b51ea")
+ })
+
+ print("Success!")
+}
+
+test_4.2 <- function() {
+ test_that('Did not assign answer to an object called "answer4.2"', {
+ expect_true(exists("answer4.2"))
+ })
+
+ test_that('Solution should be "true" or "false"', {
+ expect_match(answer4.2, "true|false", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.2))
+ if (answer_hash == "d2a90307aac5ae8d0ef58e2fe730d38b") {
+ print("So long as the proportion of the bootstrap distribution that falls between the two quantiles is equal to the confidence level of the interval, the confidence interval is still valid and we can interpret it the same way!")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "05ca18b596514af73f6880309a21b5dd")
+ })
+
+ print("Success!")
+}
+
+test_4.3 <- function() {
+ test_that('Did not assign answer to an object called "answer4.3"', {
+ expect_true(exists("answer4.3"))
+ })
+
+ test_that('Solution should be a single character ("A", "B", "C", or "D")', {
+ expect_match(answer4.3, "a|b|c|d", ignore.case = TRUE)
+ })
+
+ answer_hash <- digest(tolower(answer4.3))
+ if (answer_hash == "127a2ec00989b9f7faf671ed470be7f8") {
+ print("Is this more likely than the other potential confidence level?")
+ } else if (answer_hash == "ddf100612805359cd81fdc5ce3b9fbba" | answer_hash == "6e7a8c1c098e8817e3df3fd1b21149d1") {
+ print("Think about how the confidence level relates to the proportion of intervals that would capture the true parameter if you calculated many, many confidence intervals.")
+ }
+
+ test_that("Solution is incorrect", {
+ expect_equal(answer_hash, "d110f00cfb1b248e835137025804a23b")
+ })
+
+ print("Success!")
+}
diff --git a/materials/worksheet_04/worksheet_04.ipynb b/materials/worksheet_04/worksheet_04.ipynb
new file mode 100644
index 0000000..ad081d9
--- /dev/null
+++ b/materials/worksheet_04/worksheet_04.ipynb
@@ -0,0 +1,2903 @@
+{
+ "cells": [
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "183a2e078152dd161a30387b5a0e5db4",
+ "grade": false,
+ "grade_id": "cell-c3be035a676e3d8f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "# Worksheet 4: Confidence Intervals via Bootstrapping"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "97171ab5adfcd750c67c4bb92da174c2",
+ "grade": false,
+ "grade_id": "cell-e74e47156fd30ffe",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "#### Lecture and Tutorial Learning Goals:\n",
+ "From this section, students are expected to be able to:\n",
+ "\n",
+ "1. Define what a confidence interval is and why we want to generate one.\n",
+ "2. Explain how the bootstrap sampling distribution can be used to create confidence intervals.\n",
+ "3. Write a computer script to calculate confidence intervals for a population parameter using bootstrapping.\n",
+ "4. Effectively visualize point estimates and confidence intervals.\n",
+ "5. Interpret and explain results from confidence intervals.\n",
+ "6. Discuss the potential limitations of these methods."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "1472cf43296097795109b54543e4eee0",
+ "grade": false,
+ "grade_id": "cell-e3dd9d74ab20965b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "library(cowplot)\n",
+ "library(datateachr)\n",
+ "library(infer)\n",
+ "library(repr)\n",
+ "library(tidyverse)\n",
+ "source(\"tests_worksheet_04.R\")"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f7e7f33d097396294395d7212ef07a16",
+ "grade": false,
+ "grade_id": "cell-04657c2d7e49dc5d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 1. Short Recap & Warm-Up\n",
+ "\n",
+ "Before we start exploring the new material for this week, let's remind ourselves of some of the most important points that we covered in the previous week by answering a couple of questions."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "e84f69315a3126d27024d3117f6632c3",
+ "grade": false,
+ "grade_id": "cell-277aef32f735ac0e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Consider the following statements pertaining to some concepts that we have learned about so far: \n",
+ "\n",
+ "---\n",
+ "\n",
+ "- From a given sample, we obtain a point estimate that estimates a (1) `...`.\n",
+ "\n",
+ "- (2) `...` is a function (depends on) of the sample, and its standard deviation is called the standard error.\n",
+ "\n",
+ "- From bootstrap samples, we obtain bootstrap distribution, which (3) `...` the sampling distribution.\n",
+ "\n",
+ "- The (4) `...` of the bootstrap distribution estimates the (5)`...` of a statistic.\n",
+ "\n",
+ "---\n",
+ "\n",
+ "Notice that some terms are missing, as indicated by the five blanks (`...`). Your job is to match the following terms with their appropriate locations in the diagram:\n",
+ "\n",
+ "A. Standard deviation\n",
+ "\n",
+ "B. Standard error\n",
+ "\n",
+ "C. Estimator\n",
+ "\n",
+ "D. Estimates\n",
+ "\n",
+ "E. Parameter\n",
+ "\n",
+ "Your answer should be a string containing the letters associated with the terms **in the same order as they would appear above:** `(1)(2)(3)(4)(5)`. Each letter must be used exactly once. For example, one potential solution is `\"ABCDE\"`.\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.0`. Your answer should be a string containing the letters \"A\", \"B\", \"C\", \"D\", and \"E\" in any order._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7d68b56e6852681b46c0bef0ca97cae9",
+ "grade": false,
+ "grade_id": "cell-1727cffb8fad502f",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.0 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "1861854a0a5451c2ac811312d881821e",
+ "grade": true,
+ "grade_id": "cell-44068c9ca1db48aa",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "45ef2eabad40d15b0c17912520d44a88",
+ "grade": false,
+ "grade_id": "cell-eea64fe8856b291f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 1.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Which statment below is **not** true?\n",
+ "\n",
+ "A. Given a sample of size 100, we could get a useful estimate of the sampling distribution for samples of size 100 by taking many bootstrap samples of size 70 from the original sample.\n",
+ "\n",
+ "B. As sample size increases, the standard deviation of the boostrap distribution resulting from a given sample generally decreases.\n",
+ "\n",
+ "C. The standard deviation of a bootstrap distribution can provide a reliable estimate of the standard error of an estimator, even if the estimator's distribution is asymmetrical.\n",
+ "\n",
+ "D. The procedure for drawing a normal sample and a bootstrap sample are very similar, with the exception of where we sample from, and the type of sampling (with vs. without replacement).\n",
+ "\n",
+ "_Assign your answer to an object called `answer1.1`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2fe9c30eec4bb5eaf011a71050add8c2",
+ "grade": false,
+ "grade_id": "cell-6e7c99c9098e9e01",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer1.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6215c6106144eca0b5a679ae057a300f",
+ "grade": true,
+ "grade_id": "cell-0e9dc9ae6c2a29f4",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_1.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "7106f48195e0b39444f688ef4640e15f",
+ "grade": false,
+ "grade_id": "cell-0ba462b13e472a93",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 2. Introduction to Confidence Intervals\n",
+ "\n",
+ "So far, we have spent a lot of time understanding sampling distributions as well as one method used to estimate them (bootstrapping). But what's the point of sampling distributions in reality? We know that it tells us about **sampling variation**, which we quantify as the **standard error** of an estimator (the standard deviation of the estimator's distribution). But how are sampling distributions used in practice?\n",
+ "> We use a sampling distribution to give a range of plausible values for a population parameter. This range of values is known as a **confidence interval**.\n",
+ "\n",
+ "In this section, we'll present the basic idea behind confidence intervals and the formal concepts that are used to define them."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "58a980684fe89d1059aa5ba425d5e883",
+ "grade": false,
+ "grade_id": "cell-509ae1c00179cdf6",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Vancouver Street Trees\n",
+ "Because we are introducing something brand new, let's revisit a dataset that we are familiar with: `vancouver_trees`. This time, we'll consider our population to be all of the public trees planted in Sunset. Our parameter of interest will be the mean of the `diameter` variable. In the cell below we have filtered the data frame for the population of interest and selected the variable that we need. We have also converted the diameter column from inches to centimetres."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "e0224a5939c6f3f1d7c342af24004229",
+ "grade": false,
+ "grade_id": "cell-acaf959d1d48ef8b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "sunset_pop <- \n",
+ " vancouver_trees %>% \n",
+ " filter(neighbourhood_name == \"SUNSET\") %>% \n",
+ " select(diameter) %>% \n",
+ " mutate(diameter = diameter * 2.54)\n",
+ "\n",
+ "head(sunset_pop)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "747ecae948dd00caf20056ace5423ec4",
+ "grade": false,
+ "grade_id": "cell-04d92e2140412282",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.0** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the mean of the population of interest.\n",
+ "\n",
+ "_Assign your answer to an object called `pop_mean`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5870082f29c7af2bc0a07ad09b9d480d",
+ "grade": false,
+ "grade_id": "cell-9316dff880f18da5",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "pop_mean"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "196684b82d6ee223b1e0cc56de6c899b",
+ "grade": true,
+ "grade_id": "cell-21c011af0ae860c8",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ce5c633f0e833e0ee1ee9c11b150657a",
+ "grade": false,
+ "grade_id": "cell-668169d4e9139f50",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "In the cell below, we run code that generates 10 different bootstrap distributions. Each distribution estimates the sampling distribution of the mean of `sunset_pop` for samples of size 24. Hence, each bootstrap distribution was generated by taking a single sample of size 24 from the population `sunset_pop`, taking many resamples from this sample, and calculating the mean of each resample. We can consider the bootstrap distributions to depict some plausible values for the population parameter of interest, based on the original sample that was used to generate them.\n",
+ "\n",
+ "_Use the 10 bootstrap distributions below to answer the **next question**._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "bffc7c9538a99849fc74c7c746436d66",
+ "grade": false,
+ "grade_id": "cell-1e4480115f4769d7",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "options(repr.plot.width = 20, repr.plot.height = 8)\n",
+ "source(\"bootstrap_dists_worksheet_04.R\")\n",
+ "print(bootstrap_dists)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "b3e0527a37de3fba1e6d57c7d6aa847e",
+ "grade": false,
+ "grade_id": "cell-c93453feb55827dc",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "How many of the bootstrap distributions **reasonably \"cover\"** the true mean of the population?\n",
+ "\n",
+ "**Hint:** there may be more than one correct answer.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.1`. Your answer should be a single integer._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7cfab1f6ac89fe05a6b9fe1642b35981",
+ "grade": false,
+ "grade_id": "cell-b718f74c7ad73204",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9e22ed2ce555b908ef76b2c1861d5ba3",
+ "grade": true,
+ "grade_id": "cell-cf6d3812af64bde2",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "b9294ec77530d4272a3fa3cb0f89136e",
+ "grade": false,
+ "grade_id": "cell-08219e12485b6dbd",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Quantiles\n",
+ "Is there a clear answer to the previous question? Not really... The meaning of \"reasonably covers\" may differ from person to person; where would you draw the line between \"covers\" and \"does not cover\"? To avoid relying on our own intuition, we need a more rigorous way to say whether or not a bootstrap distribution \"covers\" the parameter of interest. To do this, we will use **quantiles**. The general definition of quantiles that we will be using in this course is as follows:\n",
+ "> The $p$th quantile is the value of the observation data set where a proportion of $p$ fall below it, and $1 - p$ fall above it.\n",
+ "\n",
+ "The $p$th quantile is also commonly referred to as the $p \\times 100\\%$th **percentile**. For example, the 0.025th quantile is also referred to as the 2.5th percentile. "
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c74f4cddedf55e5eebe967cbf1c87381",
+ "grade": false,
+ "grade_id": "cell-5a8d653eb31a90a3",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.2**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Take a single sample of size 150 from `sunset_pop` using `rep_sample_n`. Be sure to `ungroup` and select only the variable that we are interested in (`diameter`). Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "sample_1 <- \n",
+ " ... %>% \n",
+ " rep_sample_n(reps = ..., size = ..., replace = ...) %>% \n",
+ " ungroup() %>% \n",
+ " select(...)\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `sample_1`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "1fc531e7d0de9f119023504a0ce1ec45",
+ "grade": false,
+ "grade_id": "cell-631427c9071eaba9",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(8622) # DO NOT CHANGE THIS!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "head(sample_1)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c4a1124b5a515db2d2e351ccd13a6d78",
+ "grade": true,
+ "grade_id": "cell-a081d7650da43c44",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "596548b20ff36900203aa0f0d3c94854",
+ "grade": false,
+ "grade_id": "cell-21b0d343665f8c2b",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.3**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the 0.75th quantile of `sample_1` using R's `quantile` function. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "upper_quantile <- \n",
+ " sample_1 %>% \n",
+ " pull(...) %>% \n",
+ " quantile(...)\n",
+ "```\n",
+ "\n",
+ "**Hints:**\n",
+ "1. `quantile` takes a numeric vector for the first argument\n",
+ "2. You can use the `pull` to get a single column from a data frame as a vector, for example, `pull(data_frame, column_name)`\n",
+ "\n",
+ "_Assign your answer to an object called `upper_quantile`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "1cfe81118b002bfd513511024952058a",
+ "grade": false,
+ "grade_id": "cell-cacf4f1c9c1e26dc",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "upper_quantile"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "515f58bd3fac17448778d18d174d2edf",
+ "grade": true,
+ "grade_id": "cell-8b38703a2532492b",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "40031598c204784c11e54a3aa7011a4d",
+ "grade": false,
+ "grade_id": "cell-1decc52a2880a0bf",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "One correct interpretation of the value of `upper_quantile` is: approximately 25% of observations in the sample `sample_1` lie above the value of `upper_quantile`.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.4`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "cd655f0bca6b8f1877dbf65bda9a25ce",
+ "grade": false,
+ "grade_id": "cell-43b8be334725790e",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.4 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8736c07cf06fa7e47cfa0f7bb6ff87e5",
+ "grade": true,
+ "grade_id": "cell-e04d21251d8de8fb",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3f1cddce2df0ce3a11e0fd195bd1e297",
+ "grade": false,
+ "grade_id": "cell-bffd96979f8468c2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.5**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the 0.25th quantile of `sample_1` using R's `quantile` function.\n",
+ "\n",
+ "_Assign your answer to an object called `lower_quantile`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "814bbce0a89c4234521912aca790e781",
+ "grade": false,
+ "grade_id": "cell-80552f5495dd76e7",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "lower_quantile"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "78ac2dc569ec290d5ae87331ed8efd30",
+ "grade": true,
+ "grade_id": "cell-00effe9dd34235fa",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.5()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "c7d218d5a27bc7de70941552bb6a8f27",
+ "grade": false,
+ "grade_id": "cell-6509ea4d827fc45e",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.6**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Plot the distribution of the sample `sample_1` using `geom_histogram` with bin widths of 2. Additionally, add vertical lines on top of the histogram at the location of the 0.25th and 0.75th quantiles using `geom_vline`. Ensure your plot has descriptive, human-readable labels with units and a title. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "sample_quantile_plot <- \n",
+ " ... %>% \n",
+ " ggplot(aes(x = ...)) +\n",
+ " theme_bw() +\n",
+ " ...(binwidth = ..., color = 'white') +\n",
+ " geom_vline(... = lower_quantile, colour = \"red\", size = 1) +\n",
+ " ...(xintercept = upper_quantile, colour = \"red\", size = 1) +\n",
+ " labs(title = \"Sample Distribution (150 observations from population)\",\n",
+ " x = ...) + \n",
+ " theme(text = element_text(size = 20))\n",
+ "\n",
+ "```\n",
+ "\n",
+ "_Assign your plot to an object called `sample_quantile_plot`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "909345903fd70ea9f975184b2a63de52",
+ "grade": false,
+ "grade_id": "cell-f733caa7b3918b85",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "options(repr.plot.width = 10, repr.plot.height = 6)\n",
+ "sample_quantile_plot"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "759eae3254135d1caba084aaa23981d6",
+ "grade": true,
+ "grade_id": "cell-4d14bf1e59651b64",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.6()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3bb61b1a51e28558b51a8efd9ac84884",
+ "grade": false,
+ "grade_id": "cell-d39d1428b752e6ef",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.7** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the proportion of `sample_1` that falls **below** the 0.75th quantile you calculated earlier (`upper_quantile`). Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "p_below <-\n",
+ " sample_1 %>% \n",
+ " summarise(prop = mean(... < ...)) %>% \n",
+ " pull(...)\n",
+ "```\n",
+ "\n",
+ "_Assign your answer to an object called `p_below`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9d763dd1a7bfe17fdb5fca30f17f087e",
+ "grade": false,
+ "grade_id": "cell-d881d2aa312309a9",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "p_below"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7853b57e1f5ecbb3a2d35d7855f3ae09",
+ "grade": true,
+ "grade_id": "cell-6f42ef47e030eb3c",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.7()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ffdaacf49cc21620b726d5a35467de00",
+ "grade": false,
+ "grade_id": "cell-4182c2bf8c74aae5",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.8** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the proportion of `sample_1` that falls **between** the 0.25th and 0.75th quantiles that you calculated earlier (`lower_quantile` and `upper_quantile`, respectively).\n",
+ "\n",
+ "**Hint:** one method of calculating the answer to this question is very similar to the method used in the previous question.\n",
+ "\n",
+ "_Assign your answer to an object called `p_between`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "4336cecfbda7a3986b175a4bb30a1e00",
+ "grade": false,
+ "grade_id": "cell-8eec876afcff3471",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "p_between"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "f16daa65c3b1ad236e036305a75d9d9a",
+ "grade": true,
+ "grade_id": "cell-ba5a902a9f7c2d70",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.8()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "ca6dee0ccb9c06f4c732644669ca2dbe",
+ "grade": false,
+ "grade_id": "cell-2f242a5fcf503103",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.9**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Assume that we are certain that the sample `sample_1` is unbiased and representative of the population (i.e. we can consider it to be a good estimate of the population). Which of the interpretation **of the interval** (`lower_quantile`, `upper_quantile`) between the two quantiles of the sample distribution is **incorrect**?\n",
+ "\n",
+ "A. If we picked a random observation from the population, we can estimate that there is approximately a 50% chance that its diameter would fall within the interval (`lower_quantile`, `upper_quantile`).\n",
+ "\n",
+ "B. Approximately 25% of the diameters of the observations in the sample fall above the value of `upper_quantile`.\n",
+ "\n",
+ "C. If we draw another random sample and randomly picked an observation, there is approximately a 75% chance that its diameter would fall above the value of `lower_quantile`.\n",
+ "\n",
+ "D. We can estimate that approximately 25% of the diameters of the observations in the population fall below the value of `lower_quantile`.\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.9`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "915bd5f052f829e1a0ad49c7a2dc330c",
+ "grade": false,
+ "grade_id": "cell-15bf5fcc9a1caf7a",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.9 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "010b2b359de650775499b6d8921a79ab",
+ "grade": true,
+ "grade_id": "cell-05e987f5d1c2ac77",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.9()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "697fef9b4320c8b04b90bf99cb57324c",
+ "grade": false,
+ "grade_id": "cell-9f27e8a9508261b2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 2.10**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Like the previous question, assume that we are certain that the sample `sample_1` is unbiased and representative of the population (i.e. we can consider it to be a good estimate of the population). However, suppose that you calculated the 0.1th quantile for `lower_quantile` and the 0.6th quantile for `upper_quantile` for the sample, instead of the 0.25th and 0.75th quantiles as you did previously.\n",
+ "\n",
+ "Given the above scenario, would the correctness of the following interpretation of the interval (`lower_quantile`, `upper_quantile`) remain **unchanged**?\n",
+ "\n",
+ "> If we picked a random observation from the population, we can estimate that there is approximately a 50% chance that it would fall within the interval (`lower_quantile`, `upper_quantile`).\n",
+ "\n",
+ "_Assign your answer to an object called `answer2.10`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c917edf8c3bc1325b83d95bbc8feea8e",
+ "grade": false,
+ "grade_id": "cell-7cb07710ff20a77a",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer2.10 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "bbc07b9bed4a9074781864d35f23cc38",
+ "grade": true,
+ "grade_id": "cell-7c17acaaaaafaf03",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_2.10()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "181316faa3b135e913817670ff954118",
+ "grade": false,
+ "grade_id": "cell-d5e11d0ae75cba1a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 3. Formalizing Confidence Intervals\n",
+ "\n",
+ "Now that we understand quantiles and how we can interpret them, we can rephrase the vague question of\n",
+ "> How many of the bootstrap distributions **reasonably \"cover\"** the true mean of the population?\n",
+ "\n",
+ "that we encountered at the start of the previous section. Specifically, we could ask something like\n",
+ "> Does the interval between the 0.1th and 0.9th quantiles capture the true mean of the population?\n",
+ "\n",
+ "instead, where the answer does not rely on one's intuition. That interval referenced in the question above is called a **confidence interval**, and in particular, it is called an **80% confidence interval**. One should think of a confidence interval as a **range of plausible** values for the population parameter, which may or may not fall within the interval. This is significantly different than a point estimate, which is a **single plausible value** for the population parameter. A popular analogy used to compare point estimates to confidence intervals is fishing with a spear vs. fishing with a net, respectively.\n",
+ "\n",
+ "
\n",
+ "\n",
+ "![](https://d33wubrfki0l68.cloudfront.net/45f6d2e16255dbcb42de86336e1e49ef732aa5da/8bcd0/images/shutterstock/point_estimate_vs_conf_int.png)\n",
+ "
\n",
+ "With a spear, we are aiming for a particular fish (a single value) and hoping to catch it, whereas with a net, we are aiming for a larger area in space (a range of plausible values) and hoping that the fish is captured in the net."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d9f2dd2455331b347dcae4c95ae58873",
+ "grade": false,
+ "grade_id": "cell-f79e0d2285a3d223",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Calculating & Visualizing a Single 90% Confidence Interval Using Bootstrapping\n",
+ "To get a clearer picture of how we can use quantiles and a bootstrap sampling distribution to calculate a confidence interval, let's calculate one from scratch. Specifically, we'll calculate a single 90% confidence interval for the mean of the `diameter` variable for the population `sunset_pop`. Afterwards, we'll visualize it and compare it to the true mean.\n",
+ "> As usual, it is important to note that we do not usually have access to the population parameter of interest; many of these questions are purely for your understanding of confidence intervals. "
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "7532b3a418b00de62097fa93b4ee5e13",
+ "grade": false,
+ "grade_id": "cell-e79671482c0c74aa",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.0** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Take a single random sample of size 30 from `sunset_pop` using `rep_sample_n` and a seed of 0120. Ensure the resulting data frame only has a single column: `diameter`. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "sample_2 <- \n",
+ " sunset_pop %>% \n",
+ " rep_sample_n(reps = ..., size = ..., replace = ...) %>% \n",
+ " ungroup() %>% \n",
+ " select(...)\n",
+ "```\n",
+ "\n",
+ "**Note:** don't forget that `rep_sample_n` returns a grouped data frame.\n",
+ "\n",
+ "_Assign your data frame to an object called `sample_2`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "818a2468d1a6640170310f2bcd48f1f6",
+ "grade": false,
+ "grade_id": "cell-9662bf3faea4b384",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(0120) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(sample_2)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "019fd32a7836b161864d6cc98fdaf35c",
+ "grade": true,
+ "grade_id": "cell-655ca510c6b77ddd",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "aeb41e8fae2865744e13df91c47ef1fd",
+ "grade": false,
+ "grade_id": "cell-c91006d0be04f2ed",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.1** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Generate a bootstrap distribution of sample means from `sample_2` by re-sampling with replacement 1000 times using `rep_sample_n` and a seed of 5127. Then, calculate the mean of each bootstrap sample. Name the new column containing the bootstrap sample means `mean_diameter`, and select only that column. Use the scaffolding provided below as a guide:\n",
+ "```r\n",
+ "bootstrap_dist <- \n",
+ " sample_2 %>% \n",
+ " rep_sample_n(reps = ..., size = ..., replace = ...) %>% \n",
+ " group_by(...) %>% \n",
+ " ...(mean_diameter = ...(diameter)) %>% \n",
+ " select(mean_diameter)\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `bootstrap_dist`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "85e98a5c8bf41a7d1ef9f273a24f1183",
+ "grade": false,
+ "grade_id": "cell-3210e119a4b45f52",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "set.seed(5127) # DO NOT CHANGE!\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(bootstrap_dist)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "52b56bb12c56ade4e1d8dd475c8cca3d",
+ "grade": true,
+ "grade_id": "cell-468f79ddac80be06",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "375b024ae7cddd5823f0714301e8d7cc",
+ "grade": false,
+ "grade_id": "cell-c687afc82623f277",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.2** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Calculate the 5th and 95th percentiles of `bootstrap_dist` using the `quantile` and `summarize` functions. Name the column containing the 5th percentile `ci_lower` and the column containing the 95th percentile `ci_upper`. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "ci <- \n",
+ " bootstrap_dist %>% \n",
+ " ...(ci_lower = quantile(..., 0.05),\n",
+ " ci_upper = ...(mean_diameter, ...))\n",
+ "```\n",
+ "\n",
+ "_Assign your data frame to an object called `ci`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7dd8bb470fd3982c2e16b2f06a91da0f",
+ "grade": false,
+ "grade_id": "cell-5c3ecec57f5961ed",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(ci)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "25424d0f6e5da845fb7b4b460f65d333",
+ "grade": true,
+ "grade_id": "cell-06d2c37656961ba4",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8bd77c538396c6e7777ff3f10ed94d77",
+ "grade": false,
+ "grade_id": "cell-49ce2db61cd6187f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.3**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Plot the confidence interval (represented by a transluscent rectangle) and true mean of the population (represented by a vertical line, generated by `geom_vline`) over the bootstrap distribution `bootstrap_dist` (visualized as a histogram with bin widths of 1, generated by `geom_histogram`). Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "ci_plot <- \n",
+ " ... %>% \n",
+ " ggplot(aes(x = ...)) +\n",
+ " ...(binwidth = ..., colour = \"white\", fill = \"grey\") +\n",
+ " annotate(\"rect\", xmin = ci$ci_lower, xmax = ci$ci_upper, ymin = 0, ymax = Inf,\n",
+ " fill = \"deepskyblue\",\n",
+ " alpha = 0.3) +\n",
+ " geom_vline(xintercept = pop_mean,\n",
+ " size = 2,\n",
+ " colour = \"red\") +\n",
+ " labs(title = \"Bootstrap distribution with 90% confidence interval\",\n",
+ " x = \"Mean tree diameter (cm)\") +\n",
+ " theme_bw() # Sets a theme for better visibility\n",
+ "```\n",
+ "\n",
+ "**Note:** recall that you already calculated the true mean of the population in the and saved it to an object named `pop_mean`. \n",
+ "\n",
+ "_Assign your plot to an object called `ci_plot`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "834a61d580660a32a40df0d326166168",
+ "grade": false,
+ "grade_id": "cell-eb29c1f5f79ebd0d",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "ci_plot"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "8fec8121a401bd8b2eeb0fae41d722d8",
+ "grade": true,
+ "grade_id": "cell-f9895e50fbccccc1",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.3()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "d212480892614c224ecf26fa6fccfb4f",
+ "grade": false,
+ "grade_id": "cell-8f5235449d935656",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.4**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "The parameter of interest (the mean diameter of public street trees located in sunset) is captured by the confidence interval that we calculated in **question 3.2** and visualized above.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.4`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2b4f7394fbf078c68b8c6b128ba271f7",
+ "grade": false,
+ "grade_id": "cell-fc39e7ebca011d85",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.4 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "3d6764157a2a6f6432b73e27766d9f9a",
+ "grade": true,
+ "grade_id": "cell-c3b87542b1ddd91e",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.4()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "8b7072f87952b92da5c354cd8d193832",
+ "grade": false,
+ "grade_id": "cell-5045ad6c08aad93f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "### Calculating & Visualizing Many 90% Confidence Intervals Using Bootstrapping\n",
+ "How can we interpret a confidence interval when we don't have access to the population parameter (i.e. in reality)? Does our interpretation change as the width of the interval changes? How could we choose the width in the first place? To answer these questions, we're going to produce 100 different 90% confidence intervals to see how they behave. The bulk of the work has already been done for you in the cell below. We took 100 samples of size 30 and used each one to produce an estimate of the sampling distribution using bootstrapping with 1000 repetitions, essentially repeating the procedure you followed at the start of this section 100 times over."
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "643589ff9f3bfff4303cc0a7b19babf2",
+ "grade": false,
+ "grade_id": "cell-44364736f4a0c09a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# Run this cell before continuing.\n",
+ "sampling_dist_estimates <- read_csv(\"sampling_dist_estimates.csv\",show_col_types = FALSE)\n",
+ "bootstrap_samples <- read_csv(\"bootstrap_samples.csv\",show_col_types = FALSE)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "5387cae40cac9b0481d2baa4e96fd705",
+ "grade": false,
+ "grade_id": "cell-e4c194c8f89c4d32",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "However, here are a few questions to check your understanding of what went on behind the scenes.\n",
+ "\n",
+ "_Use the following information to answer the **next 3 questions**._\n",
+ "\n",
+ "Consider the following two data frames:\n",
+ "1. `sampling_dist_estimates`: contains 100 estimates of the sampling distribution as 100 different tibbles within the column `bootstrap_mean`. The `sample_id` column ranges from 1 to 100 (since we took 100 samples)\n",
+ "2. `bootstrap_samples`: a bootstrap data frame, where `sample_id == 1` for all rows"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "b7a3703a7bc5d5320a704e46ecf88d4d",
+ "grade": false,
+ "grade_id": "cell-050b99444ff299dd",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "print(sampling_dist_estimates)\n",
+ "print(bootstrap_samples)"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "6a4453baf832eef9c73a943d7d599bc8",
+ "grade": false,
+ "grade_id": "cell-89d9be6420a6b0c2",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.5**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "`bootstrap_samples` contains all of the bootstrap samples that were used to calculate the `bootstrap_mean` variable in `sampling_dist_estimates` for all of the 100 original samples.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.5`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5b0f6fa4f6eae6c958ef1d9d241ba212",
+ "grade": false,
+ "grade_id": "cell-6119935a39ff6560",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.5 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6c319ec28704f515a21eea857c4977db",
+ "grade": true,
+ "grade_id": "cell-38d43d4c70b0e718",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.5()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "f1d651113dec9bbbca5e6387fddbe716",
+ "grade": false,
+ "grade_id": "cell-00d2e4f54afbf569",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.6**\n",
+ "
{points: 1}\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "Given **only** the `sampling_dist_estimates` data frame, we could produce `bootstrap_samples` data frame.\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.6`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a0d5bf6493917cee336024e1d9af5a5d",
+ "grade": false,
+ "grade_id": "cell-1098ceb1db0279d4",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.6 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "2e30a13ab82689ff9c1e9b736ef84bab",
+ "grade": true,
+ "grade_id": "cell-3368d315642a0ac1",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.6()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "215b6934f99349d90940620a039105e6",
+ "grade": false,
+ "grade_id": "cell-adfe76c5059f0f22",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.7** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Use `bootstrap_samples` to re-create the bootstrap distribution from `sampling_dist_estimates` that was generated using `sample_id == 1`. Your resulting data frame should have two columns: `replicate` and `bootstrap_mean`.\n",
+ "\n",
+ "_Assign your data frame to an object called `sampling_dist_estimate`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c2d92d8510cd5a8f93afffbec8a3fc25",
+ "grade": false,
+ "grade_id": "cell-42da114f25e415ff",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "print(sampling_dist_estimate)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fc8a3a77b187fbaab314772fe550bebf",
+ "grade": true,
+ "grade_id": "cell-f5c211ade1be51d0",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.7()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "79412bd3b0ce71a9d3dd323e3fce32d6",
+ "grade": false,
+ "grade_id": "cell-cc5f6279584f2648",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.8** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Now that we understand where `sampling_dist_estimates` came from, calculate a 90% confidence interval from each bootstrap distribution using the 0.05th and 0.95th quantiles. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "intervals <- \n",
+ " sampling_dist_estimates %>% \n",
+ " ...(...) %>% \n",
+ " summarize(ci_lower = ...(bootstrap_mean, ...),\n",
+ " ci_upper = ...(..., ...))\n",
+ "```\n",
+ "\n",
+ "**Hint:** The procedure is very similar to **question 3.2**, but with one extra step.\n",
+ "\n",
+ "_Assign your data frame to an object called `intervals`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d9d52d32128045d543bb1730de433e5d",
+ "grade": false,
+ "grade_id": "cell-cfcd85d8fdffd524",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "print(intervals)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "febd710620699b8335d0001d9555837b",
+ "grade": true,
+ "grade_id": "cell-d2e624405bcd8f41",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.8()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "cd04c388c55e6083d7b004d4b1b87dfc",
+ "grade": false,
+ "grade_id": "cell-d62749d5f278136a",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.9** \n",
+ "
{points: 1}\n",
+ "\n",
+ "Add a variable named `captured` to `intervals` that indicates whether the confidence interval described in that row captures the true mean (`pop_mean`). If the true mean is captured, `captured` should be `TRUE`, otherwise it should be `FALSE`. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "intervals_captured <- \n",
+ " intervals %>% \n",
+ " mutate(captured = (ci_lower <= ... & pop_mean <= ...))\n",
+ "```\n",
+ "\n",
+ "_Assign your answer to an object called `intervals_captured`. Your answer should be a single number._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "c54c3ea3dd0940d8ff143114e5b90e21",
+ "grade": false,
+ "grade_id": "cell-f04e9dff8487a991",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "head(intervals_captured)"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5e68f3b739d20b42e12a4c827c51c38f",
+ "grade": true,
+ "grade_id": "cell-84b7cebc8e7d4385",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.9()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "3c92688640bbbe26a581a2fe07c35b77",
+ "grade": false,
+ "grade_id": "cell-5cc314f8a903e16d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.10**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Visualize all 100 confidence intervals. Each interval is represented by a horizontal line (`geom_segment`) and is coloured depending on whether it captures the true mean of the population, which is represented as a vertical line (`geom_vline`). The ID of the sample should be on the y-axis. Use the scaffolding provided below as a guide:\n",
+ "\n",
+ "```r\n",
+ "many_ci_plot <- \n",
+ " ... %>%\n",
+ " ggplot() +\n",
+ " scale_colour_manual(breaks = c(\"TRUE\", \"FALSE\"), # Change colour scale for better visibility.\n",
+ " values = c(\"grey\", \"black\")) +\n",
+ " ...(aes(x = ...,\n",
+ " xend = ...,\n",
+ " y = sample_id,\n",
+ " yend = sample_id,\n",
+ " colour = ...)) +\n",
+ " ...(xintercept = ..., colour = \"red\", size = 1) +\n",
+ " labs(title = \"100 90% Confidence Intervals\",\n",
+ " y = \"Sample ID\",\n",
+ " x = \"Diameter (cm)\",\n",
+ " colour = \"Captured?\") +\n",
+ " theme_bw() # Sets a theme for better visibility.\n",
+ "```\n",
+ "\n",
+ "_Assign your plot to an object called `many_ci_plot`._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fe3895af9714b09d0c25caec77beb342",
+ "grade": false,
+ "grade_id": "cell-5e4348b127e03245",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "options(repr.plot.width = 5, repr.plot.height = 6)\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer\n",
+ "\n",
+ "many_ci_plot"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "9606434424e06eaaa268a50f04d742f0",
+ "grade": true,
+ "grade_id": "cell-2d43ad356138ddbc",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.10()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "39d326c1f2da136427ee1c65acac9995",
+ "grade": false,
+ "grade_id": "cell-b42b0e3fe75aa077",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.11**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Using the plot above, how many of the 100 confidence intervals \"capture\" the true mean of the population?\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.11`. Your answer should be a single integer._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "cc32a6c480eda1aaa7b66984b06bd764",
+ "grade": false,
+ "grade_id": "cell-8f63c686e8f83932",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.11 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "27e3db9c7494e4e4b03415b764e52a3b",
+ "grade": true,
+ "grade_id": "cell-21fc9714f214f663",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.11()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "580c706518be5471bc03eaf6d6e1d550",
+ "grade": false,
+ "grade_id": "cell-1a3b8516cd23c692",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.12**\n",
+ "
{points: 1}\n",
+ "\n",
+ "If we repeated the above experiment, but with 1000 different 90% confidence intervals instead of 100, how many of the intervals would you **expect** to capture the true mean of the population?\n",
+ "\n",
+ "_Assign your answer to an object called `answer3.12`. Your answer should be a single integer._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "a0daee792b58a33e2a480e6cea6a10d2",
+ "grade": false,
+ "grade_id": "cell-bb9290a90cf1a962",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.12 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "7e9b935a0cccc9b4fbbd16537f731433",
+ "grade": true,
+ "grade_id": "cell-a82f209ebd0dc15e",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.12()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "346331f01e6b8c0111d994bd674f3df7",
+ "grade": false,
+ "grade_id": "cell-8b120440dfa4831f",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 3.13**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you **did not** have data for the entire population of public street trees in Sunset. Consider a single **90% confidence interval** that you calculated using by bootstrapping a single sample of size $n$.\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "We can interpret the confidence interval as: we are 90% confident that the true mean is captured by the interval. Or, in other words, across all 90% confidence intervals that could be calculated for the mean of the population of interest, we can expect that 90% of the intervals contain the true mean. \n",
+ "\n",
+ "_Assign your answer to an object called `answer3.13`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "44150755686d6e57996e0cffe50a7e00",
+ "grade": false,
+ "grade_id": "cell-88e21c6567e30d81",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer3.13 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "994629e40a2541ba73e7d0f1c6467947",
+ "grade": true,
+ "grade_id": "cell-db5f3330adee8e77",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_3.13()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "82b36b834b8c2d53367b363bd7bdcfde",
+ "grade": false,
+ "grade_id": "cell-efa920c654bbd2a6",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "## 4. Conclusion\n",
+ "Here are a few more questions that target some of the nuances related to confidence intervals."
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "a5c8f28905dccb125c3c274ea915cfff",
+ "grade": false,
+ "grade_id": "cell-c2dd7916ef433d4c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.0**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you **did not** have access to data for the entire population of public street trees in Sunset. Assume you took a single sample of size 75 and used bootstrapping to calculate a 95% confidence interval for the **standard deviation** of the diameter of the population, which turned out to be\n",
+ "> (12.52cm, 22.33cm)\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "There is a 95% chance that the true standard deviation of the diameter of the population of public street trees in Sunset will fall within this interval.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.0`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "fb7e4a1325b32d7d578101edc4c11d98",
+ "grade": false,
+ "grade_id": "cell-e8d058e353ab4f72",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.0 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "d268daf5d4d2a0804921334073a9a66d",
+ "grade": true,
+ "grade_id": "cell-bbd47776f99243d4",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.0()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "fa7803c203c5437e746612693df46921",
+ "grade": false,
+ "grade_id": "cell-0a22a20c35a80f51",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.1**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you were interested in calculating a 90% confidence interval for the **true proportion** of UBC students who lived on campus during their first year. Which of the following can be considered as \"random\"?\n",
+ "\n",
+ "A. The true proportion of the population of interest.\n",
+ "\n",
+ "B. The lower bound of a 99% confidence interval for the proportion of the population of interest.\n",
+ "\n",
+ "C. The upper bound of a 99% confidence interval for the proportion of the population of interest.\n",
+ "\n",
+ "D. A confidence interval of (0.44, 0.82) that you calculated by taking a sample of size 50 from the population of UBC students.\n",
+ "\n",
+ "E. All of the above.\n",
+ "\n",
+ "F. Only A, B, and C.\n",
+ "\n",
+ "G. Only B, C, and D.\n",
+ "\n",
+ "H. Only A and D.\n",
+ "\n",
+ "I. Only B and C.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.1`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "132cdf28c4def2f627ed4ed0d6761a0c",
+ "grade": false,
+ "grade_id": "cell-0f3aa2532492f4c5",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.1 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "6ab647311923217d60f7b428e4eaf57f",
+ "grade": true,
+ "grade_id": "cell-2def133d8fcf3278",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.1()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "37afce45f7da32854fb0d285e54a966c",
+ "grade": false,
+ "grade_id": "cell-f5e68ef10f101d6c",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.2**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Suppose you calculated two 50% confidence intervals for the mean of the number of years that it takes a UBC student to complete their undergraduate degree using bootstrapping. For the first confidence interval, you used the 0.1th and 0.6th quantiles, and for the second, you used the 0.25th and 0.75th quantiles.\n",
+ "\n",
+ "True or false?\n",
+ "\n",
+ "Both confidence intervals are valid **and** they can be interpretted in the same way.\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.2`. Your answer should be either \"true\" or \"false\", surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "5ca4e50d295f6b91470bcf040b2fcef6",
+ "grade": false,
+ "grade_id": "cell-2d10c846379de836",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.2 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "29aaebe67dc4b6aceb758399112a8bcd",
+ "grade": true,
+ "grade_id": "cell-957569e757b313b3",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "test_4.2()"
+ ]
+ },
+ {
+ "cell_type": "markdown",
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "markdown",
+ "checksum": "5c5c014b3df86ff62b6d879418a12023",
+ "grade": false,
+ "grade_id": "cell-df732433c2fb284d",
+ "locked": true,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ }
+ },
+ "source": [
+ "**Question 4.3**\n",
+ "
{points: 1}\n",
+ "\n",
+ "Consider the following (**impossible**) scenario:\n",
+ "\n",
+ "> Congratulations! You've just made a statistical breakthrough and found a way to access the true sampling distribution for any population using only a single sample! There is no need for bootstrapping anymore, as you can determine the true sampling distribution directly.\n",
+ "> \n",
+ "> However, you're still unable to work out the population parameter you are interested in. So, you decide to use the 0.1th and 0.9th quantiles of **true sampling distribution** to formulate a confidence interval for the population parameter.\n",
+ "\n",
+ "What confidence level is **most likely** to be associated with this confidence interval that you calculated in the scenario above? \n",
+ "\n",
+ "Hint: The center of a sampling distribution is approximately 0.5 quantile\n",
+ "\n",
+ "A. 0%\n",
+ "\n",
+ "B. 50%\n",
+ "\n",
+ "C. 80%\n",
+ "\n",
+ "D. 100%\n",
+ "\n",
+ "_Assign your answer to an object called `answer4.3`. Your answer should be a single character surrounded by quotes._"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "122fbeba6c65707fa56efbb999b0b90e",
+ "grade": false,
+ "grade_id": "cell-9d1f6cfbbe4c3ce5",
+ "locked": false,
+ "schema_version": 3,
+ "solution": true,
+ "task": false
+ }
+ },
+ "outputs": [],
+ "source": [
+ "# answer4.3 <- ...\n",
+ "\n",
+ "# your code here\n",
+ "fail() # No Answer - remove if you provide an answer"
+ ]
+ },
+ {
+ "cell_type": "code",
+ "execution_count": null,
+ "metadata": {
+ "deletable": false,
+ "editable": false,
+ "nbgrader": {
+ "cell_type": "code",
+ "checksum": "4d91af6a81c601565225160e5dd541c7",
+ "grade": true,
+ "grade_id": "cell-fd193800f5a81b99",
+ "locked": true,
+ "points": 1,
+ "schema_version": 3,
+ "solution": false,
+ "task": false
+ },
+ "tags": []
+ },
+ "outputs": [],
+ "source": [
+ "test_4.3()"
+ ]
+ }
+ ],
+ "metadata": {
+ "docker": {
+ "latest_image_tag": "v0.4.0"
+ },
+ "jupytext": {
+ "formats": "ipynb,Rmd"
+ },
+ "kernelspec": {
+ "display_name": "R",
+ "language": "R",
+ "name": "ir"
+ },
+ "language_info": {
+ "codemirror_mode": "r",
+ "file_extension": ".r",
+ "mimetype": "text/x-r-source",
+ "name": "R",
+ "pygments_lexer": "r",
+ "version": "4.2.3"
+ }
+ },
+ "nbformat": 4,
+ "nbformat_minor": 4
+}